set Working Directory

setwd(“~/WE_assignments/Trim- 4/R”)

knitr Global Options

# for development
knitr::opts_chunk$set(echo=TRUE, eval=TRUE, error=TRUE, warning=TRUE, message=TRUE, cache=FALSE, tidy=FALSE, fig.path='figures/')
# for production
#knitr::opts_chunk$set(echo=TRUE, eval=TRUE, error=FALSE, warning=FALSE, message=FALSE, cache=FALSE, tidy=FALSE, fig.path='figures/')

Load Libraries

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(tidyr)
## Warning: package 'tidyr' was built under R version 3.4.4

read csv

dfrElected <- read.csv("C:/Users/Acer/Documents/WeSchool_R&BA/Trim 4/R/data_sets/elected-officials.csv", header=T,stringsAsFactors=F)
head(dfrElected)
##             ï..Office.Title                            Office.Description
## 1 DSCC Member                 1st Representative District, Office "A"    
## 2 DSCC Member                 1st Representative District, Office "B"    
## 3 DSCC Member                 2nd Representative District, Office "A"    
## 4 DSCC Member                 2nd Representative District, Office "B"    
## 5 DSCC Member                 3rd Representative District, Office "A"    
## 6 DSCC Member                 3rd Representative District, Office "B"    
##   Office.Address.1 Office.Address.2 City State Zip.Code Office.Phone
## 1                                           LA                      
## 2                                           LA                      
## 3                                           LA                      
## 4                                           LA                      
## 5                                           LA                      
## 6                                           LA                      
##   Parish         Candidate.Name Candidate.Address.1 Candidate.Address.2
## 1           Helen Godfrey Smith        P. O. Box 32                    
## 2                                                                      
## 3                Frances Kelley      935 Linden St.                    
## 4        Frederic D. Washington    2213 Queens Hwy.                    
## 5                Barbara Norton     3821 Morrow St.                    
## 6               "Steve" Jackson  610 Sugarleaf Trl.                    
##       City.1 State.1 Zip.Code.1        Phone Ethnicity Sex Party.Code
## 1    Gilliam      LA      71029 318-296-4404         B  F           D
## 2                                                                    
## 3 Shreveport      LA 71104-4209 318-869-0355         W  F           D
## 4 Shreveport      LA 71103-4048 318-470-0403         B  M           D
## 5 Shreveport      LA 71109-7647 318-635-2923                        D
## 6 Shreveport      LA 71106-6332 318-347-5421         B  M           D
##   Office.Level Expiration.Date Commissioned.Date Salutation
## 1           52      02/29/2016          04-03-12         NA
## 2           52                                           NA
## 3           52      02/29/2016          04-03-12         NA
## 4           52      02/29/2016          04-03-12         NA
## 5           52      02/29/2016          04-03-12         NA
## 6           52      02/29/2016          04-03-12         NA
summary(dfrElected)
##  ï..Office.Title    Office.Description Office.Address.1  
##  Length:6865        Length:6865        Length:6865       
##  Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character  
##                                                          
##                                                          
##                                                          
##  Office.Address.2       City              State          
##  Length:6865        Length:6865        Length:6865       
##  Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character  
##                                                          
##                                                          
##                                                          
##    Zip.Code         Office.Phone          Parish         
##  Length:6865        Length:6865        Length:6865       
##  Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character  
##                                                          
##                                                          
##                                                          
##  Candidate.Name     Candidate.Address.1 Candidate.Address.2
##  Length:6865        Length:6865         Length:6865        
##  Class :character   Class :character    Class :character   
##  Mode  :character   Mode  :character    Mode  :character   
##                                                            
##                                                            
##                                                            
##     City.1            State.1           Zip.Code.1       
##  Length:6865        Length:6865        Length:6865       
##  Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character  
##                                                          
##                                                          
##                                                          
##     Phone            Ethnicity             Sex           
##  Length:6865        Length:6865        Length:6865       
##  Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character  
##                                                          
##                                                          
##                                                          
##   Party.Code         Office.Level   Expiration.Date    Commissioned.Date 
##  Length:6865        Min.   : 52.0   Length:6865        Length:6865       
##  Class :character   1st Qu.: 66.0   Class :character   Class :character  
##  Mode  :character   Median :245.0   Mode  :character   Mode  :character  
##                     Mean   :205.8                                        
##                     3rd Qu.:300.0                                        
##                     Max.   :310.0                                        
##  Salutation    
##  Mode:logical  
##  NA's:6865     
##                
##                
##                
## 
colnames(dfrElected)<- c("OfficeTitle","OfficeDescription","OfficeAddr1","OfficeAddr2","City","State","Zipcode","OfficePhone","Parish","CandidateName","CandidateAddr1","CandidateAddr2","CityColumn2","StateColumn2","ZipcodeColumn2","Phone","Ethnicity","Gender","PartyCode","OfficeLevel","ExpirationDate","CommisionedDate","Salutation")

clean function

getClean <- function(dfname,pattern,repValue){
  strRetValue <- gsub(pattern,repValue,dfname)
  return (strRetValue)
}

Clean Officetitle

dfrElected$OfficeTitle <- getClean(dfrElected$OfficeTitle,"\\.","")
dfrElected$OfficeTitle <- getClean(dfrElected$OfficeTitle,"\\(","")
dfrElected$OfficeTitle <- getClean(dfrElected$OfficeTitle,"ss","s")
dfrElected$OfficeTitle <- getClean(dfrElected$OfficeTitle,"\\)","")
dfrElected$OfficeTitle <- getClean(dfrElected$OfficeTitle,"-","")
dfrElected$OfficeTitle <- getClean(dfrElected$OfficeTitle,",","")

Clean OfficeDescription

dfrElected$OfficeDescription <- getClean(dfrElected$OfficeDescription,"\\.","")
dfrElected$OfficeDescription <- getClean(dfrElected$OfficeDescription,"\"","")
dfrElected$OfficeDescription <- getClean(dfrElected$OfficeDescription,",","")

Clean OfficeAddr1

dfrElected$OfficeAddr1 <- getClean(dfrElected$OfficeAddr1,"\\.","")
dfrElected$OfficeAddr1 <- getClean(dfrElected$OfficeAddr1,",","")
dfrElected$OfficeAddr1 <- getClean(dfrElected$OfficeAddr1,"#","")
dfrElected$OfficeAddr1 <- getClean(dfrElected$OfficeAddr1,"\"","")
dfrElected$OfficeAddr1 <- getClean(dfrElected$OfficeAddr1,"-","")

Clean OfficeAddr2

dfrElected$OfficeAddr2 <- getClean(dfrElected$OfficeAddr2,"\\.","")
dfrElected$OfficeAddr2 <- getClean(dfrElected$OfficeAddr2,",","")
dfrElected$OfficeAddr2 <- getClean(dfrElected$OfficeAddr2,"#","")
dfrElected$OfficeAddr2 <- getClean(dfrElected$OfficeAddr2,"\"","")
dfrElected$OfficeAddr2 <- getClean(dfrElected$OfficeAddr2,"-","")

Clean City

dfrElected$City <- getClean(dfrElected$City,"\\.","")
dfrElected$City <- getClean(dfrElected$City,",","")

Clean State

dfrElected$State[dfrElected$State == "LAX"] <- "LA"

Clean CandidateName

dfrElected$CandidateName <- getClean(dfrElected$CandidateName,"\\.","")
dfrElected$CandidateName <- getClean(dfrElected$CandidateName,",","")
dfrElected$CandidateName <- getClean(dfrElected$CandidateName,"#","")
dfrElected$CandidateName <- getClean(dfrElected$CandidateName,"\"","")
dfrElected$CandidateName <- getClean(dfrElected$CandidateName,"-","")

Clean CandidateAddr1

dfrElected$CandidateAddr1 <- getClean(dfrElected$CandidateAddr1,"\\.","")
dfrElected$CandidateAddr1 <- getClean(dfrElected$CandidateAddr1,",","")
dfrElected$CandidateAddr1 <- getClean(dfrElected$CandidateAddr1,"#","")
dfrElected$CandidateAddr1 <- getClean(dfrElected$CandidateAddr1,"\"","")
dfrElected$CandidateAddr1 <- getClean(dfrElected$CandidateAddr1,"-","")

Clean CandidateAddr2

dfrElected$CandidateAddr2 <- getClean(dfrElected$CandidateAddr2,"\\.","")
dfrElected$CandidateAddr2 <- getClean(dfrElected$CandidateAddr2,",","")
dfrElected$CandidateAddr2 <- getClean(dfrElected$CandidateAddr2,"#","")
dfrElected$CandidateAddr2 <- getClean(dfrElected$CandidateAddr2,"\"","")
dfrElected$CandidateAddr2 <- getClean(dfrElected$CandidateAddr2,"-","")

Clean CityColumn2

dfrElected$CityColumn2 <- getClean(dfrElected$CityColumn2,"\\.","")
dfrElected$CityColumn2 <- getClean(dfrElected$CityColumn2,",","")

Clean StateColumn2

dfrElected$StateColumn2[dfrElected$StateColumn2 == "LAX"] <- "LA"

Clean Zipcode

dfrElected$Zipcode<- gsub(" ", "", dfrElected$Zipcode, fixed = TRUE)
dfrElected$ZipcodeColumn2<- gsub(" ", "", dfrElected$ZipcodeColumn2, fixed = TRUE)
cityx<-ifelse((nchar(dfrElected$Zipcode)==4),dfrElected$City,"")
dfrElected$Zipcode<- ifelse(cityx=="Livingston","70754",dfrElected$Zipcode)
dfrElected$Zipcode<- ifelse(cityx=="Independence","70443",dfrElected$Zipcode)

Clean Expiration Date

dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-03-17"] <- "01-03-2017"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-08-17"] <- "01-08-2017"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "04-02-16"] <- "04-02-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-01-16"] <- "01-01-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "07-01-16"] <- "07-01-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-04-16"] <- "01-04-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-05-16"] <- "01-05-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12-05-16"] <- "12-05-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-07-16"] <- "01-07-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-10-16"] <- "01-10-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-11-16"] <- "01-11-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-03-15"] <- "01-03-2015"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "07-06-15"] <- "07-06-2015"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-11-15"] <- "01-11-2015"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "01-12-15"] <- "01-12-2015"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12-01-14"] <- "12-01-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "05-04-14"] <- "05-04-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12-07-14"] <- "12-07-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "02/29/2016"] <- "29-02-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "03/27/2016"] <- "27-03-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "05/20/2014"] <- "20-05-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "05/31/2016"] <- "31-05-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "06/30/2013"] <- "30-06-2013"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "06/30/2014"] <- "30-06-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "06/30/2015"] <- "30-06-2015"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "06/30/2016"] <- "30-06-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "11/24/2014"] <- "24-11-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "11/30/2014"] <- "30-11-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "11/30/2016"] <- "30-11-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/30/2016"] <- "30-12-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/31/2014"] <- "31-12-2014"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/31/2016"] <- "31-12-2016"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/31/2018"] <- "31-12-2018"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/31/2020"] <- "31-12-2020"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/31/2021"] <- "31-12-2021"
dfrElected$ExpirationDate[dfrElected$ExpirationDate == "12/31/2022"] <- "31-12-2022"

Clean Commisioned Date

dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04-03-12"] <- "04-03-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "29-10-12"] <- "29-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04-07-12"] <- "04-07-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "08-11-12"] <- "08-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03-04-13"] <- "03-04-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-09-12"] <- "01-09-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-03-09"] <- "01-03-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-03-11"] <- "01-03-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-03-13"] <- "01-03-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-03-12"] <- "01-03-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-09"] <- "01-01-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-05"] <- "01-01-2005"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-07"] <- "01-01-2007"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02-01-13"] <- "02-01-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-13"] <- "01-01-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-11"] <- "01-01-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-12"] <- "01-01-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-02-13"] <- "01-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03-12-13"] <- "03-12-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05-11-10"] <- "05-11-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-07-09"] <- "01-07-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02-02-12"] <- "02-02-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-04-12"] <- "01-04-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-12-09"] <- "01-12-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11-01-11"] <- "11-01-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12-08-11"] <- "12-08-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "06-01-12"] <- "06-01-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-01-10"] <- "07-01-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-01-12"] <- "07-01-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-09-13"] <- "01-09-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-10-12"] <- "07-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04-10-12"] <- "04-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-02-12"] <- "01-02-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "06-01-11"] <- "06-01-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-01-09"] <- "07-01-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10-12-10"] <- "10-12-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-02-09"] <- "01-02-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11-05-12"] <- "11-05-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04-12-11"] <- "04-12-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09-03-09"] <- "09-03-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-05-11"] <- "01-05-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05-01-12"] <- "05-01-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09-04-12"] <- "09-04-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02-08-13"] <- "02-08-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-10-11"] <- "01-10-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05-08-12"] <- "05-08-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-02-11"] <- "01-02-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11-03-11"] <- "11-03-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-01-11"] <- "07-01-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11-11-12"] <- "11-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-06-13"] <- "01-06-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02-06-13"] <- "02-06-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10-11-12"] <- "10-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12-03-12"] <- "12-03-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02-11-13"] <- "02-11-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10-08-12"] <- "10-08-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-03"] <- "01-01-2003"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-01-01"] <- "01-01-2001"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05-03-10"] <- "05-03-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04-11-12"] <- "04-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10-10-12"] <- "10-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03-11-13"] <- "03-11-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-02-12"] <- "07-02-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-04-11"] <- "01-04-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05-10-11"] <- "05-10-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12-06-10"] <- "12-06-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-02-09"] <- "07-02-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09-05-12"] <- "09-05-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04-06-10"] <- "04-06-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12-01-12"] <- "12-01-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07-04-11"] <- "07-04-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01-06-12"] <- "01-06-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09-10-12"] <- "09-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10/27/2009"] <- "27-10-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/28/2013"] <- "28-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/20/2012"] <- "20-01-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/25/2013"] <- "25-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/14/2008"] <- "14-11-2008"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04/14/2009"] <- "14-04-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/18/2010"] <- "18-02-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/21/2009"] <- "21-01-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/29/2011"] <- "29-11-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12/18/2012"] <- "18-12-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/15/2010"] <- "15-02-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/22/2009"] <- "22-01-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/17/2010"] <- "17-02-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/23/2010"] <- "23-11-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03/26/2012"] <- "26-03-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "08/27/2012"] <- "27-08-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/22/2012"] <- "22-02-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/28/2012"] <- "28-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12/13/2012"] <- "13-12-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/16/2012"] <- "16-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/24/2009"] <- "24-11-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/16/2011"] <- "16-09-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/21/2011"] <- "21-02-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "06/29/2011"] <- "29-06-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10/23/2012"] <- "23-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/14/2012"] <- "14-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/28/2013"] <- "28-01-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/20/2013"] <- "20-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05/18/2010"] <- "18-05-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12/28/2011"] <- "28-12-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/13/2011"] <- "13-01-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07/19/2010"] <- "19-07-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/23/2013"] <- "23-01-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/20/2012"] <- "20-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/15/2010"] <- "15-11-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05/14/2012"] <- "14-05-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/23/2009"] <- "23-02-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/26/2013"] <- "26-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03/21/2013"] <- "21-03-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/15/2013"] <- "15-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10/15/2008"] <- "15-10-2008"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "07/28/2008"] <- "28-07-2008"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03/29/2012"] <- "29-03-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04/27/2012"] <- "27-04-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12/13/2010"] <- "13-12-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/26/2011"] <- "26-09-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10/18/2012"] <- "18-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "12/19/2011"] <- "19-12-2011"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "06/21/2012"] <- "21-06-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/14/2013"] <- "14-01-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "04/20/2012"] <- "20-04-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05/25/2012"] <- "25-05-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/27/2012"] <- "27-09-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "10/15/2012"] <- "15-10-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "02/18/2013"] <- "18-02-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "05/22/2012"] <- "22-05-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "08/24/2009"] <- "24-08-2009"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/20/2012"] <- "20-09-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "03/26/2013"] <- "26-03-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "11/19/2012"] <- "19-11-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/23/2010"] <- "23-09-2010"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/28/2012"] <- "28-09-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "01/17/2013"] <- "17-01-2013"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "09/24/2012"] <- "24-09-2012"
dfrElected$CommisionedDate[dfrElected$CommisionedDate == "08/23/2012"] <- "23-08-2012"

Placing Salutation

removews<- gsub(" ", "", dfrElected$Gender, fixed = TRUE)
dfrElected$Salutation<- ifelse(removews=="F","Mrs","Mr")
dfrElected$Salutation<- ifelse(removews=="","",dfrElected$Salutation)
dfrElected$Salutation = paste(dfrElected$Salutation,dfrElected$CandidateName)

Show Cleaned File

dfrElected
##                          OfficeTitle
## 1          DSCC Member              
## 2          DSCC Member              
## 3          DSCC Member              
## 4          DSCC Member              
## 5          DSCC Member              
## 6          DSCC Member              
## 7          DSCC Member              
## 8          DSCC Member              
## 9          DSCC Member              
## 10         DSCC Member              
## 11         DSCC Member              
## 12         DSCC Member              
## 13         DSCC Member              
## 14         DSCC Member              
## 15         DSCC Member              
## 16         DSCC Member              
## 17         DSCC Member              
## 18         DSCC Member              
## 19         DSCC Member              
## 20         DSCC Member              
## 21         DSCC Member              
## 22         DSCC Member              
## 23         DSCC Member              
## 24         DSCC Member              
## 25         DSCC Member              
## 26         DSCC Member              
## 27         DSCC Member              
## 28         DSCC Member              
## 29         DSCC Member              
## 30         DSCC Member              
## 31         DSCC Member              
## 32         DSCC Member              
## 33         DSCC Member              
## 34         DSCC Member              
## 35         DSCC Member              
## 36         DSCC Member              
## 37         DSCC Member              
## 38         DSCC Member              
## 39         DSCC Member              
## 40         DSCC Member              
## 41         DSCC Member              
## 42         DSCC Member              
## 43         DSCC Member              
## 44         DSCC Member              
## 45         DSCC Member              
## 46         DSCC Member              
## 47         DSCC Member              
## 48         DSCC Member              
## 49         DSCC Member              
## 50         DSCC Member              
## 51         DSCC Member              
## 52         DSCC Member              
## 53         DSCC Member              
## 54         DSCC Member              
## 55         DSCC Member              
## 56         DSCC Member              
## 57         DSCC Member              
## 58         DSCC Member              
## 59         DSCC Member              
## 60         DSCC Member              
## 61         DSCC Member              
## 62         DSCC Member              
## 63         DSCC Member              
## 64         DSCC Member              
## 65                       DSCC Member
## 66         DSCC Member              
## 67         DSCC Member              
## 68         DSCC Member              
## 69         DSCC Member              
## 70         DSCC Member              
## 71         DSCC Member              
## 72         DSCC Member              
## 73         DSCC Member              
## 74         DSCC Member              
## 75         DSCC Member              
## 76         DSCC Member              
## 77         DSCC Member              
## 78         DSCC Member              
## 79         DSCC Member              
## 80         DSCC Member              
## 81         DSCC Member              
## 82         DSCC Member              
## 83         DSCC Member              
## 84         DSCC Member              
## 85         DSCC Member              
## 86         DSCC Member              
## 87         DSCC Member              
## 88         DSCC Member              
## 89         DSCC Member              
## 90         DSCC Member              
## 91         DSCC Member              
## 92         DSCC Member              
## 93         DSCC Member              
## 94         DSCC Member              
## 95         DSCC Member              
## 96         DSCC Member              
## 97         DSCC Member              
## 98         DSCC Member              
## 99         DSCC Member              
## 100        DSCC Member              
## 101        DSCC Member              
## 102        DSCC Member              
## 103        DSCC Member              
## 104        DSCC Member              
## 105        DSCC Member              
## 106        DSCC Member              
## 107        DSCC Member              
## 108        DSCC Member              
## 109        DSCC Member              
## 110        DSCC Member              
## 111        DSCC Member              
## 112        DSCC Member              
## 113        DSCC Member              
## 114        DSCC Member              
## 115        DSCC Member              
## 116        DSCC Member              
## 117        DSCC Member              
## 118        DSCC Member              
## 119        DSCC Member              
## 120        DSCC Member              
## 121        DSCC Member              
## 122        DSCC Member              
## 123        DSCC Member              
## 124        DSCC Member              
## 125        DSCC Member              
## 126        DSCC Member              
## 127        DSCC Member              
## 128        DSCC Member              
## 129        DSCC Member              
## 130        DSCC Member              
## 131        DSCC Member              
## 132        DSCC Member              
## 133        DSCC Member              
## 134        DSCC Member              
## 135        DSCC Member              
## 136        DSCC Member              
## 137        DSCC Member              
## 138        DSCC Member              
## 139        DSCC Member              
## 140        DSCC Member              
## 141        DSCC Member              
## 142        DSCC Member              
## 143        DSCC Member              
## 144        DSCC Member              
## 145        DSCC Member              
## 146        DSCC Member              
## 147        DSCC Member              
## 148        DSCC Member              
## 149        DSCC Member              
## 150        DSCC Member              
## 151        DSCC Member              
## 152        DSCC Member              
## 153        DSCC Member              
## 154        DSCC Member              
## 155        DSCC Member              
## 156        DSCC Member              
## 157        DSCC Member              
## 158        DSCC Member              
## 159        DSCC Member              
## 160        DSCC Member              
## 161        DSCC Member              
## 162        DSCC Member              
## 163        DSCC Member              
## 164        DSCC Member              
## 165        DSCC Member              
## 166        DSCC Member              
## 167        DSCC Member              
## 168        DSCC Member              
## 169        DSCC Member              
## 170        DSCC Member              
## 171        DSCC Member              
## 172        DSCC Member              
## 173        DSCC Member              
## 174        DSCC Member              
## 175        DSCC Member              
## 176        DSCC Member              
## 177        DSCC Member              
## 178        DSCC Member              
## 179        DSCC Member              
## 180        DSCC Member              
## 181        DSCC Member              
## 182        DSCC Member              
## 183        DSCC Member              
## 184        DSCC Member              
## 185        DSCC Member              
## 186        DSCC Member              
## 187        DSCC Member              
## 188        DSCC Member              
## 189        DSCC Member              
## 190        DSCC Member              
## 191        DSCC Member              
## 192        DSCC Member              
## 193        DSCC Member              
## 194        DSCC Member              
## 195        DSCC Member              
## 196        DSCC Member              
## 197        DSCC Member              
## 198        DSCC Member              
## 199        DSCC Member              
## 200        DSCC Member              
## 201        DSCC Member              
## 202        DSCC Member              
## 203        DSCC Member              
## 204        DSCC Member              
## 205        DSCC Member              
## 206        DSCC Member              
## 207        DSCC Member              
## 208        DSCC Member              
## 209        DSCC Member              
## 210        DSCC Member              
## 211        RSCC Member              
## 212        RSCC Member              
## 213        RSCC Member              
## 214        RSCC Member              
## 215        RSCC Member              
## 216        RSCC Member              
## 217        RSCC Member              
## 218        RSCC Member              
## 219        RSCC Member              
## 220        RSCC Member              
## 221        RSCC Member              
## 222        RSCC Member              
## 223        RSCC Member              
## 224        RSCC Member              
## 225        RSCC Member              
## 226        RSCC Member              
## 227        RSCC Member              
## 228        RSCC Member              
## 229        RSCC Member              
## 230        RSCC Member              
## 231        RSCC Member              
## 232        RSCC Member              
## 233        RSCC Member              
## 234        RSCC Member              
## 235        RSCC Member              
## 236        RSCC Member              
## 237        RSCC Member              
## 238        RSCC Member              
## 239        RSCC Member              
## 240        RSCC Member              
## 241        RSCC Member              
## 242        RSCC Member              
## 243        RSCC Member              
## 244        RSCC Member              
## 245        RSCC Member              
## 246        RSCC Member              
## 247        RSCC Member              
## 248        RSCC Member              
## 249        RSCC Member              
## 250        RSCC Member              
## 251        RSCC Member              
## 252        RSCC Member              
## 253        RSCC Member              
## 254        RSCC Member              
## 255        RSCC Member              
## 256        RSCC Member              
## 257        RSCC Member              
## 258        RSCC Member              
## 259        RSCC Member              
## 260        RSCC Member              
## 261        RSCC Member              
## 262        RSCC Member              
## 263        RSCC Member              
## 264        RSCC Member              
## 265        RSCC Member              
## 266        RSCC Member              
## 267        RSCC Member              
## 268        RSCC Member              
## 269        RSCC Member              
## 270        RSCC Member              
## 271        RSCC Member              
## 272        RSCC Member              
## 273        RSCC Member              
## 274        RSCC Member              
## 275        RSCC Member              
## 276        RSCC Member              
## 277        RSCC Member              
## 278        RSCC Member              
## 279        RSCC Member              
## 280        RSCC Member              
## 281        RSCC Member              
## 282        RSCC Member              
## 283        RSCC Member              
## 284        RSCC Member              
## 285        RSCC Member              
## 286        RSCC Member              
## 287        RSCC Member              
## 288        RSCC Member              
## 289        RSCC Member              
## 290        RSCC Member              
## 291        RSCC Member              
## 292        RSCC Member              
## 293        RSCC Member              
## 294        RSCC Member              
## 295        RSCC Member              
## 296        RSCC Member              
## 297        RSCC Member              
## 298        RSCC Member              
## 299        RSCC Member              
## 300        RSCC Member              
## 301        RSCC Member              
## 302        RSCC Member              
## 303        RSCC Member              
## 304        RSCC Member              
## 305        RSCC Member              
## 306        RSCC Member              
## 307        RSCC Member              
## 308        RSCC Member              
## 309        RSCC Member              
## 310        RSCC Member              
## 311        RSCC Member              
## 312        RSCC Member              
## 313        RSCC Member              
## 314        RSCC Member              
## 315        RSCC Member              
## 316        RSCC Member              
## 317        RSCC Member              
## 318        RSCC Member              
## 319        RSCC Member              
## 320        RSCC Member              
## 321        RSCC Member              
## 322        RSCC Member              
## 323        RSCC Member              
## 324        RSCC Member              
## 325        RSCC Member              
## 326        RSCC Member              
## 327        RSCC Member              
## 328        RSCC Member              
## 329        RSCC Member              
## 330        RSCC Member              
## 331        RSCC Member              
## 332        RSCC Member              
## 333        RSCC Member              
## 334        RSCC Member              
## 335        RSCC Member              
## 336        RSCC Member              
## 337        RSCC Member              
## 338        RSCC Member              
## 339        RSCC Member              
## 340        RSCC Member              
## 341        RSCC Member              
## 342        RSCC Member              
## 343        RSCC Member              
## 344        RSCC Member              
## 345        RSCC Member              
## 346        RSCC Member              
## 347        RSCC Member              
## 348        RSCC Member              
## 349        RSCC Member              
## 350        RSCC Member              
## 351        RSCC Member              
## 352        RSCC Member              
## 353        RSCC Member              
## 354        RSCC Member              
## 355        RSCC Member              
## 356        RSCC Member              
## 357        RSCC Member              
## 358        RSCC Member              
## 359        RSCC Member              
## 360        RSCC Member              
## 361        RSCC Member              
## 362        RSCC Member              
## 363        RSCC Member              
## 364        RSCC Member              
## 365        RSCC Member              
## 366        RSCC Member              
## 367        RSCC Member              
## 368        RSCC Member              
## 369        RSCC Member              
## 370        RSCC Member              
## 371        RSCC Member              
## 372        RSCC Member              
## 373        RSCC Member              
## 374        RSCC Member              
## 375        RSCC Member              
## 376        RSCC Member              
## 377        RSCC Member              
## 378        RSCC Member              
## 379        RSCC Member              
## 380        RSCC Member              
## 381        RSCC Member              
## 382        RSCC Member              
## 383        RSCC Member              
## 384        RSCC Member              
## 385        RSCC Member              
## 386        RSCC Member              
## 387        RSCC Member              
## 388        RSCC Member              
## 389        RSCC Member              
## 390        RSCC Member              
## 391        RSCC Member              
## 392        RSCC Member              
## 393        RSCC Member              
## 394        RSCC Member              
## 395        RSCC Member              
## 396        RSCC Member              
## 397        RSCC Member              
## 398        RSCC Member              
## 399        RSCC Member              
## 400        RSCC Member              
## 401        RSCC Member              
## 402        RSCC Member              
## 403        RSCC Member              
## 404        RSCC Member              
## 405        RSCC Member              
## 406        RSCC Member              
## 407        RSCC Member              
## 408        RSCC Member              
## 409        RSCC Member              
## 410        RSCC Member              
## 411        RSCC Member              
## 412        RSCC Member              
## 413        RSCC Member              
## 414        RSCC Member              
## 415        RSCC Member              
## 416        RSCC Member              
## 417        RSCC Member              
## 418        RSCC Member              
## 419        RSCC Member              
## 420        RSCC Member              
## 421        RSCC Member              
## 422        RSCC Member              
## 423        RSCC Member              
## 424        RSCC Member              
## 425        RSCC Member              
## 426        RSCC Member              
## 427        RSCC Member              
## 428        RSCC Member              
## 429        RSCC Member              
## 430        RSCC Member              
## 431        RSCC Member              
## 432        RSCC Member              
## 433        RSCC Member              
## 434        RSCC Member              
## 435        RSCC Member              
## 436        RSCC Member              
## 437        RSCC Member              
## 438        RSCC Member              
## 439        RSCC Member              
## 440        RSCC Member              
## 441        RSCC Member              
## 442        RSCC Member              
## 443        RSCC Member              
## 444        Governor                 
## 445        Lieutenant Governor      
## 446        Secretary of State       
## 447        Attorney General         
## 448        State Treasurer          
## 449         Commisioner             
## 450         Commisioner             
## 451          U S Senator            
## 452          U S Senator            
## 453          U S Representative     
## 454          U S Representative     
## 455          U S Representative     
## 456          U S Representative     
## 457          U S Representative     
## 458          U S Representative     
## 459         Asociate Justice        
## 460         Asociate Justice        
## 461         Asociate Justice        
## 462         Asociate Justice        
## 463         Asociate Justice        
## 464         Asociate Justice        
## 465         Asociate Justice        
## 466         Judge Court of Appeal   
## 467         Judge Court of Appeal   
## 468         Judge Court of Appeal   
## 469         Judge Court of Appeal   
## 470         Judge Court of Appeal   
## 471         Judge Court of Appeal   
## 472         Judge Court of Appeal   
## 473         Judge Court of Appeal   
## 474         Judge Court of Appeal   
## 475         Judge Court of Appeal   
## 476         Judge Court of Appeal   
## 477         Judge Court of Appeal   
## 478            Judge Court of Appeal
## 479         Judge Court of Appeal   
## 480         Judge Court of Appeal   
## 481         Judge Court of Appeal   
## 482         Judge Court of Appeal   
## 483         Judge Court of Appeal   
## 484         Judge Court of Appeal   
## 485         Judge Court of Appeal   
## 486         Judge Court of Appeal   
## 487         Judge Court of Appeal   
## 488         Judge Court of Appeal   
## 489         Judge Court of Appeal   
## 490         Judge Court of Appeal   
## 491         Judge Court of Appeal   
## 492         Judge Court of Appeal   
## 493         Judge Court of Appeal   
## 494         Judge Court of Appeal   
## 495         Judge Court of Appeal   
## 496         Judge Court of Appeal   
## 497         Judge Court of Appeal   
## 498         Judge Court of Appeal   
## 499         Judge Court of Appeal   
## 500         Judge Court of Appeal   
## 501         Judge Court of Appeal   
## 502         Judge Court of Appeal   
## 503         Judge Court of Appeal   
## 504         Judge Court of Appeal   
## 505         Judge Court of Appeal   
## 506         Judge Court of Appeal   
## 507         Judge Court of Appeal   
## 508         Judge Court of Appeal   
## 509            Judge Court of Appeal
## 510         Judge Court of Appeal   
## 511         Judge Court of Appeal   
## 512         Judge Court of Appeal   
## 513         Judge Court of Appeal   
## 514            Judge Court of Appeal
## 515            Judge Court of Appeal
## 516            Judge Court of Appeal
## 517            Judge Court of Appeal
## 518         Judge Court of Appeal   
## 519         Judge Court of Appeal   
## 520         Public Service Commision
## 521         Public Service Commision
## 522         Public Service Commision
## 523         Public Service Commision
## 524         Public Service Commision
## 525         Member BESE             
## 526         Member BESE             
## 527         Member BESE             
## 528         Member BESE             
## 529         Member BESE             
## 530         Member BESE             
## 531         Member BESE             
## 532         Member BESE             
## 533                    State Senator
## 534        State Senator            
## 535        State Senator            
## 536        State Senator            
## 537        State Senator            
## 538        State Senator            
## 539        State Senator            
## 540        State Senator            
## 541        State Senator            
## 542        State Senator            
## 543        State Senator            
## 544        State Senator            
## 545        State Senator            
## 546        State Senator            
## 547        State Senator            
## 548        State Senator            
## 549        State Senator            
## 550        State Senator            
## 551        State Senator            
## 552        State Senator            
## 553        State Senator            
## 554        State Senator            
## 555        State Senator            
## 556        State Senator            
## 557        State Senator            
## 558        State Senator            
## 559        State Senator            
## 560        State Senator            
## 561        State Senator            
## 562        State Senator            
## 563        State Senator            
## 564        State Senator            
## 565        State Senator            
## 566        State Senator            
## 567        State Senator            
## 568        State Senator            
## 569        State Senator            
## 570        State Senator            
## 571        State Senator            
## 572        State Representative     
## 573        State Representative     
## 574        State Representative     
## 575        State Representative     
## 576        State Representative     
## 577        State Representative     
## 578        State Representative     
## 579        State Representative     
## 580        State Representative     
## 581        State Representative     
## 582        State Representative     
## 583        State Representative     
## 584        State Representative     
## 585        State Representative     
## 586        State Representative     
## 587        State Representative     
## 588        State Representative     
## 589        State Representative     
## 590        State Representative     
## 591        State Representative     
## 592        State Representative     
## 593        State Representative     
## 594        State Representative     
## 595        State Representative     
## 596        State Representative     
## 597        State Representative     
## 598        State Representative     
## 599        State Representative     
## 600        State Representative     
## 601        State Representative     
## 602        State Representative     
## 603        State Representative     
## 604        State Representative     
## 605        State Representative     
## 606        State Representative     
## 607        State Representative     
## 608        State Representative     
## 609        State Representative     
## 610        State Representative     
## 611        State Representative     
## 612        State Representative     
## 613        State Representative     
## 614        State Representative     
## 615        State Representative     
## 616        State Representative     
## 617        State Representative     
## 618        State Representative     
## 619        State Representative     
## 620        State Representative     
## 621        State Representative     
## 622        State Representative     
## 623        State Representative     
## 624        State Representative     
## 625        State Representative     
## 626        State Representative     
## 627        State Representative     
## 628        State Representative     
## 629        State Representative     
## 630        State Representative     
## 631        State Representative     
## 632        State Representative     
## 633        State Representative     
## 634        State Representative     
## 635        State Representative     
## 636        State Representative     
## 637        State Representative     
## 638        State Representative     
## 639        State Representative     
## 640        State Representative     
## 641        State Representative     
## 642        State Representative     
## 643        State Representative     
## 644        State Representative     
## 645        State Representative     
## 646        State Representative     
## 647        State Representative     
## 648        State Representative     
## 649        State Representative     
## 650        State Representative     
## 651        State Representative     
## 652        State Representative     
## 653        State Representative     
## 654        State Representative     
## 655        State Representative     
## 656        State Representative     
## 657        State Representative     
## 658        State Representative     
## 659        State Representative     
## 660        State Representative     
## 661        State Representative     
## 662        State Representative     
## 663        State Representative     
## 664        State Representative     
## 665             State Representative
## 666        State Representative     
## 667        State Representative     
## 668        State Representative     
## 669        State Representative     
## 670        State Representative     
## 671        State Representative     
## 672        State Representative     
## 673        State Representative     
## 674        State Representative     
## 675        State Representative     
## 676        State Representative     
## 677        District Judge           
## 678        District Judge           
## 679        District Judge           
## 680        District Judge           
## 681        District Judge           
## 682        District Judge           
## 683        District Judge           
## 684        District Judge           
## 685        District Judge           
## 686        District Judge           
## 687        District Judge           
## 688        District Judge           
## 689        District Judge           
## 690        District Judge           
## 691        District Judge           
## 692        District Judge           
## 693        District Judge           
## 694        District Judge           
## 695        District Judge           
## 696        District Judge           
## 697        District Judge           
## 698        District Judge           
## 699        District Judge           
## 700        District Judge           
## 701        District Judge           
## 702        District Judge           
## 703        District Judge           
## 704        District Judge           
## 705        District Judge           
## 706        District Judge           
## 707        District Judge           
## 708        District Judge           
## 709        District Judge           
## 710        District Judge           
## 711        District Judge           
## 712        District Judge           
## 713        District Judge           
## 714        District Judge           
## 715        District Judge           
## 716        District Judge           
## 717        District Judge           
## 718        District Judge           
## 719        District Judge           
## 720        District Judge           
## 721        District Judge           
## 722        District Judge           
## 723        District Judge           
## 724        District Judge           
## 725        District Judge           
## 726        District Judge           
## 727        District Judge           
## 728        District Judge           
## 729        District Judge           
## 730        District Judge           
## 731        District Judge           
## 732        District Judge           
## 733        District Judge           
## 734        District Judge           
## 735        District Judge           
## 736        District Judge           
## 737        District Judge           
## 738        District Judge           
## 739        District Judge           
## 740        District Judge           
## 741        District Judge           
## 742        District Judge           
## 743        District Judge           
## 744        District Judge           
## 745        District Judge           
## 746        District Judge           
## 747        District Judge           
## 748        District Judge           
## 749        District Judge           
## 750        District Judge           
## 751        District Judge           
## 752        District Judge           
## 753        District Judge           
## 754        District Judge           
## 755        District Judge           
## 756        District Judge           
## 757        District Judge           
## 758        District Judge           
## 759        District Judge           
## 760        District Judge           
## 761        District Judge           
## 762        District Judge           
## 763        District Judge           
## 764        District Judge           
## 765        District Judge           
## 766        District Judge           
## 767                   District Judge
## 768        District Judge           
## 769        District Judge           
## 770        District Judge           
## 771        District Judge           
## 772        District Judge           
## 773        District Judge           
## 774        District Judge           
## 775        District Judge           
## 776        District Judge           
## 777        District Judge           
## 778        District Judge           
## 779        District Judge           
## 780        District Judge           
## 781        District Judge           
## 782        District Judge           
## 783        District Judge           
## 784        District Judge           
## 785        District Judge           
## 786        District Judge           
## 787        District Judge           
## 788        District Judge           
## 789        District Judge           
## 790        District Judge           
## 791        District Judge           
## 792        District Judge           
## 793        District Judge           
## 794        District Judge           
## 795        District Judge           
## 796        District Judge           
## 797        District Judge           
## 798        District Judge           
## 799        District Judge           
## 800        District Judge           
## 801        District Judge           
## 802        District Judge           
## 803        District Judge           
## 804        District Judge           
## 805        District Judge           
## 806        District Judge           
## 807        District Judge           
## 808        District Judge           
## 809        District Judge           
## 810        District Judge           
## 811        District Judge           
## 812        District Judge           
## 813        District Judge           
## 814        District Judge           
## 815        District Judge           
## 816        District Judge           
## 817        District Judge           
## 818        District Judge           
## 819        District Judge           
## 820        District Judge           
## 821        District Judge           
## 822        District Judge           
## 823        District Judge           
## 824        District Judge           
## 825        District Judge           
## 826        District Judge           
## 827        District Judge           
## 828        District Judge           
## 829        District Judge           
## 830        District Judge           
## 831        District Judge           
## 832        District Judge           
## 833        District Judge           
## 834        District Judge           
## 835        District Judge           
## 836        District Judge           
## 837        District Judge           
## 838        District Judge           
## 839        District Judge           
## 840        District Judge           
## 841        District Judge           
## 842        District Judge           
## 843        District Judge           
## 844        District Judge           
## 845                   District Judge
## 846                   District Judge
## 847                   District Judge
## 848                   District Judge
## 849                   District Judge
## 850        District Judge           
## 851        District Judge           
## 852        District Judge           
## 853        District Judge           
## 854        District Judge           
## 855        District Judge           
## 856        District Judge           
## 857        District Judge           
## 858        District Judge           
## 859        District Judge           
## 860        District Judge           
## 861        District Judge           
## 862        District Judge           
## 863        District Judge           
## 864        District Judge           
## 865        District Judge           
## 866        District Judge           
## 867        District Judge           
## 868        Judge                    
## 869        Judge                    
## 870        Judge                    
## 871        Judge                    
## 872        Judge                    
## 873        Judge                    
## 874        Judge                    
## 875        Judge                    
## 876        Judge                    
## 877        Judge                    
## 878                            Judge
## 879        Judge                    
## 880        Judge                    
## 881        Judge                    
## 882                            Judge
## 883        Judge                    
## 884        Judge                    
## 885        Judge                    
## 886        Judge                    
## 887        Judge                    
## 888        Judge                    
## 889        Judge                    
## 890        Judge                    
## 891        Judge                    
## 892        Judge                    
## 893        Judge                    
## 894        Judge                    
## 895        Magistrate               
## 896        District Attorney        
## 897        District Attorney        
## 898        District Attorney        
## 899        District Attorney        
## 900                District Attorney
## 901        District Attorney        
## 902        District Attorney        
## 903        District Attorney        
## 904        District Attorney        
## 905        District Attorney        
## 906        District Attorney        
## 907        District Attorney        
## 908        District Attorney        
## 909        District Attorney        
## 910        District Attorney        
## 911        District Attorney        
## 912        District Attorney        
## 913        District Attorney        
## 914        District Attorney        
## 915        District Attorney        
## 916        District Attorney        
## 917        District Attorney        
## 918        District Attorney        
## 919        District Attorney        
## 920        District Attorney        
## 921        District Attorney        
## 922        District Attorney        
## 923        District Attorney        
## 924        District Attorney        
## 925        District Attorney        
## 926        District Attorney        
## 927        District Attorney        
## 928        District Attorney        
## 929        District Attorney        
## 930        District Attorney        
## 931        District Attorney        
## 932        District Attorney        
## 933        District Attorney        
## 934        District Attorney        
## 935        District Attorney        
## 936                District Attorney
## 937        District Attorney        
## 938        City Judge               
## 939         City Judge City Court   
## 940         City Judge City Court   
## 941         City Judge City Court   
## 942         City Judge City Court   
## 943        City Marshal             
## 944        City Marshal             
## 945                            Mayor
## 946        Mayor                    
## 947        Mayor                    
## 948        Mayor                    
## 949        Mayor                    
## 950        Mayor                    
## 951                            Mayor
## 952        Mayor                    
## 953        Mayor                    
## 954        Mayor                    
## 955        Chief of Police          
## 956        Chief of Police          
## 957        Chief of Police          
## 958        Chief of Police          
## 959        Chief of Police          
## 960        Chief of Police          
## 961        Chief of Police          
## 962        Alderman at Large        
## 963        Alderman at Large        
## 964        Councilman at Large      
## 965        Councilman at Large      
## 966        Councilman at Large      
## 967        Alderman                 
## 968        Alderman                 
## 969        Alderman                 
## 970        Alderman                 
## 971        Alderman                 
## 972        Alderman                 
## 973        Alderman                 
## 974        Alderman                 
## 975        Alderman                 
## 976        Alderman                 
## 977        Alderman                 
## 978        Alderman                 
## 979        Alderman                 
## 980        Alderman                 
## 981        Alderman                 
## 982        Alderman                 
## 983        Alderman                 
## 984        Alderman                 
## 985        Alderman                 
## 986        Alderman                 
## 987        Alderman                 
## 988        Alderman                 
## 989        Alderman                 
## 990        Alderman                 
## 991        Alderman                 
## 992        Alderman                 
## 993        Alderman                 
## 994        Alderman                 
## 995        Alderman                 
## 996        Councilman               
## 997        Councilman               
## 998        Councilman               
## 999        Councilman               
## 1000       Councilman               
## 1001       Councilman               
## 1002       Councilman               
## 1003       Councilman               
## 1004       Councilman               
## 1005       Councilman               
## 1006       Councilman               
## 1007       Councilman               
## 1008       Councilman               
## 1009       Councilman               
## 1010       Councilman               
## 1011       Councilman               
## 1012       Councilman               
## 1013       Councilman               
## 1014       DPEC Member              
## 1015       DPEC Member              
## 1016       DPEC Member              
## 1017       DPEC Member              
## 1018       DPEC Member              
## 1019       DPEC Member              
## 1020       DPEC Member              
## 1021       DPEC Member              
## 1022       DPEC Member              
## 1023       RPEC Member              
## 1024       RPEC Member              
## 1025       RPEC Member              
## 1026       RPEC Member              
## 1027       RPEC Member              
## 1028       RPEC Member              
## 1029       RPEC Member              
## 1030       RPEC Member              
## 1031       RPEC Member              
## 1032       RPEC Member              
## 1033       RPEC Member              
## 1034       RPEC Member              
## 1035       Sheriff                  
## 1036       Clerk of Court           
## 1037         Asesor                 
## 1038       Coroner                  
## 1039                    Police Juror
## 1040       Police Juror             
## 1041       Police Juror             
## 1042       Police Juror             
## 1043       Police Juror             
## 1044       Police Juror             
## 1045       Police Juror             
## 1046       Police Juror             
## 1047       City Judge               
## 1048       City Judge               
## 1049       City Marshal             
## 1050       City Marshal             
## 1051       Member of School Board   
## 1052       Member of School Board   
## 1053       Member of School Board   
## 1054       Member of School Board   
## 1055       Member of School Board   
## 1056       Member of School Board   
## 1057       Member of School Board   
## 1058       Member of School Board   
## 1059       Justice of the Peace     
## 1060       Justice of the Peace     
## 1061       Justice of the Peace     
## 1062       Justice of the Peace     
## 1063       Justice of the Peace     
## 1064       Constable                
## 1065       Constable                
## 1066       Constable                
## 1067       Constable                
## 1068       Constable                
## 1069       Mayor                    
## 1070       Mayor                    
## 1071                           Mayor
## 1072       Mayor                    
## 1073                           Mayor
## 1074       Mayor                    
## 1075       Mayor                    
## 1076       Chief of Police          
## 1077       Chief of Police          
## 1078       Chief of Police          
## 1079       Chief of Police          
## 1080       Chief of Police          
## 1081                 Chief of Police
## 1082       Chief of Police          
## 1083       Alderman at Large        
## 1084       Alderman at Large        
## 1085       Alderman                 
## 1086       Alderman                 
## 1087       Alderman                 
## 1088       Alderman                 
## 1089       Alderman                 
## 1090       Alderman                 
## 1091       Alderman                 
## 1092       Alderman                 
## 1093       Alderman                 
## 1094       Alderman                 
## 1095       Alderman                 
## 1096       Alderman                 
## 1097       Alderman                 
## 1098       Alderman                 
## 1099       Alderman                 
## 1100       Alderman                 
## 1101       Alderman                 
## 1102       Alderman                 
## 1103       Alderman                 
## 1104       Alderman                 
## 1105       Alderman                 
## 1106       Alderman                 
## 1107       Alderman                 
## 1108       Alderman                 
## 1109       Alderman                 
## 1110       Alderman                 
## 1111       Alderman                 
## 1112       Alderman                 
## 1113       Alderman                 
## 1114       Alderman                 
## 1115       Alderman                 
## 1116       DPEC Member              
## 1117       DPEC Member              
## 1118       DPEC Member              
## 1119       DPEC Member              
## 1120       DPEC Member              
## 1121       DPEC Member              
## 1122       DPEC Member              
## 1123       DPEC Member              
## 1124       RPEC Member              
## 1125       RPEC Member              
## 1126       RPEC Member              
## 1127       RPEC Member              
## 1128       RPEC Member              
## 1129       RPEC Member              
## 1130       RPEC Member              
## 1131       RPEC Member              
## 1132       Sheriff                  
## 1133       Clerk of Court           
## 1134         Asesor                 
## 1135       Coroner                  
## 1136                    Police Juror
## 1137       Police Juror             
## 1138       Police Juror             
## 1139       Police Juror             
## 1140       Police Juror             
## 1141       Police Juror             
## 1142       Police Juror             
## 1143       City Judge               
## 1144       City Marshal             
## 1145          Member of School Board
## 1146       Member of School Board   
## 1147       Member of School Board   
## 1148       Member of School Board   
## 1149       Member of School Board   
## 1150       Member of School Board   
## 1151       Member of School Board   
## 1152       Justice of the Peace     
## 1153       Justice of the Peace     
## 1154       Justice of the Peace     
## 1155       Justice of the Peace     
## 1156       Constable                
## 1157       Constable                
## 1158       Constable                
## 1159       Constable                
## 1160       Mayor                    
## 1161       Mayor                    
## 1162                           Mayor
## 1163       Mayor                    
## 1164       Mayor                    
## 1165       Chief of Police          
## 1166       Chief of Police          
## 1167       Chief of Police          
## 1168       Chief of Police          
## 1169       Chief of Police          
## 1170       Alderman at Large        
## 1171       Council Member           
## 1172                  Council Member
## 1173       Alderman                 
## 1174       Alderman                 
## 1175       Alderman                 
## 1176       Alderman                 
## 1177       Alderman                 
## 1178       Alderman                 
## 1179       Alderman                 
## 1180       Alderman                 
## 1181       Alderman                 
## 1182       Alderman                 
## 1183       Alderman                 
## 1184       Alderman                 
## 1185                  Council Member
## 1186       Council Member           
## 1187       Council Member           
## 1188       Council Member           
## 1189       Council Member           
## 1190       Council Member           
## 1191       Council Member           
## 1192       Council Member           
## 1193       DPEC Member              
## 1194       DPEC Member              
## 1195       DPEC Member              
## 1196       DPEC Member              
## 1197       DPEC Member              
## 1198       DPEC Member              
## 1199       DPEC Member              
## 1200       DPEC Member              
## 1201       DPEC Member              
## 1202       DPEC Member              
## 1203       DPEC Member              
## 1204       DPEC Member              
## 1205       DPEC Member              
## 1206       RPEC Member              
## 1207       RPEC Member              
## 1208       RPEC Member              
## 1209       RPEC Member              
## 1210       RPEC Member              
## 1211       RPEC Member              
## 1212       RPEC Member              
## 1213       RPEC Member              
## 1214       RPEC Member              
## 1215       RPEC Member              
## 1216       RPEC Member              
## 1217       RPEC Member              
## 1218       RPEC Member              
## 1219       RPEC Member              
## 1220       RPEC Member              
## 1221       RPEC Member              
## 1222       Judge                    
## 1223       Sheriff                  
## 1224       Clerk of Court           
## 1225         Asesor                 
## 1226       Coroner                  
## 1227       Parish President         
## 1228       Council Member           
## 1229       Council Member           
## 1230       Council Member           
## 1231       Council Member           
## 1232       Council Member           
## 1233       Council Member           
## 1234       Council Member           
## 1235       Council Member           
## 1236       Council Member           
## 1237       Council Member           
## 1238       Council Member           
## 1239          Member of School Board
## 1240       Member of School Board   
## 1241       Member of School Board   
## 1242       Member of School Board   
## 1243       Member of School Board   
## 1244       Member of School Board   
## 1245       Member of School Board   
## 1246       Member of School Board   
## 1247       Member of School Board   
## 1248       Member of School Board   
## 1249       Member of School Board   
## 1250       Justice of the Peace     
## 1251       Justice of the Peace     
## 1252       Justice of the Peace     
## 1253       Constable                
## 1254       Constable                
## 1255       Constable                
## 1256                           Mayor
## 1257       Mayor                    
## 1258       Mayor                    
## 1259       Chief of Police          
## 1260       Chief of Police          
## 1261       Chief of Police          
## 1262       Council Member           
## 1263       Council Member           
## 1264       Council Member           
## 1265       Council Member           
## 1266       Council Member           
## 1267       Council Member           
## 1268       Council Member           
## 1269       Council Member           
## 1270       Council Member           
## 1271       Council Member           
## 1272       Council Member           
## 1273       Council Member           
## 1274       Council Member           
## 1275       Council Member           
## 1276       Council Member           
## 1277       DPEC Member              
## 1278       DPEC Member              
## 1279       DPEC Member              
## 1280       DPEC Member              
## 1281       DPEC Member              
## 1282       DPEC Member              
## 1283       DPEC Member              
## 1284       DPEC Member              
## 1285       DPEC Member              
## 1286       DPEC Member              
## 1287       RPEC Member              
## 1288       RPEC Member              
## 1289       RPEC Member              
## 1290       RPEC Member              
## 1291       RPEC Member              
## 1292       RPEC Member              
## 1293       RPEC Member              
## 1294       RPEC Member              
## 1295       RPEC Member              
## 1296       RPEC Member              
## 1297       Sheriff                  
## 1298       Clerk of Court           
## 1299         Asesor                 
## 1300       Coroner                  
## 1301       Police Juror             
## 1302       Police Juror             
## 1303       Police Juror             
## 1304       Police Juror             
## 1305       Police Juror             
## 1306       Police Juror             
## 1307       Police Juror             
## 1308       Police Juror             
## 1309       Police Juror             
## 1310       Member of School Board   
## 1311       Member of School Board   
## 1312       Member of School Board   
## 1313       Member of School Board   
## 1314       Member of School Board   
## 1315       Member of School Board   
## 1316       Member of School Board   
## 1317       Member of School Board   
## 1318       Member of School Board   
## 1319       Justice of the Peace     
## 1320       Justice of the Peace     
## 1321       Justice of the Peace     
## 1322       Constable                
## 1323       Constable                
## 1324       Constable                
## 1325                           Mayor
## 1326       Alderman                 
## 1327       Alderman                 
## 1328       Alderman                 
## 1329       DPEC Member              
## 1330       DPEC Member              
## 1331       DPEC Member              
## 1332       DPEC Member              
## 1333       DPEC Member              
## 1334       DPEC Member              
## 1335       DPEC Member              
## 1336       DPEC Member              
## 1337       DPEC Member              
## 1338       DPEC Member              
## 1339       RPEC Member              
## 1340       RPEC Member              
## 1341       RPEC Member              
## 1342       RPEC Member              
## 1343       RPEC Member              
## 1344       RPEC Member              
## 1345       RPEC Member              
## 1346       RPEC Member              
## 1347       RPEC Member              
## 1348       RPEC Member              
## 1349       Sheriff                  
## 1350       Clerk of Court           
## 1351         Asesor                 
## 1352       Coroner                  
## 1353                    Police Juror
## 1354       Police Juror             
## 1355       Police Juror             
## 1356       Police Juror             
## 1357       Police Juror             
## 1358       Police Juror             
## 1359       Police Juror             
## 1360       Police Juror             
## 1361       Police Juror             
## 1362       City Judge               
## 1363       City Judge               
## 1364       City Marshal             
## 1365       City Marshal             
## 1366          Member of School Board
## 1367       Member of School Board   
## 1368       Member of School Board   
## 1369       Member of School Board   
## 1370       Member of School Board   
## 1371       Member of School Board   
## 1372       Member of School Board   
## 1373       Member of School Board   
## 1374       Member of School Board   
## 1375       Justice of the Peace     
## 1376       Justice of the Peace     
## 1377       Justice of the Peace     
## 1378       Justice of the Peace     
## 1379       Justice of the Peace     
## 1380       Justice of the Peace     
## 1381       Justice of the Peace     
## 1382       Justice of the Peace     
## 1383       Justice of the Peace     
## 1384       Constable                
## 1385       Constable                
## 1386       Constable                
## 1387       Constable                
## 1388       Constable                
## 1389       Constable                
## 1390       Constable                
## 1391       Constable                
## 1392       Constable                
## 1393       Mayor                    
## 1394       Mayor                    
## 1395       Mayor                    
## 1396       Mayor                    
## 1397       Mayor                    
## 1398       Mayor                    
## 1399       Mayor                    
## 1400       Mayor                    
## 1401       Mayor                    
## 1402       Chief of Police          
## 1403       Chief of Police          
## 1404       Chief of Police          
## 1405                 Chief of Police
## 1406       Chief of Police          
## 1407                         Marshal
## 1408       Alderman at Large        
## 1409       Alderman at Large        
## 1410       Council Member at Large  
## 1411       Alderman                 
## 1412       Alderman                 
## 1413       Alderman                 
## 1414       Alderman                 
## 1415       Alderman                 
## 1416       Alderman                 
## 1417       Alderman                 
## 1418       Alderman                 
## 1419       Alderman                 
## 1420       Alderman                 
## 1421       Alderman                 
## 1422       Alderman                 
## 1423       Alderman                 
## 1424       Alderman                 
## 1425       Alderman                 
## 1426       Alderman                 
## 1427       Alderman                 
## 1428       Alderman                 
## 1429       Alderman                 
## 1430       Alderman                 
## 1431       Alderman                 
## 1432       Alderman                 
## 1433       Alderman                 
## 1434       Alderman                 
## 1435       Alderman                 
## 1436       Alderman                 
## 1437       Alderman                 
## 1438       Alderman                 
## 1439       Alderman                 
## 1440       Alderman                 
## 1441       Alderman                 
## 1442       Alderman                 
## 1443       Council Member           
## 1444       Council Member           
## 1445       Council Member           
## 1446       Council Member           
## 1447       DPEC Member              
## 1448       DPEC Member              
## 1449       DPEC Member              
## 1450       DPEC Member              
## 1451       DPEC Member              
## 1452       DPEC Member              
## 1453       DPEC Member              
## 1454       DPEC Member              
## 1455       DPEC Member              
## 1456       DPEC Member              
## 1457       DPEC Member              
## 1458       DPEC Member              
## 1459       DPEC Member              
## 1460       DPEC Member              
## 1461       DPEC Member              
## 1462       RPEC Member              
## 1463       RPEC Member              
## 1464       RPEC Member              
## 1465       RPEC Member              
## 1466       RPEC Member              
## 1467       RPEC Member              
## 1468       RPEC Member              
## 1469       RPEC Member              
## 1470       RPEC Member              
## 1471       RPEC Member              
## 1472       RPEC Member              
## 1473       RPEC Member              
## 1474       Sheriff                  
## 1475       Clerk of Court           
## 1476         Asesor                 
## 1477       Coroner                  
## 1478                    Police Juror
## 1479       Police Juror             
## 1480       Police Juror             
## 1481       Police Juror             
## 1482       Police Juror             
## 1483       Police Juror             
## 1484       Police Juror             
## 1485       Police Juror             
## 1486       Police Juror             
## 1487       Police Juror             
## 1488          Member of School Board
## 1489       Member of School Board   
## 1490       Member of School Board   
## 1491       Member of School Board   
## 1492       Member of School Board   
## 1493       Member of School Board   
## 1494       Member of School Board   
## 1495       Member of School Board   
## 1496       Member of School Board   
## 1497       Member of School Board   
## 1498       Justice of the Peace     
## 1499       Justice of the Peace     
## 1500       Justice of the Peace     
## 1501       Justice of the Peace     
## 1502       Constable                
## 1503       Constable                
## 1504       Constable                
## 1505       Constable                
## 1506                           Mayor
## 1507       Chief of Police          
## 1508       Alderman                 
## 1509       Alderman                 
## 1510       Alderman                 
## 1511       Alderman                 
## 1512       Alderman                 
## 1513       DPEC Member              
## 1514       DPEC Member              
## 1515       DPEC Member              
## 1516       DPEC Member              
## 1517       DPEC Member              
## 1518       DPEC Member              
## 1519       DPEC Member              
## 1520       DPEC Member              
## 1521       RPEC Member              
## 1522       RPEC Member              
## 1523       RPEC Member              
## 1524       RPEC Member              
## 1525       RPEC Member              
## 1526       RPEC Member              
## 1527       RPEC Member              
## 1528       RPEC Member              
## 1529       Sheriff                  
## 1530       Clerk of Court           
## 1531         Asesor                 
## 1532       Coroner                  
## 1533                    Police Juror
## 1534       Police Juror             
## 1535       Police Juror             
## 1536       Police Juror             
## 1537       Police Juror             
## 1538       Police Juror             
## 1539       Police Juror             
## 1540       Member of School Board   
## 1541       Member of School Board   
## 1542       Member of School Board   
## 1543       Member of School Board   
## 1544       Member of School Board   
## 1545       Member of School Board   
## 1546       Member of School Board   
## 1547       Justice of the Peace     
## 1548       Justice of the Peace     
## 1549       Justice of the Peace     
## 1550       Justice of the Peace     
## 1551       Justice of the Peace     
## 1552                       Constable
## 1553                       Constable
## 1554                       Constable
## 1555                       Constable
## 1556                       Constable
## 1557                           Mayor
## 1558       Mayor                    
## 1559       Mayor                    
## 1560                           Mayor
## 1561       Mayor                    
## 1562                           Mayor
## 1563       Mayor                    
## 1564       Mayor                    
## 1565       Mayor                    
## 1566                           Mayor
## 1567       Chief of Police          
## 1568       Chief of Police          
## 1569                 Chief of Police
## 1570       Chief of Police          
## 1571       Chief of Police          
## 1572       Alderman                 
## 1573       Alderman                 
## 1574       Alderman                 
## 1575       Alderman                 
## 1576       Alderman                 
## 1577       Alderman                 
## 1578       Alderman                 
## 1579       Alderman                 
## 1580       Alderman                 
## 1581       Alderman                 
## 1582       Alderman                 
## 1583       Alderman                 
## 1584       Alderman                 
## 1585       Alderman                 
## 1586       Alderman                 
## 1587       Alderman                 
## 1588       Alderman                 
## 1589       Alderman                 
## 1590       Alderman                 
## 1591       Alderman                 
## 1592       Alderman                 
## 1593       Alderman                 
## 1594       Alderman                 
## 1595       Alderman                 
## 1596       Alderman                 
## 1597       Alderman                 
## 1598       Alderman                 
## 1599       Alderman                 
## 1600       Alderman                 
## 1601       Council Member           
## 1602       Council Member           
## 1603       Council Member           
## 1604       Council Member           
## 1605       Council Member           
## 1606       Councilman               
## 1607       Councilman               
## 1608       Councilman               
## 1609       Councilman               
## 1610       Councilman               
## 1611       DPEC Member              
## 1612       DPEC Member              
## 1613       DPEC Member              
## 1614       DPEC Member              
## 1615       DPEC Member              
## 1616       DPEC Member              
## 1617       DPEC Member              
## 1618       DPEC Member              
## 1619       DPEC Member              
## 1620       DPEC Member              
## 1621       DPEC Member              
## 1622       DPEC Member              
## 1623       DPEC Member              
## 1624       RPEC Member              
## 1625       RPEC Member              
## 1626       RPEC Member              
## 1627       RPEC Member              
## 1628       RPEC Member              
## 1629       RPEC Member              
## 1630       RPEC Member              
## 1631       RPEC Member              
## 1632       RPEC Member              
## 1633       RPEC Member              
## 1634       RPEC Member              
## 1635       RPEC Member              
## 1636       RPEC Member              
## 1637       RPEC Member              
## 1638       RPEC Member              
## 1639       RPEC Member              
## 1640       RPEC Member              
## 1641       Sheriff                  
## 1642       Clerk of Court           
## 1643         Asesor                 
## 1644       Coroner                  
## 1645                    Police Juror
## 1646       Police Juror             
## 1647       Police Juror             
## 1648       Police Juror             
## 1649       Police Juror             
## 1650       Police Juror             
## 1651       Police Juror             
## 1652       Police Juror             
## 1653       Police Juror             
## 1654       Police Juror             
## 1655       Police Juror             
## 1656       Police Juror             
## 1657       City Judge               
## 1658       City Marshal             
## 1659       Member of School Board   
## 1660       Member of School Board   
## 1661       Member of School Board   
## 1662       Member of School Board   
## 1663       Member of School Board   
## 1664       Member of School Board   
## 1665       Member of School Board   
## 1666       Member of School Board   
## 1667       Member of School Board   
## 1668       Member of School Board   
## 1669       Member of School Board   
## 1670       Member of School Board   
## 1671       Justice of the Peace     
## 1672       Justice of the Peace     
## 1673       Justice of the Peace     
## 1674       Justice of the Peace     
## 1675       Justice of the Peace     
## 1676       Justice of the Peace     
## 1677       Justice of the Peace     
## 1678       Constable                
## 1679       Constable                
## 1680       Constable                
## 1681       Constable                
## 1682       Constable                
## 1683       Constable                
## 1684       Constable                
## 1685       Mayor                    
## 1686       Mayor                    
## 1687       Mayor                    
## 1688       Mayor                    
## 1689       Mayor                    
## 1690       Chief of Police          
## 1691       Chief of Police          
## 1692       Marshal                  
## 1693       Councilman at Large      
## 1694       Councilman at Large      
## 1695       Councilman at Large      
## 1696       Councilman at Large      
## 1697       Alderman                 
## 1698       Alderman                 
## 1699       Alderman                 
## 1700       Alderman                 
## 1701       Alderman                 
## 1702       Alderman                 
## 1703       Alderman                 
## 1704       Alderman                 
## 1705       Alderman                 
## 1706                        Aldermen
## 1707                        Aldermen
## 1708       Councilman               
## 1709       Councilman               
## 1710       Councilman               
## 1711       Councilman               
## 1712       Councilman               
## 1713       Councilman               
## 1714       Councilman               
## 1715       Councilman               
## 1716       DPEC Member              
## 1717       DPEC Member              
## 1718       DPEC Member              
## 1719       DPEC Member              
## 1720       DPEC Member              
## 1721       DPEC Member              
## 1722       DPEC Member              
## 1723       DPEC Member              
## 1724       DPEC Member              
## 1725       DPEC Member              
## 1726       DPEC Member              
## 1727       DPEC Member              
## 1728       DPEC Member              
## 1729       DPEC Member              
## 1730       DPEC Member              
## 1731       DPEC Member              
## 1732       DPEC Member              
## 1733       RPEC Member              
## 1734       RPEC Member              
## 1735       RPEC Member              
## 1736       RPEC Member              
## 1737       RPEC Member              
## 1738       RPEC Member              
## 1739       RPEC Member              
## 1740       RPEC Member              
## 1741       RPEC Member              
## 1742       RPEC Member              
## 1743       RPEC Member              
## 1744       RPEC Member              
## 1745       RPEC Member              
## 1746       RPEC Member              
## 1747       RPEC Member              
## 1748       RPEC Member              
## 1749       RPEC Member              
## 1750       Judge                    
## 1751       Judge                    
## 1752       Judge                    
## 1753       Sheriff                  
## 1754       Clerk of Court           
## 1755         Asesor                 
## 1756       Coroner                  
## 1757         Parish Commision Member
## 1758        Parish Commision Member 
## 1759        Parish Commision Member 
## 1760        Parish Commision Member 
## 1761        Parish Commision Member 
## 1762        Parish Commision Member 
## 1763        Parish Commision Member 
## 1764        Parish Commision Member 
## 1765        Parish Commision Member 
## 1766        Parish Commision Member 
## 1767        Parish Commision Member 
## 1768        Parish Commision Member 
## 1769          Member of School Board
## 1770       Member of School Board   
## 1771       Member of School Board   
## 1772       Member of School Board   
## 1773       Member of School Board   
## 1774       Member of School Board   
## 1775       Member of School Board   
## 1776       Member of School Board   
## 1777       Member of School Board   
## 1778       Member of School Board   
## 1779       Member of School Board   
## 1780       Member of School Board   
## 1781       Justice of the Peace     
## 1782       Justice of the Peace     
## 1783       Justice of the Peace     
## 1784       Justice of the Peace     
## 1785       Justice of the Peace     
## 1786       Justice of the Peace     
## 1787       Justice of the Peace     
## 1788       Justice of the Peace     
## 1789       Justice of the Peace     
## 1790            Justice of the Peace
## 1791       Constable                
## 1792       Constable                
## 1793       Constable                
## 1794       Constable                
## 1795       Constable                
## 1796       Constable                
## 1797       Constable                
## 1798       Constable                
## 1799       Constable                
## 1800       Constable                
## 1801       Mayor                    
## 1802                           Mayor
## 1803                           Mayor
## 1804                           Mayor
## 1805       Mayor                    
## 1806                           Mayor
## 1807       Mayor                    
## 1808                           Mayor
## 1809       Mayor                    
## 1810       Mayor                    
## 1811       Chief of Police          
## 1812       Chief of Police          
## 1813       Chief of Police          
## 1814       Chief of Police          
## 1815       Chief of Police          
## 1816       Chief of Police          
## 1817       Chief of Police          
## 1818       Alderman at Large        
## 1819       Alderman at Large        
## 1820       Council Member at Large  
## 1821       Council Member at Large  
## 1822       Alderman                 
## 1823       Alderman                 
## 1824       Alderman                 
## 1825       Alderman                 
## 1826                        Alderman
## 1827       Alderman                 
## 1828       Alderman                 
## 1829       Alderman                 
## 1830       Alderman                 
## 1831       Alderman                 
## 1832       Alderman                 
## 1833       Alderman                 
## 1834       Alderman                 
## 1835       Alderman                 
## 1836       Alderman                 
## 1837       Alderman                 
## 1838       Alderman                 
## 1839       Alderman                 
## 1840       Alderman                 
## 1841       Alderman                 
## 1842       Alderman                 
## 1843       Alderman                 
## 1844       Alderman                 
## 1845       Alderman                 
## 1846       Alderman                 
## 1847       Alderman                 
## 1848       Alderman                 
## 1849       Alderman                 
## 1850       Alderman                 
## 1851       Alderman                 
## 1852       Alderman                 
## 1853       Alderman                 
## 1854       Alderman                 
## 1855       Council Member           
## 1856       Council Member           
## 1857       Council Member           
## 1858       DPEC Member              
## 1859       DPEC Member              
## 1860       DPEC Member              
## 1861       DPEC Member              
## 1862       DPEC Member              
## 1863       DPEC Member              
## 1864       DPEC Member              
## 1865       DPEC Member              
## 1866       DPEC Member              
## 1867       DPEC Member              
## 1868       DPEC Member              
## 1869       DPEC Member              
## 1870       DPEC Member              
## 1871       DPEC Member              
## 1872       DPEC Member              
## 1873       DPEC Member              
## 1874       DPEC Member              
## 1875       DPEC Member              
## 1876       DPEC Member              
## 1877       DPEC Member              
## 1878       DPEC Member              
## 1879       RPEC Member              
## 1880       RPEC Member              
## 1881       RPEC Member              
## 1882       RPEC Member              
## 1883       RPEC Member              
## 1884       RPEC Member              
## 1885       RPEC Member              
## 1886       RPEC Member              
## 1887       RPEC Member              
## 1888       RPEC Member              
## 1889       RPEC Member              
## 1890       RPEC Member              
## 1891       RPEC Member              
## 1892       RPEC Member              
## 1893       RPEC Member              
## 1894       RPEC Member              
## 1895       RPEC Member              
## 1896       RPEC Member              
## 1897       RPEC Member              
## 1898       Sheriff                  
## 1899       Clerk of Court           
## 1900         Asesor                 
## 1901       Coroner                  
## 1902                    Police Juror
## 1903       Police Juror             
## 1904       Police Juror             
## 1905       Police Juror             
## 1906       Police Juror             
## 1907       Police Juror             
## 1908       Police Juror             
## 1909       Police Juror             
## 1910       Police Juror             
## 1911       Police Juror             
## 1912       Police Juror             
## 1913       Police Juror             
## 1914       Police Juror             
## 1915       Police Juror             
## 1916       Police Juror             
## 1917       City Judge               
## 1918       City Judge               
## 1919       City Judge               
## 1920       City Marshal             
## 1921       City Marshal             
## 1922          Member of School Board
## 1923       Member of School Board   
## 1924       Member of School Board   
## 1925       Member of School Board   
## 1926       Member of School Board   
## 1927       Member of School Board   
## 1928       Member of School Board   
## 1929       Member of School Board   
## 1930       Member of School Board   
## 1931       Member of School Board   
## 1932       Member of School Board   
## 1933       Member of School Board   
## 1934       Member of School Board   
## 1935       Member of School Board   
## 1936       Member of School Board   
## 1937       Justice of the Peace     
## 1938       Justice of the Peace     
## 1939       Justice of the Peace     
## 1940       Justice of the Peace     
## 1941       Justice of the Peace     
## 1942       Justice of the Peace     
## 1943       Constable                
## 1944       Constable                
## 1945       Constable                
## 1946       Constable                
## 1947       Constable                
## 1948       Constable                
## 1949       Mayor                    
## 1950       Mayor                    
## 1951       Mayor                    
## 1952       Mayor                    
## 1953       Mayor                    
## 1954       Mayor                    
## 1955       Mayor                    
## 1956       Mayor                    
## 1957       Chief of Police          
## 1958       Chief of Police          
## 1959       Chief of Police          
## 1960       Councilman at Large      
## 1961                  Council Member
## 1962       Council Member           
## 1963       Council Member           
## 1964       Council Member           
## 1965       Council Member           
## 1966       Council Member           
## 1967       Council Member           
## 1968       Council Member           
## 1969       Council Member           
## 1970       Council Member           
## 1971       Councilman               
## 1972       Councilman               
## 1973       Councilman               
## 1974       Councilman               
## 1975       Councilman               
## 1976       Councilman               
## 1977       Councilman               
## 1978       Councilman               
## 1979       Councilman               
## 1980       Councilman               
## 1981       Councilman               
## 1982       Councilman               
## 1983       Councilman               
## 1984       Councilman               
## 1985       Councilman               
## 1986       Councilman               
## 1987       Councilman               
## 1988       Councilman               
## 1989       Councilman               
## 1990       Councilman               
## 1991       Councilman               
## 1992       Councilman               
## 1993       Councilman               
## 1994       Councilman               
## 1995       Councilman               
## 1996       DPEC Member              
## 1997       DPEC Member              
## 1998       DPEC Member              
## 1999       DPEC Member              
## 2000       DPEC Member              
## 2001       DPEC Member              
## 2002       DPEC Member              
## 2003       DPEC Member              
## 2004       RPEC Member              
## 2005       RPEC Member              
## 2006       RPEC Member              
## 2007       RPEC Member              
## 2008       RPEC Member              
## 2009       RPEC Member              
## 2010       RPEC Member              
## 2011       RPEC Member              
## 2012       Sheriff                  
## 2013       Clerk of Court           
## 2014         Asesor                 
## 2015       Coroner                  
## 2016                    Police Juror
## 2017       Police Juror             
## 2018       Police Juror             
## 2019       Police Juror             
## 2020       Police Juror             
## 2021       Police Juror             
## 2022       Police Juror             
## 2023          Member of School Board
## 2024       Member of School Board   
## 2025       Member of School Board   
## 2026       Member of School Board   
## 2027       Member of School Board   
## 2028       Member of School Board   
## 2029       Member of School Board   
## 2030       Justice of the Peace     
## 2031       Justice of the Peace     
## 2032       Constable                
## 2033       Constable                
## 2034                           Mayor
## 2035       Mayor                    
## 2036       Mayor                    
## 2037       Chief of Police          
## 2038       Chief of Police          
## 2039       Alderman                 
## 2040       Alderman                 
## 2041       Alderman                 
## 2042       Alderman                 
## 2043       Alderman                 
## 2044       Council Member           
## 2045       Council Member           
## 2046       Council Member           
## 2047       Councilman               
## 2048       Councilman               
## 2049       Councilman               
## 2050       Councilman               
## 2051       Councilman               
## 2052       DPEC Member              
## 2053       DPEC Member              
## 2054       DPEC Member              
## 2055       DPEC Member              
## 2056       DPEC Member              
## 2057       DPEC Member              
## 2058       DPEC Member              
## 2059       DPEC Member              
## 2060       DPEC Member              
## 2061       DPEC Member              
## 2062       RPEC Member              
## 2063       RPEC Member              
## 2064       RPEC Member              
## 2065       RPEC Member              
## 2066       RPEC Member              
## 2067       RPEC Member              
## 2068       RPEC Member              
## 2069       RPEC Member              
## 2070       Sheriff                  
## 2071       Clerk of Court           
## 2072         Asesor                 
## 2073       Coroner                  
## 2074                    Police Juror
## 2075       Police Juror             
## 2076       Police Juror             
## 2077       Police Juror             
## 2078       Police Juror             
## 2079       Police Juror             
## 2080       Police Juror             
## 2081          Member of School Board
## 2082       Member of School Board   
## 2083       Member of School Board   
## 2084       Member of School Board   
## 2085       Member of School Board   
## 2086       Member of School Board   
## 2087       Member of School Board   
## 2088       Justice of the Peace     
## 2089       Justice of the Peace     
## 2090       Justice of the Peace     
## 2091       Justice of the Peace     
## 2092       Justice of the Peace     
## 2093       Justice of the Peace     
## 2094       Constable                
## 2095       Constable                
## 2096       Constable                
## 2097       Constable                
## 2098       Constable                
## 2099       Constable                
## 2100       DPEC Member              
## 2101       DPEC Member              
## 2102       DPEC Member              
## 2103       DPEC Member              
## 2104       DPEC Member              
## 2105       DPEC Member              
## 2106       DPEC Member              
## 2107       DPEC Member              
## 2108       DPEC Member              
## 2109       DPEC Member              
## 2110       DPEC Member              
## 2111       DPEC Member              
## 2112       RPEC Member              
## 2113       RPEC Member              
## 2114       RPEC Member              
## 2115       RPEC Member              
## 2116       RPEC Member              
## 2117       RPEC Member              
## 2118       RPEC Member              
## 2119       RPEC Member              
## 2120       RPEC Member              
## 2121       RPEC Member              
## 2122       Sheriff                  
## 2123       Clerk of Court           
## 2124         Asesor                 
## 2125       Coroner                  
## 2126                    Police Juror
## 2127       Police Juror             
## 2128       Police Juror             
## 2129       Police Juror             
## 2130       Police Juror             
## 2131       Police Juror             
## 2132       Police Juror             
## 2133       Police Juror             
## 2134       Police Juror             
## 2135          Member of School Board
## 2136       Member of School Board   
## 2137       Member of School Board   
## 2138       Member of School Board   
## 2139       Member of School Board   
## 2140       Member of School Board   
## 2141       Member of School Board   
## 2142       Member of School Board   
## 2143       Member of School Board   
## 2144       Justice of the Peace     
## 2145       Justice of the Peace     
## 2146       Justice of the Peace     
## 2147       Constable                
## 2148       Constable                
## 2149       Constable                
## 2150       Mayor                    
## 2151                           Mayor
## 2152                           Mayor
## 2153       Chief of Police          
## 2154       Alderman                 
## 2155       Alderman                 
## 2156       Alderman                 
## 2157       Alderman                 
## 2158       Alderman                 
## 2159       Alderman                 
## 2160       Alderman                 
## 2161       Alderman                 
## 2162       Alderman                 
## 2163       Alderman                 
## 2164       Alderman                 
## 2165       DPEC Member              
## 2166       DPEC Member              
## 2167       DPEC Member              
## 2168       DPEC Member              
## 2169       DPEC Member              
## 2170       DPEC Member              
## 2171       DPEC Member              
## 2172       DPEC Member              
## 2173       DPEC Member              
## 2174       DPEC Member              
## 2175       DPEC Member              
## 2176       DPEC Member              
## 2177       RPEC Member              
## 2178       RPEC Member              
## 2179       RPEC Member              
## 2180       RPEC Member              
## 2181       RPEC Member              
## 2182       RPEC Member              
## 2183       RPEC Member              
## 2184       RPEC Member              
## 2185       RPEC Member              
## 2186       RPEC Member              
## 2187       RPEC Member              
## 2188       Sheriff                  
## 2189       Clerk of Court           
## 2190         Asesor                 
## 2191       Coroner                  
## 2192       Police Juror             
## 2193       Police Juror             
## 2194       Police Juror             
## 2195       Police Juror             
## 2196       Police Juror             
## 2197       Police Juror             
## 2198       Police Juror             
## 2199       Police Juror             
## 2200       Police Juror             
## 2201       Police Juror             
## 2202          Member of School Board
## 2203       Member of School Board   
## 2204       Member of School Board   
## 2205       Member of School Board   
## 2206       Member of School Board   
## 2207       Member of School Board   
## 2208       Member of School Board   
## 2209       Member of School Board   
## 2210       Member of School Board   
## 2211       Member of School Board   
## 2212       Justice of the Peace     
## 2213       Justice of the Peace     
## 2214       Justice of the Peace     
## 2215       Constable                
## 2216       Constable                
## 2217       Constable                
## 2218                           Mayor
## 2219                           Mayor
## 2220                           Mayor
## 2221                           Mayor
## 2222                 Chief of Police
## 2223       Chief of Police          
## 2224       Marshal                  
## 2225       Alderman                 
## 2226       Alderman                 
## 2227       Alderman                 
## 2228       Alderman                 
## 2229       Alderman                 
## 2230       Alderman                 
## 2231                  Council Member
## 2232       Council Member           
## 2233       Council Member           
## 2234       Council Member           
## 2235       Council Member           
## 2236       Selectman                
## 2237       Selectman                
## 2238       Selectman                
## 2239       Selectman                
## 2240       Selectman                
## 2241       DPEC Member              
## 2242       DPEC Member              
## 2243       DPEC Member              
## 2244       DPEC Member              
## 2245       DPEC Member              
## 2246       DPEC Member              
## 2247       DPEC Member              
## 2248       DPEC Member              
## 2249       DPEC Member              
## 2250       DPEC Member              
## 2251       RPEC Member              
## 2252       RPEC Member              
## 2253       RPEC Member              
## 2254       RPEC Member              
## 2255       RPEC Member              
## 2256       RPEC Member              
## 2257       RPEC Member              
## 2258       RPEC Member              
## 2259       RPEC Member              
## 2260       RPEC Member              
## 2261       Sheriff                  
## 2262       Clerk of Court           
## 2263         Asesor                 
## 2264       Coroner                  
## 2265                    Police Juror
## 2266       Police Juror             
## 2267       Police Juror             
## 2268       Police Juror             
## 2269       Police Juror             
## 2270       Police Juror             
## 2271       Police Juror             
## 2272       Police Juror             
## 2273       Police Juror             
## 2274       City Judge               
## 2275       City Marshal             
## 2276          Member of School Board
## 2277       Member of School Board   
## 2278       Member of School Board   
## 2279       Member of School Board   
## 2280       Member of School Board   
## 2281       Member of School Board   
## 2282       Member of School Board   
## 2283       Member of School Board   
## 2284       Member of School Board   
## 2285       Justice of the Peace     
## 2286       Justice of the Peace     
## 2287       Justice of the Peace     
## 2288       Justice of the Peace     
## 2289       Justice of the Peace     
## 2290       Justice of the Peace     
## 2291       Constable                
## 2292       Constable                
## 2293       Constable                
## 2294       Constable                
## 2295       Constable                
## 2296       Constable                
## 2297       Mayor                    
## 2298                           Mayor
## 2299                           Mayor
## 2300       Mayor                    
## 2301       Chief of Police          
## 2302       Chief of Police          
## 2303       Chief of Police          
## 2304       Alderman                 
## 2305       Alderman                 
## 2306       Alderman                 
## 2307       Alderman                 
## 2308       Alderman                 
## 2309       Alderman                 
## 2310       Alderman                 
## 2311       Alderman                 
## 2312       Alderman                 
## 2313       Alderman                 
## 2314       Alderman                 
## 2315       Alderman                 
## 2316       Alderman                 
## 2317       Alderman                 
## 2318       Alderman                 
## 2319       Alderman                 
## 2320       Alderman                 
## 2321       Alderman                 
## 2322       Alderman                 
## 2323       Alderman                 
## 2324       DPEC Member              
## 2325       DPEC Member              
## 2326       DPEC Member              
## 2327       DPEC Member              
## 2328       DPEC Member              
## 2329       DPEC Member              
## 2330       DPEC Member              
## 2331       DPEC Member              
## 2332       DPEC Member              
## 2333       DPEC Member              
## 2334       DPEC Member              
## 2335       DPEC Member              
## 2336       DPEC Member              
## 2337       RPEC Member              
## 2338       RPEC Member              
## 2339       RPEC Member              
## 2340       RPEC Member              
## 2341       RPEC Member              
## 2342       RPEC Member              
## 2343       RPEC Member              
## 2344       RPEC Member              
## 2345       RPEC Member              
## 2346       RPEC Member              
## 2347       RPEC Member              
## 2348       RPEC Member              
## 2349       Sheriff                  
## 2350       Clerk of Court           
## 2351         Asesor                 
## 2352       Coroner                  
## 2353                    Police Juror
## 2354       Police Juror             
## 2355       Police Juror             
## 2356       Police Juror             
## 2357       Police Juror             
## 2358       Police Juror             
## 2359       Police Juror             
## 2360       Police Juror             
## 2361       Police Juror             
## 2362       Police Juror             
## 2363       Police Juror             
## 2364       Member of School Board   
## 2365       Member of School Board   
## 2366       Member of School Board   
## 2367       Member of School Board   
## 2368       Member of School Board   
## 2369       Member of School Board   
## 2370       Member of School Board   
## 2371       Member of School Board   
## 2372       Member of School Board   
## 2373       Member of School Board   
## 2374       Member of School Board   
## 2375       Justice of the Peace     
## 2376       Justice of the Peace     
## 2377       Justice of the Peace     
## 2378       Justice of the Peace     
## 2379       Justice of the Peace     
## 2380       Justice of the Peace     
## 2381       Constable                
## 2382       Constable                
## 2383       Constable                
## 2384       Constable                
## 2385       Constable                
## 2386       Constable                
## 2387                           Mayor
## 2388       Mayor                    
## 2389       Mayor                    
## 2390                           Mayor
## 2391       Mayor                    
## 2392                           Mayor
## 2393       Mayor                    
## 2394       Mayor                    
## 2395       Mayor                    
## 2396       Chief of Police          
## 2397       Chief of Police          
## 2398       Chief of Police          
## 2399       Alderman                 
## 2400       Alderman                 
## 2401       Alderman                 
## 2402       Alderman                 
## 2403       Alderman                 
## 2404       Alderman                 
## 2405       Alderman                 
## 2406       Alderman                 
## 2407       Alderman                 
## 2408       Alderman                 
## 2409       Alderman                 
## 2410       Alderman                 
## 2411       Alderman                 
## 2412       Alderman                 
## 2413       Alderman                 
## 2414       Alderman                 
## 2415       Alderman                 
## 2416       Council Member           
## 2417       Council Member           
## 2418       Council Member           
## 2419       Council Member           
## 2420       Council Member           
## 2421       Council Member           
## 2422       Council Member           
## 2423       Council Member           
## 2424       Council Member           
## 2425       Council Member           
## 2426       Council Member           
## 2427       Council Member           
## 2428       Council Member           
## 2429       Councilman               
## 2430       Councilman               
## 2431       Councilman               
## 2432       Councilman               
## 2433       Councilman               
## 2434       DPEC Member              
## 2435       DPEC Member              
## 2436       DPEC Member              
## 2437       DPEC Member              
## 2438       DPEC Member              
## 2439       DPEC Member              
## 2440       DPEC Member              
## 2441       DPEC Member              
## 2442       DPEC Member              
## 2443       DPEC Member              
## 2444       DPEC Member              
## 2445       DPEC Member              
## 2446       DPEC Member              
## 2447       DPEC Member              
## 2448       DPEC Member              
## 2449       DPEC Member              
## 2450       DPEC Member              
## 2451       RPEC Member              
## 2452       RPEC Member              
## 2453       RPEC Member              
## 2454       RPEC Member              
## 2455       RPEC Member              
## 2456       RPEC Member              
## 2457       RPEC Member              
## 2458       RPEC Member              
## 2459       RPEC Member              
## 2460       RPEC Member              
## 2461       RPEC Member              
## 2462       RPEC Member              
## 2463       RPEC Member              
## 2464       RPEC Member              
## 2465       RPEC Member              
## 2466       RPEC Member              
## 2467       RPEC Member              
## 2468       Judge                    
## 2469       Judge                    
## 2470        Judge Family Court      
## 2471        Judge Family Court      
## 2472        Judge Family Court      
## 2473        Judge Family Court      
## 2474       Sheriff                  
## 2475       Clerk of Court           
## 2476         Asesor                 
## 2477       Coroner                  
## 2478        MayorPresident          
## 2479       Councilman               
## 2480       Councilman               
## 2481       Councilman               
## 2482       Councilman               
## 2483       Councilman               
## 2484       Councilman               
## 2485       Councilman               
## 2486       Councilman               
## 2487       Councilman               
## 2488       Councilman               
## 2489       Councilman               
## 2490       Councilman               
## 2491       City Judge               
## 2492       City Judge               
## 2493       City Judge               
## 2494       City Judge               
## 2495       City Judge               
## 2496       City Judge               
## 2497       City Judge               
## 2498       City Constable           
## 2499          Member of School Board
## 2500       Member of School Board   
## 2501       Member of School Board   
## 2502       Member of School Board   
## 2503       Member of School Board   
## 2504       Member of School Board   
## 2505       Member of School Board   
## 2506       Member of School Board   
## 2507       Member of School Board   
## 2508          Member of School Board
## 2509          Member of School Board
## 2510          Member of School Board
## 2511       Member of School Board   
## 2512       Member of School Board   
## 2513       Member of School Board   
## 2514       Member of School Board   
## 2515       Member of School Board   
## 2516       Member of School Board   
## 2517       Member of School Board   
## 2518       Member of School Board   
## 2519       Member of School Board   
## 2520       Member of School Board   
## 2521       Member of School Board   
## 2522       Member of School Board   
## 2523       Member of School Board   
## 2524       Member of School Board   
## 2525       Member of School Board   
## 2526       Member of School Board   
## 2527       Member of School Board   
## 2528       Member of School Board   
## 2529       Member of School Board   
## 2530       Member of School Board   
## 2531       Justice of the Peace     
## 2532       Justice of the Peace     
## 2533       Justice of the Peace     
## 2534       Justice of the Peace     
## 2535       Justice of the Peace     
## 2536       Justice of the Peace     
## 2537       Constable                
## 2538       Constable                
## 2539       Constable                
## 2540       Constable                
## 2541       Constable                
## 2542       Constable                
## 2543                           Mayor
## 2544                           Mayor
## 2545       Mayor                    
## 2546       Chief of Police          
## 2547       Chief of Police          
## 2548       Chief of Police          
## 2549                  Council Member
## 2550                  Council Member
## 2551                  Council Member
## 2552                  Council Member
## 2553                  Council Member
## 2554       Councilman               
## 2555       Councilman               
## 2556       Councilman               
## 2557       Councilman               
## 2558       Councilman               
## 2559       Councilman               
## 2560       Councilman               
## 2561       Councilman               
## 2562       Councilman               
## 2563       Councilman               
## 2564       Councilman               
## 2565       DPEC Member              
## 2566       DPEC Member              
## 2567       DPEC Member              
## 2568       DPEC Member              
## 2569       DPEC Member              
## 2570       DPEC Member              
## 2571       DPEC Member              
## 2572       DPEC Member              
## 2573       DPEC Member              
## 2574       DPEC Member              
## 2575       RPEC Member              
## 2576       RPEC Member              
## 2577       RPEC Member              
## 2578       RPEC Member              
## 2579       RPEC Member              
## 2580       RPEC Member              
## 2581       RPEC Member              
## 2582       RPEC Member              
## 2583       RPEC Member              
## 2584       RPEC Member              
## 2585       Sheriff                  
## 2586       Clerk of Court           
## 2587         Asesor                 
## 2588       Coroner                  
## 2589                    Police Juror
## 2590       Police Juror             
## 2591       Police Juror             
## 2592       Police Juror             
## 2593       Police Juror             
## 2594          Member of School Board
## 2595       Member of School Board   
## 2596       Member of School Board   
## 2597       Member of School Board   
## 2598       Member of School Board   
## 2599       Member of School Board   
## 2600       Member of School Board   
## 2601       Member of School Board   
## 2602       Member of School Board   
## 2603       Justice of the Peace     
## 2604       Constable                
## 2605                           Mayor
## 2606       Chief of Police          
## 2607       Alderman                 
## 2608       Alderman                 
## 2609       Alderman                 
## 2610       Alderman                 
## 2611       Alderman                 
## 2612       DPEC Member              
## 2613       DPEC Member              
## 2614       DPEC Member              
## 2615       DPEC Member              
## 2616       DPEC Member              
## 2617       DPEC Member              
## 2618       DPEC Member              
## 2619       DPEC Member              
## 2620       DPEC Member              
## 2621       DPEC Member              
## 2622       RPEC Member              
## 2623       RPEC Member              
## 2624       RPEC Member              
## 2625       RPEC Member              
## 2626       RPEC Member              
## 2627       RPEC Member              
## 2628       RPEC Member              
## 2629       RPEC Member              
## 2630       RPEC Member              
## 2631       RPEC Member              
## 2632       Sheriff                  
## 2633       Clerk of Court           
## 2634         Asesor                 
## 2635       Coroner                  
## 2636                    Police Juror
## 2637       Police Juror             
## 2638       Police Juror             
## 2639       Police Juror             
## 2640       Police Juror             
## 2641       Police Juror             
## 2642       Police Juror             
## 2643       Police Juror             
## 2644       Police Juror             
## 2645          Member of School Board
## 2646       Member of School Board   
## 2647       Member of School Board   
## 2648       Member of School Board   
## 2649       Member of School Board   
## 2650       Member of School Board   
## 2651       Member of School Board   
## 2652       Member of School Board   
## 2653       Member of School Board   
## 2654       Member of School Board   
## 2655       Member of School Board   
## 2656       Member of School Board   
## 2657       Justice of the Peace     
## 2658       Justice of the Peace     
## 2659       Justice of the Peace     
## 2660       Justice of the Peace     
## 2661       Constable                
## 2662       Constable                
## 2663       Constable                
## 2664       Constable                
## 2665       Mayor                    
## 2666       Mayor                    
## 2667       Mayor                    
## 2668       Mayor                    
## 2669                           Mayor
## 2670       Chief of Police          
## 2671       Marshal                  
## 2672       Alderman                 
## 2673       Alderman                 
## 2674       Alderman                 
## 2675       Alderman                 
## 2676       Alderman                 
## 2677       Alderman                 
## 2678       Alderman                 
## 2679       Alderman                 
## 2680       Alderman                 
## 2681       Alderman                 
## 2682       Alderman                 
## 2683       Alderman                 
## 2684       Alderman                 
## 2685       Alderman                 
## 2686       Alderman                 
## 2687       Alderman                 
## 2688       Alderman                 
## 2689       Alderman                 
## 2690       Alderman                 
## 2691        Member Board of Trustees
## 2692        Member Board of Trustees
## 2693        Member Board of Trustees
## 2694        Member Board of Trustees
## 2695        Member Board of Trustees
## 2696       DPEC Member              
## 2697       DPEC Member              
## 2698       DPEC Member              
## 2699       DPEC Member              
## 2700       DPEC Member              
## 2701       DPEC Member              
## 2702       DPEC Member              
## 2703       DPEC Member              
## 2704       DPEC Member              
## 2705       DPEC Member              
## 2706       DPEC Member              
## 2707       DPEC Member              
## 2708       RPEC Member              
## 2709       RPEC Member              
## 2710       RPEC Member              
## 2711       RPEC Member              
## 2712       RPEC Member              
## 2713       RPEC Member              
## 2714       RPEC Member              
## 2715       RPEC Member              
## 2716       RPEC Member              
## 2717       RPEC Member              
## 2718       RPEC Member              
## 2719       RPEC Member              
## 2720       RPEC Member              
## 2721       Sheriff                  
## 2722       Clerk of Court           
## 2723         Asesor                 
## 2724       Coroner                  
## 2725       Police Juror             
## 2726       Police Juror             
## 2727       Police Juror             
## 2728       Police Juror             
## 2729       Police Juror             
## 2730       Police Juror             
## 2731       Police Juror             
## 2732       Police Juror             
## 2733       Police Juror             
## 2734       City Judge               
## 2735       City Marshal             
## 2736          Member of School Board
## 2737       Member of School Board   
## 2738       Member of School Board   
## 2739       Member of School Board   
## 2740       Member of School Board   
## 2741       Member of School Board   
## 2742       Member of School Board   
## 2743       Member of School Board   
## 2744       Member of School Board   
## 2745       Member of School Board   
## 2746       Member of School Board   
## 2747       Member of School Board   
## 2748       Member of School Board   
## 2749       Justice of the Peace     
## 2750       Justice of the Peace     
## 2751       Justice of the Peace     
## 2752       Justice of the Peace     
## 2753       Justice of the Peace     
## 2754       Constable                
## 2755       Constable                
## 2756       Constable                
## 2757       Constable                
## 2758       Constable                
## 2759                           Mayor
## 2760       Mayor                    
## 2761       Mayor                    
## 2762       Mayor                    
## 2763                           Mayor
## 2764       Chief of Police          
## 2765       Chief of Police          
## 2766       Chief of Police          
## 2767       Chief of Police          
## 2768       Chief of Police          
## 2769       Alderman at Large        
## 2770       Alderman                 
## 2771       Alderman                 
## 2772       Alderman                 
## 2773       Alderman                 
## 2774       Alderman                 
## 2775       Alderman                 
## 2776       Alderman                 
## 2777       Alderman                 
## 2778       Alderman                 
## 2779       Alderman                 
## 2780       Alderman                 
## 2781       Alderman                 
## 2782       Alderman                 
## 2783       Alderman                 
## 2784       Alderman                 
## 2785       Alderman                 
## 2786       Council Member           
## 2787       Council Member           
## 2788       Council Member           
## 2789       DPEC Member              
## 2790       DPEC Member              
## 2791       DPEC Member              
## 2792       DPEC Member              
## 2793       DPEC Member              
## 2794       DPEC Member              
## 2795       DPEC Member              
## 2796       DPEC Member              
## 2797       DPEC Member              
## 2798       DPEC Member              
## 2799       RPEC Member              
## 2800       RPEC Member              
## 2801       RPEC Member              
## 2802       RPEC Member              
## 2803       RPEC Member              
## 2804       RPEC Member              
## 2805       RPEC Member              
## 2806       RPEC Member              
## 2807       RPEC Member              
## 2808       RPEC Member              
## 2809       RPEC Member              
## 2810       RPEC Member              
## 2811       Sheriff                  
## 2812       Clerk of Court           
## 2813         Asesor                 
## 2814       Coroner                  
## 2815                    Police Juror
## 2816       Police Juror             
## 2817       Police Juror             
## 2818       Police Juror             
## 2819       Police Juror             
## 2820       Police Juror             
## 2821       Police Juror             
## 2822       City Judge               
## 2823       City Marshal             
## 2824          Member of School Board
## 2825       Member of School Board   
## 2826       Member of School Board   
## 2827       Member of School Board   
## 2828       Member of School Board   
## 2829       Member of School Board   
## 2830       Member of School Board   
## 2831       Justice of the Peace     
## 2832       Justice of the Peace     
## 2833       Justice of the Peace     
## 2834       Justice of the Peace     
## 2835       Justice of the Peace     
## 2836       Justice of the Peace     
## 2837       Justice of the Peace     
## 2838       Constable                
## 2839       Constable                
## 2840       Constable                
## 2841       Constable                
## 2842       Constable                
## 2843       Constable                
## 2844       Constable                
## 2845       Mayor                    
## 2846       Mayor                    
## 2847                           Mayor
## 2848       Mayor                    
## 2849       Chief of Police          
## 2850       Chief of Police          
## 2851       Chief of Police          
## 2852       Chief of Police          
## 2853       Alderman                 
## 2854       Alderman                 
## 2855       Alderman                 
## 2856       Alderman                 
## 2857       Alderman                 
## 2858       Alderman                 
## 2859       Alderman                 
## 2860       Alderman                 
## 2861       Alderman                 
## 2862       Alderman                 
## 2863       Alderman                 
## 2864       Councilman               
## 2865       Councilman               
## 2866       Councilman               
## 2867       Councilman               
## 2868       Councilman               
## 2869       DPEC Member              
## 2870       DPEC Member              
## 2871       DPEC Member              
## 2872       DPEC Member              
## 2873       DPEC Member              
## 2874       DPEC Member              
## 2875       DPEC Member              
## 2876       DPEC Member              
## 2877       DPEC Member              
## 2878       RPEC Member              
## 2879       RPEC Member              
## 2880       RPEC Member              
## 2881       RPEC Member              
## 2882       RPEC Member              
## 2883       RPEC Member              
## 2884       RPEC Member              
## 2885       RPEC Member              
## 2886       RPEC Member              
## 2887       RPEC Member              
## 2888       Sheriff                  
## 2889       Clerk of Court           
## 2890         Asesor                 
## 2891       Coroner                  
## 2892       Police Juror             
## 2893       Police Juror             
## 2894       Police Juror             
## 2895       Police Juror             
## 2896       Police Juror             
## 2897       Police Juror             
## 2898       Police Juror             
## 2899       Police Juror             
## 2900          Member of School Board
## 2901       Member of School Board   
## 2902       Member of School Board   
## 2903       Member of School Board   
## 2904       Member of School Board   
## 2905       Member of School Board   
## 2906       Member of School Board   
## 2907       Member of School Board   
## 2908       Justice of the Peace     
## 2909       Justice of the Peace     
## 2910       Justice of the Peace     
## 2911       Justice of the Peace     
## 2912       Justice of the Peace     
## 2913       Constable                
## 2914       Constable                
## 2915       Constable                
## 2916       Constable                
## 2917       Constable                
## 2918       Mayor                    
## 2919       Mayor                    
## 2920       Mayor                    
## 2921                           Mayor
## 2922       Mayor                    
## 2923       Mayor                    
## 2924       Chief of Police          
## 2925       Chief of Police          
## 2926       Chief of Police          
## 2927       Alderman                 
## 2928       Alderman                 
## 2929       Alderman                 
## 2930       Alderman                 
## 2931       Alderman                 
## 2932       Alderman                 
## 2933       Alderman                 
## 2934       Alderman                 
## 2935       Alderman                 
## 2936       Alderman                 
## 2937       Alderman                 
## 2938       Alderman                 
## 2939       Alderman                 
## 2940       Alderman                 
## 2941       Council Member           
## 2942       Council Member           
## 2943       Council Member           
## 2944       Council Member           
## 2945       Council Member           
## 2946                      Councilman
## 2947                      Councilman
## 2948                      Councilman
## 2949                      Councilman
## 2950                      Councilman
## 2951       DPEC Member              
## 2952       DPEC Member              
## 2953       DPEC Member              
## 2954       DPEC Member              
## 2955       DPEC Member              
## 2956       DPEC Member              
## 2957       DPEC Member              
## 2958       DPEC Member              
## 2959       DPEC Member              
## 2960       DPEC Member              
## 2961       DPEC Member              
## 2962       DPEC Member              
## 2963       DPEC Member              
## 2964       DPEC Member              
## 2965       DPEC Member              
## 2966       DPEC Member              
## 2967       DPEC Member              
## 2968       RPEC Member              
## 2969       RPEC Member              
## 2970       RPEC Member              
## 2971       RPEC Member              
## 2972       RPEC Member              
## 2973       RPEC Member              
## 2974       RPEC Member              
## 2975       RPEC Member              
## 2976       RPEC Member              
## 2977       RPEC Member              
## 2978       RPEC Member              
## 2979       RPEC Member              
## 2980       RPEC Member              
## 2981       RPEC Member              
## 2982       RPEC Member              
## 2983       RPEC Member              
## 2984       Sheriff                  
## 2985       Clerk of Court           
## 2986         Asesor                 
## 2987       Coroner                  
## 2988       Parish President         
## 2989                      Councilman
## 2990       Councilman               
## 2991       Councilman               
## 2992       Councilman               
## 2993       Councilman               
## 2994       Councilman               
## 2995       Councilman               
## 2996       Councilman               
## 2997       Councilman               
## 2998       Councilman               
## 2999       Councilman               
## 3000       Councilman               
## 3001       Councilman               
## 3002       Councilman               
## 3003       City Judge               
## 3004       City Judge               
## 3005       City Marshal             
## 3006       City Marshal             
## 3007          Member of School Board
## 3008       Member of School Board   
## 3009       Member of School Board   
## 3010       Member of School Board   
## 3011       Member of School Board   
## 3012       Member of School Board   
## 3013       Member of School Board   
## 3014       Member of School Board   
## 3015       Member of School Board   
## 3016       Member of School Board   
## 3017       Member of School Board   
## 3018       Member of School Board   
## 3019       Member of School Board   
## 3020       Member of School Board   
## 3021       Justice of the Peace     
## 3022       Justice of the Peace     
## 3023       Justice of the Peace     
## 3024       Constable                
## 3025       Constable                
## 3026       Constable                
## 3027                           Mayor
## 3028                           Mayor
## 3029       Mayor                    
## 3030       Alderman at Large        
## 3031       Council Member           
## 3032       Alderman                 
## 3033       Alderman                 
## 3034       Alderman                 
## 3035       Alderman                 
## 3036       Alderman                 
## 3037       Alderman                 
## 3038       Alderman                 
## 3039       Council Member           
## 3040       Council Member           
## 3041       Council Member           
## 3042       Council Member           
## 3043       Council Member           
## 3044       Council Member           
## 3045       DPEC Member              
## 3046       DPEC Member              
## 3047       DPEC Member              
## 3048       DPEC Member              
## 3049       DPEC Member              
## 3050       DPEC Member              
## 3051       DPEC Member              
## 3052       DPEC Member              
## 3053       DPEC Member              
## 3054       DPEC Member              
## 3055       DPEC Member              
## 3056       DPEC Member              
## 3057       DPEC Member              
## 3058       DPEC Member              
## 3059       DPEC Member              
## 3060       RPEC Member              
## 3061       RPEC Member              
## 3062       RPEC Member              
## 3063       RPEC Member              
## 3064       RPEC Member              
## 3065       RPEC Member              
## 3066       RPEC Member              
## 3067       RPEC Member              
## 3068       RPEC Member              
## 3069       RPEC Member              
## 3070       RPEC Member              
## 3071       RPEC Member              
## 3072       RPEC Member              
## 3073       RPEC Member              
## 3074       Sheriff                  
## 3075       Clerk of Court           
## 3076         Asesor                 
## 3077       Coroner                  
## 3078       Parish President         
## 3079                  Council Member
## 3080       Council Member           
## 3081       Council Member           
## 3082       Council Member           
## 3083       Council Member           
## 3084       Council Member           
## 3085       Council Member           
## 3086       Council Member           
## 3087       Council Member           
## 3088       Council Member           
## 3089       Council Member           
## 3090       Council Member           
## 3091       Council Member           
## 3092       City Judge               
## 3093                    City Marshal
## 3094          Member of School Board
## 3095       Member of School Board   
## 3096       Member of School Board   
## 3097       Member of School Board   
## 3098       Member of School Board   
## 3099       Member of School Board   
## 3100       Member of School Board   
## 3101       Member of School Board   
## 3102       Member of School Board   
## 3103       Member of School Board   
## 3104       Member of School Board   
## 3105       Member of School Board   
## 3106       Member of School Board   
## 3107       Member of School Board   
## 3108       Member of School Board   
## 3109       Justice of the Peace     
## 3110       Justice of the Peace     
## 3111       Justice of the Peace     
## 3112       Justice of the Peace     
## 3113       Justice of the Peace     
## 3114       Justice of the Peace     
## 3115       Constable                
## 3116       Constable                
## 3117       Constable                
## 3118       Constable                
## 3119       Constable                
## 3120       Constable                
## 3121       Mayor                    
## 3122                           Mayor
## 3123       Mayor                    
## 3124       Mayor                    
## 3125       Mayor                    
## 3126                           Mayor
## 3127                 Chief of Police
## 3128       Chief of Police          
## 3129       Chief of Police          
## 3130       Chief of Police          
## 3131       Chief of Police          
## 3132       Chief of Police          
## 3133       Alderman                 
## 3134       Alderman                 
## 3135       Alderman                 
## 3136       Alderman                 
## 3137       Alderman                 
## 3138       Alderman                 
## 3139       Alderman                 
## 3140       Alderman                 
## 3141       Alderman                 
## 3142       Alderman                 
## 3143       Alderman                 
## 3144       Alderman                 
## 3145       Alderman                 
## 3146       Alderman                 
## 3147       Alderman                 
## 3148       Alderman                 
## 3149                  Council Member
## 3150                  Council Member
## 3151                  Council Member
## 3152                  Council Member
## 3153                  Council Member
## 3154       Selectman                
## 3155       Selectman                
## 3156       Selectman                
## 3157       Selectman                
## 3158       Selectman                
## 3159       Selectman                
## 3160       DPEC Member              
## 3161       DPEC Member              
## 3162       DPEC Member              
## 3163       DPEC Member              
## 3164       DPEC Member              
## 3165       DPEC Member              
## 3166       DPEC Member              
## 3167       DPEC Member              
## 3168       RPEC Member              
## 3169                     RPEC Member
## 3170                     RPEC Member
## 3171                     RPEC Member
## 3172                     RPEC Member
## 3173                     RPEC Member
## 3174                     RPEC Member
## 3175                     RPEC Member
## 3176       Sheriff                  
## 3177       Clerk of Court           
## 3178         Asesor                 
## 3179       Coroner                  
## 3180                    Police Juror
## 3181                    Police Juror
## 3182                    Police Juror
## 3183                    Police Juror
## 3184                    Police Juror
## 3185                    Police Juror
## 3186                    Police Juror
## 3187          Member of School Board
## 3188       Member of School Board   
## 3189       Member of School Board   
## 3190       Member of School Board   
## 3191       Member of School Board   
## 3192       Member of School Board   
## 3193       Member of School Board   
## 3194       Justice of the Peace     
## 3195       Justice of the Peace     
## 3196       Justice of the Peace     
## 3197       Justice of the Peace     
## 3198       Justice of the Peace     
## 3199       Constable                
## 3200       Constable                
## 3201       Constable                
## 3202       Constable                
## 3203       Constable                
## 3204       Mayor                    
## 3205                           Mayor
## 3206                           Mayor
## 3207                           Mayor
## 3208                           Mayor
## 3209                           Mayor
## 3210       Mayor                    
## 3211       Chief of Police          
## 3212       Chief of Police          
## 3213       Chief of Police          
## 3214       Chief of Police          
## 3215       Chief of Police          
## 3216       Chief of Police          
## 3217       Chief of Police          
## 3218       Alderman at Large        
## 3219       Alderman                 
## 3220       Alderman                 
## 3221       Alderman                 
## 3222       Alderman                 
## 3223       Alderman                 
## 3224       Alderman                 
## 3225       Alderman                 
## 3226       Alderman                 
## 3227       Alderman                 
## 3228       Alderman                 
## 3229       Alderman                 
## 3230       Alderman                 
## 3231       Alderman                 
## 3232       Alderman                 
## 3233       Alderman                 
## 3234       Alderman                 
## 3235       Alderman                 
## 3236       Alderman                 
## 3237       Alderman                 
## 3238       Alderman                 
## 3239       Alderman                 
## 3240       Alderman                 
## 3241       Alderman                 
## 3242       Alderman                 
## 3243       DPEC Member              
## 3244       DPEC Member              
## 3245       DPEC Member              
## 3246       DPEC Member              
## 3247       DPEC Member              
## 3248       DPEC Member              
## 3249       DPEC Member              
## 3250       DPEC Member              
## 3251       DPEC Member              
## 3252       DPEC Member              
## 3253       DPEC Member              
## 3254       DPEC Member              
## 3255       DPEC Member              
## 3256       DPEC Member              
## 3257       DPEC Member              
## 3258       RPEC Member              
## 3259       RPEC Member              
## 3260       RPEC Member              
## 3261       RPEC Member              
## 3262       RPEC Member              
## 3263       RPEC Member              
## 3264       RPEC Member              
## 3265       RPEC Member              
## 3266       RPEC Member              
## 3267       RPEC Member              
## 3268       RPEC Member              
## 3269       RPEC Member              
## 3270       RPEC Member              
## 3271       RPEC Member              
## 3272       RPEC Member              
## 3273       RPEC Member              
## 3274       RPEC Member              
## 3275       RPEC Member              
## 3276       RPEC Member              
## 3277       RPEC Member              
## 3278       RPEC Member              
## 3279       RPEC Member              
## 3280       RPEC Member              
## 3281       RPEC Member              
## 3282       RPEC Member              
## 3283       RPEC Member              
## 3284       RPEC Member              
## 3285       RPEC Member              
## 3286       RPEC Member              
## 3287       RPEC Member              
## 3288       RPEC Member              
## 3289       RPEC Member              
## 3290       RPEC Member              
## 3291       RPEC Member              
## 3292       RPEC Member              
## 3293       RPEC Member              
## 3294       Judge                    
## 3295       Judge                    
## 3296       Judge                    
## 3297       Judge                    
## 3298       Judge                    
## 3299       Judge                    
## 3300       Judge                    
## 3301       Sheriff                  
## 3302       Clerk of Court           
## 3303         Asesor                 
## 3304       Coroner                  
## 3305       Parish President         
## 3306       Councilman at Large      
## 3307       Councilman at Large      
## 3308       Councilman               
## 3309       Councilman               
## 3310       Councilman               
## 3311       Councilman               
## 3312       Councilman               
## 3313          Member of School Board
## 3314       Member of School Board   
## 3315       Member of School Board   
## 3316       Member of School Board   
## 3317       Member of School Board   
## 3318       Member of School Board   
## 3319       Member of School Board   
## 3320       Member of School Board   
## 3321       Member of School Board   
## 3322       Justice of the Peace     
## 3323       Justice of the Peace     
## 3324       Justice of the Peace     
## 3325       Justice of the Peace     
## 3326       Justice of the Peace     
## 3327       Justice of the Peace     
## 3328       Justice of the Peace     
## 3329       Justice of the Peace     
## 3330       Constable                
## 3331       Constable                
## 3332       Constable                
## 3333       Constable                
## 3334       Constable                
## 3335       Constable                
## 3336       Constable                
## 3337       Constable                
## 3338                           Mayor
## 3339                           Mayor
## 3340                           Mayor
## 3341                           Mayor
## 3342       Mayor                    
## 3343       Mayor                    
## 3344       Chief of Police          
## 3345       Chief of Police          
## 3346       Chief of Police          
## 3347       Chief of Police          
## 3348       Chief of Police          
## 3349       Chief of Police          
## 3350       Chief of Police          
## 3351       Councilman at Large      
## 3352       Councilman at Large      
## 3353       Council Member           
## 3354       Council Member           
## 3355       Council Member           
## 3356       Council Member           
## 3357       Council Member           
## 3358       Council Member           
## 3359       Council Member           
## 3360       Council Member           
## 3361       Council Member           
## 3362       Council Member           
## 3363       Council Member           
## 3364       Council Member           
## 3365       Council Member           
## 3366       Council Member           
## 3367       Council Member           
## 3368       Council Member           
## 3369       Council Member           
## 3370       Council Member at Large  
## 3371       Councilman               
## 3372       Councilman               
## 3373       Councilman               
## 3374       Councilman               
## 3375       Councilman               
## 3376       Councilman               
## 3377       Councilman               
## 3378       Councilman               
## 3379       Councilman               
## 3380       Councilman               
## 3381       Councilman               
## 3382       Councilman               
## 3383       Councilman               
## 3384       Councilman               
## 3385       Councilman               
## 3386       DPEC Member              
## 3387       DPEC Member              
## 3388       DPEC Member              
## 3389       DPEC Member              
## 3390       DPEC Member              
## 3391       DPEC Member              
## 3392       DPEC Member              
## 3393       DPEC Member              
## 3394       DPEC Member              
## 3395       DPEC Member              
## 3396       DPEC Member              
## 3397       DPEC Member              
## 3398       DPEC Member              
## 3399       DPEC Member              
## 3400       RPEC Member              
## 3401       RPEC Member              
## 3402       RPEC Member              
## 3403       RPEC Member              
## 3404       RPEC Member              
## 3405       RPEC Member              
## 3406       RPEC Member              
## 3407       RPEC Member              
## 3408       RPEC Member              
## 3409       RPEC Member              
## 3410       RPEC Member              
## 3411       RPEC Member              
## 3412       RPEC Member              
## 3413       RPEC Member              
## 3414       Sheriff                  
## 3415       Clerk of Court           
## 3416         Asesor                 
## 3417       Coroner                  
## 3418                    Police Juror
## 3419       Police Juror             
## 3420       Police Juror             
## 3421       Police Juror             
## 3422       Police Juror             
## 3423       Police Juror             
## 3424       Police Juror             
## 3425       Police Juror             
## 3426       Police Juror             
## 3427       Police Juror             
## 3428       Police Juror             
## 3429       Police Juror             
## 3430       Police Juror             
## 3431       City Judge               
## 3432       City Marshal             
## 3433          Member of School Board
## 3434       Member of School Board   
## 3435       Member of School Board   
## 3436       Member of School Board   
## 3437       Member of School Board   
## 3438       Member of School Board   
## 3439       Member of School Board   
## 3440       Member of School Board   
## 3441       Member of School Board   
## 3442       Member of School Board   
## 3443       Member of School Board   
## 3444       Member of School Board   
## 3445       Member of School Board   
## 3446       Justice of the Peace     
## 3447       Justice of the Peace     
## 3448       Justice of the Peace     
## 3449       Justice of the Peace     
## 3450       Justice of the Peace     
## 3451       Justice of the Peace     
## 3452       Constable                
## 3453       Constable                
## 3454       Constable                
## 3455       Constable                
## 3456       Constable                
## 3457       Constable                
## 3458                           Mayor
## 3459                           Mayor
## 3460       Mayor                    
## 3461       Mayor                    
## 3462                           Mayor
## 3463       Chief of Police          
## 3464       Chief of Police          
## 3465       Chief of Police          
## 3466       Chief of Police          
## 3467       Alderman                 
## 3468       Alderman                 
## 3469       Alderman                 
## 3470       Alderman                 
## 3471       Alderman                 
## 3472       Alderman                 
## 3473       Alderman                 
## 3474       Alderman                 
## 3475       Council Member           
## 3476       Council Member           
## 3477       Council Member           
## 3478       Council Member           
## 3479       Council Member           
## 3480       Council Member           
## 3481       Council Member           
## 3482       Council Member           
## 3483       Council Member           
## 3484       Council Member           
## 3485       Councilman               
## 3486       Councilman               
## 3487       Councilman               
## 3488       Councilman               
## 3489       Councilman               
## 3490       DPEC Member              
## 3491       DPEC Member              
## 3492       DPEC Member              
## 3493       DPEC Member              
## 3494       DPEC Member              
## 3495       DPEC Member              
## 3496       DPEC Member              
## 3497       DPEC Member              
## 3498       DPEC Member              
## 3499       DPEC Member              
## 3500       DPEC Member              
## 3501       DPEC Member              
## 3502       DPEC Member              
## 3503       DPEC Member              
## 3504       RPEC Member              
## 3505       RPEC Member              
## 3506       RPEC Member              
## 3507       RPEC Member              
## 3508       RPEC Member              
## 3509       RPEC Member              
## 3510       RPEC Member              
## 3511       RPEC Member              
## 3512       RPEC Member              
## 3513       RPEC Member              
## 3514       RPEC Member              
## 3515       RPEC Member              
## 3516       RPEC Member              
## 3517       RPEC Member              
## 3518       Sheriff                  
## 3519       Clerk of Court           
## 3520         Asesor                 
## 3521            CityParish President
## 3522                          Member
## 3523       Member                   
## 3524       Member                   
## 3525       Member                   
## 3526       Member                   
## 3527       Member                   
## 3528       Member                   
## 3529       Member                   
## 3530       Member                   
## 3531       City Judge               
## 3532       City Judge               
## 3533       City Marshal             
## 3534          Member of School Board
## 3535       Member of School Board   
## 3536       Member of School Board   
## 3537       Member of School Board   
## 3538       Member of School Board   
## 3539       Member of School Board   
## 3540       Member of School Board   
## 3541       Member of School Board   
## 3542       Member of School Board   
## 3543       Justice of the Peace     
## 3544       Justice of the Peace     
## 3545       Justice of the Peace     
## 3546       Justice of the Peace     
## 3547       Justice of the Peace     
## 3548       Justice of the Peace     
## 3549       Justice of the Peace     
## 3550       Justice of the Peace     
## 3551            Justice of the Peace
## 3552       Constable                
## 3553       Constable                
## 3554       Constable                
## 3555       Constable                
## 3556       Constable                
## 3557       Constable                
## 3558       Constable                
## 3559       Constable                
## 3560       Constable                
## 3561                           Mayor
## 3562       Mayor                    
## 3563       Mayor                    
## 3564       Chief of Police          
## 3565       Chief of Police          
## 3566       Chief of Police          
## 3567       Council Member at Large  
## 3568       Council Member           
## 3569       Council Member           
## 3570       Council Member           
## 3571       Council Member           
## 3572       Council Member           
## 3573       Council Member           
## 3574       Council Member           
## 3575       Council Member           
## 3576       Council Member           
## 3577       Council Member           
## 3578       Council Member           
## 3579       Council Member           
## 3580       Council Member           
## 3581       Council Member           
## 3582       DPEC Member              
## 3583       DPEC Member              
## 3584       DPEC Member              
## 3585       DPEC Member              
## 3586       DPEC Member              
## 3587       DPEC Member              
## 3588       DPEC Member              
## 3589       DPEC Member              
## 3590       DPEC Member              
## 3591       DPEC Member              
## 3592       DPEC Member              
## 3593       DPEC Member              
## 3594       DPEC Member              
## 3595       DPEC Member              
## 3596       RPEC Member              
## 3597       RPEC Member              
## 3598       RPEC Member              
## 3599       RPEC Member              
## 3600       RPEC Member              
## 3601       RPEC Member              
## 3602       RPEC Member              
## 3603       RPEC Member              
## 3604       RPEC Member              
## 3605       RPEC Member              
## 3606       Sheriff                  
## 3607       Clerk of Court           
## 3608         Asesor                 
## 3609       Coroner                  
## 3610       Parish President         
## 3611       Council Member           
## 3612       Council Member           
## 3613       Council Member           
## 3614       Council Member           
## 3615       Council Member           
## 3616       Council Member           
## 3617       Council Member           
## 3618       Council Member           
## 3619       Council Member           
## 3620       City Judge               
## 3621       City Marshal             
## 3622          Member of School Board
## 3623       Member of School Board   
## 3624       Member of School Board   
## 3625       Member of School Board   
## 3626       Member of School Board   
## 3627       Member of School Board   
## 3628       Member of School Board   
## 3629       Member of School Board   
## 3630       Member of School Board   
## 3631       Member of School Board   
## 3632       Member of School Board   
## 3633       Member of School Board   
## 3634       Member of School Board   
## 3635       Member of School Board   
## 3636       Member of School Board   
## 3637       Member                   
## 3638       Member                   
## 3639       Member                   
## 3640       Member                   
## 3641       Member                   
## 3642       Member                   
## 3643       Member                   
## 3644       Member                   
## 3645       Member                   
## 3646       Justice of the Peace     
## 3647       Justice of the Peace     
## 3648       Justice of the Peace     
## 3649       Justice of the Peace     
## 3650       Constable                
## 3651       Constable                
## 3652       Constable                
## 3653       Constable                
## 3654       Mayor                    
## 3655       Mayor                    
## 3656                           Mayor
## 3657       Chief of Police          
## 3658       Chief of Police          
## 3659       Councilman at Large      
## 3660       Councilman at Large      
## 3661       Council Member           
## 3662       Council Member           
## 3663       Council Member           
## 3664       Council Member           
## 3665       Council Member           
## 3666       Councilman               
## 3667       Councilman               
## 3668       Councilman               
## 3669       Councilman               
## 3670       Councilman               
## 3671       Councilman               
## 3672       Councilman               
## 3673       Councilman               
## 3674       DPEC Member              
## 3675       DPEC Member              
## 3676       DPEC Member              
## 3677       DPEC Member              
## 3678       DPEC Member              
## 3679       DPEC Member              
## 3680       DPEC Member              
## 3681       DPEC Member              
## 3682       DPEC Member              
## 3683       DPEC Member              
## 3684       DPEC Member              
## 3685       DPEC Member              
## 3686       RPEC Member              
## 3687       RPEC Member              
## 3688       RPEC Member              
## 3689       RPEC Member              
## 3690       RPEC Member              
## 3691       RPEC Member              
## 3692       RPEC Member              
## 3693       RPEC Member              
## 3694       RPEC Member              
## 3695       RPEC Member              
## 3696       RPEC Member              
## 3697       RPEC Member              
## 3698       RPEC Member              
## 3699       RPEC Member              
## 3700       Sheriff                  
## 3701       Clerk of Court           
## 3702         Asesor                 
## 3703       Coroner                  
## 3704                    Police Juror
## 3705       Police Juror             
## 3706       Police Juror             
## 3707       Police Juror             
## 3708       Police Juror             
## 3709       Police Juror             
## 3710       Police Juror             
## 3711       Police Juror             
## 3712       Police Juror             
## 3713       Police Juror             
## 3714       Member of School Board   
## 3715       Member of School Board   
## 3716       Member of School Board   
## 3717       Member of School Board   
## 3718       Member of School Board   
## 3719       Member of School Board   
## 3720       Member of School Board   
## 3721       Member of School Board   
## 3722       Member of School Board   
## 3723       Member of School Board   
## 3724       Justice of the Peace     
## 3725       Justice of the Peace     
## 3726       Justice of the Peace     
## 3727       Justice of the Peace     
## 3728       Justice of the Peace     
## 3729       Constable                
## 3730       Constable                
## 3731       Constable                
## 3732       Constable                
## 3733       Constable                
## 3734                           Mayor
## 3735       Mayor                    
## 3736                           Mayor
## 3737                           Mayor
## 3738       Chief of Police          
## 3739       Chief of Police          
## 3740       Chief of Police          
## 3741       Chief of Police          
## 3742       Alderman                 
## 3743       Alderman                 
## 3744       Alderman                 
## 3745       Alderman                 
## 3746       Alderman                 
## 3747       Alderman                 
## 3748       Alderman                 
## 3749       Alderman                 
## 3750       Alderman                 
## 3751       Alderman                 
## 3752       Alderman                 
## 3753       Alderman                 
## 3754       Alderman                 
## 3755       Alderman                 
## 3756       Alderman                 
## 3757         Council Members        
## 3758         Council Members        
## 3759         Council Members        
## 3760         Council Members        
## 3761         Council Members        
## 3762       DPEC Member              
## 3763                     DPEC Member
## 3764                     DPEC Member
## 3765                     DPEC Member
## 3766                     DPEC Member
## 3767                     DPEC Member
## 3768                     DPEC Member
## 3769                     DPEC Member
## 3770                     DPEC Member
## 3771                     DPEC Member
## 3772                     DPEC Member
## 3773                     DPEC Member
## 3774                     DPEC Member
## 3775       RPEC Member              
## 3776       RPEC Member              
## 3777       RPEC Member              
## 3778       RPEC Member              
## 3779       RPEC Member              
## 3780                     RPEC Member
## 3781                     RPEC Member
## 3782                     RPEC Member
## 3783                     RPEC Member
## 3784                     RPEC Member
## 3785                     RPEC Member
## 3786                     RPEC Member
## 3787                     RPEC Member
## 3788                     RPEC Member
## 3789                     RPEC Member
## 3790                     RPEC Member
## 3791                     RPEC Member
## 3792       Sheriff                  
## 3793       Clerk of Court           
## 3794         Asesor                 
## 3795                         Coroner
## 3796                    Police Juror
## 3797       Police Juror             
## 3798       Police Juror             
## 3799       Police Juror             
## 3800       Police Juror             
## 3801       Police Juror             
## 3802       Police Juror             
## 3803       Police Juror             
## 3804       Police Juror             
## 3805       Police Juror             
## 3806       Police Juror             
## 3807       Police Juror             
## 3808       City Judge               
## 3809       City Marshal             
## 3810          Member of School Board
## 3811       Member of School Board   
## 3812       Member of School Board   
## 3813       Member of School Board   
## 3814       Member of School Board   
## 3815       Member of School Board   
## 3816       Member of School Board   
## 3817       Member of School Board   
## 3818       Member of School Board   
## 3819       Member of School Board   
## 3820       Member of School Board   
## 3821       Member of School Board   
## 3822       Justice of the Peace     
## 3823       Justice of the Peace     
## 3824       Justice of the Peace     
## 3825       Justice of the Peace     
## 3826       Constable                
## 3827       Constable                
## 3828       Constable                
## 3829       Constable                
## 3830       Mayor                    
## 3831       Mayor                    
## 3832                           Mayor
## 3833                           Mayor
## 3834                           Mayor
## 3835                           Mayor
## 3836       Chief of Police          
## 3837       Chief of Police          
## 3838       Chief of Police          
## 3839       Alderman                 
## 3840       Alderman                 
## 3841       Alderman                 
## 3842       Alderman                 
## 3843       Alderman                 
## 3844       Alderman                 
## 3845       Alderman                 
## 3846       Alderman                 
## 3847       Alderman                 
## 3848       Alderman                 
## 3849       Alderman                 
## 3850       Council Member           
## 3851       Council Member           
## 3852       Council Member           
## 3853       Council Member           
## 3854       Council Member           
## 3855       Council Member           
## 3856       Council Member           
## 3857       Council Member           
## 3858       Council Member           
## 3859       Council Member           
## 3860       Councilmen               
## 3861       Councilmen               
## 3862       Councilmen               
## 3863       DPEC Member              
## 3864       DPEC Member              
## 3865       DPEC Member              
## 3866       DPEC Member              
## 3867       DPEC Member              
## 3868       DPEC Member              
## 3869       DPEC Member              
## 3870       DPEC Member              
## 3871       DPEC Member              
## 3872       DPEC Member              
## 3873       DPEC Member              
## 3874       RPEC Member              
## 3875       RPEC Member              
## 3876       RPEC Member              
## 3877       RPEC Member              
## 3878       RPEC Member              
## 3879       RPEC Member              
## 3880       RPEC Member              
## 3881       RPEC Member              
## 3882       RPEC Member              
## 3883       RPEC Member              
## 3884       RPEC Member              
## 3885       RPEC Member              
## 3886       RPEC Member              
## 3887       RPEC Member              
## 3888       Sheriff                  
## 3889       Clerk of Court           
## 3890         Asesor                 
## 3891       Coroner                  
## 3892       Parish President         
## 3893                      Councilman
## 3894       Councilman               
## 3895       Councilman               
## 3896       Councilman               
## 3897       Councilman               
## 3898       Councilman               
## 3899       Councilman               
## 3900       Councilman               
## 3901       Councilman               
## 3902       City Judge               
## 3903       City Marshal             
## 3904          Member of School Board
## 3905       Member of School Board   
## 3906       Member of School Board   
## 3907       Member of School Board   
## 3908       Member of School Board   
## 3909       Member of School Board   
## 3910       Member of School Board   
## 3911       Member of School Board   
## 3912       Member of School Board   
## 3913       Justice of the Peace     
## 3914       Justice of the Peace     
## 3915       Justice of the Peace     
## 3916       Justice of the Peace     
## 3917       Justice of the Peace     
## 3918       Justice of the Peace     
## 3919       Justice of the Peace     
## 3920       Justice of the Peace     
## 3921       Justice of the Peace     
## 3922       Justice of the Peace     
## 3923       Constable                
## 3924       Constable                
## 3925       Constable                
## 3926       Constable                
## 3927       Constable                
## 3928       Constable                
## 3929       Constable                
## 3930       Constable                
## 3931       Constable                
## 3932       Constable                
## 3933       Mayor                    
## 3934                           Mayor
## 3935                           Mayor
## 3936                           Mayor
## 3937       Mayor                    
## 3938       Mayor                    
## 3939       Mayor                    
## 3940                           Mayor
## 3941                           Mayor
## 3942                 Chief of Police
## 3943                 Chief of Police
## 3944       Chief of Police          
## 3945       Chief of Police          
## 3946                        Alderman
## 3947                        Alderman
## 3948                        Alderman
## 3949                        Alderman
## 3950                        Alderman
## 3951                        Alderman
## 3952       Alderman                 
## 3953       Alderman                 
## 3954       Alderman                 
## 3955       Alderman                 
## 3956       Alderman                 
## 3957       Alderman                 
## 3958       Alderman                 
## 3959       Alderman                 
## 3960       Alderman                 
## 3961       Alderman                 
## 3962       Alderman                 
## 3963       Alderman                 
## 3964       Alderman                 
## 3965       Alderman                 
## 3966       Alderman                 
## 3967       Alderman                 
## 3968       Alderman                 
## 3969       Alderman                 
## 3970       Alderman                 
## 3971       Alderman                 
## 3972       Alderman                 
## 3973       Alderman                 
## 3974       Alderman                 
## 3975       Alderman                 
## 3976       Alderman                 
## 3977       Alderman                 
## 3978       Council Member           
## 3979       Council Member           
## 3980       Council Member           
## 3981       Council Member           
## 3982       Council Member           
## 3983                      Councilmen
## 3984                      Councilmen
## 3985                      Councilmen
## 3986       DPEC Member              
## 3987       DPEC Member              
## 3988       DPEC Member              
## 3989       DPEC Member              
## 3990       DPEC Member              
## 3991       DPEC Member              
## 3992       DPEC Member              
## 3993       DPEC Member              
## 3994       DPEC Member              
## 3995       RPEC Member              
## 3996       RPEC Member              
## 3997       RPEC Member              
## 3998       RPEC Member              
## 3999       RPEC Member              
## 4000       RPEC Member              
## 4001       Sheriff                  
## 4002                  Clerk of Court
## 4003         Asesor                 
## 4004       Coroner                  
## 4005                    Police Juror
## 4006       Police Juror             
## 4007       Police Juror             
## 4008       Police Juror             
## 4009       Police Juror             
## 4010          Member of School Board
## 4011       Member of School Board   
## 4012       Member of School Board   
## 4013       Member of School Board   
## 4014       Member of School Board   
## 4015       Member of School Board   
## 4016       Member of School Board   
## 4017       Member of School Board   
## 4018       Justice of the Peace     
## 4019       Justice of the Peace     
## 4020       Justice of the Peace     
## 4021       Justice of the Peace     
## 4022       Constable                
## 4023       Constable                
## 4024       Constable                
## 4025       Constable                
## 4026       Mayor                    
## 4027                           Mayor
## 4028       Mayor                    
## 4029       Mayor                    
## 4030       Chief of Police          
## 4031       Chief of Police          
## 4032       Chief of Police          
## 4033       Alderman                 
## 4034       Alderman                 
## 4035       Alderman                 
## 4036       Alderman                 
## 4037       Alderman                 
## 4038       Alderman                 
## 4039       Alderman                 
## 4040       Alderman                 
## 4041       Alderman                 
## 4042       Council Member           
## 4043       Council Member           
## 4044       Council Member           
## 4045       Council Member           
## 4046       Council Member           
## 4047       DPEC Member              
## 4048       DPEC Member              
## 4049       DPEC Member              
## 4050       DPEC Member              
## 4051       DPEC Member              
## 4052       DPEC Member              
## 4053       DPEC Member              
## 4054       DPEC Member              
## 4055       DPEC Member              
## 4056       DPEC Member              
## 4057       DPEC Member              
## 4058       DPEC Member              
## 4059       RPEC Member              
## 4060       RPEC Member              
## 4061       RPEC Member              
## 4062       RPEC Member              
## 4063       RPEC Member              
## 4064       RPEC Member              
## 4065       RPEC Member              
## 4066       RPEC Member              
## 4067       Sheriff                  
## 4068       Clerk of Court           
## 4069         Asesor                 
## 4070       Coroner                  
## 4071                    Police Juror
## 4072       Police Juror             
## 4073       Police Juror             
## 4074       Police Juror             
## 4075       Police Juror             
## 4076       Police Juror             
## 4077       Police Juror             
## 4078       City Judge               
## 4079       City Marshal             
## 4080          Member of School Board
## 4081       Member of School Board   
## 4082       Member of School Board   
## 4083       Member of School Board   
## 4084       Member of School Board   
## 4085       Member of School Board   
## 4086       Member of School Board   
## 4087       Justice of the Peace     
## 4088       Justice of the Peace     
## 4089       Justice of the Peace     
## 4090       Justice of the Peace     
## 4091       Justice of the Peace     
## 4092       Justice of the Peace     
## 4093       Justice of the Peace     
## 4094       Justice of the Peace     
## 4095       Constable                
## 4096       Constable                
## 4097       Constable                
## 4098       Constable                
## 4099       Constable                
## 4100       Constable                
## 4101       Constable                
## 4102       Constable                
## 4103       Mayor                    
## 4104       Mayor                    
## 4105                           Mayor
## 4106       Mayor                    
## 4107       Mayor                    
## 4108       Alderman                 
## 4109       Alderman                 
## 4110       Alderman                 
## 4111       Alderman                 
## 4112       Alderman                 
## 4113       Alderman                 
## 4114       Alderman                 
## 4115       Alderman                 
## 4116       Alderman                 
## 4117       Alderman                 
## 4118       Alderman                 
## 4119       Alderman                 
## 4120                        Alderman
## 4121       Alderman                 
## 4122       Alderman                 
## 4123       Alderman                 
## 4124       Alderman                 
## 4125       Alderman                 
## 4126       Alderman                 
## 4127       Alderman                 
## 4128       Alderman                 
## 4129       Alderman                 
## 4130       DPEC Member              
## 4131       DPEC Member              
## 4132       DPEC Member              
## 4133       DPEC Member              
## 4134       DPEC Member              
## 4135       DPEC Member              
## 4136       DPEC Member              
## 4137       DPEC Member              
## 4138       DPEC Member              
## 4139       DPEC Member              
## 4140       DPEC Member              
## 4141       DPEC Member              
## 4142       DPEC Member              
## 4143       DPEC Member              
## 4144       RPEC Member              
## 4145       RPEC Member              
## 4146       RPEC Member              
## 4147       RPEC Member              
## 4148       RPEC Member              
## 4149       RPEC Member              
## 4150       RPEC Member              
## 4151       RPEC Member              
## 4152       RPEC Member              
## 4153       RPEC Member              
## 4154       RPEC Member              
## 4155       RPEC Member              
## 4156       Sheriff                  
## 4157       Clerk of Court           
## 4158         Asesor                 
## 4159       Coroner                  
## 4160                Parish President
## 4161                  Council Member
## 4162                  Council Member
## 4163                  Council Member
## 4164                  Council Member
## 4165                  Council Member
## 4166       City Judge               
## 4167       City Marshal             
## 4168          Member of School Board
## 4169       Member of School Board   
## 4170       Member of School Board   
## 4171       Member of School Board   
## 4172       Member of School Board   
## 4173       Member of School Board   
## 4174       Member of School Board   
## 4175       Member of School Board   
## 4176       Member of School Board   
## 4177       Member of School Board   
## 4178          Member of School Board
## 4179       Justice of the Peace     
## 4180       Justice of the Peace     
## 4181       Justice of the Peace     
## 4182       Constable                
## 4183       Constable                
## 4184       Constable                
## 4185       Mayor                    
## 4186                           Mayor
## 4187                           Mayor
## 4188                           Mayor
## 4189                           Mayor
## 4190                           Mayor
## 4191                           Mayor
## 4192       Mayor                    
## 4193       Mayor                    
## 4194       Chief of Police          
## 4195       Chief of Police          
## 4196       Chief of Police          
## 4197       Chief of Police          
## 4198       Chief of Police          
## 4199       Chief of Police          
## 4200       Chief of Police          
## 4201       Chief of Police          
## 4202       Councilman at Large      
## 4203       Alderman                 
## 4204       Alderman                 
## 4205       Alderman                 
## 4206       Alderman                 
## 4207       Alderman                 
## 4208       Alderman                 
## 4209       Alderman                 
## 4210       Alderman                 
## 4211       Alderman                 
## 4212                        Alderman
## 4213                        Alderman
## 4214                        Alderman
## 4215       Alderman                 
## 4216       Alderman                 
## 4217       Alderman                 
## 4218       Alderman                 
## 4219       Alderman                 
## 4220       Alderman                 
## 4221       Council Member           
## 4222       Council Member           
## 4223       Council Member           
## 4224       Councilman               
## 4225       Councilman               
## 4226       Councilman               
## 4227       Councilman               
## 4228       Councilman               
## 4229       Councilman               
## 4230       Councilman               
## 4231       Councilman               
## 4232       Councilman               
## 4233       DPEC Member              
## 4234       DPEC Member              
## 4235       DPEC Member              
## 4236       DPEC Member              
## 4237       DPEC Member              
## 4238       DPEC Member              
## 4239       DPEC Member              
## 4240       DPEC Member              
## 4241       DPEC Member              
## 4242       DPEC Member              
## 4243       DPEC Member              
## 4244       DPEC Member              
## 4245       DPEC Member              
## 4246       DPEC Member              
## 4247       DPEC Member              
## 4248       DPEC Member              
## 4249       DPEC Member              
## 4250       DPEC Member              
## 4251       DPEC Member              
## 4252       DPEC Member              
## 4253       DPEC Member              
## 4254       DPEC Member              
## 4255       DPEC Member              
## 4256       DPEC Member              
## 4257       DPEC Member              
## 4258       DPEC Member              
## 4259       DPEC Member              
## 4260       DPEC Member              
## 4261       DPEC Member              
## 4262       DPEC Member              
## 4263       DPEC Member              
## 4264       DPEC Member              
## 4265       DPEC Member              
## 4266       DPEC Member              
## 4267       DPEC Member              
## 4268       DPEC Member              
## 4269       DPEC Member              
## 4270       DPEC Member              
## 4271       DPEC Member              
## 4272       DPEC Member              
## 4273       DPEC Member              
## 4274       DPEC Member              
## 4275       DPEC Member              
## 4276       DPEC Member              
## 4277       DPEC Member              
## 4278       DPEC Member              
## 4279       DPEC Member              
## 4280       DPEC Member              
## 4281       DPEC Member              
## 4282       DPEC Member              
## 4283       DPEC Member              
## 4284       DPEC Member              
## 4285       DPEC Member              
## 4286       DPEC Member              
## 4287       DPEC Member              
## 4288       DPEC Member              
## 4289       DPEC Member              
## 4290       DPEC Member              
## 4291       DPEC Member              
## 4292       DPEC Member              
## 4293       DPEC Member              
## 4294       DPEC Member              
## 4295       DPEC Member              
## 4296       DPEC Member              
## 4297       DPEC Member              
## 4298       DPEC Member              
## 4299       DPEC Member              
## 4300       DPEC Member              
## 4301       DPEC Member              
## 4302       DPEC Member              
## 4303       RPEC Member              
## 4304       RPEC Member              
## 4305       RPEC Member              
## 4306       RPEC Member              
## 4307       RPEC Member              
## 4308       RPEC Member              
## 4309       RPEC Member              
## 4310       RPEC Member              
## 4311       RPEC Member              
## 4312       RPEC Member              
## 4313       RPEC Member              
## 4314       RPEC Member              
## 4315       RPEC Member              
## 4316       RPEC Member              
## 4317       RPEC Member              
## 4318       RPEC Member              
## 4319       RPEC Member              
## 4320       RPEC Member              
## 4321       RPEC Member              
## 4322       RPEC Member              
## 4323       RPEC Member              
## 4324       RPEC Member              
## 4325       RPEC Member              
## 4326       RPEC Member              
## 4327       RPEC Member              
## 4328       RPEC Member              
## 4329       RPEC Member              
## 4330       RPEC Member              
## 4331       RPEC Member              
## 4332       RPEC Member              
## 4333       RPEC Member              
## 4334       RPEC Member              
## 4335       RPEC Member              
## 4336       RPEC Member              
## 4337       RPEC Member              
## 4338       RPEC Member              
## 4339       RPEC Member              
## 4340       RPEC Member              
## 4341       RPEC Member              
## 4342       RPEC Member              
## 4343       RPEC Member              
## 4344       RPEC Member              
## 4345       RPEC Member              
## 4346       Judge                    
## 4347       Judge                    
##                                  OfficeDescription
## 1         1st Representative District Office A    
## 2         1st Representative District Office B    
## 3         2nd Representative District Office A    
## 4         2nd Representative District Office B    
## 5         3rd Representative District Office A    
## 6         3rd Representative District Office B    
## 7         4th Representative District Office A    
## 8         4th Representative District Office B    
## 9         5th Representative District Office A    
## 10        5th Representative District Office B    
## 11        6th Representative District Office A    
## 12        6th Representative District Office B    
## 13        7th Representative District Office A    
## 14        7th Representative District Office B    
## 15        8th Representative District Office A    
## 16        8th Representative District Office B    
## 17        9th Representative District Office A    
## 18        9th Representative District Office B    
## 19       10th Representative District Office A    
## 20       10th Representative District Office B    
## 21       11th Representative District Office A    
## 22       11th Representative District Office B    
## 23       12th Representative District Office A    
## 24       12th Representative District Office B    
## 25       13th Representative District Office A    
## 26       13th Representative District Office B    
## 27       14th Representative District Office A    
## 28       14th Representative District Office B    
## 29       15th Representative District Office A    
## 30       15th Representative District Office B    
## 31       16th Representative District Office A    
## 32       16th Representative District Office B    
## 33       17th Representative District Office A    
## 34       17th Representative District Office B    
## 35       18th Representative District Office A    
## 36       18th Representative District Office B    
## 37       19th Representative District Office A    
## 38       19th Representative District Office B    
## 39       20th Representative District Office A    
## 40       20th Representative District Office B    
## 41       21st Representative District Office A    
## 42       21st Representative District Office B    
## 43       22nd Representative District Office A    
## 44       22nd Representative District Office B    
## 45       23rd Representative District Office A    
## 46       23rd Representative District Office B    
## 47       24th Representative District Office A    
## 48       24th Representative District Office B    
## 49       25th Representative District Office A    
## 50       25th Representative District Office B    
## 51       26th Representative District Office A    
## 52       26th Representative District Office B    
## 53       27th Representative District Office A    
## 54       27th Representative District Office B    
## 55       28th Representative District Office A    
## 56       28th Representative District Office B    
## 57       29th Representative District Office A    
## 58       29th Representative District Office B    
## 59       30th Representative District Office A    
## 60       30th Representative District Office B    
## 61       31st Representative District Office A    
## 62       31st Representative District Office B    
## 63       32nd Representative District Office A    
## 64       32nd Representative District Office B    
## 65           33rd Representative District Office A
## 66       33rd Representative District Office B    
## 67       34th Representative District Office A    
## 68       34th Representative District Office B    
## 69       35th Representative District Office A    
## 70       35th Representative District Office B    
## 71       36th Representative District Office A    
## 72       36th Representative District Office B    
## 73       37th Representative District Office A    
## 74       37th Representative District Office B    
## 75       38th Representative District Office A    
## 76       38th Representative District Office B    
## 77       39th Representative District Office A    
## 78       39th Representative District Office B    
## 79       40th Representative District Office A    
## 80       40th Representative District Office B    
## 81       41st Representative District Office A    
## 82       41st Representative District Office B    
## 83       42nd Representative District Office A    
## 84       42nd Representative District Office B    
## 85       43rd Representative District Office A    
## 86       43rd Representative District Office B    
## 87       44th Representative District Office A    
## 88       44th Representative District Office B    
## 89       45th Representative District Office A    
## 90       45th Representative District Office B    
## 91       46th Representative District Office A    
## 92       46th Representative District Office B    
## 93       47th Representative District Office A    
## 94       47th Representative District Office B    
## 95       48th Representative District Office A    
## 96       48th Representative District Office B    
## 97       49th Representative District Office A    
## 98       49th Representative District Office B    
## 99       50th Representative District Office A    
## 100      50th Representative District Office B    
## 101      51st Representative District Office A    
## 102      51st Representative District Office B    
## 103      52nd Representative District Office A    
## 104      52nd Representative District Office B    
## 105      53rd Representative District Office A    
## 106      53rd Representative District Office B    
## 107      54th Representative District Office A    
## 108      54th Representative District Office B    
## 109      55th Representative District Office A    
## 110      55th Representative District Office B    
## 111      56th Representative District Office A    
## 112      56th Representative District Office B    
## 113      57th Representative District Office A    
## 114      57th Representative District Office B    
## 115      58th Representative District Office A    
## 116      58th Representative District Office B    
## 117      59th Representative District Office A    
## 118      59th Representative District Office B    
## 119      60th Representative District Office A    
## 120      60th Representative District Office B    
## 121      61st Representative District Office A    
## 122      61st Representative District Office B    
## 123      62nd Representative District Office A    
## 124      62nd Representative District Office B    
## 125      63rd Representative District Office A    
## 126      63rd Representative District Office B    
## 127      64th Representative District Office A    
## 128      64th Representative District Office B    
## 129      65th Representative District Office A    
## 130      65th Representative District Office B    
## 131      66th Representative District Office A    
## 132      66th Representative District Office B    
## 133      67th Representative District Office A    
## 134      67th Representative District Office B    
## 135      68th Representative District Office A    
## 136      68th Representative District Office B    
## 137      69th Representative District Office A    
## 138      69th Representative District Office B    
## 139      70th Representative District Office A    
## 140      70th Representative District Office B    
## 141      71st Representative District Office A    
## 142      71st Representative District Office B    
## 143      72nd Representative District Office A    
## 144      72nd Representative District Office B    
## 145      73rd Representative District Office A    
## 146      73rd Representative District Office B    
## 147      74th Representative District Office A    
## 148      74th Representative District Office B    
## 149      75th Representative District Office A    
## 150      75th Representative District Office B    
## 151      76th Representative District Office A    
## 152      76th Representative District Office B    
## 153      77th Representative District Office A    
## 154      77th Representative District Office B    
## 155      78th Representative District Office A    
## 156      78th Representative District Office B    
## 157      79th Representative District Office A    
## 158      79th Representative District Office B    
## 159      80th Representative District Office A    
## 160      80th Representative District Office B    
## 161      81st Representative District Office A    
## 162      81st Representative District Office B    
## 163      82nd Representative District Office A    
## 164      82nd Representative District Office B    
## 165      83rd Representative District Office A    
## 166      83rd Representative District Office B    
## 167      84th Representative District Office A    
## 168      84th Representative District Office B    
## 169      85th Representative District Office A    
## 170      85th Representative District Office B    
## 171      86th Representative District Office A    
## 172      86th Representative District Office B    
## 173      87th Representative District Office A    
## 174      87th Representative District Office B    
## 175      88th Representative District Office A    
## 176      88th Representative District Office B    
## 177      89th Representative District Office A    
## 178      89th Representative District Office B    
## 179      90th Representative District Office A    
## 180      90th Representative District Office B    
## 181      91st Representative District Office A    
## 182      91st Representative District Office B    
## 183      92nd Representative District Office A    
## 184      92nd Representative District Office B    
## 185      93rd Representative District Office A    
## 186      93rd Representative District Office B    
## 187      94th Representative District Office A    
## 188      94th Representative District Office B    
## 189      95th Representative District Office A    
## 190      95th Representative District Office B    
## 191      96th Representative District Office A    
## 192      96th Representative District Office B    
## 193      97th Representative District Office A    
## 194      97th Representative District Office B    
## 195      98th Representative District Office A    
## 196      98th Representative District Office B    
## 197      99th Representative District Office A    
## 198      99th Representative District Office B    
## 199     100th Representative District Office A    
## 200     100th Representative District Office B    
## 201     101st Representative District Office A    
## 202     101st Representative District Office B    
## 203     102nd Representative District Office A    
## 204     102nd Representative District Office B    
## 205     103rd Representative District Office A    
## 206     103rd Representative District Office B    
## 207     104th Representative District Office A    
## 208     104th Representative District Office B    
## 209     105th Representative District Office A    
## 210     105th Representative District Office B    
## 211     1st Representative District Subdistrict A 
## 212     1st Representative District Subdistrict B 
## 213    2nd Representative District                
## 214    3rd Representative District                
## 215     4th Representative District Subdistrict A 
## 216     4th Representative District Subdistrict B 
## 217     5th Representative District Subdistrict A 
## 218     5th Representative District Subdistrict B 
## 219     5th Representative District Subdistrict C 
## 220     5th Representative District Subdistrict D 
## 221     6th Representative District Subdistrict A 
## 222     6th Representative District Subdistrict B 
## 223     6th Representative District Subdistrict C 
## 224     6th Representative District Subdistrict D 
## 225     7th Representative District Subdistrict A 
## 226     7th Representative District Subdistrict B 
## 227     8th Representative District Subdistrict A 
## 228     8th Representative District Subdistrict B 
## 229     8th Representative District Subdistrict C 
## 230     9th Representative District Subdistrict A 
## 231     9th Representative District Subdistrict B 
## 232     9th Representative District Subdistrict C 
## 233    10th Representative District Subdistrict A 
## 234    10th Representative District Subdistrict B 
## 235   11th Representative District                
## 236    12th Representative District Subdistrict A 
## 237    12th Representative District Subdistrict B 
## 238    12th Representative District Subdistrict C 
## 239    13th Representative District Subdistrict A 
## 240    13th Representative District Subdistrict B 
## 241    14th Representative District Subdistrict A 
## 242    14th Representative District Subdistrict B 
## 243    14th Representative District Subdistrict C 
## 244    15th Representative District Subdistrict A 
## 245    15th Representative District Subdistrict B 
## 246    15th Representative District Subdistrict C 
## 247    16th Representative District Subdistrict A 
## 248    16th Representative District Subdistrict B 
## 249    16th Representative District Subdistrict C 
## 250    16th Representative District Subdistrict D 
## 251   17th Representative District                
## 252   18th Representative District                
## 253    19th Representative District Subdistrict A 
## 254    19th Representative District Subdistrict B 
## 255    20th Representative District Subdistrict A 
## 256    20th Representative District Subdistrict B 
## 257    21st Representative District Subdistrict A 
## 258    21st Representative District Subdistrict B 
## 259    22nd Representative District Subdistrict A 
## 260    22nd Representative District Subdistrict B 
## 261    23rd Representative District Subdistrict A 
## 262    23rd Representative District Subdistrict B 
## 263    24th Representative District Subdistrict A 
## 264    24th Representative District Subdistrict B 
## 265    25th Representative District Subdistrict A 
## 266    25th Representative District Subdistrict B 
## 267    25th Representative District Subdistrict C 
## 268   26th Representative District                
## 269    27th Representative District Subdistrict A 
## 270    27th Representative District Subdistrict B 
## 271    27th Representative District Subdistrict C 
## 272   28th Representative District                
## 273   29th Representative District                
## 274    30th Representative District Subdistrict A 
## 275    30th Representative District Subdistrict B 
## 276    31st Representative District Subdistrict A 
## 277    31st Representative District Subdistrict B 
## 278    31st Representative District Subdistrict C 
## 279    32nd Representative District Subdistrict A 
## 280    32nd Representative District Subdistrict B 
## 281    33rd Representative District Subdistrict A 
## 282    33rd Representative District Subdistrict B 
## 283   34th Representative District                
## 284    35th Representative District Subdistrict A 
## 285    35th Representative District Subdistrict B 
## 286    36th Representative District Subdistrict A 
## 287    36th Representative District Subdistrict B 
## 288    36th Representative District Subdistrict C 
## 289    37th Representative District Subdistrict A 
## 290    37th Representative District Subdistrict B 
## 291    38th Representative District Subdistrict A 
## 292    38th Representative District Subdistrict B 
## 293    39th Representative District Subdistrict A 
## 294    39th Representative District Subdistrict B 
## 295   40th Representative District                
## 296    41st Representative District Subdistrict A 
## 297    41st Representative District Subdistrict B 
## 298    42nd Representative District Subdistrict A 
## 299    42nd Representative District Subdistrict B 
## 300    43rd Representative District Subdistrict A 
## 301    43rd Representative District Subdistrict B 
## 302    43rd Representative District Subdistrict C 
## 303    43rd Representative District Subdistrict D 
## 304   44th Representative District                
## 305    45th Representative District Subdistrict A 
## 306    45th Representative District Subdistrict B 
## 307    45th Representative District Subdistrict C 
## 308    46th Representative District Subdistrict A 
## 309    46th Representative District Subdistrict B 
## 310    47th Representative District Subdistrict A 
## 311    47th Representative District Subdistrict B 
## 312    48th Representative District Subdistrict A 
## 313    48th Representative District Subdistrict B 
## 314    49th Representative District Subdistrict A 
## 315    49th Representative District Subdistrict B 
## 316    50th Representative District Subdistrict A 
## 317    50th Representative District Subdistrict B 
## 318    51st Representative District Subdistrict A 
## 319    51st Representative District Subdistrict B 
## 320    52nd Representative District Subdistrict A 
## 321    52nd Representative District Subdistrict B 
## 322    53rd Representative District Subdistrict A 
## 323    53rd Representative District Subdistrict B 
## 324   54th Representative District                
## 325    55th Representative District Subdistrict A 
## 326    55th Representative District Subdistrict B 
## 327    56th Representative District Subdistrict A 
## 328    56th Representative District Subdistrict B 
## 329    57th Representative District Subdistrict A 
## 330    57th Representative District Subdistrict B 
## 331   58th Representative District                
## 332    59th Representative District Subdistrict A 
## 333    59th Representative District Subdistrict B 
## 334    59th Representative District Subdistrict C 
## 335   60th Representative District                
## 336   61st Representative District                
## 337    62nd Representative District Subdistrict A 
## 338    62nd Representative District Subdistrict B 
## 339   63rd Representative District                
## 340    64th Representative District Subdistrict A 
## 341    64th Representative District Subdistrict B 
## 342    64th Representative District Subdistrict C 
## 343    65th Representative District Subdistrict A 
## 344    65th Representative District Subdistrict B 
## 345    65th Representative District Subdistrict C 
## 346    66th Representative District Subdistrict A 
## 347    66th Representative District Subdistrict B 
## 348    66th Representative District Subdistrict C 
## 349   67th Representative District                
## 350    68th Representative District Subdistrict A 
## 351    68th Representative District Subdistrict B 
## 352    68th Representative District Subdistrict C 
## 353    69th Representative District Subdistrict A 
## 354    69th Representative District Subdistrict B 
## 355    69th Representative District Subdistrict C 
## 356    69th Representative District Subdistrict D 
## 357    70th Representative District Subdistrict A 
## 358    70th Representative District Subdistrict B 
## 359    70th Representative District Subdistrict C 
## 360    70th Representative District Subdistrict D 
## 361    71st Representative District Subdistrict A 
## 362    71st Representative District Subdistrict B 
## 363    71st Representative District Subdistrict C 
## 364    72nd Representative District Subdistrict A 
## 365    72nd Representative District Subdistrict B 
## 366    73rd Representative District Subdistrict A 
## 367    73rd Representative District Subdistrict B 
## 368    73rd Representative District Subdistrict C 
## 369    74th Representative District Subdistrict A 
## 370    74th Representative District Subdistrict B 
## 371    74th Representative District Subdistrict C 
## 372    75th Representative District Subdistrict A 
## 373    75th Representative District Subdistrict B 
## 374    76th Representative District Subdistrict A 
## 375    76th Representative District Subdistrict B 
## 376    76th Representative District Subdistrict C 
## 377    76th Representative District Subdistrict D 
## 378    77th Representative District Subdistrict A 
## 379    77th Representative District Subdistrict B 
## 380    77th Representative District Subdistrict C 
## 381    77th Representative District Subdistrict D 
## 382    78th Representative District Subdistrict A 
## 383    78th Representative District Subdistrict B 
## 384    78th Representative District Subdistrict C 
## 385    78th Representative District Subdistrict D 
## 386    79th Representative District Subdistrict A 
## 387    79th Representative District Subdistrict B 
## 388    79th Representative District Subdistrict C 
## 389    79th Representative District Subdistrict D 
## 390    80th Representative District Subdistrict A 
## 391    80th Representative District Subdistrict B 
## 392    80th Representative District Subdistrict C 
## 393    81st Representative District Subdistrict A 
## 394    81st Representative District Subdistrict B 
## 395    81st Representative District Subdistrict C 
## 396    81st Representative District Subdistrict D 
## 397    82nd Representative District Subdistrict A 
## 398    82nd Representative District Subdistrict B 
## 399    82nd Representative District Subdistrict C 
## 400    83rd Representative District Subdistrict A 
## 401    83rd Representative District Subdistrict B 
## 402    84th Representative District Subdistrict A 
## 403    84th Representative District Subdistrict B 
## 404    85th Representative District Subdistrict A 
## 405    85th Representative District Subdistrict B 
## 406    86th Representative District Subdistrict A 
## 407    86th Representative District Subdistrict B 
## 408   87th Representative District                
## 409    88th Representative District Subdistrict A 
## 410    88th Representative District Subdistrict B 
## 411    88th Representative District Subdistrict C 
## 412    88th Representative District Subdistrict D 
## 413    89th Representative District Subdistrict A 
## 414    89th Representative District Subdistrict B 
## 415    89th Representative District Subdistrict C 
## 416    89th Representative District Subdistrict D 
## 417    89th Representative District Subdistrict E 
## 418    90th Representative District Subdistrict A 
## 419    90th Representative District Subdistrict B 
## 420    90th Representative District Subdistrict C 
## 421    90th Representative District Subdistrict D 
## 422   91st Representative District                
## 423    92nd Representative District Subdistrict A 
## 424    92nd Representative District Subdistrict B 
## 425   93rd Representative District                
## 426    94th Representative District Subdistrict A 
## 427    94th Representative District Subdistrict B 
## 428    94th Representative District Subdistrict C 
## 429   95th Representative District                
## 430   96th Representative District                
## 431   97th Representative District                
## 432    98th Representative District Subdistrict A 
## 433    98th Representative District Subdistrict B 
## 434   99th Representative District                
## 435  100th Representative District                
## 436  101st Representative District                
## 437  102nd Representative District                
## 438   103rd Representative District Subdistrict A 
## 439   103rd Representative District Subdistrict B 
## 440   104th Representative District Subdistrict A 
## 441   104th Representative District Subdistrict B 
## 442   105th Representative District Subdistrict A 
## 443   105th Representative District Subdistrict B 
## 444                                               
## 445                                               
## 446                                               
## 447                                               
## 448                                               
## 449  Department of Agriculture and Forestry       
## 450  Department of Insurance                      
## 451                                               
## 452                                               
## 453  1st Congressional District                   
## 454  2nd Congressional District                   
## 455  3rd Congressional District                   
## 456  4th Congressional District                   
## 457  5th Congressional District                   
## 458  6th Congressional District                   
## 459  1st Supreme Court District of Louisiana      
## 460  2nd Supreme Court District of Louisiana      
## 461  3rd Supreme Court District of Louisiana      
## 462  4th Supreme Court District of Louisiana      
## 463  5th Supreme Court District of Louisiana      
## 464  6th Supreme Court District of Louisiana      
## 465  7th Supreme Court District of Louisiana      
## 466         1st Cir 2nd Dist Subdist 1 Div A      
## 467         1st Cir 2nd Dist Subdist 1 Div B      
## 468         1st Cir 2nd Dist Subdist 1 Div C      
## 469         1st Cir 2nd Dist Subdist 2 Div D      
## 470    1st Circuit 1st District Division A        
## 471    1st Circuit 1st District Division B        
## 472    1st Circuit 1st District Division C        
## 473    1st Circuit 1st District Division D        
## 474    1st Circuit 3rd District Division A        
## 475    1st Circuit 3rd District Division B        
## 476    1st Circuit 3rd District Division C        
## 477    1st Circuit 3rd District Division D        
## 478              2nd Circuit 1st Dist Elec Sect 1C
## 479       2nd Circuit 1st Dist Elec Sect 2A       
## 480       2nd Circuit 1st Dist Elec Sect 2B       
## 481    2nd Circuit 2nd Dist At-Large              
## 482       2nd Circuit 2nd Dist Elec Sec 1         
## 483       2nd Circuit 2nd Dist Elec Sec 2         
## 484       2nd Circuit 3rd Dist Elec Sect 1A       
## 485       2nd Circuit 3rd Dist Elec Sect 2B       
## 486       2nd Circuit 3rd Dist Elec Sect 2B       
## 487       2nd Circuit 3rd Dist Elec Sect 2C       
## 488    3rd Circuit 1st District Division A        
## 489    3rd Circuit 1st District Division B        
## 490    3rd Circuit 1st District Division C        
## 491       3rd Circuit 2nd Dist Elec Sect 1C       
## 492       3rd Circuit 2nd Dist Elec Sect 2A       
## 493       3rd Circuit 2nd Dist Elec Sect 2B       
## 494       3rd Circuit 3rd Dist Elec Sect 1C       
## 495       3rd Circuit 3rd Dist Elec Sect 2D       
## 496       3rd Circuit 3rd Dist Elec Sect 3E       
## 497       3rd Circuit 3rd Dist Elec Sect 4F       
## 498       3rd Circuit 3rd Dist Elec Sect 5A       
## 499    3rd Circuit 3rd District Division B        
## 500  4th Circuit at Large                         
## 501  4th Circuit at Large                         
## 502    4th Circuit 1st District Division A        
## 503    4th Circuit 1st District Division B        
## 504    4th Circuit 1st District Division C        
## 505    4th Circuit 1st District Division D        
## 506    4th Circuit 1st District Division E        
## 507    4th Circuit 1st District Division F        
## 508    4th Circuit 1st District Division G        
## 509            4th Circuit 1st District Division H
## 510    4th Circuit 2nd District Division A        
## 511    4th Circuit 3rd District Division A        
## 512       5th Circuit 1st Dist Elec Sect 2C       
## 513    5th Circuit 1st District Division B        
## 514            5th Circuit 1st District Division D
## 515            5th Circuit 1st District Division E
## 516            5th Circuit 1st District Division F
## 517            5th Circuit 1st District Division G
## 518    5th Circuit 2nd District Division A        
## 519    5th Circuit 3rd District Division A        
## 520  District 1                                   
## 521  District 2                                   
## 522  District 3                                   
## 523  District 4                                   
## 524  District 5                                   
## 525  District 1                                   
## 526  District 2                                   
## 527  District 3                                   
## 528  District 4                                   
## 529  District 5                                   
## 530  District 6                                   
## 531  District 7                                   
## 532  District 8                                   
## 533                        1st Senatorial District
## 534   2nd Senatorial District                     
## 535   3rd Senatorial District                     
## 536   4th Senatorial District                     
## 537   5th Senatorial District                     
## 538   6th Senatorial District                     
## 539   7th Senatorial District                     
## 540   8th Senatorial District                     
## 541   9th Senatorial District                     
## 542  10th Senatorial District                     
## 543  11th Senatorial District                     
## 544  12th Senatorial District                     
## 545  13th Senatorial District                     
## 546  14th Senatorial District                     
## 547  15th Senatorial District                     
## 548  16th Senatorial District                     
## 549  17th Senatorial District                     
## 550  18th Senatorial District                     
## 551  19th Senatorial District                     
## 552  20th Senatorial District                     
## 553  21st Senatorial District                     
## 554  22nd Senatorial District                     
## 555  23rd Senatorial District                     
## 556  24th Senatorial District                     
## 557  25th Senatorial District                     
## 558  26th Senatorial District                     
## 559  27th Senatorial District                     
## 560  28th Senatorial District                     
## 561  29th Senatorial District                     
## 562  30th Senatorial District                     
## 563  31st Senatorial District                     
## 564  32nd Senatorial District                     
## 565  33rd Senatorial District                     
## 566  34th Senatorial District                     
## 567  35th Senatorial District                     
## 568  36th Senatorial District                     
## 569  37th Senatorial District                     
## 570  38th Senatorial District                     
## 571  39th Senatorial District                     
## 572    1st Representative District                
## 573    2nd Representative District                
## 574    3rd Representative District                
## 575    4th Representative District                
## 576    5th Representative District                
## 577    6th Representative District                
## 578    7th Representative District                
## 579    8th Representative District                
## 580    9th Representative District                
## 581   10th Representative District                
## 582   11th Representative District                
## 583   12th Representative District                
## 584   13th Representative District                
## 585   14th Representative District                
## 586   15th Representative District                
## 587   16th Representative District                
## 588   17th Representative District                
## 589   18th Representative District                
## 590   19th Representative District                
## 591   20th Representative District                
## 592   21st Representative District                
## 593   22nd Representative District                
## 594   23rd Representative District                
## 595   24th Representative District                
## 596   25th Representative District                
## 597   26th Representative District                
## 598   27th Representative District                
## 599   28th Representative District                
## 600   29th Representative District                
## 601   30th Representative District                
## 602   31st Representative District                
## 603   32nd Representative District                
## 604   33rd Representative District                
## 605   34th Representative District                
## 606   35th Representative District                
## 607   36th Representative District                
## 608   37th Representative District                
## 609   38th Representative District                
## 610   39th Representative District                
## 611   40th Representative District                
## 612   41st Representative District                
## 613   42nd Representative District                
## 614   43rd Representative District                
## 615   44th Representative District                
## 616   45th Representative District                
## 617   46th Representative District                
## 618   47th Representative District                
## 619   48th Representative District                
## 620   49th Representative District                
## 621   50th Representative District                
## 622   51st Representative District                
## 623   52nd Representative District                
## 624   53rd Representative District                
## 625   54th Representative District                
## 626   55th Representative District                
## 627   56th Representative District                
## 628   57th Representative District                
## 629   58th Representative District                
## 630   59th Representative District                
## 631   60th Representative District                
## 632   61st Representative District                
## 633   62nd Representative District                
## 634   63rd Representative District                
## 635   64th Representative District                
## 636   65th Representative District                
## 637   66th Representative District                
## 638   67th Representative District                
## 639   68th Representative District                
## 640   69th Representative District                
## 641   70th Representative District                
## 642   71st Representative District                
## 643   72nd Representative District                
## 644   73rd Representative District                
## 645   74th Representative District                
## 646   75th Representative District                
## 647   76th Representative District                
## 648   77th Representative District                
## 649   78th Representative District                
## 650   79th Representative District                
## 651   80th Representative District                
## 652   81st Representative District                
## 653   82nd Representative District                
## 654   83rd Representative District                
## 655   84th Representative District                
## 656   85th Representative District                
## 657   86th Representative District                
## 658   87th Representative District                
## 659   88th Representative District                
## 660   89th Representative District                
## 661   90th Representative District                
## 662   91st Representative District                
## 663   92nd Representative District                
## 664   93rd Representative District                
## 665                   94th Representative District
## 666   95th Representative District                
## 667   96th Representative District                
## 668   97th Representative District                
## 669   98th Representative District                
## 670   99th Representative District                
## 671  100th Representative District                
## 672  101st Representative District                
## 673  102nd Representative District                
## 674  103rd Representative District                
## 675  104th Representative District                
## 676  105th Representative District                
## 677     1st JDC Election Section 1 Division B     
## 678     1st JDC Election Section 1 Division D     
## 679     1st JDC Election Section 1 Division G     
## 680     1st JDC Election Section 1 Division J     
## 681     1st JDC Election Section 2 Division C     
## 682     1st JDC Election Section 2 Division H     
## 683     1st JDC Election Section 2 Division I     
## 684     1st JDC Election Section 3 Division A     
## 685     1st JDC Election Section 3 Division E     
## 686     1st JDC Election Section 3 Division F     
## 687     1st JDC Election Section 3 Division K     
## 688    2nd Judicial District Division A           
## 689    2nd Judicial District Division B           
## 690    2nd Judicial District Division C           
## 691    3rd Judicial District Division A           
## 692    3rd Judicial District Division B           
## 693    3rd Judicial District Division C           
## 694     4th JDC Election Section 1 Division G     
## 695     4th JDC Election Section 1 Division H     
## 696     4th JDC Election Section 1 Division I     
## 697     4th JDC Election Section 1 Division J     
## 698     4th JDC Election Section 2 Division A     
## 699     4th JDC Election Section 2 Division B     
## 700     4th JDC Election Section 2 Division C     
## 701     4th JDC Election Section 2 Division D     
## 702     4th JDC Election Section 2 Division E     
## 703     4th JDC Election Section 2 Division F     
## 704     4th JDC Election Section 2 Division K     
## 705    5th Judicial District Division A           
## 706    5th Judicial District Division B           
## 707    5th Judicial District Division C           
## 708    6th Judicial District Division A           
## 709    6th Judicial District Division B           
## 710    7th Judicial District Division A           
## 711    7th Judicial District Division B           
## 712   8th Judicial District                       
## 713     9th JDC Election Section 1 Division A     
## 714     9th JDC Election Section 1 Division F     
## 715     9th JDC Election Section 2 Division B     
## 716     9th JDC Election Section 2 Division C     
## 717     9th JDC Election Section 2 Division D     
## 718     9th JDC Election Section 2 Division E     
## 719     9th JDC Subdistrict 2 Division G          
## 720   10th Judicial District Division A           
## 721   10th Judicial District Division B           
## 722  11th Judicial District                       
## 723   12th Judicial District Division A           
## 724   12th Judicial District Division B           
## 725   13th Judicial District Division A           
## 726   13th Judicial District Division B           
## 727      14th JDC Elect Sect 1 & 3 Division I     
## 728    14th JDC Election Section 1 Division F     
## 729    14th JDC Election Section 1 Division H     
## 730    14th JDC Election Section 2 Division B     
## 731    14th JDC Election Section 2 Division C     
## 732    14th JDC Election Section 2 Division D     
## 733    14th JDC Election Section 2 Division G     
## 734    14th JDC Election Section 3 Division A     
## 735    14th JDC Election Section 3 Division E     
## 736    15th JDC Election Section 1 Division B     
## 737    15th JDC Election Section 1 Division D     
## 738    15th JDC Election Section 2 Division E     
## 739    15th JDC Election Section 3 Division H     
## 740    15th JDC Election Section 3 Division I     
## 741    15th JDC Election Section 3 Division K     
## 742    15th JDC Election Section 3 Division L     
## 743    15th JDC Election Section 3 Division M     
## 744    15th JDC Election Section 4 Division A     
## 745    15th JDC Election Section 4 Division F     
## 746    15th JDC Election Section 4 Division J     
## 747    15th JDC Election Section 5 Division C     
## 748    15th JDC Election Section 5 Division G     
## 749    16th JDC Election Section 1 Division G     
## 750    16th JDC Election Section 1 Division H     
## 751    16th JDC Election Section 2 Division A     
## 752    16th JDC Election Section 2 Division B     
## 753    16th JDC Election Section 2 Division C     
## 754    16th JDC Election Section 2 Division D     
## 755    16th JDC Election Section 2 Division E     
## 756    16th JDC Election Section 2 Division F     
## 757   17th Judicial District Division A           
## 758   17th Judicial District Division B           
## 759   17th Judicial District Division C           
## 760   17th Judicial District Division D           
## 761   17th Judicial District Division E           
## 762    18th JDC Election Section 1 Division C     
## 763    18th JDC Election Section 2 Division D     
## 764    18th JDC Election Section 3 Division B     
## 765    18th JDC Election Section 4 Division A     
## 766    19th JDC Election Section 1 Division B     
## 767         19th JDC Election Section 1 Division D
## 768    19th JDC Election Section 1 Division J     
## 769    19th JDC Election Section 1 Division K     
## 770    19th JDC Election Section 1 Division O     
## 771    19th JDC Election Section 2 Division A     
## 772    19th JDC Election Section 2 Division G     
## 773    19th JDC Election Section 2 Division L     
## 774    19th JDC Election Section 2 Division M     
## 775    19th JDC Election Section 2 Division N     
## 776    19th JDC Election Section 3 Division C     
## 777    19th JDC Election Section 3 Division E     
## 778    19th JDC Election Section 3 Division F     
## 779    19th JDC Election Section 3 Division H     
## 780    19th JDC Election Section 3 Division I     
## 781   20th Judicial District Division A           
## 782   20th Judicial District Division B           
## 783   21st Judicial District Division A           
## 784   21st Judicial District Division B           
## 785   21st Judicial District Division C           
## 786   21st Judicial District Division D           
## 787   21st Judicial District Division E           
## 788   21st Judicial District Division F           
## 789   21st Judicial District Division G           
## 790   21st Judicial District Division H           
## 791   21st Judicial District Division I           
## 792   22nd Judicial District Division A           
## 793   22nd Judicial District Division B           
## 794   22nd Judicial District Division C           
## 795   22nd Judicial District Division D           
## 796   22nd Judicial District Division E           
## 797   22nd Judicial District Division F           
## 798   22nd Judicial District Division G           
## 799   22nd Judicial District Division H           
## 800   22nd Judicial District Division I           
## 801   22nd Judicial District Division J           
## 802   22nd Judicial District Division K           
## 803   22nd Judicial District Division L           
## 804    23rd JDC Election Section 1 Division E     
## 805    23rd JDC Election Section 2 Division A     
## 806    23rd JDC Election Section 2 Division B     
## 807    23rd JDC Election Section 2 Division C     
## 808    23rd JDC Election Section 2 Division D     
## 809    24th JDC Election Section 1 Division G     
## 810    24th JDC Election Section 1 Division O     
## 811    24th JDC Election Section 2 Division A     
## 812    24th JDC Election Section 2 Division D     
## 813    24th JDC Election Section 2 Division F     
## 814    24th JDC Election Section 2 Division N     
## 815    24th JDC Election Section 3 Division K     
## 816    24th JDC Election Section 3 Division L     
## 817    24th JDC Election Section 4 Division H     
## 818    24th JDC Election Section 4 Division I     
## 819    24th JDC Election Section 5 Division C     
## 820    24th JDC Election Section 5 Division P     
## 821    24th JDC Election Section 6 Division J     
## 822    24th JDC Election Section 6 Division M     
## 823    24th JDC Election Section 7 Division B     
## 824    24th JDC Election Section 7 Division E     
## 825   25th Judicial District Division A           
## 826   25th Judicial District Division B           
## 827   26th Judicial District Division A           
## 828   26th Judicial District Division B           
## 829   26th Judicial District Division C           
## 830   26th Judicial District Division D           
## 831   26th Judicial District Division E           
## 832   26th Judicial District Division F           
## 833    27th JDC Election Section 1 Division C     
## 834    27th JDC Election Section 2 Division A     
## 835    27th JDC Election Section 3 Division D     
## 836    27th JDC Election Section 4 Division B     
## 837  28th Judicial District                       
## 838   29th Judicial District Division C           
## 839   29th Judicial District Division D           
## 840   29th Judicial District Division E           
## 841   30th Judicial District Division A           
## 842   30th Judicial District Division B           
## 843   30th Judicial District Division C           
## 844  31st Judicial District                       
## 845              32nd Judicial District Division A
## 846              32nd Judicial District Division B
## 847              32nd Judicial District Division C
## 848              32nd Judicial District Division D
## 849              32nd Judicial District Division E
## 850   33rd Judicial District Division A           
## 851   33rd Judicial District Division B           
## 852   34th Judicial District Division A           
## 853   34th Judicial District Division B           
## 854   34th Judicial District Division C           
## 855   34th Judicial District Division D           
## 856   34th Judicial District Division E           
## 857  35th Judicial District                       
## 858   36th Judicial District Division A           
## 859   36th Judicial District Division B           
## 860  37th Judicial District                       
## 861  38th Judicial District                       
## 862  39th Judicial District                       
## 863    40th JDC Election Section 1 Division B     
## 864    40th JDC Election Section 2 Division A     
## 865    40th JDC Election Section 3 Division C     
## 866   42nd Judicial District Court Division A     
## 867   42nd Judicial District Court Division B     
## 868   Civil District Court Division A             
## 869   Civil District Court Division B             
## 870   Civil District Court Division C             
## 871   Civil District Court Division D             
## 872   Civil District Court Division E             
## 873   Civil District Court Division F             
## 874   Civil District Court Division G             
## 875   Civil District Court Division H             
## 876   Civil District Court Division I             
## 877   Civil District Court Division J             
## 878                Civil District Court Division K
## 879   Civil District Court Division L             
## 880   Civil District Court Division M             
## 881   Civil District Court Division N             
## 882        Civil District Court Domestic Section 1
## 883   Criminal District Court Section A           
## 884   Criminal District Court Section B           
## 885   Criminal District Court Section C           
## 886   Criminal District Court Section D           
## 887   Criminal District Court Section E           
## 888   Criminal District Court Section F           
## 889   Criminal District Court Section G           
## 890   Criminal District Court Section H           
## 891   Criminal District Court Section I           
## 892   Criminal District Court Section J           
## 893   Criminal District Court Section K           
## 894   Criminal District Court Section L           
## 895   Magistrate Section Criminal District Court  
## 896   1st Judicial District                       
## 897   2nd Judicial District                       
## 898   3rd Judicial District                       
## 899   4th Judicial District                       
## 900                          5th Judicial District
## 901   6th Judicial District                       
## 902   7th Judicial District                       
## 903   8th Judicial District                       
## 904   9th Judicial District                       
## 905  10th Judicial District                       
## 906  11th Judicial District                       
## 907  12th Judicial District                       
## 908  13th Judicial District                       
## 909  14th Judicial District                       
## 910  15th Judicial District                       
## 911  16th Judicial District                       
## 912  17th Judicial District                       
## 913  18th Judicial District                       
## 914  19th Judicial District                       
## 915  20th Judicial District                       
## 916  21st Judicial District                       
## 917  22nd Judicial District                       
## 918  23rd Judicial District                       
## 919  24th Judicial District                       
## 920  25th Judicial District                       
## 921  26th Judicial District                       
## 922  27th Judicial District                       
## 923  28th Judicial District                       
## 924  29th Judicial District                       
## 925  30th Judicial District                       
## 926  31st Judicial District                       
## 927  32nd Judicial District                       
## 928  33rd Judicial District                       
## 929  34th Judicial District                       
## 930  35th Judicial District                       
## 931  36th Judicial District                       
## 932  37th Judicial District                       
## 933  38th Judicial District                       
## 934  39th Judicial District                       
## 935  40th Judicial District                       
## 936                   42nd Judicial District Court
## 937  Criminal District Court                      
## 938   City Court City of Eunice                   
## 939       Elec Dist 1 Div A City of Shreveport    
## 940       Elec Dist 1 Div B City of Shreveport    
## 941       Elec Dist 2 Div C City of Shreveport    
## 942       Elec Dist 2 Div D City of Shreveport    
## 943   City Court City of Eunice                   
## 944   City Court City of Shreveport               
## 945                              City of Broussard
## 946  City of DeRidder                             
## 947  City of Eunice                               
## 948  City of Shreveport                           
## 949  Town of Arnaudville                          
## 950  Town of Basile                               
## 951                              Town of Delcambre
## 952  Town of Duson                                
## 953  Village of Downsville                        
## 954  Village of Junction City                     
## 955  City of Broussard                            
## 956  City of Eunice                               
## 957  Town of Arnaudville                          
## 958  Town of Basile                               
## 959  Town of Delcambre                            
## 960  Village of Downsville                        
## 961  Village of Junction City                     
## 962  City of Eunice                               
## 963  Town of Basile                               
## 964  City of Broussard                            
## 965  City of DeRidder                             
## 966  City of DeRidder                             
## 967   District 1 Town of Basile                   
## 968   District 1 Town of Delcambre                
## 969   District 2 Town of Basile                   
## 970   District 2 Town of Delcambre                
## 971   District 3 Town of Basile                   
## 972   District 3 Town of Delcambre                
## 973   District 4 Town of Basile                   
## 974   District 4 Town of Delcambre                
## 975   District 5 Town of Delcambre                
## 976  Town of Arnaudville                          
## 977  Town of Arnaudville                          
## 978  Town of Arnaudville                          
## 979  Town of Arnaudville                          
## 980  Town of Arnaudville                          
## 981  Town of Duson                                
## 982  Town of Duson                                
## 983  Town of Duson                                
## 984  Town of Duson                                
## 985  Town of Duson                                
## 986  Village of Downsville                        
## 987  Village of Downsville                        
## 988  Village of Downsville                        
## 989  Village of Junction City                     
## 990  Village of Junction City                     
## 991  Village of Junction City                     
## 992   Ward 1 City of Eunice                       
## 993   Ward 2 City of Eunice                       
## 994   Ward 3 City of Eunice                       
## 995   Ward 4 City of Eunice                       
## 996   District  A City of Shreveport              
## 997   District  B City of Shreveport              
## 998   District  C City of Shreveport              
## 999   District  D City of Shreveport              
## 1000  District  E City of Shreveport              
## 1001  District  F City of Shreveport              
## 1002  District  G City of Shreveport              
## 1003  District 1 City of Broussard                
## 1004  District 1 City of DeRidder                 
## 1005  District 2 City of Broussard                
## 1006  District 2 City of DeRidder                 
## 1007  District 3 City of Broussard                
## 1008  District 3 City of DeRidder                 
## 1009  District 4 City of Broussard                
## 1010  District 4 City of DeRidder                 
## 1011  District 5 City of Broussard                
## 1012  District 5 City of DeRidder                 
## 1013  District 6 City of Broussard                
## 1014 at Large                                     
## 1015 District  1                                  
## 1016 District  2                                  
## 1017 District  3                                  
## 1018 District  4                                  
## 1019 District  5                                  
## 1020 District  6                                  
## 1021 District  7                                  
## 1022 District  8                                  
## 1023 at Large                                     
## 1024 at Large                                     
## 1025 at Large                                     
## 1026 at Large                                     
## 1027 District  1                                  
## 1028 District  2                                  
## 1029 District  3                                  
## 1030 District  4                                  
## 1031 District  5                                  
## 1032 District  6                                  
## 1033 District  7                                  
## 1034 District  8                                  
## 1035                                              
## 1036                                              
## 1037                                              
## 1038                                              
## 1039                                   District  1
## 1040 District  2                                  
## 1041 District  3                                  
## 1042 District  4                                  
## 1043 District  5                                  
## 1044 District  6                                  
## 1045 District  7                                  
## 1046 District  8                                  
## 1047  City Court City of Crowley                  
## 1048  City Court City of Rayne                    
## 1049  City Court City of Crowley                  
## 1050  City Court City of Rayne                    
## 1051 District  1                                  
## 1052 District  2                                  
## 1053 District  3                                  
## 1054 District  4                                  
## 1055 District  5                                  
## 1056 District  6                                  
## 1057 District  7                                  
## 1058 District  8                                  
## 1059 Justice of the Peace Ward  2                 
## 1060 Justice of the Peace Ward  3                 
## 1061 Justice of the Peace Ward  4                 
## 1062 Justice of the Peace Ward  5                 
## 1063 Justice of the Peace Ward  7                 
## 1064 Justice of the Peace Ward  2                 
## 1065 Justice of the Peace Ward  3                 
## 1066 Justice of the Peace Ward  4                 
## 1067 Justice of the Peace Ward  5                 
## 1068 Justice of the Peace Ward  7                 
## 1069 City of Crowley                              
## 1070 City of Rayne                                
## 1071                          Town of Church Point
## 1072 Town of Iota                                 
## 1073                         Village of Estherwood
## 1074 Village of Mermentau                         
## 1075 Village of Morse                             
## 1076 City of Crowley                              
## 1077 City of Rayne                                
## 1078 Town of Church Point                         
## 1079 Town of Iota                                 
## 1080 Village of Estherwood                        
## 1081                          Village of Mermentau
## 1082 Village of Morse                             
## 1083 City of Crowley                              
## 1084 City of Rayne                                
## 1085 Town of Iota                                 
## 1086 Town of Iota                                 
## 1087 Town of Iota                                 
## 1088 Town of Iota                                 
## 1089 Town of Iota                                 
## 1090 Village of Estherwood                        
## 1091 Village of Estherwood                        
## 1092 Village of Estherwood                        
## 1093 Village of Mermentau                         
## 1094 Village of Mermentau                         
## 1095 Village of Mermentau                         
## 1096 Village of Morse                             
## 1097 Village of Morse                             
## 1098 Village of Morse                             
## 1099  Ward  1 City of Rayne                       
## 1100   Ward  1 Division A City of Crowley         
## 1101   Ward  1 Division B City of Crowley         
## 1102  Ward  1 Town of Church Point                
## 1103  Ward  2 City of Rayne                       
## 1104   Ward  2 Division A City of Crowley         
## 1105   Ward  2 Division B City of Crowley         
## 1106  Ward  2 Town of Church Point                
## 1107  Ward  3 City of Rayne                       
## 1108   Ward  3 Division A City of Crowley         
## 1109   Ward  3 Division B City of Crowley         
## 1110  Ward  3 Town of Church Point                
## 1111  Ward  4 City of Rayne                       
## 1112   Ward  4 Division A City of Crowley         
## 1113   Ward  4 Division B City of Crowley         
## 1114  Ward  4 Town of Church Point                
## 1115  Ward  5 Town of Church Point                
## 1116 at Large                                     
## 1117 District 1                                   
## 1118 District 2                                   
## 1119 District 3                                   
## 1120 District 4                                   
## 1121 District 5                                   
## 1122 District 6                                   
## 1123 District 7                                   
## 1124 at Large                                     
## 1125 District 1                                   
## 1126 District 2                                   
## 1127 District 3                                   
## 1128 District 4                                   
## 1129 District 5                                   
## 1130 District 6                                   
## 1131 District 7                                   
## 1132                                              
## 1133                                              
## 1134                                              
## 1135                                              
## 1136                                    District 1
## 1137 District 2                                   
## 1138 District 3                                   
## 1139 District 4                                   
## 1140 District 5                                   
## 1141 District 6                                   
## 1142 District 7                                   
## 1143  City Court City of Oakdale                  
## 1144  City Court City of Oakdale                  
## 1145                                   District  1
## 1146 District  2                                  
## 1147 District  3                                  
## 1148 District  4                                  
## 1149 District  5                                  
## 1150 District  6                                  
## 1151 District  7                                  
## 1152 Justice of the Peace Ward 1                  
## 1153 Justice of the Peace Ward 2                  
## 1154 Justice of the Peace Ward 3                  
## 1155 Justice of the Peace Ward 4                  
## 1156 Justice of the Peace Ward 1                  
## 1157 Justice of the Peace Ward 2                  
## 1158 Justice of the Peace Ward 3                  
## 1159 Justice of the Peace Ward 4                  
## 1160 City of Oakdale                              
## 1161 Town of Elizabeth                            
## 1162                                Town of Kinder
## 1163 Town of Oberlin                              
## 1164 Village of Reeves                            
## 1165 City of Oakdale                              
## 1166 Town of Elizabeth                            
## 1167 Town of Kinder                               
## 1168 Town of Oberlin                              
## 1169 Village of Reeves                            
## 1170 Town of Oberlin                              
## 1171  at Large City of Oakdale                    
## 1172                       at Large Town of Kinder
## 1173  District  1 Town of Oberlin                 
## 1174  District  2 Town of Oberlin                 
## 1175  District  3 Town of Oberlin                 
## 1176  District  4 Town of Oberlin                 
## 1177 Town of Elizabeth                            
## 1178 Town of Elizabeth                            
## 1179 Town of Elizabeth                            
## 1180 Town of Elizabeth                            
## 1181 Town of Elizabeth                            
## 1182 Village of Reeves                            
## 1183 Village of Reeves                            
## 1184 Village of Reeves                            
## 1185                    District 1 City of Oakdale
## 1186  District 1 Town of Kinder                   
## 1187  District 2 City of Oakdale                  
## 1188  District 2 Town of Kinder                   
## 1189  District 3 City of Oakdale                  
## 1190  District 3 Town of Kinder                   
## 1191  District 4 City of Oakdale                  
## 1192  District 4 Town of Kinder                   
## 1193 at Large                                     
## 1194 at Large                                     
## 1195 District  1                                  
## 1196 District  2                                  
## 1197 District  3                                  
## 1198 District  4                                  
## 1199 District  5                                  
## 1200 District  6                                  
## 1201 District  7                                  
## 1202 District  8                                  
## 1203 District  9                                  
## 1204 District 10                                  
## 1205 District 11                                  
## 1206 at Large                                     
## 1207 at Large                                     
## 1208 at Large                                     
## 1209 at Large                                     
## 1210 at Large                                     
## 1211 District  1                                  
## 1212 District  2                                  
## 1213 District  3                                  
## 1214 District  4                                  
## 1215 District  5                                  
## 1216 District  6                                  
## 1217 District  7                                  
## 1218 District  8                                  
## 1219 District  9                                  
## 1220 District 10                                  
## 1221 District 11                                  
## 1222 Parish Court                                 
## 1223                                              
## 1224                                              
## 1225                                              
## 1226                                              
## 1227                                              
## 1228 District  1                                  
## 1229 District  2                                  
## 1230 District  3                                  
## 1231 District  4                                  
## 1232 District  5                                  
## 1233 District  6                                  
## 1234 District  7                                  
## 1235 District  8                                  
## 1236 District  9                                  
## 1237 District 10                                  
## 1238 District 11                                  
## 1239                                   District  1
## 1240 District  2                                  
## 1241 District  3                                  
## 1242  District  4 Seat A                          
## 1243  District  4 Seat B                          
## 1244  District  5 Seat A                          
## 1245  District  5 Seat B                          
## 1246  District  6 Seat A                          
## 1247  District  6 Seat B                          
## 1248  District  7 Seat A                          
## 1249  District  7 Seat B                          
## 1250 1st Justice Court                            
## 1251 2nd Justice Court                            
## 1252 3rd Justice Court                            
## 1253 1st Justice Court                            
## 1254 2nd Justice Court                            
## 1255 3rd Justice Court                            
## 1256                        City of Donaldsonville
## 1257 City of Gonzales                             
## 1258 Town of Sorrento                             
## 1259 City of Gonzales                             
## 1260 Town of Sorrento                             
## 1261 Town of Sorrento                             
## 1262  District  1 City of Donaldsonville          
## 1263  District  2 City of Donaldsonville          
## 1264  District  3 City of Donaldsonville          
## 1265  District  4 City of Donaldsonville          
## 1266  District  5 City of Donaldsonville          
## 1267  Division A City of Gonzales                 
## 1268  Division B City of Gonzales                 
## 1269  Division C City of Gonzales                 
## 1270  Division D City of Gonzales                 
## 1271  Division E City of Gonzales                 
## 1272 Town of Sorrento                             
## 1273 Town of Sorrento                             
## 1274 Town of Sorrento                             
## 1275 Town of Sorrento                             
## 1276 Town of Sorrento                             
## 1277 at Large                                     
## 1278 District 1                                   
## 1279 District 2                                   
## 1280 District 3                                   
## 1281 District 4                                   
## 1282 District 5                                   
## 1283 District 6                                   
## 1284 District 7                                   
## 1285 District 8                                   
## 1286 District 9                                   
## 1287 at Large                                     
## 1288 District 1                                   
## 1289 District 2                                   
## 1290 District 3                                   
## 1291 District 4                                   
## 1292 District 5                                   
## 1293 District 6                                   
## 1294 District 7                                   
## 1295 District 8                                   
## 1296 District 9                                   
## 1297                                              
## 1298                                              
## 1299                                              
## 1300                                              
## 1301 Ward 1                                       
## 1302 Ward 2                                       
## 1303 Ward 3                                       
## 1304 Ward 4                                       
## 1305 Ward 5                                       
## 1306 Ward 6                                       
## 1307 Ward 7                                       
## 1308 Ward 8                                       
## 1309 Ward 9                                       
## 1310 Ward  1                                      
## 1311 Ward  2                                      
## 1312 Ward  3                                      
## 1313 Ward  4                                      
## 1314 Ward  5                                      
## 1315 Ward  6                                      
## 1316 Ward  7                                      
## 1317 Ward  8                                      
## 1318 Ward  9                                      
## 1319 1st Justice of the Peace Ward                
## 1320 2nd Justice of the Peace Ward                
## 1321 3rd Justice of the Peace Ward                
## 1322 1st Justice of the Peace Ward                
## 1323 2nd Justice of the Peace Ward                
## 1324 3rd Justice of the Peace Ward                
## 1325                      Village of Napoleonville
## 1326 Village of Napoleonville                     
## 1327 Village of Napoleonville                     
## 1328 Village of Napoleonville                     
## 1329 at Large                                     
## 1330 District  1                                  
## 1331 District  2                                  
## 1332 District  3                                  
## 1333 District  4                                  
## 1334 District  5                                  
## 1335 District  6                                  
## 1336 District  7                                  
## 1337 District  8                                  
## 1338 District  9                                  
## 1339 at Large                                     
## 1340 District  1                                  
## 1341 District  2                                  
## 1342 District  3                                  
## 1343 District  4                                  
## 1344 District  5                                  
## 1345 District  6                                  
## 1346 District  7                                  
## 1347 District  8                                  
## 1348 District  9                                  
## 1349                                              
## 1350                                              
## 1351                                              
## 1352                                              
## 1353                                   District  1
## 1354 District  2                                  
## 1355 District  3                                  
## 1356 District  4                                  
## 1357 District  5                                  
## 1358 District  6                                  
## 1359 District  7                                  
## 1360 District  8                                  
## 1361 District  9                                  
## 1362  City Court City of Bunkie                   
## 1363  City Court City of Marksville               
## 1364  City Court City of Bunkie                   
## 1365  City Court City of Marksville               
## 1366                                   District  1
## 1367 District  2                                  
## 1368 District  3                                  
## 1369 District  4                                  
## 1370 District  5                                  
## 1371 District  6                                  
## 1372 District  7                                  
## 1373 District  8                                  
## 1374 District  9                                  
## 1375 Justice of the Peace Ward  1                 
## 1376 Justice of the Peace Ward  3                 
## 1377 Justice of the Peace Ward  4                 
## 1378 Justice of the Peace Ward  5                 
## 1379 Justice of the Peace Ward  6                 
## 1380 Justice of the Peace Ward  7                 
## 1381 Justice of the Peace Ward  8                 
## 1382 Justice of the Peace Ward  9                 
## 1383 Justice of the Peace Ward 11                 
## 1384 Justice of the Peace Ward  1                 
## 1385 Justice of the Peace Ward  3                 
## 1386 Justice of the Peace Ward  4                 
## 1387 Justice of the Peace Ward  5                 
## 1388 Justice of the Peace Ward  6                 
## 1389 Justice of the Peace Ward  7                 
## 1390 Justice of the Peace Ward  8                 
## 1391 Justice of the Peace Ward  9                 
## 1392 Justice of the Peace Ward 11                 
## 1393 City of Bunkie                               
## 1394 City of Marksville                           
## 1395 Town of Cottonport                           
## 1396 Town of Evergreen                            
## 1397 Town of Mansura                              
## 1398 Town of Simmesport                           
## 1399 Village of Hessmer                           
## 1400 Village of Moreauville                       
## 1401 Village of Plaucheville                      
## 1402 City of Bunkie                               
## 1403 Town of Cottonport                           
## 1404 Town of Mansura                              
## 1405                            Town of Simmesport
## 1406 Village of Hessmer                           
## 1407                             Town of Evergreen
## 1408 City of Bunkie                               
## 1409 Town of Simmesport                           
## 1410 Town of Cottonport                           
## 1411  District 1 City of Bunkie                   
## 1412  District 1 City of Marksville               
## 1413  District 1 Town of Simmesport               
## 1414  District 2 City of Bunkie                   
## 1415  District 2 City of Marksville               
## 1416  District 2 Town of Simmesport               
## 1417  District 3 City of Bunkie                   
## 1418  District 3 City of Marksville               
## 1419  District 3 Town of Simmesport               
## 1420  District 4 City of Bunkie                   
## 1421  District 4 City of Marksville               
## 1422  District 4 Town of Simmesport               
## 1423  District 5 City of Marksville               
## 1424 Town of Evergreen                            
## 1425 Town of Evergreen                            
## 1426 Town of Evergreen                            
## 1427 Town of Evergreen                            
## 1428 Town of Evergreen                            
## 1429 Town of Mansura                              
## 1430 Town of Mansura                              
## 1431 Town of Mansura                              
## 1432 Town of Mansura                              
## 1433 Town of Mansura                              
## 1434 Village of Hessmer                           
## 1435 Village of Hessmer                           
## 1436 Village of Hessmer                           
## 1437 Village of Moreauville                       
## 1438 Village of Moreauville                       
## 1439 Village of Moreauville                       
## 1440 Village of Plaucheville                      
## 1441 Village of Plaucheville                      
## 1442 Village of Plaucheville                      
## 1443  District 1 Town of Cottonport               
## 1444  District 2 Town of Cottonport               
## 1445  District 3 Town of Cottonport               
## 1446  District 4 Town of Cottonport               
## 1447 at Large                                     
## 1448 at Large                                     
## 1449 at Large                                     
## 1450 at Large                                     
## 1451 at Large                                     
## 1452 District 1                                   
## 1453 District 2                                   
## 1454 District 3A                                  
## 1455 District 3B                                  
## 1456 District 3C                                  
## 1457 District 3D                                  
## 1458 District 3E                                  
## 1459 District 4A                                  
## 1460 District 4B                                  
## 1461 District 5                                   
## 1462 at Large                                     
## 1463 at Large                                     
## 1464 District 1                                   
## 1465 District 2                                   
## 1466 District 3A                                  
## 1467 District 3B                                  
## 1468 District 3C                                  
## 1469 District 3D                                  
## 1470 District 3E                                  
## 1471 District 4A                                  
## 1472 District 4B                                  
## 1473 District 5                                   
## 1474                                              
## 1475                                              
## 1476                                              
## 1477                                              
## 1478                                    District 1
## 1479 District 2                                   
## 1480 District 3A                                  
## 1481 District 3B                                  
## 1482 District 3C                                  
## 1483 District 3D                                  
## 1484 District 3E                                  
## 1485 District 4A                                  
## 1486 District 4B                                  
## 1487 District 5                                   
## 1488                                   District  1
## 1489 District  2                                  
## 1490 District  3A                                 
## 1491 District  3B                                 
## 1492 District  3C                                 
## 1493 District  3D                                 
## 1494 District  3E                                 
## 1495 District  4A                                 
## 1496 District  4B                                 
## 1497 District  5                                  
## 1498 Justice of the Peace District  1             
## 1499 Justice of the Peace District  2             
## 1500 Justice of the Peace District  4             
## 1501 Justice of the Peace District  5             
## 1502 Justice of the Peace District  1             
## 1503 Justice of the Peace District  2             
## 1504 Justice of the Peace District  4             
## 1505 Justice of the Peace District  5             
## 1506                            Town of Merryville
## 1507 Town of Merryville                           
## 1508 Town of Merryville                           
## 1509 Town of Merryville                           
## 1510 Town of Merryville                           
## 1511 Town of Merryville                           
## 1512 Town of Merryville                           
## 1513 at Large                                     
## 1514 District 1                                   
## 1515 District 2                                   
## 1516 District 3                                   
## 1517 District 4                                   
## 1518 District 5                                   
## 1519 District 6                                   
## 1520 District 7                                   
## 1521 at Large                                     
## 1522 District 1                                   
## 1523 District 2                                   
## 1524 District 3                                   
## 1525 District 4                                   
## 1526 District 5                                   
## 1527 District 6                                   
## 1528 District 7                                   
## 1529                                              
## 1530                                              
## 1531                                              
## 1532                                              
## 1533                                    District 1
## 1534 District 2                                   
## 1535 District 3                                   
## 1536 District 4                                   
## 1537 District 5                                   
## 1538 District 6                                   
## 1539 District 7                                   
## 1540 District  1                                  
## 1541 District  2                                  
## 1542 District  3                                  
## 1543 District  4                                  
## 1544 District  5                                  
## 1545 District  6                                  
## 1546 District  7                                  
## 1547 Justice of the Peace District 1              
## 1548 Justice of the Peace District 2              
## 1549 Justice of the Peace District 3              
## 1550 Justice of the Peace District 4              
## 1551 Justice of the Peace District 5              
## 1552              Justice of the Peace  District 1
## 1553              Justice of the Peace District  2
## 1554              Justice of the Peace District  3
## 1555              Justice of the Peace District  4
## 1556              Justice of the Peace District  5
## 1557                               Town of Arcadia
## 1558 Town of Gibsland                             
## 1559 Town of Mount Lebanon                        
## 1560                              Town of Ringgold
## 1561 Village of Bienville                         
## 1562                          Village of Bryceland
## 1563 Village of Castor                            
## 1564 Village of Jamestown                         
## 1565 Village of Lucky                             
## 1566                             Village of Saline
## 1567 Town of Arcadia                              
## 1568 Town of Gibsland                             
## 1569                              Town of Ringgold
## 1570 Village of Lucky                             
## 1571 Village of Saline                            
## 1572 Town of Gibsland                             
## 1573 Town of Gibsland                             
## 1574 Town of Gibsland                             
## 1575 Town of Gibsland                             
## 1576 Town of Mount Lebanon                        
## 1577 Town of Mount Lebanon                        
## 1578 Town of Mount Lebanon                        
## 1579 Town of Mount Lebanon                        
## 1580 Town of Mount Lebanon                        
## 1581 Village of Bienville                         
## 1582 Village of Bienville                         
## 1583 Village of Bienville                         
## 1584 Village of Bryceland                         
## 1585 Village of Bryceland                         
## 1586 Village of Bryceland                         
## 1587 Village of Castor                            
## 1588 Village of Castor                            
## 1589 Village of Castor                            
## 1590 Village of Jamestown                         
## 1591 Village of Jamestown                         
## 1592 Village of Jamestown                         
## 1593 Village of Lucky                             
## 1594 Village of Lucky                             
## 1595 Village of Lucky                             
## 1596 Village of Saline                            
## 1597 Village of Saline                            
## 1598 Village of Saline                            
## 1599 Village of Saline                            
## 1600 Village of Saline                            
## 1601  District  1 Town of Arcadia                 
## 1602  District  2 Town of Arcadia                 
## 1603  District  3 Town of Arcadia                 
## 1604  District  4 Town of Arcadia                 
## 1605  District  5 Town of Arcadia                 
## 1606  District 1 Town of Ringgold                 
## 1607  District 2 Town of Ringgold                 
## 1608  District 3 Town of Ringgold                 
## 1609  District 4 Town of Ringgold                 
## 1610  District 5 Town of Ringgold                 
## 1611 at Large                                     
## 1612 District  1                                  
## 1613 District  2                                  
## 1614 District  3                                  
## 1615 District  4                                  
## 1616 District  5                                  
## 1617 District  6                                  
## 1618 District  7                                  
## 1619 District  8                                  
## 1620 District  9                                  
## 1621 District 10                                  
## 1622 District 11                                  
## 1623 District 12                                  
## 1624 at Large                                     
## 1625 at Large                                     
## 1626 at Large                                     
## 1627 at Large                                     
## 1628 at Large                                     
## 1629 District  1                                  
## 1630 District  2                                  
## 1631 District  3                                  
## 1632 District  4                                  
## 1633 District  5                                  
## 1634 District  6                                  
## 1635 District  7                                  
## 1636 District  8                                  
## 1637 District  9                                  
## 1638 District 10                                  
## 1639 District 11                                  
## 1640 District 12                                  
## 1641                                              
## 1642                                              
## 1643                                              
## 1644                                              
## 1645                                   District  1
## 1646 District  2                                  
## 1647 District  3                                  
## 1648 District  4                                  
## 1649 District  5                                  
## 1650 District  6                                  
## 1651 District  7                                  
## 1652 District  8                                  
## 1653 District  9                                  
## 1654 District 10                                  
## 1655 District 11                                  
## 1656 District 12                                  
## 1657  City Court City of Bossier City             
## 1658  City Court City of Bossier City             
## 1659 District  1                                  
## 1660 District  2                                  
## 1661 District  3                                  
## 1662 District  4                                  
## 1663 District  5                                  
## 1664 District  6                                  
## 1665 District  7                                  
## 1666 District  8                                  
## 1667 District  9                                  
## 1668 District 10                                  
## 1669 District 11                                  
## 1670 District 12                                  
## 1671 Justice of the Peace District  1             
## 1672 Justice of the Peace District  3             
## 1673 Justice of the Peace District  3             
## 1674 Justice of the Peace District  4             
## 1675 Justice of the Peace District  5             
## 1676 Justice of the Peace District  6             
## 1677 Justice of the Peace District  6             
## 1678 Justice of the Peace District  1             
## 1679 Justice of the Peace District  3             
## 1680 Justice of the Peace District  3             
## 1681 Justice of the Peace District  4             
## 1682 Justice of the Peace District  5             
## 1683 Justice of the Peace District  6             
## 1684 Justice of the Peace District  6             
## 1685 City of Bossier City                         
## 1686 City of Bossier City                         
## 1687 Town of Benton                               
## 1688 Town of Haughton                             
## 1689 Town of Plain Dealing                        
## 1690 Town of Benton                               
## 1691 Town of Haughton                             
## 1692 Town of Plain Dealing                        
## 1693 City of Bossier City                         
## 1694 City of Bossier City                         
## 1695 City of Bossier City                         
## 1696 City of Bossier City                         
## 1697  District  2 Town of Plain Dealing           
## 1698  District  3 Town of Plain Dealing           
## 1699  District  4 Town of Plain Dealing           
## 1700  District 1 Town of Benton                   
## 1701  District 2 Town of Benton                   
## 1702 Town of Haughton                             
## 1703 Town of Haughton                             
## 1704 Town of Haughton                             
## 1705 Town of Haughton                             
## 1706             District  1 Town of Plain Dealing
## 1707             District  1 Town of Plain Dealing
## 1708  District 1 City of Bossier City             
## 1709  District 2 City of Bossier City             
## 1710  District 2 City of Bossier City             
## 1711  District 3 City of Bossier City             
## 1712  District 3 City of Bossier City             
## 1713  District 4 City of Bossier City             
## 1714  District 4 City of Bossier City             
## 1715  District 5 City of Bossier City             
## 1716 at Large                                     
## 1717 at Large                                     
## 1718 at Large                                     
## 1719 at Large                                     
## 1720 at Large                                     
## 1721 District  1                                  
## 1722 District  2                                  
## 1723 District  3                                  
## 1724 District  4                                  
## 1725 District  5                                  
## 1726 District  6                                  
## 1727 District  7                                  
## 1728 District  8                                  
## 1729 District  9                                  
## 1730 District 10                                  
## 1731 District 11                                  
## 1732 District 12                                  
## 1733 at Large                                     
## 1734 at Large                                     
## 1735 at Large                                     
## 1736 at Large                                     
## 1737 at Large                                     
## 1738 District  1                                  
## 1739 District  2                                  
## 1740 District  3                                  
## 1741 District  4                                  
## 1742 District  5                                  
## 1743 District  6                                  
## 1744 District  7                                  
## 1745 District  8                                  
## 1746 District  9                                  
## 1747 District 10                                  
## 1748 District 11                                  
## 1749 District 12                                  
## 1750    Juvenile Court Elec Sect 1C               
## 1751    Juvenile Court Elec Sect 2B               
## 1752    Juvenile Court Elec Sect 3A               
## 1753                                              
## 1754                                              
## 1755                                              
## 1756                                              
## 1757                                   District  1
## 1758 District  2                                  
## 1759 District  3                                  
## 1760 District  4                                  
## 1761 District  5                                  
## 1762 District  6                                  
## 1763 District  7                                  
## 1764 District  8                                  
## 1765 District  9                                  
## 1766 District 10                                  
## 1767 District 11                                  
## 1768 District 12                                  
## 1769                                   District  1
## 1770 District  2                                  
## 1771 District  3                                  
## 1772 District  4                                  
## 1773 District  5                                  
## 1774 District  6                                  
## 1775 District  7                                  
## 1776 District  8                                  
## 1777 District  9                                  
## 1778 District 10                                  
## 1779 District 11                                  
## 1780 District 12                                  
## 1781 Justice of the Peace Ward 1                  
## 1782   Justice of the Peace Ward 2 Oil City Dist  
## 1783  Justice of the Peace Ward 2 Vivian District 
## 1784   Justice of the Peace Ward 3 Blanchard Dist 
## 1785 Justice of the Peace Ward 5                  
## 1786 Justice of the Peace Ward 6                  
## 1787 Justice of the Peace Ward 7                  
## 1788 Justice of the Peace Ward 8                  
## 1789 Justice of the Peace Ward 9                  
## 1790                   Ward 3 Mooringsport Disrict
## 1791 Justice of the Peace Ward 1                  
## 1792   Justice of the Peace Ward 2 Oil City Dist  
## 1793   Justice of the Peace Ward 2 Vivian Dist    
## 1794   Justice of the Peace Ward 3 Blanchard Dist 
## 1795   Justice of the Peace Ward 3 Mooringsport D 
## 1796 Justice of the Peace Ward 5                  
## 1797 Justice of the Peace Ward 6                  
## 1798 Justice of the Peace Ward 7                  
## 1799 Justice of the Peace Ward 8                  
## 1800 Justice of the Peace Ward 9                  
## 1801 Town of Blanchard                            
## 1802                             Town of Greenwood
## 1803                          Town of Mooringsport
## 1804                              Town of Oil City
## 1805 Town of Vivian                               
## 1806                            Village of Belcher
## 1807 Village of Gilliam                           
## 1808                            Village of Hosston
## 1809 Village of Ida                               
## 1810 Village of Rodessa                           
## 1811 Town of Blanchard                            
## 1812 Town of Mooringsport                         
## 1813 Town of Vivian                               
## 1814 Village of Belcher                           
## 1815 Village of Gilliam                           
## 1816 Village of Hosston                           
## 1817 Village of Ida                               
## 1818 Town of Greenwood                            
## 1819 Town of Vivian                               
## 1820 Town of Mooringsport                         
## 1821 Town of Mooringsport                         
## 1822  District  1 Town of Oil City                
## 1823  District  2 Town of Oil City                
## 1824  District  3 Town of Oil City                
## 1825  District  4 Town of Oil City                
## 1826                  District  5 Town of Oil City
## 1827  District 1 Town of Greenwood                
## 1828  District 2 Town of Greenwood                
## 1829  District 3 Town of Greenwood                
## 1830  District 4 Town of Greenwood                
## 1831 Town of Blanchard                            
## 1832 Town of Blanchard                            
## 1833 Town of Blanchard                            
## 1834 Town of Blanchard                            
## 1835 Town of Blanchard                            
## 1836 Village of Belcher                           
## 1837 Village of Belcher                           
## 1838 Village of Belcher                           
## 1839 Village of Gilliam                           
## 1840 Village of Gilliam                           
## 1841 Village of Gilliam                           
## 1842 Village of Hosston                           
## 1843 Village of Hosston                           
## 1844 Village of Hosston                           
## 1845 Village of Ida                               
## 1846 Village of Ida                               
## 1847 Village of Ida                               
## 1848 Village of Rodessa                           
## 1849 Village of Rodessa                           
## 1850 Village of Rodessa                           
## 1851  Ward  1 Town of Vivian                      
## 1852  Ward  2 Town of Vivian                      
## 1853  Ward  3 Town of Vivian                      
## 1854  Ward  4 Town of Vivian                      
## 1855  District  1 Town of Mooringsport            
## 1856  District  2 Town of Mooringsport            
## 1857  District  3 Town of Mooringsport            
## 1858 at Large                                     
## 1859 at Large                                     
## 1860 at Large                                     
## 1861 at Large                                     
## 1862 at Large                                     
## 1863 at Large                                     
## 1864 District  1                                  
## 1865 District  2                                  
## 1866 District  3                                  
## 1867 District  4                                  
## 1868 District  5                                  
## 1869 District  6                                  
## 1870 District  7                                  
## 1871 District  8                                  
## 1872 District  9                                  
## 1873 District 10                                  
## 1874 District 11                                  
## 1875 District 12                                  
## 1876 District 13                                  
## 1877 District 14                                  
## 1878 District 15                                  
## 1879 at Large                                     
## 1880 at Large                                     
## 1881 at Large                                     
## 1882 at Large                                     
## 1883 District  1                                  
## 1884 District  2                                  
## 1885 District  3                                  
## 1886 District  4                                  
## 1887 District  5                                  
## 1888 District  6                                  
## 1889 District  7                                  
## 1890 District  8                                  
## 1891 District  9                                  
## 1892 District 10                                  
## 1893 District 11                                  
## 1894 District 12                                  
## 1895 District 13                                  
## 1896 District 14                                  
## 1897 District 15                                  
## 1898                                              
## 1899                                              
## 1900                                              
## 1901                                              
## 1902                                   District  1
## 1903 District  2                                  
## 1904 District  3                                  
## 1905 District  4                                  
## 1906 District  5                                  
## 1907 District  6                                  
## 1908 District  7                                  
## 1909 District  8                                  
## 1910 District  9                                  
## 1911 District 10                                  
## 1912 District 11                                  
## 1913 District 12                                  
## 1914 District 13                                  
## 1915 District 14                                  
## 1916 District 15                                  
## 1917  City Court City of Sulphur                  
## 1918   City Court Division A City of Lake Charles 
## 1919   City Court Division B City of Lake Charles 
## 1920  City Court City of Lake Charles             
## 1921  City Court City of Sulphur                  
## 1922                                   District  1
## 1923 District  2                                  
## 1924 District  3                                  
## 1925 District  4                                  
## 1926 District  5                                  
## 1927 District  6                                  
## 1928 District  7                                  
## 1929 District  8                                  
## 1930 District  9                                  
## 1931 District 10                                  
## 1932 District 11                                  
## 1933 District 12                                  
## 1934 District 13                                  
## 1935 District 14                                  
## 1936 District 15                                  
## 1937 Justice of the Peace Ward 1                  
## 1938 Justice of the Peace Ward 2                  
## 1939 Justice of the Peace Ward 5                  
## 1940 Justice of the Peace Ward 6                  
## 1941 Justice of the Peace Ward 7                  
## 1942 Justice of the Peace Ward 8                  
## 1943 Justice of the Peace Ward 1                  
## 1944 Justice of the Peace Ward 2                  
## 1945 Justice of the Peace Ward 5                  
## 1946 Justice of the Peace Ward 6                  
## 1947 Justice of the Peace Ward 7                  
## 1948 Justice of the Peace Ward 8                  
## 1949 City of DeQuincy                             
## 1950 City of Lake Charles                         
## 1951 City of Lake Charles                         
## 1952 City of Sulphur                              
## 1953 City of Westlake                             
## 1954 Town of Iowa                                 
## 1955 Town of Vinton                               
## 1956 Town of Vinton                               
## 1957 City of Westlake                             
## 1958 Town of Iowa                                 
## 1959 Town of Vinton                               
## 1960 City of DeQuincy                             
## 1961                       District A Town of Iowa
## 1962  District B Town of Iowa                     
## 1963  District C Town of Iowa                     
## 1964  District D Town of Iowa                     
## 1965  District E Town of Iowa                     
## 1966  Division A City of Westlake                 
## 1967  Division B City of Westlake                 
## 1968  Division C City of Westlake                 
## 1969  Division D City of Westlake                 
## 1970  Division E City of Westlake                 
## 1971  District 1 City of DeQuincy                 
## 1972  District 1 City of Sulphur                  
## 1973  District 2 City of DeQuincy                 
## 1974  District 2 City of Sulphur                  
## 1975  District 3 City of DeQuincy                 
## 1976  District 3 City of Sulphur                  
## 1977  District 4 City of DeQuincy                 
## 1978  District 4 City of Sulphur                  
## 1979  District 5 City of Sulphur                  
## 1980  District A City of Lake Charles             
## 1981  District B City of Lake Charles             
## 1982  District C City of Lake Charles             
## 1983  District C City of Lake Charles             
## 1984  District D City of Lake Charles             
## 1985  District D City of Lake Charles             
## 1986  District E City of Lake Charles             
## 1987  District E City of Lake Charles             
## 1988  District F City of Lake Charles             
## 1989  District F City of Lake Charles             
## 1990  District G City of Lake Charles             
## 1991 Town of Vinton                               
## 1992 Town of Vinton                               
## 1993 Town of Vinton                               
## 1994 Town of Vinton                               
## 1995 Town of Vinton                               
## 1996 at Large                                     
## 1997 District 1                                   
## 1998 District 2                                   
## 1999 District 3                                   
## 2000 District 4                                   
## 2001 District 5                                   
## 2002 District 6                                   
## 2003 District 7                                   
## 2004 at Large                                     
## 2005 District 1                                   
## 2006 District 2                                   
## 2007 District 3                                   
## 2008 District 4                                   
## 2009 District 5                                   
## 2010 District 6                                   
## 2011 District 7                                   
## 2012                                              
## 2013                                              
## 2014                                              
## 2015                                              
## 2016                                    District 1
## 2017 District 2                                   
## 2018 District 3                                   
## 2019 District 4                                   
## 2020 District 5                                   
## 2021 District 6                                   
## 2022 District 7                                   
## 2023                                    District 1
## 2024 District 2                                   
## 2025 District 3                                   
## 2026 District 4                                   
## 2027 District 5                                   
## 2028 District 6                                   
## 2029 District 7                                   
## 2030 Justice of the Peace Ward  1                 
## 2031 Justice of the Peace Ward  2                 
## 2032 Justice of the Peace Ward  1                 
## 2033 Justice of the Peace Ward  2                 
## 2034                                Town of Clarks
## 2035 Town of Columbia                             
## 2036 Village of Grayson                           
## 2037 Town of Columbia                             
## 2038 Village of Grayson                           
## 2039 Town of Clarks                               
## 2040 Town of Clarks                               
## 2041 Town of Clarks                               
## 2042 Town of Clarks                               
## 2043 Town of Clarks                               
## 2044 Village of Grayson                           
## 2045 Village of Grayson                           
## 2046 Village of Grayson                           
## 2047 Town of Columbia                             
## 2048 Town of Columbia                             
## 2049 Town of Columbia                             
## 2050 Town of Columbia                             
## 2051 Town of Columbia                             
## 2052 at Large                                     
## 2053 at Large                                     
## 2054 at Large                                     
## 2055 District 1                                   
## 2056 District 2                                   
## 2057 District 3                                   
## 2058 District 4                                   
## 2059 District 5                                   
## 2060 District 6                                   
## 2061 District 7                                   
## 2062 at Large                                     
## 2063 District 1                                   
## 2064 District 2                                   
## 2065 District 3                                   
## 2066 District 4                                   
## 2067 District 5                                   
## 2068 District 6                                   
## 2069 District 7                                   
## 2070                                              
## 2071                                              
## 2072                                              
## 2073                                              
## 2074                                    District 1
## 2075 District 2                                   
## 2076 District 3                                   
## 2077 District 4                                   
## 2078 District 5                                   
## 2079 District 6                                   
## 2080 District 7                                   
## 2081                                   District  1
## 2082 District  2                                  
## 2083 District  3                                  
## 2084 District  4                                  
## 2085 District  5                                  
## 2086 District  6                                  
## 2087 District  7                                  
## 2088 Justice of the Peace Ward  1                 
## 2089 Justice of the Peace Ward  2                 
## 2090 Justice of the Peace Ward  3                 
## 2091 Justice of the Peace Ward  4                 
## 2092 Justice of the Peace Ward  5                 
## 2093 Justice of the Peace Ward  6                 
## 2094 Justice of the Peace Ward  1                 
## 2095 Justice of the Peace Ward  2                 
## 2096 Justice of the Peace Ward  3                 
## 2097 Justice of the Peace Ward  4                 
## 2098 Justice of the Peace Ward  5                 
## 2099 Justice of the Peace Ward  6                 
## 2100 at Large                                     
## 2101 at Large                                     
## 2102 at Large                                     
## 2103 District 1                                   
## 2104 District 2                                   
## 2105 District 3                                   
## 2106 District 4                                   
## 2107 District 5                                   
## 2108 District 6                                   
## 2109 District 7                                   
## 2110 District 8                                   
## 2111 District 9                                   
## 2112 at Large                                     
## 2113 District 1                                   
## 2114 District 2                                   
## 2115 District 3                                   
## 2116 District 4                                   
## 2117 District 5                                   
## 2118 District 6                                   
## 2119 District 7                                   
## 2120 District 8                                   
## 2121 District 9                                   
## 2122                                              
## 2123                                              
## 2124                                              
## 2125                                              
## 2126                                    District 1
## 2127 District 2                                   
## 2128 District 3                                   
## 2129 District 4                                   
## 2130 District 5                                   
## 2131 District 6                                   
## 2132 District 7                                   
## 2133 District 8                                   
## 2134 District 9                                   
## 2135                                   District  1
## 2136 District  2                                  
## 2137 District  3                                  
## 2138 District  4                                  
## 2139 District  5                                  
## 2140 District  6                                  
## 2141 District  7                                  
## 2142 District  8                                  
## 2143 District  9                                  
## 2144 Justice of the Peace Ward  1                 
## 2145 Justice of the Peace Ward  2                 
## 2146 Justice of the Peace Ward  3                 
## 2147 Justice of the Peace Ward  1                 
## 2148 Justice of the Peace Ward  2                 
## 2149 Justice of the Peace Ward  3                 
## 2150 Town of Jonesville                           
## 2151                       Village of Harrisonburg
## 2152                      Village of Sicily Island
## 2153 Village of Harrisonburg                      
## 2154  District  1 Town of Jonesville              
## 2155  District  2 Town of Jonesville              
## 2156  District  3 Town of Jonesville              
## 2157  District  4 Town of Jonesville              
## 2158  District  5 Town of Jonesville              
## 2159 Village of Harrisonburg                      
## 2160 Village of Harrisonburg                      
## 2161 Village of Harrisonburg                      
## 2162 Village of Sicily Island                     
## 2163 Village of Sicily Island                     
## 2164 Village of Sicily Island                     
## 2165 at Large                                     
## 2166 at Large                                     
## 2167 District  1                                  
## 2168 District  2                                  
## 2169 District  3                                  
## 2170 District  4                                  
## 2171 District  5                                  
## 2172 District  6                                  
## 2173 District  7                                  
## 2174 District  8                                  
## 2175 District  9                                  
## 2176 District 10                                  
## 2177 at Large                                     
## 2178 District  1                                  
## 2179 District  2                                  
## 2180 District  3                                  
## 2181 District  4                                  
## 2182 District  5                                  
## 2183 District  6                                  
## 2184 District  7                                  
## 2185 District  8                                  
## 2186 District  9                                  
## 2187 District 10                                  
## 2188                                              
## 2189                                              
## 2190                                              
## 2191                                              
## 2192 District  1                                  
## 2193 District  2                                  
## 2194 District  3                                  
## 2195 District  4                                  
## 2196 District  5                                  
## 2197 District  6                                  
## 2198 District  7                                  
## 2199 District  8                                  
## 2200 District  9                                  
## 2201 District 10                                  
## 2202                                   District  1
## 2203 District  2                                  
## 2204 District  3                                  
## 2205 District  4                                  
## 2206 District  5                                  
## 2207 District  6                                  
## 2208 District  7                                  
## 2209 District  8                                  
## 2210 District  9                                  
## 2211 District 10                                  
## 2212 1st Justice of the Peace Court               
## 2213 2nd Justice of the Peace Court               
## 2214 3rd Justice of the Peace Court               
## 2215 1st Justice of the Peace Court               
## 2216 2nd Justice of the Peace Court               
## 2217 3rd Justice of the Peace Court               
## 2218                           Town of Haynesville
## 2219                                 Town of Homer
## 2220                             Village of Athens
## 2221                             Village of Lisbon
## 2222                           Town of Haynesville
## 2223 Village of Athens                            
## 2224 Town of Homer                                
## 2225 Village of Athens                            
## 2226 Village of Athens                            
## 2227 Village of Athens                            
## 2228 Village of Lisbon                            
## 2229 Village of Lisbon                            
## 2230 Village of Lisbon                            
## 2231                District 1 Town of Haynesville
## 2232  District 2 Town of Haynesville              
## 2233  District 3 Town of Haynesville              
## 2234  District 4 Town of Haynesville              
## 2235  District 5 Town of Haynesville              
## 2236  District  1 Town of Homer                   
## 2237  District  2 Town of Homer                   
## 2238  District  3 Town of Homer                   
## 2239  District  4 Town of Homer                   
## 2240  District  5 Town of Homer                   
## 2241 at Large                                     
## 2242  District 1 Place A                          
## 2243  District 1 Place B                          
## 2244 District 2                                   
## 2245  District 3 Place A                          
## 2246  District 3 Place B                          
## 2247  District 4 Place A                          
## 2248  District 4 Place B                          
## 2249 District 5A                                  
## 2250 District 5B                                  
## 2251 at Large                                     
## 2252  District 1 Place A                          
## 2253  District 1 Place B                          
## 2254 District 2                                   
## 2255  District 3 Place A                          
## 2256  District 3 Place B                          
## 2257  District 4 Place A                          
## 2258  District 4 Place B                          
## 2259 District 5A                                  
## 2260 District 5B                                  
## 2261                                              
## 2262                                              
## 2263                                              
## 2264                                              
## 2265                            District 1 Place A
## 2266  District 1 Place B                          
## 2267 District 2                                   
## 2268  District 3 Place A                          
## 2269  District 3 Place B                          
## 2270  District 4 Place A                          
## 2271  District 4 Place B                          
## 2272  District 5 Place A                          
## 2273  District 5 Place B                          
## 2274  City Court Town of Vidalia                  
## 2275  City Court Town of Vidalia                  
## 2276                            District 1 Place A
## 2277  District 1 Place B                          
## 2278 District 2                                   
## 2279  District 3 Place A                          
## 2280  District 3 Place B                          
## 2281  District 4 Place A                          
## 2282  District 4 Place B                          
## 2283  District 5 Place A                          
## 2284  District 5 Place B                          
## 2285 Justice of the Peace District 1              
## 2286 Justice of the Peace District 2              
## 2287 Justice of the Peace District 3              
## 2288 Justice of the Peace District 4              
## 2289 Justice of the Peace District 5A             
## 2290 Justice of the Peace District 5B             
## 2291 Justice of the Peace District 1              
## 2292 Justice of the Peace District 2              
## 2293 Justice of the Peace District 3              
## 2294 Justice of the Peace District 4              
## 2295 Justice of the Peace District 5A             
## 2296 Justice of the Peace District 5B             
## 2297 Town of Clayton                              
## 2298                              Town of Ferriday
## 2299                            Town of Ridgecrest
## 2300 Town of Vidalia                              
## 2301 Town of Clayton                              
## 2302 Town of Ridgecrest                           
## 2303 Town of Vidalia                              
## 2304  District 1 Town of Vidalia                  
## 2305  District 2 Town of Vidalia                  
## 2306  District 3 Town of Vidalia                  
## 2307  District 3 Town of Vidalia                  
## 2308  District 3 Town of Vidalia                  
## 2309  District A Town of Ferriday                 
## 2310  District B Town of Ferriday                 
## 2311  District C Town of Ferriday                 
## 2312  District D Town of Ferriday                 
## 2313  District E Town of Ferriday                 
## 2314 Town of Clayton                              
## 2315 Town of Clayton                              
## 2316 Town of Clayton                              
## 2317 Town of Clayton                              
## 2318 Town of Clayton                              
## 2319 Town of Ridgecrest                           
## 2320 Town of Ridgecrest                           
## 2321 Town of Ridgecrest                           
## 2322 Town of Ridgecrest                           
## 2323 Town of Ridgecrest                           
## 2324 at Large                                     
## 2325 at Large                                     
## 2326 District 1A                                  
## 2327 District 1B                                  
## 2328 District 1C                                  
## 2329 District 2                                   
## 2330 District 3                                   
## 2331 District 4A                                  
## 2332 District 4B                                  
## 2333 District 4C                                  
## 2334 District 4D                                  
## 2335 District 5                                   
## 2336 District 6                                   
## 2337 at Large                                     
## 2338 District 1A                                  
## 2339 District 1B                                  
## 2340 District 1C                                  
## 2341 District 2                                   
## 2342 District 3                                   
## 2343 District 4A                                  
## 2344 District 4B                                  
## 2345 District 4C                                  
## 2346 District 4D                                  
## 2347 District 5                                   
## 2348 District 6                                   
## 2349                                              
## 2350                                              
## 2351                                              
## 2352                                              
## 2353                                   District 1A
## 2354 District 1B                                  
## 2355 District 1C                                  
## 2356 District 2                                   
## 2357 District 3                                   
## 2358 District 4A                                  
## 2359 District 4B                                  
## 2360 District 4C                                  
## 2361 District 4D                                  
## 2362 District 5                                   
## 2363 District 6                                   
## 2364 District  1                                  
## 2365 District  2                                  
## 2366 District  3                                  
## 2367 District  4                                  
## 2368 District  5                                  
## 2369 District  6                                  
## 2370 District  7                                  
## 2371 District  8                                  
## 2372 District  9                                  
## 2373 District 10                                  
## 2374 District 11                                  
## 2375 Justice of the Peace District 1              
## 2376 Justice of the Peace District 2              
## 2377 Justice of the Peace District 3              
## 2378 Justice of the Peace District 4              
## 2379 Justice of the Peace District 5              
## 2380 Justice of the Peace District 6              
## 2381 Justice of the Peace District 1              
## 2382 Justice of the Peace District 2              
## 2383 Justice of the Peace District 3              
## 2384 Justice of the Peace District 4              
## 2385 Justice of the Peace District 5              
## 2386 Justice of the Peace District 6              
## 2387                             City of Mansfield
## 2388 Town of Keachi                               
## 2389 Town of Logansport                           
## 2390                             Town of Stonewall
## 2391 Village of Grand Cane                        
## 2392                         Village of Longstreet
## 2393 Village of South Mansfield                   
## 2394 Village of Stanley                           
## 2395 Village of Stanley                           
## 2396 Town of Stonewall                            
## 2397 Village of Stanley                           
## 2398 Village of Stanley                           
## 2399  District A City of Mansfield                
## 2400  District B City of Mansfield                
## 2401  District C City of Mansfield                
## 2402  District D City of Mansfield                
## 2403  District E City of Mansfield                
## 2404 Village of Grand Cane                        
## 2405 Village of Grand Cane                        
## 2406 Village of Grand Cane                        
## 2407 Village of South Mansfield                   
## 2408 Village of South Mansfield                   
## 2409 Village of South Mansfield                   
## 2410 Village of Stanley                           
## 2411 Village of Stanley                           
## 2412 Village of Stanley                           
## 2413 Village of Stanley                           
## 2414 Village of Stanley                           
## 2415 Village of Stanley                           
## 2416 Town of Logansport                           
## 2417 Town of Logansport                           
## 2418 Town of Logansport                           
## 2419 Town of Logansport                           
## 2420 Town of Logansport                           
## 2421 Town of Stonewall                            
## 2422 Town of Stonewall                            
## 2423 Town of Stonewall                            
## 2424 Town of Stonewall                            
## 2425 Town of Stonewall                            
## 2426 Village of Longstreet                        
## 2427 Village of Longstreet                        
## 2428 Village of Longstreet                        
## 2429 Town of Keachi                               
## 2430 Town of Keachi                               
## 2431 Town of Keachi                               
## 2432 Town of Keachi                               
## 2433 Town of Keachi                               
## 2434 at Large                                     
## 2435 at Large                                     
## 2436 at Large                                     
## 2437 at Large                                     
## 2438 at Large                                     
## 2439 District  1                                  
## 2440 District  2                                  
## 2441 District  3                                  
## 2442 District  4                                  
## 2443 District  5                                  
## 2444 District  6                                  
## 2445 District  7                                  
## 2446 District  8                                  
## 2447 District  9                                  
## 2448 District 10                                  
## 2449 District 11                                  
## 2450 District 12                                  
## 2451 at Large                                     
## 2452 at Large                                     
## 2453 at Large                                     
## 2454 at Large                                     
## 2455 at Large                                     
## 2456 District  1                                  
## 2457 District  2                                  
## 2458 District  3                                  
## 2459 District  4                                  
## 2460 District  5                                  
## 2461 District  6                                  
## 2462 District  7                                  
## 2463 District  8                                  
## 2464 District  9                                  
## 2465 District 10                                  
## 2466 District 11                                  
## 2467 District 12                                  
## 2468    Juvenile Court Elec Sect 1A               
## 2469    Juvenile Court Elec Sect 2B               
## 2470  Election Section 1 Division B               
## 2471  Election Section 2 Division C               
## 2472  Election Section 3 Division A               
## 2473  Election Section 3 Division D               
## 2474                                              
## 2475                                              
## 2476                                              
## 2477                                              
## 2478  Metro Council City of Baton Rouge           
## 2479 Metro District  1                            
## 2480 Metro District  2                            
## 2481 Metro District  3                            
## 2482 Metro District  4                            
## 2483 Metro District  5                            
## 2484 Metro District  6                            
## 2485 Metro District  7                            
## 2486 Metro District  8                            
## 2487 Metro District  9                            
## 2488 Metro District 10                            
## 2489 Metro District 11                            
## 2490 Metro District 12                            
## 2491  City Court City of Baker                    
## 2492  City Court City of Zachary                  
## 2493     City Court El Sect 1B Baton Rouge        
## 2494     City Court El Sect 1D Baton Rouge        
## 2495     City Court El Sect 2A Baton Rouge        
## 2496     City Court El Sect 2C Baton Rouge        
## 2497     City Court El Sect 2E Baton Rouge        
## 2498  City Court City of Baton Rouge              
## 2499                District   1 Zachary Community
## 2500  District   2 Zachary Community              
## 2501  District   3 Zachary Community              
## 2502  District   4 Zachary Community              
## 2503  District   5 Zachary Community              
## 2504  District   6 Zachary Community              
## 2505  District   7 Zachary Community              
## 2506  District   8 Zachary Community              
## 2507  District   9 Zachary Community              
## 2508                                   District  1
## 2509                 District  1 Central Community
## 2510                     District  1 City of Baker
## 2511 District  2                                  
## 2512  District  2 Central Community               
## 2513  District  2 City of Baker                   
## 2514 District  3                                  
## 2515  District  3 Central Community               
## 2516  District  3 City of Baker                   
## 2517 District  4                                  
## 2518  District  4 Central Community               
## 2519  District  4 City of Baker                   
## 2520 District  5                                  
## 2521  District  5 Central Community               
## 2522  District  5 City of Baker                   
## 2523 District  6                                  
## 2524  District  6 Central Community               
## 2525 District  7                                  
## 2526  District  7 Central Community               
## 2527 District  8                                  
## 2528 District  9                                  
## 2529 District 10                                  
## 2530 District 11                                  
## 2531  Justice of the Peace Ward 2 District 1      
## 2532  Justice of the Peace Ward 2 District 2      
## 2533  Justice of the Peace Ward 2 District 3      
## 2534  Justice of the Peace Ward 3 District 1      
## 2535  Justice of the Peace Ward 3 District 2      
## 2536  Justice of the Peace Ward 3 District 3      
## 2537  Justice of the Peace Ward 2 District 1      
## 2538  Justice of the Peace Ward 2 District 2      
## 2539  Justice of the Peace Ward 2 District 3      
## 2540  Justice of the Peace Ward 3 District 1      
## 2541  Justice of the Peace Ward 3 District 2      
## 2542  Justice of the Peace Ward 3 District 3      
## 2543                                 City of Baker
## 2544                               City of Central
## 2545 City of Zachary                              
## 2546 City of Baker                                
## 2547 City of Central                              
## 2548 City of Zachary                              
## 2549                               City of Central
## 2550                               City of Central
## 2551                               City of Central
## 2552                               City of Central
## 2553                               City of Central
## 2554  District 1 City of Baker                    
## 2555  District 1 City of Zachary                  
## 2556  District 2 City of Baker                    
## 2557  District 2 City of Zachary                  
## 2558  District 3 City of Baker                    
## 2559  District 3 City of Zachary                  
## 2560  District 4 City of Baker                    
## 2561  District 4 City of Baker                    
## 2562  District 4 City of Zachary                  
## 2563  District 5 City of Baker                    
## 2564  District 5 City of Zachary                  
## 2565 at Large                                     
## 2566 District 1                                   
## 2567 District 2                                   
## 2568 District 3                                   
## 2569 District 4                                   
## 2570 District 5                                   
## 2571 District 6                                   
## 2572 District 7                                   
## 2573 District 8                                   
## 2574 District 9                                   
## 2575 at Large                                     
## 2576 District 1                                   
## 2577 District 2                                   
## 2578 District 3                                   
## 2579 District 4                                   
## 2580 District 5                                   
## 2581 District 6                                   
## 2582 District 7                                   
## 2583 District 8                                   
## 2584 District 9                                   
## 2585                                              
## 2586                                              
## 2587                                              
## 2588                                              
## 2589                                    District 1
## 2590 District 2                                   
## 2591 District 3                                   
## 2592 District 4                                   
## 2593 District 5                                   
## 2594                                   District  1
## 2595 District  2                                  
## 2596 District  3                                  
## 2597 District  4                                  
## 2598 District  5                                  
## 2599 District  6                                  
## 2600 District  7                                  
## 2601 District  8                                  
## 2602 District  9                                  
## 2603 1st Justice Court                            
## 2604 1st Justice Court                            
## 2605                       Town of Lake Providence
## 2606 Town of Lake Providence                      
## 2607 Town of Lake Providence                      
## 2608 Town of Lake Providence                      
## 2609 Town of Lake Providence                      
## 2610 Town of Lake Providence                      
## 2611 Town of Lake Providence                      
## 2612 at Large                                     
## 2613 District 1A                                  
## 2614 District 1B                                  
## 2615 District 2                                   
## 2616 District 3                                   
## 2617 District 4A                                  
## 2618 District 4B                                  
## 2619 District 5                                   
## 2620 District 6                                   
## 2621 District 7                                   
## 2622 at Large                                     
## 2623 District 1A                                  
## 2624 District 1B                                  
## 2625 District 2                                   
## 2626 District 3                                   
## 2627 District 4A                                  
## 2628 District 4B                                  
## 2629 District 5                                   
## 2630 District 6                                   
## 2631 District 7                                   
## 2632                                              
## 2633                                              
## 2634                                              
## 2635                                              
## 2636                                   District 1A
## 2637 District 1B                                  
## 2638 District 2                                   
## 2639 District 3                                   
## 2640 District 4A                                  
## 2641 District 4B                                  
## 2642 District 5                                   
## 2643 District 6                                   
## 2644 District 7                                   
## 2645                                    District 1
## 2646  District 2 Division 1                       
## 2647  District 2 Division 2                       
## 2648  District 3 Division 1                       
## 2649  District 3 Division 2                       
## 2650  District 3 Division 3                       
## 2651 District 4                                   
## 2652 District 5                                   
## 2653  District 6 Division 1                       
## 2654  District 6 Division 2                       
## 2655  District 6 Division 3                       
## 2656 District 7                                   
## 2657 Justice of the Peace District 1              
## 2658 Justice of the Peace District 2              
## 2659 Justice of the Peace District 3              
## 2660 Justice of the Peace District 4              
## 2661 Justice of the Peace District 1              
## 2662 Justice of the Peace District 2              
## 2663 Justice of the Peace District 3              
## 2664 Justice of the Peace District 4              
## 2665 Town of Clinton                              
## 2666 Town of Jackson                              
## 2667 Town of Slaughter                            
## 2668 Village of Norwood                           
## 2669                             Village of Wilson
## 2670 Town of Slaughter                            
## 2671 Town of Jackson                              
## 2672 Town of Clinton                              
## 2673 Town of Clinton                              
## 2674 Town of Clinton                              
## 2675 Town of Clinton                              
## 2676 Town of Clinton                              
## 2677 Town of Slaughter                            
## 2678 Town of Slaughter                            
## 2679 Town of Slaughter                            
## 2680 Town of Slaughter                            
## 2681 Town of Slaughter                            
## 2682 Village of Norwood                           
## 2683 Village of Norwood                           
## 2684 Village of Norwood                           
## 2685 Village of Wilson                            
## 2686 Village of Wilson                            
## 2687 Village of Wilson                            
## 2688 Village of Wilson                            
## 2689 Village of Wilson                            
## 2690 Village of Wilson                            
## 2691 Town of Jackson                              
## 2692 Town of Jackson                              
## 2693 Town of Jackson                              
## 2694 Town of Jackson                              
## 2695 Town of Jackson                              
## 2696 at Large                                     
## 2697 at Large                                     
## 2698 at Large                                     
## 2699 District  1                                  
## 2700 District  2                                  
## 2701 District  3                                  
## 2702 District  4                                  
## 2703 District  5                                  
## 2704 District  6                                  
## 2705 District  7                                  
## 2706 District  8                                  
## 2707 District  9                                  
## 2708 at Large                                     
## 2709 at Large                                     
## 2710 at Large                                     
## 2711 at Large                                     
## 2712 District  1                                  
## 2713 District  2                                  
## 2714 District  3                                  
## 2715 District  4                                  
## 2716 District  5                                  
## 2717 District  6                                  
## 2718 District  7                                  
## 2719 District  8                                  
## 2720 District  9                                  
## 2721                                              
## 2722                                              
## 2723                                              
## 2724                                              
## 2725 District  1                                  
## 2726 District  2                                  
## 2727 District  3                                  
## 2728 District  4                                  
## 2729 District  5                                  
## 2730 District  6                                  
## 2731 District  7                                  
## 2732 District  8                                  
## 2733 District  9                                  
## 2734  City Court City of Ville Platte             
## 2735  City Court City of Ville Platte             
## 2736                                   District  1
## 2737 District  2                                  
## 2738 District  3                                  
## 2739 District  4                                  
## 2740 District  5                                  
## 2741 District  6                                  
## 2742 District  7                                  
## 2743 District  8                                  
## 2744 District  9                                  
## 2745 District 10                                  
## 2746 District 11                                  
## 2747 District 12                                  
## 2748 District 13                                  
## 2749 Justice of the Peace Ward 2                  
## 2750 Justice of the Peace Ward 2                  
## 2751 Justice of the Peace Ward 3                  
## 2752 Justice of the Peace Ward 4                  
## 2753 Justice of the Peace Ward 5                  
## 2754 Justice of the Peace Ward 2                  
## 2755 Justice of the Peace Ward 2                  
## 2756 Justice of the Peace Ward 3                  
## 2757 Justice of the Peace Ward 4                  
## 2758 Justice of the Peace Ward 5                  
## 2759                          City of Ville Platte
## 2760 Town of Mamou                                
## 2761 Village of Chataignier                       
## 2762 Village of Pine Prairie                      
## 2763                       Village of Turkey Creek
## 2764 City of Ville Platte                         
## 2765 Town of Mamou                                
## 2766 Village of Chataignier                       
## 2767 Village of Pine Prairie                      
## 2768 Village of Turkey Creek                      
## 2769 Town of Mamou                                
## 2770  District 1 Town of Mamou                    
## 2771  District 2 Town of Mamou                    
## 2772  District 3 Town of Mamou                    
## 2773  District 4 Town of Mamou                    
## 2774  District A City of Ville Platte             
## 2775  District B City of Ville Platte             
## 2776  District C City of Ville Platte             
## 2777  District D City of Ville Platte             
## 2778  District E City of Ville Platte             
## 2779  District F City of Ville Platte             
## 2780 Village of Chataignier                       
## 2781 Village of Chataignier                       
## 2782 Village of Chataignier                       
## 2783 Village of Pine Prairie                      
## 2784 Village of Pine Prairie                      
## 2785 Village of Pine Prairie                      
## 2786 Village of Turkey Creek                      
## 2787 Village of Turkey Creek                      
## 2788 Village of Turkey Creek                      
## 2789 at Large                                     
## 2790 at Large                                     
## 2791 at Large                                     
## 2792 District  1                                  
## 2793 District  2                                  
## 2794 District  3                                  
## 2795 District  4                                  
## 2796 District  5                                  
## 2797 District  6                                  
## 2798 District  7                                  
## 2799 at Large                                     
## 2800 at Large                                     
## 2801 at Large                                     
## 2802 at Large                                     
## 2803 at Large                                     
## 2804 District  1                                  
## 2805 District  2                                  
## 2806 District  3                                  
## 2807 District  4                                  
## 2808 District  5                                  
## 2809 District  6                                  
## 2810 District  7                                  
## 2811                                              
## 2812                                              
## 2813                                              
## 2814                                              
## 2815                                   District  1
## 2816 District  2                                  
## 2817 District  3                                  
## 2818 District  4                                  
## 2819 District  5                                  
## 2820 District  6                                  
## 2821 District  7                                  
## 2822  City Court City of Winnsboro                
## 2823  City Court City of Winnsboro                
## 2824                                   District  1
## 2825 District  2                                  
## 2826 District  3                                  
## 2827 District  4                                  
## 2828 District  5                                  
## 2829 District  6                                  
## 2830 District  7                                  
## 2831 Justice of the Peace District 1              
## 2832 Justice of the Peace District 2              
## 2833 Justice of the Peace District 3              
## 2834 Justice of the Peace District 5              
## 2835 Justice of the Peace District 6              
## 2836 Justice of the Peace District 7              
## 2837 Justice of the Peace District 8              
## 2838 Justice of the Peace District 1              
## 2839 Justice of the Peace District 2              
## 2840 Justice of the Peace District 3              
## 2841 Justice of the Peace District 5              
## 2842 Justice of the Peace District 6              
## 2843 Justice of the Peace District 7              
## 2844 Justice of the Peace District 8              
## 2845 City of Winnsboro                            
## 2846 Town of Wisner                               
## 2847                             Village of Baskin
## 2848 Village of Gilbert                           
## 2849 City of Winnsboro                            
## 2850 Town of Wisner                               
## 2851 Village of Baskin                            
## 2852 Village of Gilbert                           
## 2853 Town of Wisner                               
## 2854 Town of Wisner                               
## 2855 Town of Wisner                               
## 2856 Town of Wisner                               
## 2857 Town of Wisner                               
## 2858 Village of Baskin                            
## 2859 Village of Baskin                            
## 2860 Village of Baskin                            
## 2861 Village of Gilbert                           
## 2862 Village of Gilbert                           
## 2863 Village of Gilbert                           
## 2864  District 1 City of Winnsboro                
## 2865  District 2 City of Winnsboro                
## 2866  District 3 City of Winnsboro                
## 2867  District 4 City of Winnsboro                
## 2868  District 5 City of Winnsboro                
## 2869 at Large                                     
## 2870 District 1                                   
## 2871 District 2                                   
## 2872 District 3                                   
## 2873 District 4                                   
## 2874 District 5                                   
## 2875 District 6                                   
## 2876 District 7                                   
## 2877 District 8                                   
## 2878 at Large                                     
## 2879 at Large                                     
## 2880 District 1                                   
## 2881 District 2                                   
## 2882 District 3                                   
## 2883 District 4                                   
## 2884 District 5                                   
## 2885 District 6                                   
## 2886 District 7                                   
## 2887 District 8                                   
## 2888                                              
## 2889                                              
## 2890                                              
## 2891                                              
## 2892 District 1                                   
## 2893 District 2                                   
## 2894 District 3                                   
## 2895 District 4                                   
## 2896 District 5                                   
## 2897 District 6                                   
## 2898 District 7                                   
## 2899 District 8                                   
## 2900                                   District  1
## 2901 District  2                                  
## 2902 District  3                                  
## 2903 District  4                                  
## 2904 District  5                                  
## 2905 District  6                                  
## 2906 District  7                                  
## 2907 District  8                                  
## 2908 Justice of the Peace District A              
## 2909 Justice of the Peace District B              
## 2910 Justice of the Peace District C              
## 2911 Justice of the Peace District D              
## 2912 Justice of the Peace District E              
## 2913 Justice of the Peace District A              
## 2914 Justice of the Peace District B              
## 2915 Justice of the Peace District C              
## 2916 Justice of the Peace District D              
## 2917 Justice of the Peace District E              
## 2918 Town of Colfax                               
## 2919 Town of Montgomery                           
## 2920 Town of Pollock                              
## 2921                             Village of Creola
## 2922 Village of Dry Prong                         
## 2923 Village of Georgetown                        
## 2924 Town of Pollock                              
## 2925 Village of Creola                            
## 2926 Village of Georgetown                        
## 2927 Town of Colfax                               
## 2928 Town of Colfax                               
## 2929 Town of Colfax                               
## 2930 Town of Colfax                               
## 2931 Town of Colfax                               
## 2932 Village of Creola                            
## 2933 Village of Creola                            
## 2934 Village of Creola                            
## 2935 Village of Dry Prong                         
## 2936 Village of Dry Prong                         
## 2937 Village of Dry Prong                         
## 2938 Village of Georgetown                        
## 2939 Village of Georgetown                        
## 2940 Village of Georgetown                        
## 2941 Town of Montgomery                           
## 2942 Town of Montgomery                           
## 2943 Town of Montgomery                           
## 2944 Town of Montgomery                           
## 2945 Town of Montgomery                           
## 2946                               Town of Pollock
## 2947                               Town of Pollock
## 2948                               Town of Pollock
## 2949                               Town of Pollock
## 2950                               Town of Pollock
## 2951 at Large                                     
## 2952 at Large                                     
## 2953 at Large                                     
## 2954 District  1                                  
## 2955 District  2                                  
## 2956 District  3                                  
## 2957 District  4                                  
## 2958 District  5                                  
## 2959 District  6                                  
## 2960 District  7                                  
## 2961 District  8                                  
## 2962 District  9                                  
## 2963 District 10                                  
## 2964 District 11                                  
## 2965 District 12                                  
## 2966 District 13                                  
## 2967 District 14                                  
## 2968 at Large                                     
## 2969 at Large                                     
## 2970 District  1                                  
## 2971 District  2                                  
## 2972 District  3                                  
## 2973 District  4                                  
## 2974 District  5                                  
## 2975 District  6                                  
## 2976 District  7                                  
## 2977 District  8                                  
## 2978 District  9                                  
## 2979 District 10                                  
## 2980 District 11                                  
## 2981 District 12                                  
## 2982 District 13                                  
## 2983 District 14                                  
## 2984                                              
## 2985                                              
## 2986                                              
## 2987                                              
## 2988                                              
## 2989                                   District  1
## 2990 District  2                                  
## 2991 District  3                                  
## 2992 District  4                                  
## 2993 District  5                                  
## 2994 District  6                                  
## 2995 District  7                                  
## 2996 District  8                                  
## 2997 District  9                                  
## 2998 District 10                                  
## 2999 District 11                                  
## 3000 District 12                                  
## 3001 District 13                                  
## 3002 District 14                                  
## 3003  City Court City of Jeanerette               
## 3004  City Court City of New Iberia               
## 3005  City Court City of Jeanerette               
## 3006  City Court City of New Iberia               
## 3007                                   District  1
## 3008 District  2                                  
## 3009 District  3                                  
## 3010 District  4                                  
## 3011 District  5                                  
## 3012 District  6                                  
## 3013 District  7                                  
## 3014 District  8                                  
## 3015 District  9                                  
## 3016 District 10                                  
## 3017 District 11                                  
## 3018 District 12                                  
## 3019 District 13                                  
## 3020 District 14                                  
## 3021 Justice of the Peace Ward  1                 
## 3022 Justice of the Peace Ward  2                 
## 3023 Justice of the Peace Ward  3                 
## 3024 Justice of the Peace Ward  1                 
## 3025 Justice of the Peace Ward  2                 
## 3026 Justice of the Peace Ward  3                 
## 3027                            City of Jeanerette
## 3028                            City of New Iberia
## 3029 Village of Loreauville                       
## 3030 City of Jeanerette                           
## 3031  At Large City of New Iberia                 
## 3032 Village of Loreauville                       
## 3033 Village of Loreauville                       
## 3034 Village of Loreauville                       
## 3035  Ward 1 City of Jeanerette                   
## 3036  Ward 2 City of Jeanerette                   
## 3037  Ward 3 City of Jeanerette                   
## 3038  Ward 4 City of Jeanerette                   
## 3039  District 1 City of New Iberia               
## 3040  District 2 City of New Iberia               
## 3041  District 3 City of New Iberia               
## 3042  District 4 City of New Iberia               
## 3043  District 5 City of New Iberia               
## 3044  District 6 City of New Iberia               
## 3045 at Large                                     
## 3046 at Large                                     
## 3047 District  1                                  
## 3048 District  2                                  
## 3049 District  3                                  
## 3050 District  4                                  
## 3051 District  5                                  
## 3052 District  6                                  
## 3053 District  7                                  
## 3054 District  8                                  
## 3055 District  9                                  
## 3056 District 10                                  
## 3057 District 11                                  
## 3058 District 12                                  
## 3059 District 13                                  
## 3060 at Large                                     
## 3061 District  1                                  
## 3062 District  2                                  
## 3063 District  3                                  
## 3064 District  4                                  
## 3065 District  5                                  
## 3066 District  6                                  
## 3067 District  7                                  
## 3068 District  8                                  
## 3069 District  9                                  
## 3070 District 10                                  
## 3071 District 11                                  
## 3072 District 12                                  
## 3073 District 13                                  
## 3074                                              
## 3075                                              
## 3076                                              
## 3077                                              
## 3078                                              
## 3079                                   District  1
## 3080 District  2                                  
## 3081 District  3                                  
## 3082 District  4                                  
## 3083 District  5                                  
## 3084 District  6                                  
## 3085 District  7                                  
## 3086 District  8                                  
## 3087 District  9                                  
## 3088 District 10                                  
## 3089 District 11                                  
## 3090 District 12                                  
## 3091 District 13                                  
## 3092  City Court City of Plaquemine               
## 3093                 City Court City of Plaquemine
## 3094                                    District A
## 3095 District B                                   
## 3096 District C                                   
## 3097 District D                                   
## 3098 District E                                   
## 3099 District F                                   
## 3100 District G                                   
## 3101 District H                                   
## 3102 District I                                   
## 3103 District J                                   
## 3104 District K                                   
## 3105 District L                                   
## 3106 District M                                   
## 3107 District N                                   
## 3108 District O                                   
## 3109 Justice of the Peace Ward 1                  
## 3110 Justice of the Peace Ward 2                  
## 3111 Justice of the Peace Ward 3                  
## 3112 Justice of the Peace Ward 4                  
## 3113 Justice of the Peace Ward 5                  
## 3114 Justice of the Peace Ward 6                  
## 3115 Justice of the Peace Ward 1                  
## 3116 Justice of the Peace Ward 2                  
## 3117 Justice of the Peace Ward 3                  
## 3118 Justice of the Peace Ward 4                  
## 3119 Justice of the Peace Ward 5                  
## 3120 Justice of the Peace Ward 6                  
## 3121 City of Plaquemine                           
## 3122                            City of St Gabriel
## 3123 Town of Maringouin                           
## 3124 Town of White Castle                         
## 3125 Village of Grosse Tete                       
## 3126                           Village of Rosedale
## 3127                            City of Plaquemine
## 3128  City of St Gabriel                          
## 3129 Town of Maringouin                           
## 3130 Town of White Castle                         
## 3131 Village of Grosse Tete                       
## 3132 Village of Rosedale                          
## 3133  Division A Village of Rosedale              
## 3134  Division B Village of Rosedale              
## 3135  Division C Village of Rosedale              
## 3136 Town of Maringouin                           
## 3137 Town of Maringouin                           
## 3138 Town of Maringouin                           
## 3139 Town of Maringouin                           
## 3140 Town of Maringouin                           
## 3141 Town of White Castle                         
## 3142 Town of White Castle                         
## 3143 Town of White Castle                         
## 3144 Town of White Castle                         
## 3145 Town of White Castle                         
## 3146 Village of Grosse Tete                       
## 3147 Village of Grosse Tete                       
## 3148 Village of Grosse Tete                       
## 3149                            City of St Gabriel
## 3150                            City of St Gabriel
## 3151                            City of St Gabriel
## 3152                            City of St Gabriel
## 3153                            City of St Gabriel
## 3154  District I City of Plaquemine               
## 3155  District II City of Plaquemine              
## 3156  District III City of Plaquemine             
## 3157  District IV City of Plaquemine              
## 3158  District V City of Plaquemine               
## 3159  District VI City of Plaquemine              
## 3160 at Large                                     
## 3161 District  1                                  
## 3162 District  2                                  
## 3163 District  3                                  
## 3164 District  4                                  
## 3165 District  5                                  
## 3166 District  6                                  
## 3167 District  7                                  
## 3168 at Large                                     
## 3169                                    District 1
## 3170                                    District 2
## 3171                                    District 3
## 3172                                    District 4
## 3173                                    District 5
## 3174                                    District 6
## 3175                                    District 7
## 3176                                              
## 3177                                              
## 3178                                              
## 3179                                              
## 3180                                    District 1
## 3181                                    District 2
## 3182                                    District 3
## 3183                                    District 4
## 3184                                    District 5
## 3185                                    District 6
## 3186                                    District 7
## 3187                                   District  1
## 3188 District  2                                  
## 3189 District  3                                  
## 3190 District  4                                  
## 3191 District  5                                  
## 3192 District  6                                  
## 3193 District  7                                  
## 3194 Justice of the Peace District A              
## 3195 Justice of the Peace District B              
## 3196 Justice of the Peace District C              
## 3197 Justice of the Peace District D              
## 3198 Justice of the Peace District E              
## 3199 Justice of the Peace District A              
## 3200 Justice of the Peace District B              
## 3201 Justice of the Peace District C              
## 3202 Justice of the Peace District D              
## 3203 Justice of the Peace District E              
## 3204 Town of Chatham                              
## 3205                                  Town of Eros
## 3206                             Town of Jonesboro
## 3207                         Village of East Hodge
## 3208                              Village of Hodge
## 3209                        Village of North Hodge
## 3210 Village of Quitman                           
## 3211 Town of Chatham                              
## 3212 Town of Eros                                 
## 3213 Town of Jonesboro                            
## 3214 Village of East Hodge                        
## 3215 Village of Hodge                             
## 3216 Village of North Hodge                       
## 3217 Village of Quitman                           
## 3218 Town of Jonesboro                            
## 3219  District A Town of Jonesboro                
## 3220  District B Town of Jonesboro                
## 3221  District C Town of Jonesboro                
## 3222  District D Town of Jonesboro                
## 3223 Town of Chatham                              
## 3224 Town of Chatham                              
## 3225 Town of Chatham                              
## 3226 Town of Chatham                              
## 3227 Town of Chatham                              
## 3228 Town of Eros                                 
## 3229 Town of Eros                                 
## 3230 Town of Eros                                 
## 3231 Village of East Hodge                        
## 3232 Village of East Hodge                        
## 3233 Village of East Hodge                        
## 3234 Village of Hodge                             
## 3235 Village of Hodge                             
## 3236 Village of Hodge                             
## 3237 Village of North Hodge                       
## 3238 Village of North Hodge                       
## 3239 Village of North Hodge                       
## 3240 Village of Quitman                           
## 3241 Village of Quitman                           
## 3242 Village of Quitman                           
## 3243 at Large                                     
## 3244 at Large                                     
## 3245 at Large                                     
## 3246 at Large                                     
## 3247 District 1                                   
## 3248 District 2                                   
## 3249 District 3                                   
## 3250 District 3                                   
## 3251 District 3                                   
## 3252 District 4                                   
## 3253 District 4                                   
## 3254 District 5                                   
## 3255 District 5                                   
## 3256 District 5                                   
## 3257 District 6                                   
## 3258 at Large                                     
## 3259 at Large                                     
## 3260 at Large                                     
## 3261 at Large                                     
## 3262 at Large                                     
## 3263 at Large                                     
## 3264 at Large                                     
## 3265 at Large                                     
## 3266 at Large                                     
## 3267 at Large                                     
## 3268 District 1                                   
## 3269 District 1                                   
## 3270 District 1                                   
## 3271 District 1                                   
## 3272 District 1                                   
## 3273 District 2                                   
## 3274 District 2                                   
## 3275 District 2                                   
## 3276 District 2                                   
## 3277 District 2                                   
## 3278 District 3                                   
## 3279 District 3                                   
## 3280 District 3                                   
## 3281 District 3                                   
## 3282 District 3                                   
## 3283 District 4                                   
## 3284 District 4                                   
## 3285 District 4                                   
## 3286 District 4                                   
## 3287 District 4                                   
## 3288 District 5                                   
## 3289 District 5                                   
## 3290 District 5                                   
## 3291 District 5                                   
## 3292 District 5                                   
## 3293 District 6                                   
## 3294  1st Parish Court Division A                 
## 3295  1st Parish Court Division B                 
## 3296  2nd Parish Court Division A                 
## 3297  2nd Parish Court Division B                 
## 3298  Juvenile Court Section A                    
## 3299  Juvenile Court Section B                    
## 3300  Juvenile Court Section C                    
## 3301                                              
## 3302                                              
## 3303                                              
## 3304                                              
## 3305                                              
## 3306 Division  A                                  
## 3307 Division  B                                  
## 3308 District 1                                   
## 3309 District 2                                   
## 3310 District 3                                   
## 3311 District 4                                   
## 3312 District 5                                   
## 3313                                    District 1
## 3314 District 2                                   
## 3315 District 3                                   
## 3316 District 4                                   
## 3317 District 5                                   
## 3318 District 6                                   
## 3319 District 7                                   
## 3320 District 8                                   
## 3321 District 9                                   
## 3322 1st Justice Court                            
## 3323 2nd Justice Court                            
## 3324 3rd Justice Court                            
## 3325 4th Justice Court                            
## 3326 5th Justice Court                            
## 3327 6th Justice Court                            
## 3328 7th Justice Court                            
## 3329 8th Justice Court                            
## 3330 1st Justice Court                            
## 3331 2nd Justice Court                            
## 3332 3rd Justice Court                            
## 3333 4th Justice Court                            
## 3334 5th Justice Court                            
## 3335 6th Justice Court                            
## 3336 7th Justice Court                            
## 3337 8th Justice Court                            
## 3338                                City of Gretna
## 3339                               City of Harahan
## 3340                                City of Kenner
## 3341                              City of Westwego
## 3342 Town of Grand Isle                           
## 3343 Town of Jean Lafitte                         
## 3344 City of Gretna                               
## 3345 City of Gretna                               
## 3346 City of Harahan                              
## 3347 City of Kenner                               
## 3348 City of Westwego                             
## 3349 City of Westwego                             
## 3350 Town of Grand Isle                           
## 3351  Division A City of Kenner                   
## 3352  Division B City of Kenner                   
## 3353  District 1 City of Gretna                   
## 3354  District 1 City of Gretna                   
## 3355  District 1 City of Westwego                 
## 3356  District 1 City of Westwego                 
## 3357  District 2 City of Gretna                   
## 3358  District 2 City of Westwego                 
## 3359  District 3 City of Gretna                   
## 3360  District 3 City of Westwego                 
## 3361  District 4 City of Gretna                   
## 3362  District 4 City of Gretna                   
## 3363  District 4 City of Westwego                 
## 3364  District 5 City of Westwego                 
## 3365  Seat A Town of Grand Isle                   
## 3366  Seat B Town of Grand Isle                   
## 3367  Seat C Town of Grand Isle                   
## 3368  Seat D Town of Grand Isle                   
## 3369  Seat E Town of Grand Isle                   
## 3370 City of Gretna                               
## 3371 City of Harahan                              
## 3372 City of Harahan                              
## 3373 City of Harahan                              
## 3374 City of Harahan                              
## 3375 City of Harahan                              
## 3376  District 1 City of Kenner                   
## 3377  District 2 City of Kenner                   
## 3378  District 3 City of Kenner                   
## 3379  District 4 City of Kenner                   
## 3380  District 5 City of Kenner                   
## 3381 Town of Jean Lafitte                         
## 3382 Town of Jean Lafitte                         
## 3383 Town of Jean Lafitte                         
## 3384 Town of Jean Lafitte                         
## 3385 Town of Jean Lafitte                         
## 3386 at Large                                     
## 3387 District  1                                  
## 3388 District  2                                  
## 3389 District  3                                  
## 3390 District  4                                  
## 3391 District  5                                  
## 3392 District  6                                  
## 3393 District  7                                  
## 3394 District  8                                  
## 3395 District  9                                  
## 3396 District 10                                  
## 3397 District 11                                  
## 3398 District 12                                  
## 3399 District 13                                  
## 3400 at Large                                     
## 3401 District  1                                  
## 3402 District  2                                  
## 3403 District  3                                  
## 3404 District  4                                  
## 3405 District  5                                  
## 3406 District  6                                  
## 3407 District  7                                  
## 3408 District  8                                  
## 3409 District  9                                  
## 3410 District 10                                  
## 3411 District 11                                  
## 3412 District 12                                  
## 3413 District 13                                  
## 3414                                              
## 3415                                              
## 3416                                              
## 3417                                              
## 3418                                   District  1
## 3419 District  2                                  
## 3420 District  3                                  
## 3421 District  4                                  
## 3422 District  5                                  
## 3423 District  6                                  
## 3424 District  7                                  
## 3425 District  8                                  
## 3426 District  9                                  
## 3427 District 10                                  
## 3428 District 11                                  
## 3429 District 12                                  
## 3430 District 13                                  
## 3431  City Court City of Jennings                 
## 3432  City Court City of Jennings                 
## 3433                                   District  1
## 3434 District  2                                  
## 3435 District  3                                  
## 3436 District  4                                  
## 3437 District  5                                  
## 3438 District  6                                  
## 3439 District  7                                  
## 3440 District  8                                  
## 3441 District  9                                  
## 3442 District 10                                  
## 3443 District 11                                  
## 3444 District 12                                  
## 3445 District 13                                  
## 3446 Justice of the Peace Ward 1                  
## 3447 Justice of the Peace Ward 2                  
## 3448 Justice of the Peace Ward 3                  
## 3449 Justice of the Peace Ward 4                  
## 3450 Justice of the Peace Ward 5                  
## 3451 Justice of the Peace Ward 6                  
## 3452 Justice of the Peace Ward 1                  
## 3453 Justice of the Peace Ward 2                  
## 3454 Justice of the Peace Ward 3                  
## 3455 Justice of the Peace Ward 4                  
## 3456 Justice of the Peace Ward 5                  
## 3457 Justice of the Peace Ward 6                  
## 3458                              City of Jennings
## 3459                                 Town of Elton
## 3460 Town of Lake Arthur                          
## 3461 Town of Welsh                                
## 3462                             Village of Fenton
## 3463 Town of Elton                                
## 3464 Town of Lake Arthur                          
## 3465 Town of Welsh                                
## 3466 Village of Fenton                            
## 3467 Town of Welsh                                
## 3468 Town of Welsh                                
## 3469 Town of Welsh                                
## 3470 Town of Welsh                                
## 3471 Town of Welsh                                
## 3472 Village of Fenton                            
## 3473 Village of Fenton                            
## 3474 Village of Fenton                            
## 3475 Town of Elton                                
## 3476 Town of Elton                                
## 3477 Town of Elton                                
## 3478 Town of Elton                                
## 3479 Town of Elton                                
## 3480 Town of Lake Arthur                          
## 3481 Town of Lake Arthur                          
## 3482 Town of Lake Arthur                          
## 3483 Town of Lake Arthur                          
## 3484 Town of Lake Arthur                          
## 3485  District A City of Jennings                 
## 3486  District B City of Jennings                 
## 3487  District C City of Jennings                 
## 3488  District D City of Jennings                 
## 3489  District E City of Jennings                 
## 3490 at Large                                     
## 3491 at Large                                     
## 3492 at Large                                     
## 3493 at Large                                     
## 3494 at Large                                     
## 3495 District 1                                   
## 3496 District 2                                   
## 3497 District 3                                   
## 3498 District 4                                   
## 3499 District 5                                   
## 3500 District 6                                   
## 3501 District 7                                   
## 3502 District 8                                   
## 3503 District 9                                   
## 3504 at Large                                     
## 3505 at Large                                     
## 3506 at Large                                     
## 3507 at Large                                     
## 3508 at Large                                     
## 3509 District 1                                   
## 3510 District 2                                   
## 3511 District 3                                   
## 3512 District 4                                   
## 3513 District 5                                   
## 3514 District 6                                   
## 3515 District 7                                   
## 3516 District 8                                   
## 3517 District 9                                   
## 3518                                              
## 3519                                              
## 3520                                              
## 3521                                              
## 3522                City-Parish Council District 1
## 3523  City-Parish Council District 2              
## 3524  City-Parish Council District 3              
## 3525  City-Parish Council District 4              
## 3526  City-Parish Council District 5              
## 3527  City-Parish Council District 6              
## 3528  City-Parish Council District 7              
## 3529  City-Parish Council District 8              
## 3530  City-Parish Council District 9              
## 3531   City Court Division A City of Lafayette    
## 3532   City Court Division B City of Lafayette    
## 3533  City Court City of Lafayette                
## 3534                                    District 1
## 3535 District 2                                   
## 3536 District 3                                   
## 3537 District 4                                   
## 3538 District 5                                   
## 3539 District 6                                   
## 3540 District 7                                   
## 3541 District 8                                   
## 3542 District 9                                   
## 3543 Justice of the Peace Ward 1                  
## 3544 Justice of the Peace Ward 2                  
## 3545 Justice of the Peace Ward 4                  
## 3546 Justice of the Peace Ward 5                  
## 3547 Justice of the Peace Ward 6                  
## 3548 Justice of the Peace Ward 6                  
## 3549 Justice of the Peace Ward 7                  
## 3550 Justice of the Peace Ward 8                  
## 3551                   Justice of the Peace Ward 9
## 3552 Justice of the Peace Ward 1                  
## 3553 Justice of the Peace Ward 2                  
## 3554 Justice of the Peace Ward 4                  
## 3555 Justice of the Peace Ward 5                  
## 3556 Justice of the Peace Ward 6                  
## 3557 Justice of the Peace Ward 6                  
## 3558 Justice of the Peace Ward 7                  
## 3559 Justice of the Peace Ward 8                  
## 3560 Justice of the Peace Ward 9                  
## 3561                              City of Carencro
## 3562 City of Scott                                
## 3563 City of Youngsville                          
## 3564 City of Carencro                             
## 3565 City of Scott                                
## 3566 City of Youngsville                          
## 3567 City of Scott                                
## 3568 City of Carencro                             
## 3569 City of Carencro                             
## 3570 City of Carencro                             
## 3571 City of Carencro                             
## 3572 City of Carencro                             
## 3573  District 1 City of Scott                    
## 3574  District 2 City of Scott                    
## 3575  District 3 City of Scott                    
## 3576  District 4 City of Scott                    
## 3577  Division A City of Youngsville              
## 3578  Division B City of Youngsville              
## 3579  Division C City of Youngsville              
## 3580  Division D City of Youngsville              
## 3581  Division E City of Youngsville              
## 3582 at Large                                     
## 3583 at Large                                     
## 3584 at Large                                     
## 3585 at Large                                     
## 3586 at Large                                     
## 3587 District  1                                  
## 3588 District  2                                  
## 3589 District  3                                  
## 3590 District  4                                  
## 3591 District  5                                  
## 3592 District  6                                  
## 3593 District  7                                  
## 3594 District  8                                  
## 3595 District  9                                  
## 3596 at Large                                     
## 3597 District  1                                  
## 3598 District  2                                  
## 3599 District  3                                  
## 3600 District  4                                  
## 3601 District  5                                  
## 3602 District  6                                  
## 3603 District  7                                  
## 3604 District  8                                  
## 3605 District  9                                  
## 3606                                              
## 3607                                              
## 3608                                              
## 3609                                              
## 3610                                              
## 3611 District  1                                  
## 3612 District  2                                  
## 3613 District  3                                  
## 3614 District  4                                  
## 3615 District  5                                  
## 3616 District  6                                  
## 3617 District  7                                  
## 3618 District  8                                  
## 3619 District  9                                  
## 3620  City Court City of Thibodaux                
## 3621  City Court City of Thibodaux                
## 3622                                   District  1
## 3623 District  2                                  
## 3624 District  3                                  
## 3625 District  4                                  
## 3626 District  5                                  
## 3627 District  6                                  
## 3628 District  7                                  
## 3629 District  8                                  
## 3630 District  9                                  
## 3631 District 10                                  
## 3632 District 11                                  
## 3633 District 12                                  
## 3634 District 13                                  
## 3635 District 14                                  
## 3636 District 15                                  
## 3637   Greater Lafourche Port Commission Div A    
## 3638   Greater Lafourche Port Commission Div B    
## 3639   Greater Lafourche Port Commission Div C    
## 3640   Greater Lafourche Port Commission Div D    
## 3641   Greater Lafourche Port Commission Div E    
## 3642   Greater Lafourche Port Commission Div F    
## 3643   Greater Lafourche Port Commission Div G    
## 3644   Greater Lafourche Port Commission Div H    
## 3645   Greater Lafourche Port Commission Div I    
## 3646 1st Justice of the Peace Court               
## 3647 2nd Justice of the Peace Court               
## 3648 3rd Justice of the Peace Court               
## 3649 4th Justice of the Peace Court               
## 3650 1st Justice of the Peace Court               
## 3651 2nd Justice of the Peace Court               
## 3652 3rd Justice of the Peace Court               
## 3653 4th Justice of the Peace Court               
## 3654 City of Thibodaux                            
## 3655 Town of Golden Meadow                        
## 3656                              Town of Lockport
## 3657 Town of Golden Meadow                        
## 3658 Town of Lockport                             
## 3659  Seat D City of Thibodaux                    
## 3660  Seat E City of Thibodaux                    
## 3661  Division A Town of Lockport                 
## 3662  Division B Town of Lockport                 
## 3663  Division C Town of Lockport                 
## 3664  Division D Town of Lockport                 
## 3665  Division E Town of Lockport                 
## 3666  District A City of Thibodaux                
## 3667  District B City of Thibodaux                
## 3668  District C City of Thibodaux                
## 3669 Town of Golden Meadow                        
## 3670 Town of Golden Meadow                        
## 3671 Town of Golden Meadow                        
## 3672 Town of Golden Meadow                        
## 3673 Town of Golden Meadow                        
## 3674 at Large                                     
## 3675 at Large                                     
## 3676 District  1                                  
## 3677 District  2                                  
## 3678 District  3                                  
## 3679 District  4                                  
## 3680 District  5                                  
## 3681 District  6                                  
## 3682 District  7                                  
## 3683 District  8                                  
## 3684 District  9                                  
## 3685 District 10                                  
## 3686 at Large                                     
## 3687 at Large                                     
## 3688 at Large                                     
## 3689 at Large                                     
## 3690 District  1                                  
## 3691 District  2                                  
## 3692 District  3                                  
## 3693 District  4                                  
## 3694 District  5                                  
## 3695 District  6                                  
## 3696 District  7                                  
## 3697 District  8                                  
## 3698 District  9                                  
## 3699 District 10                                  
## 3700                                              
## 3701                                              
## 3702                                              
## 3703                                              
## 3704                                   District  1
## 3705 District  2                                  
## 3706 District  3                                  
## 3707 District  4                                  
## 3708 District  5                                  
## 3709 District  6                                  
## 3710 District  7                                  
## 3711 District  8                                  
## 3712 District  9                                  
## 3713 District 10                                  
## 3714 District  1                                  
## 3715 District  2                                  
## 3716 District  3                                  
## 3717 District  4                                  
## 3718 District  5                                  
## 3719 District  6                                  
## 3720 District  7                                  
## 3721 District  8                                  
## 3722 District  9                                  
## 3723 District 10                                  
## 3724 Justice of the Peace District 1              
## 3725 Justice of the Peace District 2              
## 3726 Justice of the Peace District 3              
## 3727 Justice of the Peace District 4              
## 3728 Justice of the Peace District 5              
## 3729 Justice of the Peace District 1              
## 3730 Justice of the Peace District 2              
## 3731 Justice of the Peace District 3              
## 3732 Justice of the Peace District 4              
## 3733 Justice of the Peace District 5              
## 3734                                  Town of Jena
## 3735 Town of Olla                                 
## 3736                                Town of Tullos
## 3737                                Town of Urania
## 3738 Town of Jena                                 
## 3739 Town of Olla                                 
## 3740 Town of Tullos                               
## 3741 Town of Urania                               
## 3742 Town of Olla                                 
## 3743 Town of Olla                                 
## 3744 Town of Olla                                 
## 3745 Town of Olla                                 
## 3746 Town of Olla                                 
## 3747 Town of Tullos                               
## 3748 Town of Tullos                               
## 3749 Town of Tullos                               
## 3750 Town of Tullos                               
## 3751 Town of Tullos                               
## 3752 Town of Urania                               
## 3753 Town of Urania                               
## 3754 Town of Urania                               
## 3755 Town of Urania                               
## 3756 Town of Urania                               
## 3757 Town of Jena                                 
## 3758 Town of Jena                                 
## 3759 Town of Jena                                 
## 3760 Town of Jena                                 
## 3761 Town of Jena                                 
## 3762 at Large                                     
## 3763                                   District  1
## 3764                                   District  2
## 3765                                   District  3
## 3766                                   District  4
## 3767                                   District  5
## 3768                                   District  6
## 3769                                   District  7
## 3770                                   District  8
## 3771                                   District  9
## 3772                                   District 10
## 3773                                   District 11
## 3774                                   District 12
## 3775 at Large                                     
## 3776 at Large                                     
## 3777 at Large                                     
## 3778 at Large                                     
## 3779 at Large                                     
## 3780                                   District  1
## 3781                                   District  2
## 3782                                   District  3
## 3783                                   District  4
## 3784                                   District  5
## 3785                                   District  6
## 3786                                   District  7
## 3787                                   District  8
## 3788                                   District  9
## 3789                                   District 10
## 3790                                   District 11
## 3791                                   District 12
## 3792                                              
## 3793                                              
## 3794                                              
## 3795                                              
## 3796                                   District  1
## 3797 District  2                                  
## 3798 District  3                                  
## 3799 District  4                                  
## 3800 District  5                                  
## 3801 District  6                                  
## 3802 District  7                                  
## 3803 District  8                                  
## 3804 District  9                                  
## 3805 District 10                                  
## 3806 District 11                                  
## 3807 District 12                                  
## 3808  City Court City of Ruston                   
## 3809  City Court City of Ruston                   
## 3810                                   District  1
## 3811 District  2                                  
## 3812 District  3                                  
## 3813 District  4                                  
## 3814 District  5                                  
## 3815 District  6                                  
## 3816 District  7                                  
## 3817 District  8                                  
## 3818 District  9                                  
## 3819 District 10                                  
## 3820 District 11                                  
## 3821 District 12                                  
## 3822 Justice of the Peace Ward 2                  
## 3823 Justice of the Peace Ward 3                  
## 3824 Justice of the Peace Ward 4                  
## 3825 Justice of the Peace Ward 5                  
## 3826 Justice of the Peace Ward 2                  
## 3827 Justice of the Peace Ward 3                  
## 3828 Justice of the Peace Ward 4                  
## 3829 Justice of the Peace Ward 5                  
## 3830 City of Grambling                            
## 3831 City of Ruston                               
## 3832                                Town of Dubach
## 3833                                Town of Vienna
## 3834                          Village of Choudrant
## 3835                           Village of Simsboro
## 3836 Town of Dubach                               
## 3837 Village of Choudrant                         
## 3838 Village of Simsboro                          
## 3839 Village of Choudrant                         
## 3840 Village of Choudrant                         
## 3841 Village of Choudrant                         
## 3842 Village of Simsboro                          
## 3843 Village of Simsboro                          
## 3844 Village of Simsboro                          
## 3845  Ward 1 City of Ruston                       
## 3846  Ward 2 City of Ruston                       
## 3847  Ward 3 City of Ruston                       
## 3848  Ward 4 City of Ruston                       
## 3849  Ward 5 City of Ruston                       
## 3850 City of Grambling                            
## 3851 City of Grambling                            
## 3852 City of Grambling                            
## 3853 City of Grambling                            
## 3854 City of Grambling                            
## 3855  District A Town of Dubach                   
## 3856  District B Town of Dubach                   
## 3857  District C Town of Dubach                   
## 3858  District D Town of Dubach                   
## 3859  District E Town of Dubach                   
## 3860 Town of Vienna                               
## 3861 Town of Vienna                               
## 3862 Town of Vienna                               
## 3863 at Large                                     
## 3864 at Large                                     
## 3865 District 1                                   
## 3866 District 2                                   
## 3867 District 3                                   
## 3868 District 4                                   
## 3869 District 5                                   
## 3870 District 6                                   
## 3871 District 7                                   
## 3872 District 8                                   
## 3873 District 9                                   
## 3874 at Large                                     
## 3875 at Large                                     
## 3876 at Large                                     
## 3877 at Large                                     
## 3878 at Large                                     
## 3879 District 1                                   
## 3880 District 2                                   
## 3881 District 3                                   
## 3882 District 4                                   
## 3883 District 5                                   
## 3884 District 6                                   
## 3885 District 7                                   
## 3886 District 8                                   
## 3887 District 9                                   
## 3888                                              
## 3889                                              
## 3890                                              
## 3891                                              
## 3892                                              
## 3893                                    District 1
## 3894 District 2                                   
## 3895 District 3                                   
## 3896 District 4                                   
## 3897 District 5                                   
## 3898 District 6                                   
## 3899 District 7                                   
## 3900 District 8                                   
## 3901 District 9                                   
## 3902  City Court City of Denham Springs           
## 3903  City Court City of Denham Springs           
## 3904                                    District 1
## 3905 District 2                                   
## 3906 District 3                                   
## 3907 District 4                                   
## 3908 District 5                                   
## 3909 District 6                                   
## 3910 District 7                                   
## 3911 District 8                                   
## 3912 District 9                                   
## 3913 Justice of the Peace Ward  1                 
## 3914 Justice of the Peace Ward  3                 
## 3915 Justice of the Peace Ward  4                 
## 3916 Justice of the Peace Ward  5                 
## 3917 Justice of the Peace Ward  6                 
## 3918 Justice of the Peace Ward  7                 
## 3919 Justice of the Peace Ward  8                 
## 3920 Justice of the Peace Ward  9                 
## 3921 Justice of the Peace Ward 10                 
## 3922 Justice of the Peace Ward 11                 
## 3923 Justice of the Peace Ward  1                 
## 3924 Justice of the Peace Ward  3                 
## 3925 Justice of the Peace Ward  4                 
## 3926 Justice of the Peace Ward  5                 
## 3927 Justice of the Peace Ward  6                 
## 3928 Justice of the Peace Ward  7                 
## 3929 Justice of the Peace Ward  8                 
## 3930 Justice of the Peace Ward  9                 
## 3931 Justice of the Peace Ward 10                 
## 3932 Justice of the Peace Ward 11                 
## 3933 City of Denham Springs                       
## 3934                                City of Walker
## 3935                                Town of Albany
## 3936                               Town of Killian
## 3937 Town of Livingston                           
## 3938 Town of Springfield                          
## 3939 Town of Springfield                          
## 3940                  Village of French Settlement
## 3941                       Village of Port Vincent
## 3942                                City of Walker
## 3943                                Town of Albany
## 3944 Town of Livingston                           
## 3945 Village of French Settlement                 
## 3946                                City of Walker
## 3947                                City of Walker
## 3948                                City of Walker
## 3949                                City of Walker
## 3950                                City of Walker
## 3951                                City of Walker
## 3952 Town of Killian                              
## 3953 Town of Killian                              
## 3954 Town of Killian                              
## 3955 Town of Killian                              
## 3956 Town of Killian                              
## 3957 Town of Killian                              
## 3958 Town of Killian                              
## 3959 Town of Killian                              
## 3960 Town of Killian                              
## 3961 Town of Killian                              
## 3962 Town of Livingston                           
## 3963 Town of Livingston                           
## 3964 Town of Livingston                           
## 3965 Town of Livingston                           
## 3966 Town of Livingston                           
## 3967 Town of Springfield                          
## 3968 Town of Springfield                          
## 3969 Town of Springfield                          
## 3970 Town of Springfield                          
## 3971 Town of Springfield                          
## 3972 Village of French Settlement                 
## 3973 Village of French Settlement                 
## 3974 Village of French Settlement                 
## 3975 Village of Port Vincent                      
## 3976 Village of Port Vincent                      
## 3977 Village of Port Vincent                      
## 3978 City of Denham Springs                       
## 3979 City of Denham Springs                       
## 3980 City of Denham Springs                       
## 3981 City of Denham Springs                       
## 3982 City of Denham Springs                       
## 3983                                Town of Albany
## 3984                                Town of Albany
## 3985                                Town of Albany
## 3986 at Large                                     
## 3987 at Large                                     
## 3988 at Large                                     
## 3989 at Large                                     
## 3990 District 1                                   
## 3991 District 2                                   
## 3992 District 3                                   
## 3993 District 4                                   
## 3994 District 5                                   
## 3995 at Large                                     
## 3996 District 1                                   
## 3997 District 2                                   
## 3998 District 3                                   
## 3999 District 4                                   
## 4000 District 5                                   
## 4001                                              
## 4002                                              
## 4003                                              
## 4004                                              
## 4005                                    District 1
## 4006 District 2                                   
## 4007 District 3                                   
## 4008 District 4                                   
## 4009 District 5                                   
## 4010                                   District  1
## 4011 District  2                                  
## 4012 District  3                                  
## 4013 District  4                                  
## 4014 District  5                                  
## 4015 District  6                                  
## 4016 District  7                                  
## 4017 District  8                                  
## 4018 Justice of the Peace District  2             
## 4019 Justice of the Peace Districts 1 & 3         
## 4020  Justice of the Peace Districts 4 5 & 6      
## 4021 Justice of the Peace Districts 7 & 8         
## 4022 Justice of the Peace District  2             
## 4023 Justice of the Peace Districts 1 & 3         
## 4024  Justice of the Peace Districts 4 5 & 6      
## 4025 Justice of the Peace Districts 7 & 8         
## 4026 City of Tallulah                             
## 4027                              Village of Delta
## 4028 Village of Mound                             
## 4029 Village of Richmond                          
## 4030 City of Tallulah                             
## 4031 Village of Mound                             
## 4032 Village of Richmond                          
## 4033 Village of Delta                             
## 4034 Village of Delta                             
## 4035 Village of Delta                             
## 4036 Village of Mound                             
## 4037 Village of Mound                             
## 4038 Village of Mound                             
## 4039 Village of Richmond                          
## 4040 Village of Richmond                          
## 4041 Village of Richmond                          
## 4042  District 1 City of Tallulah                 
## 4043  District 2 City of Tallulah                 
## 4044  District 3 City of Tallulah                 
## 4045  District 4 City of Tallulah                 
## 4046  District 5 City of Tallulah                 
## 4047 at Large                                     
## 4048 at Large                                     
## 4049 at Large                                     
## 4050 at Large                                     
## 4051 at Large                                     
## 4052 District  1                                  
## 4053 District  2                                  
## 4054 District  3                                  
## 4055 District  4                                  
## 4056 District  5                                  
## 4057 District  6                                  
## 4058 District  7                                  
## 4059 at Large                                     
## 4060 District  1                                  
## 4061 District  2                                  
## 4062 District  3                                  
## 4063 District  4                                  
## 4064 District  5                                  
## 4065 District  6                                  
## 4066 District  7                                  
## 4067                                              
## 4068                                              
## 4069                                              
## 4070                                              
## 4071                                   District  1
## 4072 District  2                                  
## 4073 District  3                                  
## 4074 District  4                                  
## 4075 District  5                                  
## 4076 District  6                                  
## 4077 District  7                                  
## 4078  City Court City of Bastrop                  
## 4079  City Court City of Bastrop                  
## 4080                                   District  1
## 4081 District  2                                  
## 4082 District  3                                  
## 4083 District  4                                  
## 4084 District  5                                  
## 4085 District  6                                  
## 4086 District  7                                  
## 4087 Justice of the Peace Ward  1                 
## 4088 Justice of the Peace Ward  2                 
## 4089 Justice of the Peace Ward  5                 
## 4090 Justice of the Peace Ward  6                 
## 4091 Justice of the Peace Ward  7                 
## 4092 Justice of the Peace Ward  8                 
## 4093 Justice of the Peace Ward  9                 
## 4094 Justice of the Peace Ward 10                 
## 4095 Justice of the Peace Ward  1                 
## 4096 Justice of the Peace Ward  2                 
## 4097 Justice of the Peace Ward  5                 
## 4098 Justice of the Peace Ward  6                 
## 4099 Justice of the Peace Ward  7                 
## 4100 Justice of the Peace Ward  8                 
## 4101 Justice of the Peace Ward  9                 
## 4102 Justice of the Peace Ward 10                 
## 4103 City of Bastrop                              
## 4104 Village of Bonita                            
## 4105                         Village of Collinston
## 4106 Village of Mer Rouge                         
## 4107 Village of Oak Ridge                         
## 4108  District A City of Bastrop                  
## 4109  District A City of Bastrop                  
## 4110  District B City of Bastrop                  
## 4111  District C City of Bastrop                  
## 4112  District C City of Bastrop                  
## 4113  District D City of Bastrop                  
## 4114  District D City of Bastrop                  
## 4115  District E City of Bastrop                  
## 4116  District E City of Bastrop                  
## 4117 Village of Bonita                            
## 4118 Village of Bonita                            
## 4119 Village of Bonita                            
## 4120            Village of Bonita - Unexpired Term
## 4121 Village of Collinston                        
## 4122 Village of Collinston                        
## 4123 Village of Collinston                        
## 4124 Village of Mer Rouge                         
## 4125 Village of Mer Rouge                         
## 4126 Village of Mer Rouge                         
## 4127 Village of Oak Ridge                         
## 4128 Village of Oak Ridge                         
## 4129 Village of Oak Ridge                         
## 4130 at Large                                     
## 4131 at Large                                     
## 4132 at Large                                     
## 4133 District  1                                  
## 4134 District  2                                  
## 4135 District  3                                  
## 4136 District  4                                  
## 4137 District  5                                  
## 4138 District  6                                  
## 4139 District  7                                  
## 4140 District  8                                  
## 4141 District  9                                  
## 4142 District 10                                  
## 4143 District 11                                  
## 4144 at Large                                     
## 4145 District  1                                  
## 4146 District  2                                  
## 4147 District  3                                  
## 4148 District  4                                  
## 4149 District  5                                  
## 4150 District  6                                  
## 4151 District  7                                  
## 4152 District  8                                  
## 4153 District  9                                  
## 4154 District 10                                  
## 4155 District 11                                  
## 4156                                              
## 4157                                              
## 4158                                              
## 4159                                              
## 4160                                              
## 4161                                    District 1
## 4162                                    District 2
## 4163                                    District 3
## 4164                                    District 4
## 4165                                    District 5
## 4166  City Court City of Natchitoches             
## 4167  City Court City of Natchitoches             
## 4168                                   District  1
## 4169 District  2                                  
## 4170 District  3                                  
## 4171 District  4                                  
## 4172 District  5                                  
## 4173 District  6                                  
## 4174 District  7                                  
## 4175 District  8                                  
## 4176 District  9                                  
## 4177 District 10                                  
## 4178                                   District 11
## 4179 Justice of the Peace Ward  2                 
## 4180 Justice of the Peace Ward  3                 
## 4181 Justice of the Peace Ward  4                 
## 4182 Justice of the Peace Ward  2                 
## 4183 Justice of the Peace Ward  3                 
## 4184 Justice of the Peace Ward  4                 
## 4185 City of Natchitoches                         
## 4186                                Town of Campti
## 4187                            Village of Ashland
## 4188                           Village of Clarence
## 4189                           Village of Goldonna
## 4190                            Village of Natchez
## 4191                           Village of Powhatan
## 4192 Village of Provencal                         
## 4193 Village of Robeline                          
## 4194 Town of Campti                               
## 4195 Village of Ashland                           
## 4196 Village of Clarence                          
## 4197 Village of Goldonna                          
## 4198 Village of Natchez                           
## 4199 Village of Powhatan                          
## 4200 Village of Provencal                         
## 4201 Village of Robeline                          
## 4202 City of Natchitoches                         
## 4203 Village of Clarence                          
## 4204 Village of Clarence                          
## 4205 Village of Clarence                          
## 4206 Village of Goldonna                          
## 4207 Village of Goldonna                          
## 4208 Village of Goldonna                          
## 4209 Village of Natchez                           
## 4210 Village of Natchez                           
## 4211 Village of Natchez                           
## 4212                           Village of Powhatan
## 4213                           Village of Powhatan
## 4214                           Village of Powhatan
## 4215 Village of Provencal                         
## 4216 Village of Provencal                         
## 4217 Village of Provencal                         
## 4218 Village of Robeline                          
## 4219 Village of Robeline                          
## 4220 Village of Robeline                          
## 4221 Village of Ashland                           
## 4222 Village of Ashland                           
## 4223 Village of Ashland                           
## 4224  District 1 City of Natchitoches             
## 4225  District 2 City of Natchitoches             
## 4226  District 3 City of Natchitoches             
## 4227  District 4 City of Natchitoches             
## 4228 Town of Campti                               
## 4229 Town of Campti                               
## 4230 Town of Campti                               
## 4231 Town of Campti                               
## 4232 Town of Campti                               
## 4233 District A                                   
## 4234 District A                                   
## 4235 District A                                   
## 4236 District A                                   
## 4237 District A                                   
## 4238 District A                                   
## 4239 District A                                   
## 4240 District A                                   
## 4241 District A                                   
## 4242 District A                                   
## 4243 District A                                   
## 4244 District A                                   
## 4245 District A                                   
## 4246 District A                                   
## 4247 District B                                   
## 4248 District B                                   
## 4249 District B                                   
## 4250 District B                                   
## 4251 District B                                   
## 4252 District B                                   
## 4253 District B                                   
## 4254 District B                                   
## 4255 District B                                   
## 4256 District B                                   
## 4257 District B                                   
## 4258 District B                                   
## 4259 District B                                   
## 4260 District B                                   
## 4261 District C                                   
## 4262 District C                                   
## 4263 District C                                   
## 4264 District C                                   
## 4265 District C                                   
## 4266 District C                                   
## 4267 District C                                   
## 4268 District C                                   
## 4269 District C                                   
## 4270 District C                                   
## 4271 District C                                   
## 4272 District C                                   
## 4273 District C                                   
## 4274 District C                                   
## 4275 District D                                   
## 4276 District D                                   
## 4277 District D                                   
## 4278 District D                                   
## 4279 District D                                   
## 4280 District D                                   
## 4281 District D                                   
## 4282 District D                                   
## 4283 District D                                   
## 4284 District D                                   
## 4285 District D                                   
## 4286 District D                                   
## 4287 District D                                   
## 4288 District D                                   
## 4289 District E                                   
## 4290 District E                                   
## 4291 District E                                   
## 4292 District E                                   
## 4293 District E                                   
## 4294 District E                                   
## 4295 District E                                   
## 4296 District E                                   
## 4297 District E                                   
## 4298 District E                                   
## 4299 District E                                   
## 4300 District E                                   
## 4301 District E                                   
## 4302 District E                                   
## 4303 District A                                   
## 4304 District A                                   
## 4305 District A                                   
## 4306 District A                                   
## 4307 District A                                   
## 4308 District A                                   
## 4309 District A                                   
## 4310 District A                                   
## 4311 District A                                   
## 4312 District A                                   
## 4313 District A                                   
## 4314 District A                                   
## 4315 District A                                   
## 4316 District A                                   
## 4317 District B                                   
## 4318 District B                                   
## 4319 District B                                   
## 4320 District B                                   
## 4321 District B                                   
## 4322 District B                                   
## 4323 District B                                   
## 4324 District B                                   
## 4325 District B                                   
## 4326 District B                                   
## 4327 District B                                   
## 4328 District B                                   
## 4329 District C                                   
## 4330 District C                                   
## 4331 District C                                   
## 4332 District C                                   
## 4333 District C                                   
## 4334 District C                                   
## 4335 District C                                   
## 4336 District D                                   
## 4337 District D                                   
## 4338 District D                                   
## 4339 District D                                   
## 4340 District D                                   
## 4341 District D                                   
## 4342 District D                                   
## 4343 District D                                   
## 4344 District E                                   
## 4345 District E                                   
## 4346  Juvenile Court Section A                    
## 4347  Juvenile Court Section B                    
##                                              OfficeAddr1
## 1                                                       
## 2                                                       
## 3                                                       
## 4                                                       
## 5                                                       
## 6                                                       
## 7                                                       
## 8                                                       
## 9                                                       
## 10                                                      
## 11                                                      
## 12                                                      
## 13                                                      
## 14                                                      
## 15                                                      
## 16                                                      
## 17                                                      
## 18                                                      
## 19                                                      
## 20                                                      
## 21                                                      
## 22                                                      
## 23                                                      
## 24                                                      
## 25                                                      
## 26                                                      
## 27                                                      
## 28                                                      
## 29                                                      
## 30                                                      
## 31                                                      
## 32                                                      
## 33                                                      
## 34                                                      
## 35                                                      
## 36                                                      
## 37                                                      
## 38                                                      
## 39                                                      
## 40                                                      
## 41                                                      
## 42                                                      
## 43                                                      
## 44                                                      
## 45                                                      
## 46                                                      
## 47                                                      
## 48                                                      
## 49                                                      
## 50                                                      
## 51                                                      
## 52                                                      
## 53                                                      
## 54                                                      
## 55                                                      
## 56                                                      
## 57                                                      
## 58                                                      
## 59                                                      
## 60                                                      
## 61                                                      
## 62                                                      
## 63                                                      
## 64                                                      
## 65                                                      
## 66                                                      
## 67                                                      
## 68                                                      
## 69                                                      
## 70                                                      
## 71                                                      
## 72                                                      
## 73                                                      
## 74                                                      
## 75                                                      
## 76                                                      
## 77                                                      
## 78                                                      
## 79                                                      
## 80                                                      
## 81                                                      
## 82                                                      
## 83                                                      
## 84                                                      
## 85                                                      
## 86                                                      
## 87                                                      
## 88                                                      
## 89                                                      
## 90                                                      
## 91                                                      
## 92                                                      
## 93                                                      
## 94                                                      
## 95                                                      
## 96                                                      
## 97                                                      
## 98                                                      
## 99                                                      
## 100                                                     
## 101                                                     
## 102                                                     
## 103                                                     
## 104                                                     
## 105                                                     
## 106                                                     
## 107                                                     
## 108                                                     
## 109                                                     
## 110                                                     
## 111                                                     
## 112                                                     
## 113                                                     
## 114                                                     
## 115                                                     
## 116                                                     
## 117                                                     
## 118                                                     
## 119                                                     
## 120                                                     
## 121                                                     
## 122                                                     
## 123                                                     
## 124                                                     
## 125                                                     
## 126                                                     
## 127                                                     
## 128                                                     
## 129                                                     
## 130                                                     
## 131                                                     
## 132                                                     
## 133                                                     
## 134                                                     
## 135                                                     
## 136                                                     
## 137                                                     
## 138                                                     
## 139                                                     
## 140                                                     
## 141                                                     
## 142                                                     
## 143                                                     
## 144                                                     
## 145                                                     
## 146                                                     
## 147                                                     
## 148                                                     
## 149                                                     
## 150                                                     
## 151                                                     
## 152                                                     
## 153                                                     
## 154                                                     
## 155                                                     
## 156                                                     
## 157                                                     
## 158                                                     
## 159                                                     
## 160                                                     
## 161                                                     
## 162                                                     
## 163                                                     
## 164                                                     
## 165                                                     
## 166                                                     
## 167                                                     
## 168                                                     
## 169                                                     
## 170                                                     
## 171                                                     
## 172                                                     
## 173                                                     
## 174                                                     
## 175                                                     
## 176                                                     
## 177                                                     
## 178                                                     
## 179                                                     
## 180                                                     
## 181                                                     
## 182                                                     
## 183                                                     
## 184                                                     
## 185                                                     
## 186                                                     
## 187                                                     
## 188                                                     
## 189                                                     
## 190                                                     
## 191                                                     
## 192                                                     
## 193                                                     
## 194                                                     
## 195                                                     
## 196                                                     
## 197                                                     
## 198                                                     
## 199                                                     
## 200                                                     
## 201                                                     
## 202                                                     
## 203                                                     
## 204                                                     
## 205                                                     
## 206                                                     
## 207                                                     
## 208                                                     
## 209                                                     
## 210                                                     
## 211                                                     
## 212                                                     
## 213                                                     
## 214                                                     
## 215                                                     
## 216                                                     
## 217                                                     
## 218                                                     
## 219                                                     
## 220                                                     
## 221                                                     
## 222                                                     
## 223                                                     
## 224                                                     
## 225                                                     
## 226                                                     
## 227                                                     
## 228                                                     
## 229                                                     
## 230                                                     
## 231                                                     
## 232                                                     
## 233                                                     
## 234                                                     
## 235                                                     
## 236                                                     
## 237                                                     
## 238                                                     
## 239                                                     
## 240                                                     
## 241                                                     
## 242                                                     
## 243                                                     
## 244                                                     
## 245                                                     
## 246                                                     
## 247                                                     
## 248                                                     
## 249                                                     
## 250                                                     
## 251                                                     
## 252                                                     
## 253                                                     
## 254                                                     
## 255                                                     
## 256                                                     
## 257                                                     
## 258                                                     
## 259                                                     
## 260                                                     
## 261                                                     
## 262                                                     
## 263                                                     
## 264                                                     
## 265                                                     
## 266                                                     
## 267                                                     
## 268                                                     
## 269                                                     
## 270                                                     
## 271                                                     
## 272                                                     
## 273                                                     
## 274                                                     
## 275                                                     
## 276                                                     
## 277                                                     
## 278                                                     
## 279                                                     
## 280                                                     
## 281                                                     
## 282                                                     
## 283                                                     
## 284                                                     
## 285                                                     
## 286                                                     
## 287                                                     
## 288                                                     
## 289                                                     
## 290                                                     
## 291                                                     
## 292                                                     
## 293                                                     
## 294                                                     
## 295                                                     
## 296                                                     
## 297                                                     
## 298                                                     
## 299                                                     
## 300                                                     
## 301                                                     
## 302                                                     
## 303                                                     
## 304                                                     
## 305                                                     
## 306                                                     
## 307                                                     
## 308                                                     
## 309                                                     
## 310                                                     
## 311                                                     
## 312                                                     
## 313                                                     
## 314                                                     
## 315                                                     
## 316                                                     
## 317                                                     
## 318                                                     
## 319                                                     
## 320                                                     
## 321                                                     
## 322                                                     
## 323                                                     
## 324                                                     
## 325                                                     
## 326                                                     
## 327                                                     
## 328                                                     
## 329                                                     
## 330                                                     
## 331                                                     
## 332                                                     
## 333                                                     
## 334                                                     
## 335                                                     
## 336                                                     
## 337                                                     
## 338                                                     
## 339                                                     
## 340                                                     
## 341                                                     
## 342                                                     
## 343                                                     
## 344                                                     
## 345                                                     
## 346                                                     
## 347                                                     
## 348                                                     
## 349                                                     
## 350                                                     
## 351                                                     
## 352                                                     
## 353                                                     
## 354                                                     
## 355                                                     
## 356                                                     
## 357                                                     
## 358                                                     
## 359                                                     
## 360                                                     
## 361                                                     
## 362                                                     
## 363                                                     
## 364                                                     
## 365                                                     
## 366                                                     
## 367                                                     
## 368                                                     
## 369                                                     
## 370                                                     
## 371                                                     
## 372                                                     
## 373                                                     
## 374                                                     
## 375                                                     
## 376                                                     
## 377                                                     
## 378                                                     
## 379                                                     
## 380                                                     
## 381                                                     
## 382                                                     
## 383                                                     
## 384                                                     
## 385                                                     
## 386                                                     
## 387                                                     
## 388                                                     
## 389                                                     
## 390                                                     
## 391                                                     
## 392                                                     
## 393                                                     
## 394                                                     
## 395                                                     
## 396                                                     
## 397                                                     
## 398                                                     
## 399                                                     
## 400                                                     
## 401                                                     
## 402                                                     
## 403                                                     
## 404                                                     
## 405                                                     
## 406                                                     
## 407                                                     
## 408                                                     
## 409                                                     
## 410                                                     
## 411                                                     
## 412                                                     
## 413                                                     
## 414                                                     
## 415                                                     
## 416                                                     
## 417                                                     
## 418                                                     
## 419                                                     
## 420                                                     
## 421                                                     
## 422                                                     
## 423                                                     
## 424                                                     
## 425                                                     
## 426                                                     
## 427                                                     
## 428                                                     
## 429                                                     
## 430                                                     
## 431                                                     
## 432                                                     
## 433                                                     
## 434                                                     
## 435                                                     
## 436                                                     
## 437                                                     
## 438                                                     
## 439                                                     
## 440                                                     
## 441                                                     
## 442                                                     
## 443                                                     
## 444                                         PO Box 94004
## 445                                         PO Box 44243
## 446                                         PO Box 94125
## 447                                        P O Box 94005
## 448                                         PO Box 44154
## 449                                           PO Box 631
## 450                                         PO Box 94214
## 451  2800 Veterans Blvd Ste 201 Metairie LA  70002Vitter
## 452  2800 Veterans Blvd Ste 201 Metairie LA  70002Vitter
## 453                    3525 North Causeway Blvd Ste 1020
## 454                             501 Magazine St Ste 1012
## 455                              828 S Irma Blvd Ste 107
## 456                               6425 Youree Dr Ste 350
## 457                                1900 Stubbs Ave Ste B
## 458                              5555 Hilton Ave Ste 100
## 459                                400 Royal St Ste 4200
## 460                                400 Royal St Ste 4200
## 461                                400 Royal St Ste 4200
## 462                                400 Royal St Ste 4200
## 463                                400 Royal St Ste 4200
## 464                                400 Royal St Ste 4200
## 465                                400 Royal St Ste 4200
## 466                                      1600 N Third St
## 467                                      1600 N Third St
## 468                                      1600 N Third St
## 469                                      1600 N Third St
## 470                                      1600 N Third St
## 471                                      1600 N Third St
## 472                                      1600 N Third St
## 473                                      1600 N Third St
## 474                                      1600 N Third St
## 475                                      1600 N Third St
## 476                                      1600 N Third St
## 477                                      1600 N Third St
## 478                                        430 Fannin St
## 479                                        430 Fannin St
## 480                                        430 Fannin St
## 481                                        430 Fannin St
## 482                                        430 Fannin St
## 483                                        430 Fannin St
## 484                                        430 Fannin St
## 485                                        430 Fannin St
## 486                                        430 Fannin St
## 487                                        430 Fannin St
## 488                                         1000 Main St
## 489                                         1000 Main St
## 490                                         1000 Main St
## 491                                         1000 Main St
## 492                                         1000 Main St
## 493                                         1000 Main St
## 494                                         1000 Main St
## 495                                         1000 Main St
## 496                                         1000 Main St
## 497                                         1000 Main St
## 498                                         1000 Main St
## 499                                         1000 Main St
## 500                                         410 Royal St
## 501                                         410 Royal St
## 502                                         410 Royal St
## 503                                         410 Royal St
## 504                                         410 Royal St
## 505                                         410 Royal St
## 506                                         410 Royal St
## 507                                         410 Royal St
## 508                                         410 Royal St
## 509                                         410 Royal St
## 510                                         410 Royal St
## 511                                         410 Royal St
## 512                                      101 Derbigny St
## 513                                      101 Derbigny St
## 514                                      101 Derbigny St
## 515                                      101 Derbigny St
## 516                                      101 Derbigny St
## 517                                      101 Derbigny St
## 518                                      101 Derbigny St
## 519                                      101 Derbigny St
## 520                                        P O Box 91154
## 521                                        P O Box 91154
## 522                                        P O Box 91154
## 523                                        P O Box 91154
## 524                                        P O Box 91154
## 525                                         PO Box 94064
## 526                                         PO Box 94064
## 527                                         PO Box 94064
## 528                                         PO Box 94064
## 529                                         PO Box 94064
## 530                                         PO Box 94064
## 531                                         PO Box 94064
## 532                                         PO Box 94064
## 533                                        P O Box 94183
## 534                                        P O Box 94183
## 535                                        P O Box 94183
## 536                                        P O Box 94183
## 537                                        P O Box 94183
## 538                                        P O Box 94183
## 539                                        P O Box 94183
## 540                                        P O Box 94183
## 541                                        P O Box 94183
## 542                                        P O Box 94183
## 543                                        P O Box 94183
## 544                                        P O Box 94183
## 545                                        P O Box 94183
## 546                                        P O Box 94183
## 547                                        P O Box 94183
## 548                                        P O Box 94183
## 549                                        P O Box 94183
## 550                                        P O Box 94183
## 551                                        P O Box 94183
## 552                                        P O Box 94183
## 553                                        P O Box 94183
## 554                                        P O Box 94183
## 555                                        P O Box 94183
## 556                                        P O Box 94183
## 557                                        P O Box 94183
## 558                                        P O Box 94183
## 559                                        P O Box 94183
## 560                                        P O Box 94183
## 561                                        P O Box 94183
## 562                                        P O Box 94183
## 563                                        P O Box 94183
## 564                                        P O Box 94183
## 565                                        P O Box 94183
## 566                                        P O Box 94183
## 567                                        P O Box 94183
## 568                                        P O Box 94183
## 569                                        P O Box 94183
## 570                                        P O Box 94183
## 571                                        P O Box 94183
## 572                                        P O Box 94062
## 573                                        P O Box 94062
## 574                                        P O Box 94062
## 575                                        P O Box 94062
## 576                                        P O Box 94062
## 577                                        P O Box 94062
## 578                                        P O Box 94062
## 579                                        P O Box 94062
## 580                                        P O Box 94062
## 581                                        P O Box 94062
## 582                                        P O Box 94062
## 583                                        P O Box 94062
## 584                                        P O Box 94062
## 585                                        P O Box 94062
## 586                                        P O Box 94062
## 587                                        P O Box 94062
## 588                                        P O Box 94062
## 589                                        P O Box 94062
## 590                                        P O Box 94062
## 591                                        P O Box 94062
## 592                                        P O Box 94062
## 593                                        P O Box 94062
## 594                                        P O Box 94062
## 595                                        P O Box 94062
## 596                                        P O Box 94062
## 597                                        P O Box 94062
## 598                                        P O Box 94062
## 599                                        P O Box 94062
## 600                                        P O Box 94062
## 601                                        P O Box 94062
## 602                                        P O Box 94062
## 603                                        P O Box 94062
## 604                                        P O Box 94062
## 605                                        P O Box 94062
## 606                                        P O Box 94062
## 607                                        P O Box 94062
## 608                                        P O Box 94062
## 609                                        P O Box 94062
## 610                                        P O Box 94062
## 611                                        P O Box 94062
## 612                                        P O Box 94062
## 613                                        P O Box 94062
## 614                                        P O Box 94062
## 615                                        P O Box 94062
## 616                                        P O Box 94062
## 617                                        P O Box 94062
## 618                                        P O Box 94062
## 619                                        P O Box 94062
## 620                                        P O Box 94062
## 621                                        P O Box 94062
## 622                                        P O Box 94062
## 623                                        P O Box 94062
## 624                                        P O Box 94062
## 625                                        P O Box 94062
## 626                                        P O Box 94062
## 627                                        P O Box 94062
## 628                                        P O Box 94062
## 629                                        P O Box 94062
## 630                                        P O Box 94062
## 631                                        P O Box 94062
## 632                                        P O Box 94062
## 633                                        P O Box 94062
## 634                                        P O Box 94062
## 635                                        P O Box 94062
## 636                                        P O Box 94062
## 637                                        P O Box 94062
## 638                                        P O Box 94062
## 639                                        P O Box 94062
## 640                                        P O Box 94062
## 641                                        P O Box 94062
## 642                                        P O Box 94062
## 643                                        P O Box 94062
## 644                                        P O Box 94062
## 645                                        P O Box 94062
## 646                                        P O Box 94062
## 647                                        P O Box 94062
## 648                                        P O Box 94062
## 649                                        P O Box 94062
## 650                                        P O Box 94062
## 651                                        P O Box 94062
## 652                                        P O Box 94062
## 653                                        P O Box 94062
## 654                                        P O Box 94062
## 655                                        P O Box 94062
## 656                                        P O Box 94062
## 657                                        P O Box 94062
## 658                                        P O Box 94062
## 659                                        P O Box 94062
## 660                                        P O Box 94062
## 661                                        P O Box 94062
## 662                                        P O Box 94062
## 663                                        P O Box 94062
## 664                                        P O Box 94062
## 665                                        P O Box 94062
## 666                                        P O Box 94062
## 667                                        P O Box 94062
## 668                                        P O Box 94062
## 669                                        P O Box 94062
## 670                                        P O Box 94062
## 671                                        P O Box 94062
## 672                                        P O Box 94062
## 673                                        P O Box 94062
## 674                                        P O Box 94062
## 675                                        P O Box 94062
## 676                                        P O Box 94062
## 677                                                     
## 678                                                     
## 679                                                     
## 680                                                     
## 681                                                     
## 682                                                     
## 683                                                     
## 684                                                     
## 685                                                     
## 686                                                     
## 687                                                     
## 688                                                     
## 689                                                     
## 690                                                     
## 691                                                     
## 692                                                     
## 693                                                     
## 694                                                     
## 695                                                     
## 696                                                     
## 697                                                     
## 698                                                     
## 699                                                     
## 700                                                     
## 701                                                     
## 702                                                     
## 703                                                     
## 704                                                     
## 705                                                     
## 706                                                     
## 707                                                     
## 708                                                     
## 709                                                     
## 710                                                     
## 711                                                     
## 712                                                     
## 713                                                     
## 714                                                     
## 715                                                     
## 716                                                     
## 717                                                     
## 718                                                     
## 719                                                     
## 720                                                     
## 721                                                     
## 722                                                     
## 723                                                     
## 724                                                     
## 725                                                     
## 726                                                     
## 727                                                     
## 728                                                     
## 729                                                     
## 730                                                     
## 731                                                     
## 732                                                     
## 733                                                     
## 734                                                     
## 735                                                     
## 736                                                     
## 737                                                     
## 738                                                     
## 739                                                     
## 740                                                     
## 741                                                     
## 742                                                     
## 743                                                     
## 744                                                     
## 745                                                     
## 746                                                     
## 747                                                     
## 748                                                     
## 749                                                     
## 750                                                     
## 751                                                     
## 752                                                     
## 753                                                     
## 754                                                     
## 755                                                     
## 756                                                     
## 757                                                     
## 758                                                     
## 759                                                     
## 760                                                     
## 761                                                     
## 762                                                     
## 763                                                     
## 764                                                     
## 765                                                     
## 766                                                     
## 767                                                     
## 768                                                     
## 769                                                     
## 770                                                     
## 771                                                     
## 772                                                     
## 773                                                     
## 774                                                     
## 775                                                     
## 776                                                     
## 777                                                     
## 778                                                     
## 779                                                     
## 780                                                     
## 781                                                     
## 782                                                     
## 783                                                     
## 784                                                     
## 785                                                     
## 786                                                     
## 787                                                     
## 788                                                     
## 789                                                     
## 790                                                     
## 791                                                     
## 792                                                     
## 793                                                     
## 794                                                     
## 795                                                     
## 796                                                     
## 797                                                     
## 798                                                     
## 799                                                     
## 800                                                     
## 801                                                     
## 802                                                     
## 803                                                     
## 804                                                     
## 805                                                     
## 806                                                     
## 807                                                     
## 808                                                     
## 809                                                     
## 810                                                     
## 811                                                     
## 812                                                     
## 813                                                     
## 814                                                     
## 815                                                     
## 816                                                     
## 817                                                     
## 818                                                     
## 819                                                     
## 820                                                     
## 821                                                     
## 822                                                     
## 823                                                     
## 824                                                     
## 825                                                     
## 826                                                     
## 827                                                     
## 828                                                     
## 829                                                     
## 830                                                     
## 831                                                     
## 832                                                     
## 833                                                     
## 834                                                     
## 835                                                     
## 836                                                     
## 837                                                     
## 838                                                     
## 839                                                     
## 840                                                     
## 841                                                     
## 842                                                     
## 843                                                     
## 844                                                     
## 845                                      PO Box Box 3109
## 846                                          PO Box 3564
## 847                                           PO Box 308
## 848                                          PO Box 3780
## 849                7856 Main St Courthouse Annex Ste 236
## 850                                                     
## 851                                                     
## 852                                                     
## 853                                                     
## 854                                                     
## 855                                                     
## 856                                                     
## 857                                                     
## 858                                                     
## 859                                                     
## 860                                                     
## 861                                                     
## 862                                                     
## 863                                                     
## 864                                                     
## 865                                                     
## 866                                                     
## 867                                                     
## 868                                                     
## 869                                                     
## 870                                                     
## 871                                                     
## 872                                                     
## 873                                                     
## 874                                                     
## 875                                                     
## 876                                                     
## 877                                                     
## 878                                                     
## 879                                                     
## 880                                                     
## 881                                                     
## 882                                                     
## 883                                                     
## 884                                                     
## 885                                                     
## 886                                                     
## 887                                                     
## 888                                                     
## 889                                                     
## 890                                                     
## 891                                                     
## 892                                                     
## 893                                                     
## 894                                                     
## 895                                                     
## 896                                         501 Texas St
## 897                                       512 North Main
## 898                                           PO Box 777
## 899                                          PO Box 1652
## 900                                           PO Box 389
## 901                                            PO Box 43
## 902                                 4001 Carter St Ste 9
## 903                                          PO Box 1374
## 904                                       PO Drawer 1472
## 905                                           PO Box 838
## 906                                          PO Box 1557
## 907                                           PO Box 608
## 908                                           PO Box 450
## 909                                         1020 Ryan St
## 910                                    800 S Buchanan St
## 911                              Courthouse Bldg Ste 200
## 912                                           PO Box 431
## 913                                        PO Drawer 880
## 914                                      222 St Louis St
## 915                                           PO Box 429
## 916                                        PO Drawer 639
## 917                                   428 East Boston St
## 918                                        PO Drawer 279
## 919                                     Courthouse Annex
## 920                                           Courthouse
## 921                                            PO Box 69
## 922                                       PO Drawer 1968
## 923                                          PO Box 1406
## 924                                       107 Camelia Ct
## 925                                          P O Box 466
## 926                                          603 Lucy St
## 927                7856 Main St Courthouse Annex Ste 220
## 928                                     1273 Old Pump Rd
## 929                                           PO Box 947
## 930                       Courthouse 200 Main St Ste 203
## 931                                            PO Box 99
## 932                                           PO Box 119
## 933                                        PO Drawer 280
## 934                                           PO Box 606
## 935                                     1916 Madewood Dr
## 936                                          P O Box 432
## 937                                      2700 Tulane Ave
## 938                                          P O Box 591
## 939                                       1244 Texas Ave
## 940                                       1244 Texas Ave
## 941                                       1244 Texas Ave
## 942                                       1244 Texas Ave
## 943                                          P O Box 591
## 944                                       1244 Texas Ave
## 945                                           416 E Main
## 946                                  200 South Jefferson
## 947                                         P O Box 1106
## 948                                        P O Box 31109
## 949                                         P O Box 1010
## 950                                          P O Box 308
## 951                                       107 N Railroad
## 952                                           P O Box 10
## 953                                          P O Box 128
## 954                                          P O Box 142
## 955                                           416 E Main
## 956                                         P O Box 1106
## 957                                         P O Box 1010
## 958                                          P O Box 308
## 959                                       107 N Railroad
## 960                                          P O Box 128
## 961                                          P O Box 142
## 962                                         P O Box 1106
## 963                                          P O Box 308
## 964                                           416 E Main
## 965                                  200 South Jefferson
## 966                                  200 South Jefferson
## 967                                          P O Box 308
## 968                                       107 N Railroad
## 969                                          P O Box 308
## 970                                       107 N Railroad
## 971                                          P O Box 308
## 972                                       107 N Railroad
## 973                                          P O Box 308
## 974                                       107 N Railroad
## 975                                       107 N Railroad
## 976                                         P O Box 1010
## 977                                         P O Box 1010
## 978                                         P O Box 1010
## 979                                         P O Box 1010
## 980                                         P O Box 1010
## 981                                           P O Box 10
## 982                                           P O Box 10
## 983                                           P O Box 10
## 984                                           P O Box 10
## 985                                           P O Box 10
## 986                                          P O Box 128
## 987                                          P O Box 128
## 988                                          P O Box 128
## 989                                          P O Box 142
## 990                                          P O Box 142
## 991                                          P O Box 142
## 992                                         P O Box 1106
## 993                                         P O Box 1106
## 994                                         P O Box 1106
## 995                                         P O Box 1106
## 996                                        P O Box 31109
## 997                                        P O Box 31109
## 998                                        P O Box 31109
## 999                                        P O Box 31109
## 1000                                       P O Box 31109
## 1001                                       P O Box 31109
## 1002                                       P O Box 31109
## 1003                                          416 E Main
## 1004                                 200 South Jefferson
## 1005                                          416 E Main
## 1006                                 200 South Jefferson
## 1007                                          416 E Main
## 1008                                 200 South Jefferson
## 1009                                          416 E Main
## 1010                                 200 South Jefferson
## 1011                                          416 E Main
## 1012                                 200 South Jefferson
## 1013                                          416 E Main
## 1014                                                    
## 1015                                                    
## 1016                                                    
## 1017                                                    
## 1018                                                    
## 1019                                                    
## 1020                                                    
## 1021                                                    
## 1022                                                    
## 1023                                                    
## 1024                                                    
## 1025                                                    
## 1026                                                    
## 1027                                                    
## 1028                                                    
## 1029                                                    
## 1030                                                    
## 1031                                                    
## 1032                                                    
## 1033                                                    
## 1034                                                    
## 1035                                         P O Box 289
## 1036                                         P O Box 922
## 1037                                        P O Box 1329
## 1038                                       717 Curtis Dr
## 1039                                            PO Box A
## 1040                                            PO Box A
## 1041                                            PO Box A
## 1042                                            PO Box A
## 1043                                            PO Box A
## 1044                                            PO Box A
## 1045                                            PO Box A
## 1046                                            PO Box A
## 1047                                         P O Box 225
## 1048                                          P O Box 31
## 1049                                         P O Box 225
## 1050                                          P O Box 31
## 1051                                      P O Drawer 309
## 1052                                      P O Drawer 309
## 1053                                      P O Drawer 309
## 1054                                      P O Drawer 309
## 1055                                      P O Drawer 309
## 1056                                      P O Drawer 309
## 1057                                      P O Drawer 309
## 1058                                      P O Drawer 309
## 1059                                      122  O'Neal Ln
## 1060                                     666 N Beaugh St
## 1061                                      1114 Shultz Rd
## 1062                                           PO Box 52
## 1063                                                    
## 1064                                          PO Box 432
## 1065                                    544 Brasseaux St
## 1066                                          PO Box 146
## 1067                                          PO Box 118
## 1068                                     1729 Hundley Rd
## 1069                                        P O Box 1463
## 1070                                          P O Box 69
## 1071                                     102 Church Blvd
## 1072                                      P O Drawer 890
## 1073                                         P O Box 167
## 1074                                         P O Box 280
## 1075                                         P O Box 750
## 1076                                        P O Box 1463
## 1077                                          P O Box 69
## 1078                                     102 Church Blvd
## 1079                                      P O Drawer 890
## 1080                                         P O Box 167
## 1081                                         P O Box 280
## 1082                                          P O Box 36
## 1083                                        P O Box 1463
## 1084                                                    
## 1085                                      P O Drawer 890
## 1086                                      P O Drawer 890
## 1087                                      P O Drawer 890
## 1088                                      P O Drawer 890
## 1089                                      P O Drawer 890
## 1090                                         P O Box 167
## 1091                                         P O Box 167
## 1092                                         P O Box 167
## 1093                                         P O Box 280
## 1094                                         P O Box 280
## 1095                                         P O Box 280
## 1096                                          P O Box 36
## 1097                                          P O Box 36
## 1098                                          P O Box 36
## 1099                                          P O Box 69
## 1100                                        P O Box 1463
## 1101                                        P O Box 1463
## 1102                                     102 Church Blvd
## 1103                                                    
## 1104                                        P O Box 1463
## 1105                                        P O Box 1463
## 1106                                     102 Church Blvd
## 1107                                                    
## 1108                                        P O Box 1463
## 1109                                        P O Box 1463
## 1110                                     102 Church Blvd
## 1111                                                    
## 1112                                        P O Box 1463
## 1113                                        P O Box 1463
## 1114                                     102 Church Blvd
## 1115                                     102 Church Blvd
## 1116                                                    
## 1117                                                    
## 1118                                                    
## 1119                                                    
## 1120                                                    
## 1121                                                    
## 1122                                                    
## 1123                                                    
## 1124                                                    
## 1125                                                    
## 1126                                                    
## 1127                                                    
## 1128                                                    
## 1129                                                    
## 1130                                                    
## 1131                                                    
## 1132                                         P O Box 278
## 1133                                         P O Box 248
## 1134                                         P O Box 218
## 1135                                         PO Box 1140
## 1136                                    602 Court Street
## 1137                                    602 Court Street
## 1138                                    602 Court Street
## 1139                                    602 Court Street
## 1140                                    602 Court Street
## 1141                                    602 Court Street
## 1142                                    602 Court Street
## 1143                                         P O Box 565
## 1144                                         P O Box 565
## 1145                                         PO Drawer C
## 1146                                         PO Drawer C
## 1147                                         PO Drawer C
## 1148                                         PO Drawer C
## 1149                                         PO Drawer C
## 1150                                         PO Drawer C
## 1151                                         PO Drawer C
## 1152                                          PO Box 304
## 1153                                  122 Mayo Ortego Rd
## 1154                                           PO Box 41
## 1155                                   1299 Palestine Rd
## 1156                                          PO Box 431
## 1157                                         PO Box 1074
## 1158                                           PO Box 59
## 1159                                       248 Dowies Rd
## 1160                                         P O Box 728
## 1161                                         P O Box 457
## 1162                                       P O Drawer AH
## 1163                                         P O Box 370
## 1164                                         P O Box 119
## 1165                                         P O Box 728
## 1166                                         P O Box 457
## 1167                                       P O Drawer AH
## 1168                                         P O Box 370
## 1169                                         P O Box 119
## 1170                                                    
## 1171                                         P O Box 728
## 1172                                       P O Drawer AH
## 1173                                         P O Box 370
## 1174                                         P O Box 370
## 1175                                         P O Box 370
## 1176                                         P O Box 370
## 1177                                         P O Box 457
## 1178                                         P O Box 457
## 1179                                         P O Box 457
## 1180                                         P O Box 457
## 1181                                         P O Box 457
## 1182                                         P O Box 119
## 1183                                         P O Box 119
## 1184                                         P O Box 119
## 1185                                         P O Box 728
## 1186                                       P O Drawer AH
## 1187                                         P O Box 728
## 1188                                       P O Drawer AH
## 1189                                         P O Box 728
## 1190                                       P O Drawer AH
## 1191                                         P O Box 728
## 1192                                       P O Drawer AH
## 1193                                                    
## 1194                                                    
## 1195                                                    
## 1196                                                    
## 1197                                                    
## 1198                                                    
## 1199                                                    
## 1200                                                    
## 1201                                                    
## 1202                                                    
## 1203                                                    
## 1204                                                    
## 1205                                                    
## 1206                                                    
## 1207                                                    
## 1208                                                    
## 1209                                                    
## 1210                                                    
## 1211                                                    
## 1212                                                    
## 1213                                                    
## 1214                                                    
## 1215                                                    
## 1216                                                    
## 1217                                                    
## 1218                                                    
## 1219                                                    
## 1220                                                    
## 1221                                                    
## 1222                              828 S Irma Blvd Bldg 2
## 1223                                         P O Box 268
## 1224                                         P O Box 192
## 1225                                         P O Box 544
## 1226                         2647 Riverview Blvd Ste 100
## 1227                                    208 E Railrod St
## 1228                                   208 E Railroad St
## 1229                                   208 E Railroad St
## 1230                                   208 E Railroad St
## 1231                                   208 E Railroad St
## 1232                                   208 E Railroad St
## 1233                                   208 E Railroad St
## 1234                                   208 E Railroad St
## 1235                                   208 E Railroad St
## 1236                                   208 E Railroad St
## 1237                                   208 E Railroad St
## 1238                                   208 E Railroad St
## 1239                                     1100 Webster St
## 1240                                         P O Box 189
## 1241                                         P O Box 189
## 1242                                         P O Box 189
## 1243                                         P O Box 189
## 1244                                         P O Box 189
## 1245                                         P O Box 189
## 1246                                         P O Box 189
## 1247                                         P O Box 189
## 1248                                         P O Box 189
## 1249                                         P O Box 189
## 1250                                     1004 Madison St
## 1251                            39362 Shafter LeBlanc Rd
## 1252                                 11296 Hwy 431 Ste C
## 1253                                    2411 St Simon Pl
## 1254                                    1121 E Fabian St
## 1255                              12487 Agnes Marie Road
## 1256                                         P O Box 470
## 1257                                     120 S Irma Blvd
## 1258                                          P O Box 65
## 1259                                     120 S Irma Blvd
## 1260                                          P O Box 65
## 1261                                          P O Box 65
## 1262                                         P O Box 470
## 1263                                         P O Box 470
## 1264                                         P O Box 470
## 1265                                         P O Box 470
## 1266                                         P O Box 470
## 1267                                     120 S Irma Blvd
## 1268                                     120 S Irma Blvd
## 1269                                     120 S Irma Blvd
## 1270                                     120 S Irma Blvd
## 1271                                     120 S Irma Blvd
## 1272                                          P O Box 65
## 1273                                          P O Box 65
## 1274                                          P O Box 65
## 1275                                          P O Box 65
## 1276                                          P O Box 65
## 1277                                                    
## 1278                                                    
## 1279                                                    
## 1280                                                    
## 1281                                                    
## 1282                                                    
## 1283                                                    
## 1284                                                    
## 1285                                                    
## 1286                                                    
## 1287                                                    
## 1288                                                    
## 1289                                                    
## 1290                                                    
## 1291                                                    
## 1292                                                    
## 1293                                                    
## 1294                                                    
## 1295                                                    
## 1296                                                    
## 1297                                          P O Box 69
## 1298                                      P O Drawer 249
## 1299                                         P O Box 576
## 1300                                          PO Box 188
## 1301                                         P O Box 520
## 1302                                         P O Box 520
## 1303                                         P O Box 520
## 1304                                         P O Box 520
## 1305                                         P O Box 520
## 1306                                         P O Box 520
## 1307                                         P O Box 520
## 1308                                         P O Box 520
## 1309                                         P O Box 520
## 1310                                        4901 Hwy 308
## 1311                                        4901 Hwy 308
## 1312                                        4901 Hwy 308
## 1313                                        4901 Hwy 308
## 1314                                        4901 Hwy 308
## 1315                                        4901 Hwy 308
## 1316                                        4901 Hwy 308
## 1317                                        4901 Hwy 308
## 1318                                        4901 Hwy 308
## 1319                                         5026 Hwy308
## 1320                                       117 Orchid St
## 1321                                         P O Box 293
## 1322                                           PO Box 18
## 1323                                          3615 Hwy 1
## 1324                                        111 James St
## 1325                                           P O Box 6
## 1326                                           P O Box 6
## 1327                                           P O Box 6
## 1328                                           P O Box 6
## 1329                                                    
## 1330                                                    
## 1331                                                    
## 1332                                                    
## 1333                                                    
## 1334                                                    
## 1335                                                    
## 1336                                                    
## 1337                                                    
## 1338                                                    
## 1339                                                    
## 1340                                                    
## 1341                                                    
## 1342                                                    
## 1343                                                    
## 1344                                                    
## 1345                                                    
## 1346                                                    
## 1347                                                    
## 1348                                                    
## 1349                                   675 Government St
## 1350                                         P O Box 219
## 1351                            312 N Main St Courthouse
## 1352                                         PO Box 1529
## 1353                               312 N Main St Suite D
## 1354                               312 N Main St Suite D
## 1355                               312 N Main St Suite D
## 1356                               312 N Main St Suite D
## 1357                               312 N Main St Suite D
## 1358                               312 N Main St Suite D
## 1359                               312 N Main St Suite D
## 1360                               312 N Main St Suite D
## 1361                               312 N Main St Suite D
## 1362                                          P O Box 74
## 1363                               440 N Main St Suite 4
## 1364                                          P O Box 74
## 1365                               440 N Main St Suite 4
## 1366                                     221 Tunica Dr W
## 1367                                     221 Tunica Dr W
## 1368                                     221 Tunica Dr W
## 1369                                     221 Tunica Dr W
## 1370                                     221 Tunica Dr W
## 1371                                     221 Tunica Dr W
## 1372                                     221 Tunica Dr W
## 1373                                     221 Tunica Dr W
## 1374                                     221 Tunica Dr W
## 1375                                         239 Hwy 107
## 1376                                         P O Box 663
## 1377                                         P O Box 185
## 1378                                        779 Hwy 1194
## 1379                                     791 Big Bend Rd
## 1380                                        2254 Hwy 105
## 1381                                         P O Box 302
## 1382                                         P O Box 210
## 1383                           897 S Bayou Des Glaise Rd
## 1384                                        1771 Hwy 107
## 1385                                      2118 Regard St
## 1386                                        369 Jacks Rd
## 1387                                 438 German Bayou Rd
## 1388                             4751 N Bayou Des Glaise
## 1389                                          PO Box 526
## 1390                                       1121 Hwy 1181
## 1391                                         3688 Hwy 29
## 1392                                          PO Box 244
## 1393                                         P O Box 630
## 1394                                 427 N Washington St
## 1395                                         P O Box 118
## 1396                                          P O Box 85
## 1397                                         P O Box 157
## 1398                                         P O Box 145
## 1399                                         P O Box 125
## 1400                                          P O Box 57
## 1401                                          P O Box 10
## 1402                                         P O Box 630
## 1403                                         P O Box 118
## 1404                                         P O Box 157
## 1405                                         P O Box 145
## 1406                                         P O Box 125
## 1407                                          P O Box 85
## 1408                                         P O Box 630
## 1409                                         P O Box 145
## 1410                                                    
## 1411                                         P O Box 630
## 1412                                 427 N Washington St
## 1413                                         P O Box 145
## 1414                                         P O Box 630
## 1415                                 427 N Washington St
## 1416                                         P O Box 145
## 1417                                         P O Box 630
## 1418                                 427 N Washington St
## 1419                                         P O Box 145
## 1420                                         P O Box 630
## 1421                                 427 N Washington St
## 1422                                         P O Box 145
## 1423                                 427 N Washington St
## 1424                                          P O Box 85
## 1425                                          P O Box 85
## 1426                                          P O Box 85
## 1427                                          P O Box 85
## 1428                                          P O Box 85
## 1429                                         P O Box 157
## 1430                                         P O Box 157
## 1431                                         P O Box 157
## 1432                                         P O Box 157
## 1433                                         P O Box 157
## 1434                                         P O Box 125
## 1435                                         P O Box 125
## 1436                                         P O Box 125
## 1437                                          P O Box 57
## 1438                                          P O Box 57
## 1439                                          P O Box 57
## 1440                                          P O Box 10
## 1441                                          P O Box 10
## 1442                                          P O Box 10
## 1443                                         P O Box 118
## 1444                                         P O Box 118
## 1445                                         P O Box 118
## 1446                                         P O Box 118
## 1447                                                    
## 1448                                                    
## 1449                                                    
## 1450                                                    
## 1451                                                    
## 1452                                                    
## 1453                                                    
## 1454                                                    
## 1455                                                    
## 1456                                                    
## 1457                                                    
## 1458                                                    
## 1459                                                    
## 1460                                                    
## 1461                                                    
## 1462                                                    
## 1463                                                    
## 1464                                                    
## 1465                                                    
## 1466                                                    
## 1467                                                    
## 1468                                                    
## 1469                                                    
## 1470                                                    
## 1471                                                    
## 1472                                                    
## 1473                                                    
## 1474                                         P O Box 370
## 1475                                         P O Box 100
## 1476                                         P O Box 477
## 1477                                   412 S Pine Street
## 1478                                         P O Box 310
## 1479                                         P O Box 310
## 1480                                         P O Box 310
## 1481                                         P O Box 310
## 1482                                         P O Box 310
## 1483                                         P O Box 310
## 1484                                         P O Box 310
## 1485                                         P O Box 310
## 1486                                         P O Box 310
## 1487                                         P O Box 310
## 1488                                      P O Drawer 310
## 1489                                      P O Drawer 938
## 1490                                      P O Drawer 938
## 1491                                      P O Drawer 938
## 1492                                      P O Drawer 938
## 1493                                      P O Drawer 938
## 1494                                      P O Drawer 938
## 1495                                      P O Drawer 938
## 1496                                      P O Drawer 938
## 1497                                                    
## 1498                                    290 Ray Brown Rd
## 1499                                         P O Box 501
## 1500                                  961 Newt Hodges Rd
## 1501                                       1477 Hwy 1147
## 1502                                          PO Box 104
## 1503                                          PO Box 148
## 1504                                    306 Burnett Loop
## 1505                                        4239 Hwy 113
## 1506                                         P O Box 607
## 1507                                         P O Box 607
## 1508                                         P O Box 607
## 1509                                         P O Box 607
## 1510                                         P O Box 607
## 1511                                         P O Box 607
## 1512                                         P O Box 607
## 1513                                                    
## 1514                                                    
## 1515                                                    
## 1516                                                    
## 1517                                                    
## 1518                                                    
## 1519                                                    
## 1520                                                    
## 1521                                                    
## 1522                                                    
## 1523                                                    
## 1524                                                    
## 1525                                                    
## 1526                                                    
## 1527                                                    
## 1528                                                    
## 1529                                         P O Box 328
## 1530                            100 Courthouse Dr Rm 100
## 1531                                       2705 Beech St
## 1532                                        970 First St
## 1533                                         P O Box 479
## 1534                                         P O Box 479
## 1535                                         P O Box 479
## 1536                                         P O Box 479
## 1537                                         P O Box 479
## 1538                                         P O Box 479
## 1539                                         P O Box 479
## 1540                                         P O Box 418
## 1541                                         P O Box 418
## 1542                                         P O Box 418
## 1543                                         P O Box 418
## 1544                                         P O Box 418
## 1545                                         P O Box 418
## 1546                                         P O Box 418
## 1547                                         P O Box 158
## 1548                                         P O Box 268
## 1549                                     819 Thompson Rd
## 1550                                        P O Box 5068
## 1551                                       12056 Hwy 501
## 1552                                          PO Box 186
## 1553                                        1694 Hwy 794
## 1554                                     819 Thompson Rd
## 1555                                          PO Box 445
## 1556                                         27624 Hwy 9
## 1557                                         P O Box 767
## 1558                                         P O Box 309
## 1559                                          PO Box 588
## 1560                                         P O Box 565
## 1561                                         P O Box 207
## 1562                               100 Fire Station Rd 7
## 1563                                         P O Box 216
## 1564                                        P O Box 5128
## 1565                                         13041 Hwy 4
## 1566                                         P O Box 118
## 1567                                         P O Box 767
## 1568                                         P O Box 309
## 1569                                         P O Box 565
## 1570                                         13132 Hwy 4
## 1571                                         P O Box 118
## 1572                                         P O Box 309
## 1573                                         P O Box 309
## 1574                                         P O Box 309
## 1575                                         P O Box 309
## 1576                                          PO Box 588
## 1577                                          PO Box 588
## 1578                                          PO Box 588
## 1579                                          PO Box 588
## 1580                                          PO Box 588
## 1581                                         P O Box 207
## 1582                                         P O Box 207
## 1583                                         P O Box 207
## 1584                               100 Fire Station Rd 7
## 1585                               100 Fire Station Rd 7
## 1586                               100 Fire Station Rd 7
## 1587                                         P O Box 216
## 1588                                         P O Box 216
## 1589                                         P O Box 216
## 1590                                        P O Box 5128
## 1591                                        P O Box 5128
## 1592                                        P O Box 5128
## 1593                                         13132 Hwy 4
## 1594                                         13132 Hwy 4
## 1595                                         13132 Hwy 4
## 1596                                         P O Box 118
## 1597                                         P O Box 118
## 1598                                         P O Box 118
## 1599                                         P O Box 118
## 1600                                         P O Box 118
## 1601                                         P O Box 767
## 1602                                         P O Box 767
## 1603                                         P O Box 767
## 1604                                         P O Box 767
## 1605                                         P O Box 767
## 1606                                         P O Box 565
## 1607                                         P O Box 565
## 1608                                         P O Box 565
## 1609                                         P O Box 565
## 1610                                         P O Box 565
## 1611                                                    
## 1612                                                    
## 1613                                                    
## 1614                                                    
## 1615                                                    
## 1616                                                    
## 1617                                                    
## 1618                                                    
## 1619                                                    
## 1620                                                    
## 1621                                                    
## 1622                                                    
## 1623                                                    
## 1624                                                    
## 1625                                                    
## 1626                                                    
## 1627                                                    
## 1628                                                    
## 1629                                                    
## 1630                                                    
## 1631                                                    
## 1632                                                    
## 1633                                                    
## 1634                                                    
## 1635                                                    
## 1636                                                    
## 1637                                                    
## 1638                                                    
## 1639                                                    
## 1640                                                    
## 1641                                         P O Box 850
## 1642                                         P O Box 430
## 1643                                         P O Box 325
## 1644                          3022 Old Minden Rd Ste 209
## 1645                                          P O Box 70
## 1646                                          P O Box 70
## 1647                                          P O Box 70
## 1648                                          P O Box 70
## 1649                                          P O Box 70
## 1650                                          P O Box 70
## 1651                                          P O Box 70
## 1652                                          P O Box 70
## 1653                                          P O Box 70
## 1654                                          P O Box 70
## 1655                                          P O Box 70
## 1656                                          P O Box 70
## 1657                                       620 Benton Rd
## 1658                                       620 Benton Rd
## 1659                                        P O Box 2000
## 1660                                        P O Box 2000
## 1661                                        P O Box 2000
## 1662                                        P O Box 2000
## 1663                                        P O Box 2000
## 1664                                        P O Box 2000
## 1665                                        P O Box 2000
## 1666                                        P O Box 2000
## 1667                                        P O Box 2000
## 1668                                        P O Box 2000
## 1669                                        P O Box 2000
## 1670                                        P O Box 2000
## 1671                                 1416 Magnolia Ridge
## 1672                                         270 Hwy 537
## 1673                                         270 Hwy 537
## 1674                             153 Salem Cemetery Road
## 1675                            911 Old Plain Dealing Rd
## 1676                                         P O Box 308
## 1677                                         P O Box 308
## 1678                                   5404 Hollyhock Ln
## 1679                                          PO Box 323
## 1680                                          PO Box 323
## 1681                                      155 Matlock Rd
## 1682                            911 Old Plain Dealing Rd
## 1683                                          PO Box 191
## 1684                                          PO Box 191
## 1685                                        P O Box 5337
## 1686                                        P O Box 5337
## 1687                                        P O Box 1390
## 1688                                         P O Box 729
## 1689                                         P O Box 426
## 1690                                        P O Box 1390
## 1691                                         P O Box 729
## 1692                                         P O Box 426
## 1693                                        P O Box 5337
## 1694                                        P O Box 5337
## 1695                                        P O Box 5337
## 1696                                        P O Box 5337
## 1697                                         P O Box 426
## 1698                                         P O Box 426
## 1699                                         P O Box 426
## 1700                                        P O Box 1390
## 1701                                        P O Box 1390
## 1702                                         P O Box 729
## 1703                                         P O Box 729
## 1704                                         P O Box 729
## 1705                                         P O Box 729
## 1706                                         P O Box 426
## 1707                                         P O Box 426
## 1708                                        P O Box 5337
## 1709                                        P O Box 5337
## 1710                                        P O Box 5337
## 1711                                        P O Box 5337
## 1712                                        P O Box 5337
## 1713                                        P O Box 5337
## 1714                                        P O Box 5337
## 1715                                        P O Box 5337
## 1716                                                    
## 1717                                                    
## 1718                                                    
## 1719                                                    
## 1720                                                    
## 1721                                                    
## 1722                                                    
## 1723                                                    
## 1724                                                    
## 1725                                                    
## 1726                                                    
## 1727                                                    
## 1728                                                    
## 1729                                                    
## 1730                                                    
## 1731                                                    
## 1732                                                    
## 1733                                                    
## 1734                                                    
## 1735                                                    
## 1736                                                    
## 1737                                                    
## 1738                                                    
## 1739                                                    
## 1740                                                    
## 1741                                                    
## 1742                                                    
## 1743                                                    
## 1744                                                    
## 1745                                                    
## 1746                                                    
## 1747                                                    
## 1748                                                    
## 1749                                                    
## 1750                                      1835 Spring St
## 1751                                      1835 Spring St
## 1752                                      1835 Spring St
## 1753                                 501 Texas St Rm 101
## 1754                                 501 Texas St Rm 103
## 1755                           501 Texas St Rm 102 Cthse
## 1756                                      1704 Market St
## 1757                               505 Travis St Ste 110
## 1758                               505 Travis St Ste 110
## 1759                               505 Travis St Ste 110
## 1760                               505 Travis St Ste 110
## 1761                               505 Travis St Ste 110
## 1762                               505 Travis St Ste 110
## 1763                               505 Travis St Ste 110
## 1764                               505 Travis St Ste 110
## 1765                               505 Travis St Ste 110
## 1766                               505 Travis St Ste 110
## 1767                               505 Travis St Ste 110
## 1768                               505 Travis st Ste 110
## 1769                                        PO Box 32000
## 1770                                      1961 Midway St
## 1771                                      1961 Midway St
## 1772                                      1961 Midway St
## 1773                                      1961 Midway St
## 1774                                      1961 Midway St
## 1775                                      1961 Midway St
## 1776                                      1961 Midway St
## 1777                                      1961 Midway St
## 1778                                      1961 Midway St
## 1779                                      1961 Midway St
## 1780                                      1961 Midway St
## 1781                                         P O Box 104
## 1782                                         9369 Gay Ln
## 1783                                14626 Old Atlanta Rd
## 1784                                         P O Box 564
## 1785                                       8353 Tanya Dr
## 1786                                     3811 Christy Dr
## 1787                                        P O Box 6772
## 1788                               10543 Norris Ferry Rd
## 1789                           17665 Munnerlyn Chapel Rd
## 1790                                   9250 N LA Hwy 169
## 1791                                        8543 Sac Fox
## 1792                                          PO Box 519
## 1793                                          PO Box 812
## 1794                                         PO Box 1394
## 1795                                          PO Box 475
## 1796                               504 Travis St Ste 110
## 1797                               11795 Sparks Davis Rd
## 1798                                           PO Box 92
## 1799                               10543 Norris Ferry Rd
## 1800                                          PO Box 193
## 1801                                         P O Box 428
## 1802                                         P O Box 195
## 1803                                           P O Box 9
## 1804                                         P O Box 520
## 1805                                       112 W Alabama
## 1806                                         P O Box 206
## 1807                                         P O Box 129
## 1808                                         P O Box 206
## 1809                                          PO Box 299
## 1810                                         P O Box 336
## 1811                                         P O Box 428
## 1812                                           P O Box 9
## 1813                                       112 W Alabama
## 1814                                         P O Box 206
## 1815                                         P O Box 129
## 1816                                         P O Box 206
## 1817                                          PO Box 299
## 1818                                         P O Box 195
## 1819                                       112 W Alabama
## 1820                                           P O Box 9
## 1821                                           P O Box 9
## 1822                                         P O Box 520
## 1823                                         P O Box 520
## 1824                                         P O Box 520
## 1825                                         P O Box 520
## 1826                                         P O Box 520
## 1827                                         P O Box 195
## 1828                                         P O Box 195
## 1829                                         P O Box 195
## 1830                                         P O Box 195
## 1831                                         P O Box 428
## 1832                                         P O Box 428
## 1833                                         P O Box 428
## 1834                                         P O Box 428
## 1835                                         P O Box 428
## 1836                                         P O Box 206
## 1837                                         P O Box 206
## 1838                                         P O Box 206
## 1839                                         P O Box 129
## 1840                                         P O Box 129
## 1841                                         P O Box 129
## 1842                                         P O Box 206
## 1843                                         P O Box 206
## 1844                                         P O Box 206
## 1845                                          PO Box 299
## 1846                                          PO Box 299
## 1847                                          PO Box 299
## 1848                                         P O Box 336
## 1849                                         P O Box 336
## 1850                                         P O Box 336
## 1851                                       112 W Alabama
## 1852                                       112 W Alabama
## 1853                                       112 W Alabama
## 1854                                       112 W Alabama
## 1855                                           P O Box 9
## 1856                                           P O Box 9
## 1857                                           P O Box 9
## 1858                                                    
## 1859                                                    
## 1860                                                    
## 1861                                                    
## 1862                                                    
## 1863                                                    
## 1864                                                    
## 1865                                                    
## 1866                                                    
## 1867                                                    
## 1868                                                    
## 1869                                                    
## 1870                                                    
## 1871                                                    
## 1872                                                    
## 1873                                                    
## 1874                                                    
## 1875                                                    
## 1876                                                    
## 1877                                                    
## 1878                                                    
## 1879                                                    
## 1880                                                    
## 1881                                                    
## 1882                                                    
## 1883                                                    
## 1884                                                    
## 1885                                                    
## 1886                                                    
## 1887                                                    
## 1888                                                    
## 1889                                                    
## 1890                                                    
## 1891                                                    
## 1892                                                    
## 1893                                                    
## 1894                                                    
## 1895                                                    
## 1896                                                    
## 1897                                                    
## 1898                                        P O Box 3722
## 1899                                        P O Box 1030
## 1900                                        P O Box 1346
## 1901                                 707BE Prien Lake Rd
## 1902                                     P O Drawer 3287
## 1903                                     P O Drawer 3287
## 1904                                     P O Drawer 3287
## 1905                                     P O Drawer 3287
## 1906                                     P O Drawer 3287
## 1907                                     P O Drawer 3287
## 1908                                     P O Drawer 3287
## 1909                                     P O Drawer 3287
## 1910                                     P O Drawer 3287
## 1911                                     P O Drawer 3287
## 1912                                     P O Drawer 3287
## 1913                                     P O Drawer 3287
## 1914                                     P O Drawer 3287
## 1915                                     P O Drawer 3287
## 1916                                     P O Drawer 3287
## 1917                                 802 S Huntington St
## 1918                                        P O Box 1664
## 1919                                        P O Box 1664
## 1920                                        P O Box 1664
## 1921                                 802 S Huntington St
## 1922                                       3310 Broad St
## 1923                                     1724 Kirkman St
## 1924                                     1724 Kirkman St
## 1925                                     1724 Kirkman St
## 1926                                     1724 Kirkman St
## 1927                                     1724 Kirkman St
## 1928                                     1724 Kirkman St
## 1929                                     1724 Kirkman St
## 1930                                     1724 Kirkman St
## 1931                                     1724 Kirkman St
## 1932                                     1724 Kirkman St
## 1933                                     1724 Kirkman St
## 1934                                     1724 Kirkman St
## 1935                                     1724 Kirkman St
## 1936                                     1724 Kirkman St
## 1937                                   1318 Idlebrook Dr
## 1938                                           P O Box 4
## 1939                             4954B Alligator Park Rd
## 1940                                     1001  Myrtle St
## 1941                                      2259 Custer Dr
## 1942                                6581 Jerry Hebert Rd
## 1943                                    1207 Cheyenne Dr
## 1944                                           PO Box 89
## 1945                                  1184 Greenmoore Rd
## 1946                                     1292 Stephen Rd
## 1947                                        1618 West St
## 1948                                6606 Jerry Hebert Rd
## 1949                                         P O Box 968
## 1950                                         P O Box 900
## 1951                                         P O Box 900
## 1952                                        P O Box 1309
## 1953                                      P O Drawer 700
## 1954                                        P O Box 1707
## 1955                                    1200 Horridge St
## 1956                                    1200 Horridge St
## 1957                                         P O Box 700
## 1958                                        P O Box 1707
## 1959                                    1200 Horridge St
## 1960                                         P O Box 968
## 1961                                        P O Box 1707
## 1962                                        P O Box 1707
## 1963                                        P O Box 1707
## 1964                                        P O Box 1707
## 1965                                        P O Box 1707
## 1966                                         P O Box 700
## 1967                                                    
## 1968                                                    
## 1969                                                    
## 1970                                                    
## 1971                                         P O Box 968
## 1972                                        P O Box 1309
## 1973                                         P O Box 968
## 1974                                        P O Box 1309
## 1975                                         P O Box 968
## 1976                                        P O Box 1309
## 1977                                         P O Box 968
## 1978                                        P O Box 1309
## 1979                                        P O Box 1309
## 1980                                         P O Box 900
## 1981                                         P O Box 900
## 1982                                         P O Box 900
## 1983                                         P O Box 900
## 1984                                         P O Box 900
## 1985                                         P O Box 900
## 1986                                         P O Box 900
## 1987                                         P O Box 900
## 1988                                         P O Box 900
## 1989                                         P O Box 900
## 1990                                         P O Box 900
## 1991                                    1200 Horridge St
## 1992                                    1200 Horridge St
## 1993                                    1200 Horridge St
## 1994                                    1200 Horridge St
## 1995                                    1200 Horridge St
## 1996                                                    
## 1997                                                    
## 1998                                                    
## 1999                                                    
## 2000                                                    
## 2001                                                    
## 2002                                                    
## 2003                                                    
## 2004                                                    
## 2005                                                    
## 2006                                                    
## 2007                                                    
## 2008                                                    
## 2009                                                    
## 2010                                                    
## 2011                                                    
## 2012                                          P O Box 60
## 2013                                        P O Box 1327
## 2014                                        P O Box 1446
## 2015                                          PO Box 104
## 2016                                        P O Box 1737
## 2017                                        P O Box 1737
## 2018                                        P O Box 1737
## 2019                                        P O Box 1737
## 2020                                        P O Box 1737
## 2021                                        P O Box 1737
## 2022                                        P O Box 1737
## 2023                                         PO Box 1019
## 2024                                         PO Box 1019
## 2025                                         PO Box 1019
## 2026                                         PO Box 1019
## 2027                                         PO Box 1019
## 2028                                         PO Box 1019
## 2029                                         PO Box 1019
## 2030                                        1991 Hwy 848
## 2031                                          PO Box 425
## 2032                                     4417 US Hwy 165
## 2033                                         PO Box 1557
## 2034                                         P O Box 360
## 2035                                          P O Box 10
## 2036                                           P O Box 8
## 2037                                          P O Box 10
## 2038                                           P O Box 8
## 2039                                         P O Box 360
## 2040                                         P O Box 360
## 2041                                         P O Box 360
## 2042                                         P O Box 360
## 2043                                         P O Box 360
## 2044                                           P O Box 8
## 2045                                           P O Box 8
## 2046                                           P O Box 8
## 2047                                          P O Box 10
## 2048                                          P O Box 10
## 2049                                          P O Box 10
## 2050                                          P O Box 10
## 2051                                          P O Box 10
## 2052                                                    
## 2053                                                    
## 2054                                                    
## 2055                                                    
## 2056                                                    
## 2057                                                    
## 2058                                                    
## 2059                                                    
## 2060                                                    
## 2061                                                    
## 2062                                                    
## 2063                                                    
## 2064                                                    
## 2065                                                    
## 2066                                                    
## 2067                                                    
## 2068                                                    
## 2069                                                    
## 2070                                        P O Box 1250
## 2071                                         P O Box 549
## 2072                                        P O Box 1100
## 2073                                           PO Box 68
## 2074                                        P O Box 1280
## 2075                                        P O Box 1280
## 2076                                        P O Box 1280
## 2077                                        P O Box 1280
## 2078                                        P O Box 1280
## 2079                                        P O Box 1280
## 2080                                        P O Box 1280
## 2081                                     510 Marshall St
## 2082                                        P O Box 1548
## 2083                                        P O Box 1548
## 2084                                        P O Box 1548
## 2085                                        P O Box 1548
## 2086                                        P O Box 1548
## 2087                                        P O Box 1548
## 2088                                                    
## 2089                              549 Mermentau River Rd
## 2090                                   103 Bud Murphy Rd
## 2091                                       10510 Hwy 384
## 2092                                 6598 Gulf Beach Hwy
## 2093                                       225 Meyers Rd
## 2094                                          PO Box 531
## 2095                                         119 East Ln
## 2096                                          PO Box 583
## 2097                                        1071 Hwy 384
## 2098                                        140 Alivn Ln
## 2099                                194 J B Constance Ln
## 2100                                                    
## 2101                                                    
## 2102                                                    
## 2103                                                    
## 2104                                                    
## 2105                                                    
## 2106                                                    
## 2107                                                    
## 2108                                                    
## 2109                                                    
## 2110                                                    
## 2111                                                    
## 2112                                                    
## 2113                                                    
## 2114                                                    
## 2115                                                    
## 2116                                                    
## 2117                                                    
## 2118                                                    
## 2119                                                    
## 2120                                                    
## 2121                                                    
## 2122                                         P O Box 655
## 2123                                         P O Box 654
## 2124                                         P O Box 570
## 2125                                          PO Box 655
## 2126                                         P O Box 258
## 2127                                         P O Box 258
## 2128                                         P O Box 258
## 2129                                         P O Box 258
## 2130                                         P O Box 258
## 2131                                         P O Box 258
## 2132                                         P O Box 258
## 2133                                         P O Box 258
## 2134                                         P O Box 258
## 2135                                         P O Box 290
## 2136                                         P O Box 290
## 2137                                         P O Box 290
## 2138                                         P O Box 290
## 2139                                         P O Box 290
## 2140                                         P O Box 290
## 2141                                         P O Box 290
## 2142                                         P O Box 290
## 2143                                         P O Box 290
## 2144                                          P O Box 97
## 2145                                  123 Deer Hunter Ln
## 2146                                           PO Box 44
## 2147                                      1054 Newman St
## 2148                                          PO Box 247
## 2149                                        807 Front St
## 2150                                         P O Box 428
## 2151                                         P O Box 658
## 2152                                          P O Box 45
## 2153                                         P O Box 658
## 2154                                         P O Box 428
## 2155                                         P O Box 428
## 2156                                         P O Box 428
## 2157                                         P O Box 428
## 2158                                         P O Box 428
## 2159                                         P O Box 658
## 2160                                         P O Box 658
## 2161                                         P O Box 658
## 2162                                          P O Box 45
## 2163                                          P O Box 45
## 2164                                          P O Box 45
## 2165                                                    
## 2166                                                    
## 2167                                                    
## 2168                                                    
## 2169                                                    
## 2170                                                    
## 2171                                                    
## 2172                                                    
## 2173                                                    
## 2174                                                    
## 2175                                                    
## 2176                                                    
## 2177                                                    
## 2178                                                    
## 2179                                                    
## 2180                                                    
## 2181                                                    
## 2182                                                    
## 2183                                                    
## 2184                                                    
## 2185                                                    
## 2186                                                    
## 2187                                                    
## 2188                                       613 E Main St
## 2189                                         P O Box 330
## 2190                                       508 E Main St
## 2191                                           PO Box 29
## 2192                                         P O Box 270
## 2193                                         P O Box 270
## 2194                                         P O Box 270
## 2195                                         P O Box 270
## 2196                                         P O Box 270
## 2197                                         P O Box 270
## 2198                                         P O Box 270
## 2199                                         P O Box 270
## 2200                                         P O Box 270
## 2201                                         P O Box 270
## 2202                                         P O Box 600
## 2203                                         P O Box 600
## 2204                                         P O Box 600
## 2205                                         P O Box 600
## 2206                                         P O Box 600
## 2207                                         P O Box 600
## 2208                                         P O Box 600
## 2209                                         P O Box 600
## 2210                                         P O Box 600
## 2211                                         P O Box 600
## 2212                                        4149 Hwy 2AH
## 2213                                        103 Holly St
## 2214                                     153 Reynolds Rd
## 2215                                        136 Boone Rd
## 2216                                      490 Arizona Rd
## 2217                                         21011 Hwy 2
## 2218                                        1711 Main St
## 2219                                          400 E Main
## 2220                                          P O Box 69
## 2221                                         P O Box 248
## 2222                                        1711 Main St
## 2223                                          P O Box 69
## 2224                                          400 E Main
## 2225                                          P O Box 69
## 2226                                          P O Box 69
## 2227                                          P O Box 69
## 2228                                         P O Box 248
## 2229                                         P O Box 248
## 2230                                         P O Box 248
## 2231                                        1711 Main St
## 2232                                        1711 Main St
## 2233                                        1711 Main St
## 2234                                        1711 Main St
## 2235                                        1711 Main St
## 2236                                          400 E Main
## 2237                                          400 E Main
## 2238                                          400 E Main
## 2239                                          400 E Main
## 2240                                          400 E Main
## 2241                                                    
## 2242                                                    
## 2243                                                    
## 2244                                                    
## 2245                                                    
## 2246                                                    
## 2247                                                    
## 2248                                                    
## 2249                                                    
## 2250                                                    
## 2251                                                    
## 2252                                                    
## 2253                                                    
## 2254                                                    
## 2255                                                    
## 2256                                                    
## 2257                                                    
## 2258                                                    
## 2259                                                    
## 2260                                                    
## 2261                                 4001 Carter St Rm 6
## 2262                                         P O Box 790
## 2263                                 4001 Carter St Rm 3
## 2264                                     100 Lincoln Ave
## 2265                                 4001 Carter St Rm 1
## 2266                                 4001 Carter St Rm 1
## 2267                                 4001 Carter St Rm 1
## 2268                                 4001 Carter St Rm 1
## 2269                                 4001 Carter St Rm 1
## 2270                                 4001 Carter St Rm 1
## 2271                                 4001 Carter St Rm 1
## 2272                                 4001 Carter St Rm 1
## 2273                                 4001 Carter St Rm 1
## 2274                                        409 Texas St
## 2275                                        409 Texas St
## 2276                                         P O Box 950
## 2277                                         P O Box 950
## 2278                                         P O Box 950
## 2279                                         P O Box 950
## 2280                                         P O Box 950
## 2281                                         P O Box 950
## 2282                                         P O Box 950
## 2283                                         P O Box 950
## 2284                                         P O Box 950
## 2285                                        P O Box 1014
## 2286                                         207 Pine St
## 2287                                       1207 Peach St
## 2288                                  1198 Fishermans Dr
## 2289                                   5448 Dunbarton Rd
## 2290                                        8878 Hwy 129
## 2291                                    263 Concordia Dr
## 2292                                    200 South Oak St
## 2293                                        1104 Plum St
## 2294                                        391 Belle Gr
## 2295                                   3211 Dunbarton Rd
## 2296                                       10085 Hwy 129
## 2297                                         P O Box 277
## 2298                                      1116 Second St
## 2299                                       116 Foster Dr
## 2300                                        P O Box 2010
## 2301                                         P O Box 277
## 2302                                       116 Foster Dr
## 2303                                        P O Box 2010
## 2304                                        P O Box 2010
## 2305                                        P O Box 2010
## 2306                                        P O Box 2010
## 2307                                        P O Box 2010
## 2308                                        P O Box 2010
## 2309                                      1116 Second St
## 2310                                      1116 Second St
## 2311                                      1116 Second St
## 2312                                      1116 Second St
## 2313                                      1116 Second St
## 2314                                         P O Box 277
## 2315                                         P O Box 277
## 2316                                         P O Box 277
## 2317                                         P O Box 277
## 2318                                         P O Box 277
## 2319                                       116 Foster Dr
## 2320                                       116 Foster Dr
## 2321                                       116 Foster Dr
## 2322                                       116 Foster Dr
## 2323                                       116 Foster Dr
## 2324                                                    
## 2325                                                    
## 2326                                                    
## 2327                                                    
## 2328                                                    
## 2329                                                    
## 2330                                                    
## 2331                                                    
## 2332                                                    
## 2333                                                    
## 2334                                                    
## 2335                                                    
## 2336                                                    
## 2337                                                    
## 2338                                                    
## 2339                                                    
## 2340                                                    
## 2341                                                    
## 2342                                                    
## 2343                                                    
## 2344                                                    
## 2345                                                    
## 2346                                                    
## 2347                                                    
## 2348                                                    
## 2349                                     205 Franklin St
## 2350                                        P O Box 1206
## 2351                                        212 Adams St
## 2352                                          PO Box 899
## 2353                                         P O Box 898
## 2354                                         P O Box 898
## 2355                                         P O Box 898
## 2356                                         P O Box 898
## 2357                                         P O Box 898
## 2358                                         P O Box 898
## 2359                                         P O Box 898
## 2360                                         P O Box 898
## 2361                                         P O Box 898
## 2362                                         P O Box 898
## 2363                                         P O Box 898
## 2364                                       201 Crosby St
## 2365                                       201 Crosby St
## 2366                                       201 Crosby St
## 2367                                       201 Crosby St
## 2368                                       201 Crosby St
## 2369                                       201 Crosby St
## 2370                                       201 Crosby St
## 2371                                       201 Crosby St
## 2372                                       201 Crosby St
## 2373                                       201 Crosby St
## 2374                                       201 Crosby St
## 2375                                        182 Helen Ln
## 2376                                        1801 Hwy 171
## 2377                                       382 Marian Ln
## 2378                                2286 S Washington St
## 2379                                         854 Hwy 346
## 2380                                           808 Hwy 5
## 2381                                  379 Belle Bower Rd
## 2382                                   3310 Red Bluff Rd
## 2383                                        1005 Hwy 763
## 2384                                        904 Susan St
## 2385                                     191 Davidson Rd
## 2386                                         678 Horn Rd
## 2387                                         P O Box 773
## 2388                                       P O Drawer 10
## 2389                                         P O Box 400
## 2390                                          P O Box 92
## 2391                                          P O Box 82
## 2392                                        P O Box 3130
## 2393                                         P O Box 995
## 2394                                        13595 Hwy 84
## 2395                                        13595 Hwy 84
## 2396                                          P O Box 92
## 2397                                        13595 Hwy 84
## 2398                                        13595 Hwy 84
## 2399                                         P O Box 773
## 2400                                         P O Box 773
## 2401                                         P O Box 773
## 2402                                         P O Box 773
## 2403                                         P O Box 773
## 2404                                          P O Box 82
## 2405                                          P O Box 82
## 2406                                          P O Box 82
## 2407                                         P O Box 995
## 2408                                         P O Box 995
## 2409                                         P O Box 995
## 2410                                        13595 Hwy 84
## 2411                                        13595 Hwy 84
## 2412                                        13595 Hwy 84
## 2413                                        13595 Hwy 84
## 2414                                        13595 Hwy 84
## 2415                                        13595 Hwy 84
## 2416                                         P O Box 400
## 2417                                         P O Box 400
## 2418                                         P O Box 400
## 2419                                         P O Box 400
## 2420                                         P O Box 400
## 2421                                          P O Box 92
## 2422                                          P O Box 92
## 2423                                          P O Box 92
## 2424                                          P O Box 92
## 2425                                          P O Box 92
## 2426                                        P O Box 3130
## 2427                                        P O Box 3130
## 2428                                        P O Box 3130
## 2429                                       P O Drawer 10
## 2430                                       P O Drawer 10
## 2431                                       P O Drawer 10
## 2432                                       P O Drawer 10
## 2433                                       P O Drawer 10
## 2434                                                    
## 2435                                                    
## 2436                                                    
## 2437                                                    
## 2438                                                    
## 2439                                                    
## 2440                                                    
## 2441                                                    
## 2442                                                    
## 2443                                                    
## 2444                                                    
## 2445                                                    
## 2446                                                    
## 2447                                                    
## 2448                                                    
## 2449                                                    
## 2450                                                    
## 2451                                                    
## 2452                                                    
## 2453                                                    
## 2454                                                    
## 2455                                                    
## 2456                                                    
## 2457                                                    
## 2458                                                    
## 2459                                                    
## 2460                                                    
## 2461                                                    
## 2462                                                    
## 2463                                                    
## 2464                                                    
## 2465                                                    
## 2466                                                    
## 2467                                                    
## 2468                         8333 Veterans Memorial Blvd
## 2469                         8333 Veterans Memorial Blvd
## 2470                                     222 St Louis St
## 2471                                     222 St Louis St
## 2472                                     222 St Louis St
## 2473                                     222 St Louis St
## 2474                                        P O Box 3277
## 2475                                        P O Box 1991
## 2476                              222 St Louis St Rm 126
## 2477                                 4030 TB Herndon Ave
## 2478                                        222 St Louis
## 2479                                 222 St Louis Street
## 2480                                 222 St Louis Street
## 2481                                 222 St Louis Street
## 2482                                 222 St Louis Street
## 2483                                 222 St Louis Street
## 2484                                 222 St Louis Street
## 2485                                 222 St Louis Street
## 2486                                 222 St Louis Street
## 2487                                 222 St Louis Street
## 2488                                 222 St Louis Street
## 2489                                 222 St Louis Street
## 2490                                 222 St Louis Street
## 2491                                           P O Box 1
## 2492                                         P O Box 310
## 2493                                        P O Box 3438
## 2494                                        P O Box 3438
## 2495                                        P O Box 3438
## 2496                                        P O Box 3438
## 2497                                        P O Box 3438
## 2498                                        P O Box 3438
## 2499                      Zachary Community School Board
## 2500                                        4656 Main St
## 2501                                        4656 Main St
## 2502                                        4656 Main St
## 2503                                        4656 Main St
## 2504                                        4656 Main St
## 2505                                        4656 Main St
## 2506                                        4656 Main St
## 2507                                        4656 Main St
## 2508                                    1050 S Foster Dr
## 2509                      Central Community School Board
## 2510                                3033B Ray Weiland Dr
## 2511                                         PO Box 2950
## 2512                                                    
## 2513                                3033B Ray Weiland Dr
## 2514                                         PO Box 2950
## 2515                                                    
## 2516                                3033B Ray Weiland Dr
## 2517                                         PO Box 2950
## 2518                                                    
## 2519                                3033B Ray Weiland Dr
## 2520                                         PO Box 2950
## 2521                                                    
## 2522                                3033B Ray Weiland Dr
## 2523                                         PO Box 2950
## 2524                                                    
## 2525                                         PO Box 2950
## 2526                                                    
## 2527                                         PO Box 2950
## 2528                                         PO Box 2950
## 2529                                         PO Box 2950
## 2530                                         PO Box 2950
## 2531                                                    
## 2532                                                    
## 2533                                                    
## 2534                                                    
## 2535                                                    
## 2536                                                    
## 2537                                 18523 Arbor Oak Ave
## 2538                                      7970 McHost Rd
## 2539                                        PO Box 75431
## 2540                                 14786 Bon Dickey Dr
## 2541                                 3777 Jones Creek Rd
## 2542                                  16612 Autumn Ridge
## 2543                                         P O Box 707
## 2544                               13421 Hooper Rd Ste 9
## 2545                                          PO Box 310
## 2546                                         P O Box 707
## 2547                                  9339 Sullivan Road
## 2548                                          PO Box 310
## 2549                                  9339 Sullivan Road
## 2550                                  9339 Sullivan Road
## 2551                                  9339 Sullivan Road
## 2552                                  9339 Sullivan Road
## 2553                                  9339 Sullivan Road
## 2554                                         P O Box 707
## 2555                                                    
## 2556                                         P O Box 707
## 2557                                                    
## 2558                                         P O Box 707
## 2559                                                    
## 2560                                         P O Box 707
## 2561                                         P O Box 707
## 2562                                                    
## 2563                                         P O Box 707
## 2564                                                    
## 2565                                                    
## 2566                                                    
## 2567                                                    
## 2568                                                    
## 2569                                                    
## 2570                                                    
## 2571                                                    
## 2572                                                    
## 2573                                                    
## 2574                                                    
## 2575                                                    
## 2576                                                    
## 2577                                                    
## 2578                                                    
## 2579                                                    
## 2580                                                    
## 2581                                                    
## 2582                                                    
## 2583                                                    
## 2584                                                    
## 2585                                          PO Box 246
## 2586                                        400 First St
## 2587                                  400 First St Rm 10
## 2588                                          PO Box 632
## 2589                                        400 First St
## 2590                                        400 First St
## 2591                                        400 First St
## 2592                                        400 First St
## 2593                                        400 First St
## 2594                                        514 Third St
## 2595                                         P O Box 792
## 2596                                         P O Box 792
## 2597                                         P O Box 792
## 2598                                         P O Box 792
## 2599                                         P O Box 792
## 2600                                         P O Box 792
## 2601                                         P O Box 792
## 2602                                         P O Box 792
## 2603                                1896 Island Point Dr
## 2604                                        59 Artaud St
## 2605                                      201 Sparrow St
## 2606                                      201 Sparrow St
## 2607                                      201 Sparrow St
## 2608                                      201 Sparrow St
## 2609                                      201 Sparrow St
## 2610                                      201 Sparrow St
## 2611                                      201 Sparrow St
## 2612                                                    
## 2613                                                    
## 2614                                                    
## 2615                                                    
## 2616                                                    
## 2617                                                    
## 2618                                                    
## 2619                                                    
## 2620                                                    
## 2621                                                    
## 2622                                                    
## 2623                                                    
## 2624                                                    
## 2625                                                    
## 2626                                                    
## 2627                                                    
## 2628                                                    
## 2629                                                    
## 2630                                                    
## 2631                                                    
## 2632                                         P O Box 207
## 2633                                      P O Drawer 599
## 2634                                         P O Box 263
## 2635                                         PO Box 8419
## 2636                                         P O Box 427
## 2637                                         P O Box 427
## 2638                                         P O Box 427
## 2639                                         P O Box 427
## 2640                                         P O Box 427
## 2641                                         P O Box 427
## 2642                                         P O Box 427
## 2643                                         P O Box 427
## 2644                                         P O Box 427
## 2645                                         P O Box 397
## 2646                                         P O Box 397
## 2647                                         P O Box 397
## 2648                                         P O Box 397
## 2649                                         P O Box 397
## 2650                                         P O Box 397
## 2651                                         P O Box 397
## 2652                                         P O Box 397
## 2653                                         P O Box 397
## 2654                                         P O Box 397
## 2655                                         P O Box 397
## 2656                                         P O Box 397
## 2657                                         5501 Hwy 19
## 2658                                         P O Box 189
## 2659                                         P O Box 245
## 2660                                        P O Box 8681
## 2661                                          PO Box 217
## 2662                                       7713 Brown Ln
## 2663                                          PO Box 351
## 2664                                         PO Box 8681
## 2665                                         P O Box 513
## 2666                                        P O Box 1150
## 2667                                           PO Box 29
## 2668                                         P O Box 249
## 2669                                          P O Box 40
## 2670                                           PO Box 29
## 2671                                         PO Box 1150
## 2672                                         P O Box 513
## 2673                                         P O Box 513
## 2674                                         P O Box 513
## 2675                                         P O Box 513
## 2676                                         P O Box 513
## 2677                                           PO Box 29
## 2678                                           PO Box 29
## 2679                                           PO Box 29
## 2680                                           PO Box 29
## 2681                                           PO Box 29
## 2682                                         P O Box 249
## 2683                                         P O Box 249
## 2684                                         P O Box 249
## 2685                                          P O Box 40
## 2686                                          P O Box 40
## 2687                                          P O Box 40
## 2688                                          P O Box 40
## 2689                                          P O Box 40
## 2690                                          P O Box 40
## 2691                                        P O Box 1150
## 2692                                        P O Box 1150
## 2693                                        P O Box 1150
## 2694                                        P O Box 1150
## 2695                                        P O Box 1150
## 2696                                                    
## 2697                                                    
## 2698                                                    
## 2699                                                    
## 2700                                                    
## 2701                                                    
## 2702                                                    
## 2703                                                    
## 2704                                                    
## 2705                                                    
## 2706                                                    
## 2707                                                    
## 2708                                                    
## 2709                                                    
## 2710                                                    
## 2711                                                    
## 2712                                                    
## 2713                                                    
## 2714                                                    
## 2715                                                    
## 2716                                                    
## 2717                                                    
## 2718                                                    
## 2719                                                    
## 2720                                                    
## 2721                                200 Court St Ste 100
## 2722                                      P O Drawer 347
## 2723                                200 Court St Ste 103
## 2724                                       PO Drawer 510
## 2725                                200 Court St Ste 207
## 2726                                200 Court St Ste 207
## 2727                                200 Court St Ste 207
## 2728                                200 Court St Ste 207
## 2729                                200 Court St Ste 207
## 2730                                200 Court St Ste 207
## 2731                                200 Court St Ste 207
## 2732                                200 Court St Ste 207
## 2733                                200 Court St Ste 207
## 2734                                         P O Box 147
## 2735                                         P O Box 147
## 2736                                    1123 Te Mamou Rd
## 2737                                    1123 Te Mamou Rd
## 2738                                    1123 Te Mamou Rd
## 2739                                    1123 Te Mamou Rd
## 2740                                    1123 Te Mamou Rd
## 2741                                    1123 Te Mamou Rd
## 2742                                    1123 Te Mamou Rd
## 2743                                    1123 Te Mamou Rd
## 2744                                    1123 Te Mamou Rd
## 2745                                    1123 Te Mamou Rd
## 2746                                    1123 Te Mamou Rd
## 2747                                    1123 Te Mamou Rd
## 2748                                    1123 Te Mamou Rd
## 2749                                         P O Box 729
## 2750                                         P O Box 729
## 2751                                      1027 Ferdie Rd
## 2752                                         P O Box 217
## 2753                                      1042 Robken Rd
## 2754                                           PO Box 66
## 2755                                           PO Box 66
## 2756                                           PO Box 17
## 2757                                     1197 Pioneer Rd
## 2758                                     1220 Melissa Ln
## 2759                                         P O Box 390
## 2760                                         P O Box 490
## 2761                                          P O Box 70
## 2762                                         P O Box 380
## 2763                                          P O Box 98
## 2764                                         P O Box 390
## 2765                                         P O Box 490
## 2766                                          P O Box 70
## 2767                                         P O Box 380
## 2768                                          P O Box 98
## 2769                                                    
## 2770                                         P O Box 490
## 2771                                         P O Box 490
## 2772                                         P O Box 490
## 2773                                         P O Box 490
## 2774                                         P O Box 390
## 2775                                         P O Box 390
## 2776                                         P O Box 390
## 2777                                         P O Box 390
## 2778                                         P O Box 390
## 2779                                         P O Box 390
## 2780                                          P O Box 70
## 2781                                          P O Box 70
## 2782                                          P O Box 70
## 2783                                         P O Box 380
## 2784                                         P O Box 380
## 2785                                         P O Box 380
## 2786                                          P O Box 98
## 2787                                          P O Box 98
## 2788                                          P O Box 98
## 2789                                                    
## 2790                                                    
## 2791                                                    
## 2792                                                    
## 2793                                                    
## 2794                                                    
## 2795                                                    
## 2796                                                    
## 2797                                                    
## 2798                                                    
## 2799                                                    
## 2800                                                    
## 2801                                                    
## 2802                                                    
## 2803                                                    
## 2804                                                    
## 2805                                                    
## 2806                                                    
## 2807                                                    
## 2808                                                    
## 2809                                                    
## 2810                                                    
## 2811                                        6556 Main St
## 2812                                        P O Box 1564
## 2813                                        6552 Main St
## 2814                                         PO Box 1350
## 2815                                        6558 Main St
## 2816                                        6558 Main St
## 2817                                        6558 Main St
## 2818                                        6558 Main St
## 2819                                        6558 Main St
## 2820                                        6558 Main St
## 2821                                        6558 Main St
## 2822                                     1308 Cornell St
## 2823                                     1308 Cornell St
## 2824                                     7293 Prairie Rd
## 2825                                     7293 Prairie Rd
## 2826                                     7293 Prairie Rd
## 2827                                     7293 Prairie Rd
## 2828                                     7293 Prairie Rd
## 2829                                     7293 Prairie Rd
## 2830                                     7293 Prairie Rd
## 2831                                         1971 WPA Rd
## 2832                                 171 Arvel Linder Rd
## 2833                                    140 Glynn Day Rd
## 2834                                        271 First St
## 2835                                         P O Box 929
## 2836                                 404 Blue Roberts Rd
## 2837                                         992 Hwy 135
## 2838                                           PO Box 22
## 2839                                 192 Dobber Glass Rd
## 2840                                          PO Box 274
## 2841                                          PO Box 491
## 2842                                          PO Box 661
## 2843                                 404 Blue Roberts Rd
## 2844                                        1814 Hwy 135
## 2845                                          PO Box 250
## 2846                                          PO Box 290
## 2847                                         P O Box 359
## 2848                                         P O Box 600
## 2849                                          PO Box 250
## 2850                                          PO Box 290
## 2851                                         P O Box 359
## 2852                                         P O Box 600
## 2853                                          PO Box 290
## 2854                                          PO Box 290
## 2855                                          PO Box 290
## 2856                                          PO Box 290
## 2857                                          PO Box 290
## 2858                                         P O Box 359
## 2859                                         P O Box 359
## 2860                                         P O Box 359
## 2861                                         P O Box 600
## 2862                                         P O Box 600
## 2863                                         P O Box 600
## 2864                                          PO Box 250
## 2865                                          PO Box 250
## 2866                                          PO Box 250
## 2867                                          PO Box 250
## 2868                                          PO Box 250
## 2869                                                    
## 2870                                                    
## 2871                                                    
## 2872                                                    
## 2873                                                    
## 2874                                                    
## 2875                                                    
## 2876                                                    
## 2877                                                    
## 2878                                                    
## 2879                                                    
## 2880                                                    
## 2881                                                    
## 2882                                                    
## 2883                                                    
## 2884                                                    
## 2885                                                    
## 2886                                                    
## 2887                                                    
## 2888                                         P O Box 187
## 2889                                         P O Box 263
## 2890                                         200 Main St
## 2891                                          PO Box 399
## 2892                                     200 Main Street
## 2893                                     200 Main Street
## 2894                                     200 Main Street
## 2895                                     200 Main Street
## 2896                                     200 Main Street
## 2897                                     200 Main Street
## 2898                                     200 Main Street
## 2899                                     200 Main Street
## 2900                                         P O Box 208
## 2901                                         P O Box 208
## 2902                                         P O Box 208
## 2903                                         P O Box 208
## 2904                                         P O Box 208
## 2905                                         P O Box 208
## 2906                                         P O Box 208
## 2907                                         P O Box 208
## 2908                                         962 Hwy 122
## 2909                                         12220 Hwy 8
## 2910                                       21139 Hwy 167
## 2911                                         P O Box 610
## 2912                                        3540 Hwy 472
## 2913                                          PO Box 356
## 2914                                          PO Box 638
## 2915                                         154 AJ's Ln
## 2916                                   141 Wainwright Rd
## 2917                                     1177 Willett Rd
## 2918                                         P O Box 310
## 2919                                          P O Box 99
## 2920                                         P O Box 189
## 2921                                 241 Gray's Creek Rd
## 2922                              607 Russell Hataway St
## 2923                                         P O Box 220
## 2924                                         P O Box 189
## 2925                                 241 Gray's Creek Rd
## 2926                                         P O Box 220
## 2927                                         P O Box 310
## 2928                                         P O Box 310
## 2929                                         P O Box 310
## 2930                                         P O Box 310
## 2931                                         P O Box 310
## 2932                                 241 Gray's Creek Rd
## 2933                                 241 Gray's Creek Rd
## 2934                                 241 Gray's Creek Rd
## 2935                              607 Russell Hataway St
## 2936                              607 Russell Hataway St
## 2937                              607 Russell Hataway St
## 2938                                         P O Box 220
## 2939                                         P O Box 220
## 2940                                         P O Box 220
## 2941                                          P O Box 99
## 2942                                          P O Box 99
## 2943                                          P O Box 99
## 2944                                          P O Box 99
## 2945                                          P O Box 99
## 2946                                         P O Box 189
## 2947                                         P O Box 189
## 2948                                         P O Box 189
## 2949                                         P O Box 189
## 2950                                         P O Box 189
## 2951                                                    
## 2952                                                    
## 2953                                                    
## 2954                                                    
## 2955                                                    
## 2956                                                    
## 2957                                                    
## 2958                                                    
## 2959                                                    
## 2960                                                    
## 2961                                                    
## 2962                                                    
## 2963                                                    
## 2964                                                    
## 2965                                                    
## 2966                                                    
## 2967                                                    
## 2968                                                    
## 2969                                                    
## 2970                                                    
## 2971                                                    
## 2972                                                    
## 2973                                                    
## 2974                                                    
## 2975                                                    
## 2976                                                    
## 2977                                                    
## 2978                                                    
## 2979                                                    
## 2980                                                    
## 2981                                                    
## 2982                                                    
## 2983                                                    
## 2984                               300 Iberia St Ste 120
## 2985                                    P O Drawer 12010
## 2986                              300 Iberia St Ste B100
## 2987                                          PO Box 590
## 2988                               300 Iberia St Ste 410
## 2989                               300 Iberia St Ste 410
## 2990                               300 Iberia St Ste 410
## 2991                               300 Iberia St Ste 410
## 2992                               300 Iberia St Ste 410
## 2993                               300 Iberia St Ste 410
## 2994                               300 Iberia St Ste 410
## 2995                               300 Iberia St Ste 410
## 2996                               300 Iberia St Ste 410
## 2997                               300 Iberia St Ste 410
## 2998                               300 Iberia St Ste 410
## 2999                               300 Iberia St Ste 410
## 3000                               300 Iberia St Ste 410
## 3001                               300 Iberia St Ste 410
## 3002                               300 Iberia St Ste 410
## 3003                                         P O Box 268
## 3004                                457 E Main St Rm 206
## 3005                                         P O Box 268
## 3006                                457 E Main St Rm 206
## 3007                                         P O Box 200
## 3008                                         P O Box 200
## 3009                                         P O Box 200
## 3010                                         P O Box 200
## 3011                                         P O Box 200
## 3012                                         P O Box 200
## 3013                                         P O Box 200
## 3014                                         P O Box 200
## 3015                                         P O Box 200
## 3016                                         P O Box 200
## 3017                                         P O Box 200
## 3018                                         P O Box 200
## 3019                                         P O Box 200
## 3020                                         P O Box 200
## 3021                                       114 Migues Rd
## 3022                                      4918 Freyou Rd
## 3023                                 5201 Loreauville Rd
## 3024                                      7708 Coteau Rd
## 3025                                      5018 Freyou Rd
## 3026                                 7512 Loreauville Rd
## 3027                                         P O Box 209
## 3028                                457 E Main St Ste300
## 3029                                         P O Box 336
## 3030                                         P O Box 209
## 3031                                457 E Main St Ste300
## 3032                                         P O Box 336
## 3033                                         P O Box 336
## 3034                                         P O Box 336
## 3035                                         P O Box 209
## 3036                                         P O Box 209
## 3037                                         P O Box 209
## 3038                                         P O Box 209
## 3039                                457 E Main St Ste300
## 3040                                457 E Main St Ste300
## 3041                                457 E Main St Ste300
## 3042                                457 E Main St Ste300
## 3043                                457 E Main St Ste300
## 3044                                457 E Main St Ste300
## 3045                                                    
## 3046                                                    
## 3047                                                    
## 3048                                                    
## 3049                                                    
## 3050                                                    
## 3051                                                    
## 3052                                                    
## 3053                                                    
## 3054                                                    
## 3055                                                    
## 3056                                                    
## 3057                                                    
## 3058                                                    
## 3059                                                    
## 3060                                                    
## 3061                                                    
## 3062                                                    
## 3063                                                    
## 3064                                                    
## 3065                                                    
## 3066                                                    
## 3067                                                    
## 3068                                                    
## 3069                                                    
## 3070                                                    
## 3071                                                    
## 3072                                                    
## 3073                                                    
## 3074                                         P O Box 231
## 3075                                         P O Box 423
## 3076                                     58050 Meriam St
## 3077                                   58038 Fort Street
## 3078                                          PO Box 389
## 3079                                         P O Box 389
## 3080                                         P O Box 389
## 3081                                         P O Box 389
## 3082                                         P O Box 389
## 3083                                         P O Box 389
## 3084                                         P O Box 389
## 3085                                         P O Box 389
## 3086                                         P O Box 389
## 3087                                         P O Box 389
## 3088                                         P O Box 389
## 3089                                         P O Box 389
## 3090                                         P O Box 389
## 3091                                         P O Box 389
## 3092                                        P O Box 1017
## 3093                                        P O Box 1017
## 3094                                         P O Box 151
## 3095                                         P O Box 151
## 3096                                         P O Box 151
## 3097                                         P O Box 151
## 3098                                         P O Box 151
## 3099                                         P O Box 151
## 3100                                         P O Box 151
## 3101                                         P O Box 151
## 3102                                         P O Box 151
## 3103                                         P O Box 151
## 3104                                         P O Box 151
## 3105                                         P O Box 151
## 3106                                         P O Box 151
## 3107                                         P O Box 151
## 3108                                         P O Box 151
## 3109                                      34000 Bowie St
## 3110                                          P O Box 35
## 3111                                  24100 Sebastian St
## 3112                                        P O Box 1272
## 3113                                  25245 Patreau Lane
## 3114                                          PO Box 703
## 3115                                      58720 Hymel St
## 3116                                          PO Box 542
## 3117                                     59055 Darby Ave
## 3118                                       23462 Eden St
## 3119                                       66285 Spur 75
## 3120                                        21655 Hwy 77
## 3121                                         P O Box 675
## 3122                                   5035 Iberville St
## 3123                                          P O Box 10
## 3124                                         P O Box 488
## 3125                                          P O Box 98
## 3126                                         P O Box 167
## 3127                                         P O Box 675
## 3128                                   5035 Iberville St
## 3129                                          P O Box 10
## 3130                                         P O Box 488
## 3131                                          P O Box 98
## 3132                                         P O Box 167
## 3133                                         P O Box 167
## 3134                                         P O Box 167
## 3135                                         P O Box 167
## 3136                                          P O Box 10
## 3137                                          P O Box 10
## 3138                                          P O Box 10
## 3139                                          P O Box 10
## 3140                                          P O Box 10
## 3141                                         P O Box 488
## 3142                                         P O Box 488
## 3143                                         P O Box 488
## 3144                                         P O Box 488
## 3145                                         P O Box 488
## 3146                                          P O Box 98
## 3147                                          P O Box 98
## 3148                                          P O Box 98
## 3149                                         P O Box 389
## 3150                                         P O Box 389
## 3151                                         P O Box 389
## 3152                                         P O Box 389
## 3153                                         P O Box 389
## 3154                                         P O Box 675
## 3155                                         P O Box 675
## 3156                                         P O Box 675
## 3157                                         P O Box 675
## 3158                                         P O Box 675
## 3159                                         P O Box 675
## 3160                                                    
## 3161                                                    
## 3162                                                    
## 3163                                                    
## 3164                                                    
## 3165                                                    
## 3166                                                    
## 3167                                                    
## 3168                                                    
## 3169                                                    
## 3170                                                    
## 3171                                                    
## 3172                                                    
## 3173                                                    
## 3174                                                    
## 3175                                                    
## 3176                               500 E Court St Rm 100
## 3177                                         P O Box 730
## 3178                                  500 E Court Rm 101
## 3179                                         236 Hwy 505
## 3180                        500 East Court Street Rm 301
## 3181                        500 East Court Street Rm 301
## 3182                        500 East Court Street Rm 301
## 3183                        500 East Court Street Rm 301
## 3184                        500 East Court Street Rm 301
## 3185                        500 East Court Street Rm 301
## 3186                        500 East Court Street Rm 301
## 3187                                         P O Box 705
## 3188                                         P O Box 705
## 3189                                         P O Box 705
## 3190                                         P O Box 705
## 3191                                         P O Box 705
## 3192                                         P O Box 705
## 3193                                         P O Box 705
## 3194                                       884 N Antioch
## 3195                                       1138 Rosco Rd
## 3196                                         P O Box 148
## 3197                                         P O Box 880
## 3198                                       227 Talbot St
## 3199                               6126 Beech Springs Rd
## 3200                                 2037 Vernon Eros Rd
## 3201                                          PO Box 148
## 3202                                         210 Jan Cir
## 3203                                       1200 Maple St
## 3204                                           P O Box 7
## 3205                                      P O Drawer 200
## 3206                                         P O Box 610
## 3207                                       P O Drawer 10
## 3208                                      P O Drawer 280
## 3209                                         P O Box 520
## 3210                                          P O Box 35
## 3211                                           P O Box 7
## 3212                                         P O Box 200
## 3213                                         P O Box 610
## 3214                                       P O Drawer 10
## 3215                                      P O Drawer 280
## 3216                                         P O Box 632
## 3217                                          P O Box 35
## 3218                                                    
## 3219                                         P O Box 610
## 3220                                         P O Box 610
## 3221                                         P O Box 610
## 3222                                         P O Box 610
## 3223                                           P O Box 7
## 3224                                           P O Box 7
## 3225                                           P O Box 7
## 3226                                           P O Box 7
## 3227                                           P O Box 7
## 3228                                         P O Box 200
## 3229                                         P O Box 200
## 3230                                         P O Box 200
## 3231                                       P O Drawer 10
## 3232                                       P O Drawer 10
## 3233                                       P O Drawer 10
## 3234                                      P O Drawer 280
## 3235                                      P O Drawer 280
## 3236                                      P O Drawer 280
## 3237                                         P O Box 632
## 3238                                         P O Box 632
## 3239                                         P O Box 632
## 3240                                          P O Box 35
## 3241                                          P O Box 35
## 3242                                          P O Box 35
## 3243                                                    
## 3244                                                    
## 3245                                                    
## 3246                                                    
## 3247                                                    
## 3248                                                    
## 3249                                                    
## 3250                                                    
## 3251                                                    
## 3252                                                    
## 3253                                                    
## 3254                                                    
## 3255                                                    
## 3256                                                    
## 3257                                                    
## 3258                                                    
## 3259                                                    
## 3260                                                    
## 3261                                                    
## 3262                                                    
## 3263                                                    
## 3264                                                    
## 3265                                                    
## 3266                                                    
## 3267                                                    
## 3268                                                    
## 3269                                                    
## 3270                                                    
## 3271                                                    
## 3272                                                    
## 3273                                                    
## 3274                                                    
## 3275                                                    
## 3276                                                    
## 3277                                                    
## 3278                                                    
## 3279                                                    
## 3280                                                    
## 3281                                                    
## 3282                                                    
## 3283                                                    
## 3284                                                    
## 3285                                                    
## 3286                                                    
## 3287                                                    
## 3288                                                    
## 3289                                                    
## 3290                                                    
## 3291                                                    
## 3292                                                    
## 3293                                                    
## 3294                                        924 David Dr
## 3295                                        924 David Dr
## 3296                                 100 Huey P Long Ave
## 3297                                 100 Huey P Long Ave
## 3298                                        P O Box 1900
## 3299                                        P O Box 1900
## 3300                                        P O Box 1900
## 3301                                         P O Box 327
## 3302                                          P O Box 10
## 3303                               200 Derbigny Ste 1100
## 3304                                     2018 8th Street
## 3305                                            PO Box 9
## 3306                                           P O Box 9
## 3307                                           P O Box 9
## 3308                                           P O Box 9
## 3309                                           P O Box 9
## 3310                                           P O Box 9
## 3311                                           P O Box 9
## 3312                                           P O Box 9
## 3313                                 1901 Manhattan Blvd
## 3314                                     4600 River Road
## 3315                                     4600 River Road
## 3316                                     4600 River Road
## 3317                                     4600 River Road
## 3318                                     4600 River Road
## 3319                                     4600 River Road
## 3320                                     4600 River Road
## 3321                                     4600 River Road
## 3322                                      941 Marlene Dr
## 3323                                  2701 Cedar Lawn Dr
## 3324                                         P O Box 444
## 3325                                         P O Box 812
## 3326                                    2111 Harvard Ave
## 3327                                      3016 Texas Ave
## 3328                                       405 George St
## 3329                                    9014 Rousseau St
## 3330                                      1809 Cooper Rd
## 3331                                    31 Shadows Court
## 3332                                 2884 Privateer Blvd
## 3333                                          PO Box 356
## 3334                                     212 Atherton Dr
## 3335                                       312 Sophia St
## 3336                              105 Prairie View Court
## 3337                                     3139 Augusta St
## 3338                                         P O Box 404
## 3339                                  6437 Jefferson Hwy
## 3340                                  1801 Williams Blvd
## 3341                                        419 Avenue A
## 3342                                         P O Box 200
## 3343                              2654 Jean Lafitte Blvd
## 3344                                         P O Box 404
## 3345                                         P O Box 404
## 3346                                  6437 Jefferson Hwy
## 3347                                  1801 Williams Blvd
## 3348                                        419 Avenue A
## 3349                                        419 Avenue A
## 3350                                         P O Box 200
## 3351                                  1801 Williams Blvd
## 3352                                  1801 Williams Blvd
## 3353                                         P O Box 404
## 3354                                         P O Box 404
## 3355                                        419 Avenue A
## 3356                                        419 Avenue A
## 3357                                         P O Box 404
## 3358                                        419 Avenue A
## 3359                                         P O Box 404
## 3360                                        419 Avenue A
## 3361                                         P O Box 404
## 3362                                         P O Box 404
## 3363                                        419 Avenue A
## 3364                                        419 Avenue A
## 3365                                         P O Box 200
## 3366                                         P O Box 200
## 3367                                         P O Box 200
## 3368                                         P O Box 200
## 3369                                         P O Box 200
## 3370                                         P O Box 404
## 3371                                  6437 Jefferson Hwy
## 3372                                  6437 Jefferson Hwy
## 3373                                  6437 Jefferson Hwy
## 3374                                  6437 Jefferson Hwy
## 3375                                  6437 Jefferson Hwy
## 3376                                  1801 Williams Blvd
## 3377                                  1801 Williams Blvd
## 3378                                  1801 Williams Blvd
## 3379                                  1801 Williams Blvd
## 3380                                  1801 Williams Blvd
## 3381                              2654 Jean Lafitte Blvd
## 3382                              2654 Jean Lafitte Blvd
## 3383                              2654 Jean Lafitte Blvd
## 3384                              2654 Jean Lafitte Blvd
## 3385                              2654 Jean Lafitte Blvd
## 3386                                                    
## 3387                                                    
## 3388                                                    
## 3389                                                    
## 3390                                                    
## 3391                                                    
## 3392                                                    
## 3393                                                    
## 3394                                                    
## 3395                                                    
## 3396                                                    
## 3397                                                    
## 3398                                                    
## 3399                                                    
## 3400                                                    
## 3401                                                    
## 3402                                                    
## 3403                                                    
## 3404                                                    
## 3405                                                    
## 3406                                                    
## 3407                                                    
## 3408                                                    
## 3409                                                    
## 3410                                                    
## 3411                                                    
## 3412                                                    
## 3413                                                    
## 3414                                        P O Box 1449
## 3415                                         P O Box 799
## 3416                       Cths Bldg Rm 103 300 State St
## 3417                                     4153 Aaron Road
## 3418                                        P O Box 1409
## 3419                                        P O Box 1409
## 3420                                        P O Box 1409
## 3421                                        P O Box 1409
## 3422                                        P O Box 1409
## 3423                                        P O Box 1409
## 3424                                        P O Box 1409
## 3425                                        P O Box 1409
## 3426                                        P O Box 1409
## 3427                                        P O Box 1409
## 3428                                        P O Box 1409
## 3429                                        P O Box 1409
## 3430                                        P O Box 1409
## 3431                                         P O Box 609
## 3432                                         P O Box 609
## 3433                                         P O Box 640
## 3434                                         P O Box 640
## 3435                                         P O Box 640
## 3436                                         P O Box 640
## 3437                                         P O Box 640
## 3438                                         P O Box 640
## 3439                                         P O Box 640
## 3440                                         P O Box 640
## 3441                                         P O Box 640
## 3442                                         P O Box 640
## 3443                                         P O Box 640
## 3444                                         P O Box 640
## 3445                                         P O Box 640
## 3446                                     413 Kellogg Ave
## 3447                                         P O Box 309
## 3448                                     4325 Luthers Rd
## 3449                                   103 Providence Ln
## 3450                                6075 Grand Marias Rd
## 3451                          21503 Pinehill Cemetery Rd
## 3452                                          PO Box 253
## 3453                                          PO Box 547
## 3454                                    25136 LA Hwy 165
## 3455                                     609 S Dautel St
## 3456                                       6326 Bryan Rd
## 3457                                           PO Box 85
## 3458                                     P O Drawer 1249
## 3459                                          P O Box 27
## 3460                                       P O Drawer AK
## 3461                                         P O Box 786
## 3462                                         P O Box 310
## 3463                                          P O Box 27
## 3464                                       P O Drawer AK
## 3465                                         P O Box 786
## 3466                                                    
## 3467                                         P O Box 786
## 3468                                         P O Box 786
## 3469                                         P O Box 786
## 3470                                         P O Box 786
## 3471                                         P O Box 786
## 3472                                         P O Box 310
## 3473                                         P O Box 310
## 3474                                         P O Box 310
## 3475                                          P O Box 27
## 3476                                          P O Box 27
## 3477                                          P O Box 27
## 3478                                          P O Box 27
## 3479                                          P O Box 27
## 3480                                       P O Drawer AK
## 3481                                       P O Drawer AK
## 3482                                       P O Drawer AK
## 3483                                       P O Drawer AK
## 3484                                       P O Drawer AK
## 3485                                     P O Drawer 1249
## 3486                                     P O Drawer 1249
## 3487                                     P O Drawer 1249
## 3488                                     P O Drawer 1249
## 3489                                     P O Drawer 1249
## 3490                                                    
## 3491                                                    
## 3492                                                    
## 3493                                                    
## 3494                                                    
## 3495                                                    
## 3496                                                    
## 3497                                                    
## 3498                                                    
## 3499                                                    
## 3500                                                    
## 3501                                                    
## 3502                                                    
## 3503                                                    
## 3504                                                    
## 3505                                                    
## 3506                                                    
## 3507                                                    
## 3508                                                    
## 3509                                                    
## 3510                                                    
## 3511                                                    
## 3512                                                    
## 3513                                                    
## 3514                                                    
## 3515                                                    
## 3516                                                    
## 3517                                                    
## 3518                                     P O Drawer 3508
## 3519                                        P O Box 2009
## 3520                                         PO Box 3225
## 3521                                        PO Box 4017C
## 3522                                       P O Box 4017C
## 3523                                       P O Box 4017C
## 3524                                       P O Box 4017C
## 3525                                       P O Box 4017C
## 3526                                       P O Box 4017C
## 3527                                       P O Box 4017C
## 3528                                       P O Box 4017C
## 3529                                       P O Box 4017C
## 3530                                       P O Box 4017C
## 3531                                     P O Drawer 3344
## 3532                                     P O Drawer 3344
## 3533                                     P O Drawer 3344
## 3534                                     P O Drawer 2158
## 3535                                     P O Drawer 2158
## 3536                                     P O Drawer 2158
## 3537                                     P O Drawer 2158
## 3538                                     P O Drawer 2158
## 3539                                     P O Drawer 2158
## 3540                                     P O Drawer 2158
## 3541                                     P O Drawer 2158
## 3542                                     P O Drawer 2158
## 3543                                  310 D Arceneaux Rd
## 3544                                 2306 S Fieldspan Rd
## 3545                                4256 Verot School Rd
## 3546                                        120 Hulin Rd
## 3547                             1019 Hector Connolly Rd
## 3548                             1019 Hector Connolly Rd
## 3549                                2877 Verot School Rd
## 3550                                  516 E Broussard Rd
## 3551                                     120 LA Hwy 89 S
## 3552                                      255 Lormand Rd
## 3553                                     1410 Sellers Rd
## 3554                                         701 Espasie
## 3555                                        122 Hulin Rd
## 3556                                     145 Wagon Trail
## 3557                                     145 Wagon Trail
## 3558                                  1204 Laneuville Rd
## 3559                                      801 Provost St
## 3560                                     129 Nezpique Rd
## 3561                                       P O Drawer 10
## 3562                                         P O Box 517
## 3563                                          PO Box 592
## 3564                                       P O Drawer 10
## 3565                                         P O Box 517
## 3566                                          PO Box 592
## 3567                                                    
## 3568                                       P O Drawer 10
## 3569                                       P O Drawer 10
## 3570                                       P O Drawer 10
## 3571                                       P O Drawer 10
## 3572                                       P O Drawer 10
## 3573                                         P O Box 517
## 3574                                         P O Box 517
## 3575                                         P O Box 517
## 3576                                         P O Box 517
## 3577                                          PO Box 592
## 3578                                          PO Box 592
## 3579                                          PO Box 592
## 3580                                          PO Box 592
## 3581                                          PO Box 592
## 3582                                                    
## 3583                                                    
## 3584                                                    
## 3585                                                    
## 3586                                                    
## 3587                                                    
## 3588                                                    
## 3589                                                    
## 3590                                                    
## 3591                                                    
## 3592                                                    
## 3593                                                    
## 3594                                                    
## 3595                                                    
## 3596                                                    
## 3597                                                    
## 3598                                                    
## 3599                                                    
## 3600                                                    
## 3601                                                    
## 3602                                                    
## 3603                                                    
## 3604                                                    
## 3605                                                    
## 3606                                        P O Box 5608
## 3607                                         P O Box 818
## 3608                                     403 St Louis St
## 3609                                         PO Box 1562
## 3610                                     P O Drawer 5548
## 3611                                     P O Drawer 5548
## 3612                                     P O Drawer 5548
## 3613                                     P O Drawer 5548
## 3614                                     P O Drawer 5548
## 3615                                     P O Drawer 5548
## 3616                                     P O Drawer 5548
## 3617                                     P O Drawer 5548
## 3618                                     P O Drawer 5548
## 3619                                     P O Drawer 5548
## 3620                                         P O Box 568
## 3621                                         P O Box 568
## 3622                                          PO Box 879
## 3623                                          PO Box 879
## 3624                                          PO Box 879
## 3625                                          PO Box 879
## 3626                                          PO Box 879
## 3627                                          PO Box 879
## 3628                                          PO Box 879
## 3629                                          PO Box 879
## 3630                                          PO Box 879
## 3631                                          PO Box 879
## 3632                                          PO Box 879
## 3633                                          PO Box 879
## 3634                                          PO Box 879
## 3635                                          PO Box 879
## 3636                                          PO Box 879
## 3637                                      P O Drawer 490
## 3638                                                    
## 3639                                                    
## 3640                                                    
## 3641                                                    
## 3642                                                    
## 3643                                                    
## 3644                                                    
## 3645                                                    
## 3646                                        820 Oak Lane
## 3647                                       115 Uzee Lane
## 3648                                         P O Box 476
## 3649                                          PO Box 331
## 3650                                         540 Hwy 304
## 3651                                        2514 Hwy 182
## 3652                                        386 Adams St
## 3653                                      108 E 128th St
## 3654                                        P O Box 5418
## 3655                                         P O Box 307
## 3656                                       710 Church St
## 3657                                         P O Box 307
## 3658                                       710 Church St
## 3659                                        P O Box 5418
## 3660                                        P O Box 5418
## 3661                                       710 Church St
## 3662                                       710 Church St
## 3663                                       710 Church St
## 3664                                       710 Church St
## 3665                                       710 Church St
## 3666                                         PO Box 5418
## 3667                                        P O Box 5418
## 3668                                        P O Box 5418
## 3669                                         P O Box 307
## 3670                                         P O Box 307
## 3671                                         P O Box 307
## 3672                                         P O Box 307
## 3673                                         P O Box 307
## 3674                                                    
## 3675                                                    
## 3676                                                    
## 3677                                                    
## 3678                                                    
## 3679                                                    
## 3680                                                    
## 3681                                                    
## 3682                                                    
## 3683                                                    
## 3684                                                    
## 3685                                                    
## 3686                                                    
## 3687                                                    
## 3688                                                    
## 3689                                                    
## 3690                                                    
## 3691                                                    
## 3692                                                    
## 3693                                                    
## 3694                                                    
## 3695                                                    
## 3696                                                    
## 3697                                                    
## 3698                                                    
## 3699                                                    
## 3700                                          P O Box 70
## 3701                                        P O Box 1316
## 3702                                          PO Box 400
## 3703                                         PO Box 1319
## 3704                                        P O Box 1288
## 3705                                        P O Box 1288
## 3706                                        P O Box 1288
## 3707                                        P O Box 1288
## 3708                                        P O Box 1288
## 3709                                        P O Box 1288
## 3710                                        P O Box 1288
## 3711                                        P O Box 1288
## 3712                                        P O Box 1288
## 3713                                        P O Box 1288
## 3714                                       P O Drawer 90
## 3715                                       P O Drawer 90
## 3716                                       P O Drawer 90
## 3717                                       P O Drawer 90
## 3718                                       P O Drawer 90
## 3719                                       P O Drawer 90
## 3720                                       P O Drawer 90
## 3721                                       P O Drawer 90
## 3722                                       P O Drawer 90
## 3723                                       P O Drawer 90
## 3724                                         P O Box 333
## 3725                                         P O Box 196
## 3726                                         P O Box 490
## 3727                                        P O Box 1415
## 3728                                       9632 Hwy 84 E
## 3729                                      660 LA Hwy 459
## 3730                                      1607 Taylor St
## 3731                                         PO Box 1048
## 3732                                          PO Box 442
## 3733                                  1775 W Bradford St
## 3734                                          P O Box 26
## 3735                                         P O Box 223
## 3736                                         P O Box 749
## 3737                                         P O Box 339
## 3738                                          P O Box 26
## 3739                                         P O Box 223
## 3740                                         P O Box 749
## 3741                                         P O Box 339
## 3742                                         P O Box 223
## 3743                                         P O Box 223
## 3744                                         P O Box 223
## 3745                                         P O Box 223
## 3746                                         P O Box 223
## 3747                                         P O Box 749
## 3748                                         P O Box 749
## 3749                                         P O Box 749
## 3750                                         P O Box 749
## 3751                                         P O Box 749
## 3752                                         P O Box 339
## 3753                                         P O Box 339
## 3754                                         P O Box 339
## 3755                                         P O Box 339
## 3756                                         P O Box 339
## 3757                                          P O Box 26
## 3758                                          P O Box 26
## 3759                                          P O Box 26
## 3760                                          P O Box 26
## 3761                                          P O Box 26
## 3762                                                    
## 3763                                                    
## 3764                                                    
## 3765                                                    
## 3766                                                    
## 3767                                                    
## 3768                                                    
## 3769                                                    
## 3770                                                    
## 3771                                                    
## 3772                                                    
## 3773                                                    
## 3774                                                    
## 3775                                                    
## 3776                                                    
## 3777                                                    
## 3778                                                    
## 3779                                                    
## 3780                                                    
## 3781                                                    
## 3782                                                    
## 3783                                                    
## 3784                                                    
## 3785                                                    
## 3786                                                    
## 3787                                                    
## 3788                                                    
## 3789                                                    
## 3790                                                    
## 3791                                                    
## 3792                                        P O Box 2070
## 3793                                         P O Box 924
## 3794                                         PO Box 1218
## 3795                              411 EVaughn AveSte 105
## 3796                                         P O Box 979
## 3797                                         P O Box 979
## 3798                                         P O Box 979
## 3799                                         P O Box 979
## 3800                                         P O Box 979
## 3801                                         P O Box 979
## 3802                                         P O Box 979
## 3803                                         P O Box 979
## 3804                                         P O Box 979
## 3805                                         P O Box 979
## 3806                                         P O Box 979
## 3807                                         P O Box 979
## 3808                                        P O Box 1821
## 3809                                        P O Box 1821
## 3810                                410 S Farmerville St
## 3811                                410 S Farmerville St
## 3812                                410 S Farmerville St
## 3813                                410 S Farmerville St
## 3814                                410 S Farmerville St
## 3815                                410 S Farmerville St
## 3816                                410 S Farmerville St
## 3817                                410 S Farmerville St
## 3818                                410 S Farmerville St
## 3819                                410 S Farmerville St
## 3820                                410 S Farmerville St
## 3821                                410 S Farmerville St
## 3822                                         P O Box 148
## 3823                                     5570 LA Hwy 563
## 3824                                      441 LA Hwy 545
## 3825                                          P O Box 29
## 3826                                         PO Box 1031
## 3827                                          PO Box 145
## 3828                                      441 LA Hwy 545
## 3829                                           PO Box 81
## 3830                                         P O Box 108
## 3831                                        P O Box 2069
## 3832                                         P O Box 252
## 3833                                         P O Box 980
## 3834                                         P O Box 288
## 3835                                          P O Box 40
## 3836                                                    
## 3837                                         P O Box 288
## 3838                                          P O Box 40
## 3839                                         P O Box 288
## 3840                                         P O Box 288
## 3841                                         P O Box 288
## 3842                                          P O Box 40
## 3843                                          P O Box 40
## 3844                                          P O Box 40
## 3845                                        P O Box 2069
## 3846                                        P O Box 2069
## 3847                                        P O Box 2069
## 3848                                        P O Box 2069
## 3849                                        P O Box 2069
## 3850                                         P O Box 108
## 3851                                         P O Box 108
## 3852                                         P O Box 108
## 3853                                         P O Box 108
## 3854                                         P O Box 108
## 3855                                         P O Box 252
## 3856                                         P O Box 252
## 3857                                         P O Box 252
## 3858                                         P O Box 252
## 3859                                         P O Box 252
## 3860                                         P O Box 980
## 3861                                         P O Box 980
## 3862                                         P O Box 980
## 3863                                                    
## 3864                                                    
## 3865                                                    
## 3866                                                    
## 3867                                                    
## 3868                                                    
## 3869                                                    
## 3870                                                    
## 3871                                                    
## 3872                                                    
## 3873                                                    
## 3874                                                    
## 3875                                                    
## 3876                                                    
## 3877                                                    
## 3878                                                    
## 3879                                         121 Joan St
## 3880                                                    
## 3881                                                    
## 3882                                                    
## 3883                                                    
## 3884                                                    
## 3885                                                    
## 3886                                                    
## 3887                                                    
## 3888                                         P O Box 850
## 3889                                        P O Box 1150
## 3890                                         P O Box 307
## 3891                                    140 Aspen Square
## 3892                                          PO Box 335
## 3893                                         P O Box 335
## 3894                                         P O Box 335
## 3895                                         P O Box 335
## 3896                                         P O Box 335
## 3897                                         P O Box 335
## 3898                                         P O Box 335
## 3899                                         P O Box 335
## 3900                                         P O Box 335
## 3901                                         P O Box 335
## 3902                        400 Mayor Herbert Hoover Ave
## 3903                         400 Mayor Hebert Hoover Ave
## 3904                                        P O Box 1130
## 3905                                        P O Box 1130
## 3906                                        P O Box 1130
## 3907                                        P O Box 1130
## 3908                                        P O Box 1130
## 3909                                        P O Box 1130
## 3910                                        P O Box 1130
## 3911                                        P O Box 1130
## 3912                                        P O Box 1130
## 3913                                          P O Box 33
## 3914                                                    
## 3915                                          P O Box 53
## 3916                                14724 Bear Island Rd
## 3917                                         P O Box 643
## 3918                                   10964 LA Hwy 1033
## 3919                              32447 Mangum Chapel Rd
## 3920                                          PO Box 657
## 3921                                 30560 Lower Rome Rd
## 3922                                   30930 N Walker Rd
## 3923                                     37354 LA Hwy 16
## 3924                                   20150 LA  Hwy 444
## 3925                                     31868 LA Hwy 43
## 3926                                     23272 LA Hwy 22
## 3927                                24601 Blood River Rd
## 3928                                    24832 Joe May Rd
## 3929                                          PO Box 241
## 3930                                          PO Box 241
## 3931                                 30770 Lower Rome Rd
## 3932                                  13172 Pendarvis Ln
## 3933                                        P O Box 1629
## 3934                                         P O Box 217
## 3935                                        P O Box 1000
## 3936                                         P O Box 546
## 3937                                         P O Box 430
## 3938                                         P O Box 352
## 3939                                         P O Box 352
## 3940                                           P O Box 3
## 3941                                        18235 Hwy 16
## 3942                                         P O Box 217
## 3943                                        P O Box 1000
## 3944                                         P O Box 430
## 3945                                           P O Box 3
## 3946                                         P O Box 217
## 3947                                         P O Box 217
## 3948                                         P O Box 217
## 3949                                         P O Box 217
## 3950                                         P O Box 217
## 3951                                         P O Box 217
## 3952                                         P O Box 546
## 3953                                         P O Box 546
## 3954                                         P O Box 546
## 3955                                         P O Box 546
## 3956                                         P O Box 546
## 3957                                         P O Box 546
## 3958                                         P O Box 546
## 3959                                         P O Box 546
## 3960                                         P O Box 546
## 3961                                         P O Box 546
## 3962                                          PO Box 430
## 3963                                          PO Box 430
## 3964                                          PO Box 430
## 3965                                          PO Box 430
## 3966                                          PO Box 430
## 3967                                         P O Box 352
## 3968                                         P O Box 352
## 3969                                         P O Box 352
## 3970                                         P O Box 352
## 3971                                         P O Box 352
## 3972                                           P O Box 3
## 3973                                           P O Box 3
## 3974                                           P O Box 3
## 3975                                        18235 Hwy 16
## 3976                                        18235 Hwy 16
## 3977                                        18235 Hwy 16
## 3978                                        P O Box 1629
## 3979                                        P O Box 1629
## 3980                                        P O Box 1629
## 3981                                        P O Box 1629
## 3982                                        P O Box 1629
## 3983                                        P O Box 1000
## 3984                                        P O Box 1000
## 3985                                        P O Box 1000
## 3986                                                    
## 3987                                                    
## 3988                                                    
## 3989                                                    
## 3990                                                    
## 3991                                                    
## 3992                                                    
## 3993                                                    
## 3994                                                    
## 3995                                                    
## 3996                                                    
## 3997                                                    
## 3998                                                    
## 3999                                                    
## 4000                                                    
## 4001                                      100 N Cedar St
## 4002                                        P O Box 1710
## 4003                                          PO Box 423
## 4004                               212 S Chestnut Street
## 4005                      100 N Cedar St Courthouse Bldg
## 4006                      100 N Cedar St Courthouse Bldg
## 4007                      100 N Cedar St Courthouse Bldg
## 4008                      100 N Cedar St Courthouse Bldg
## 4009                      100 N Cedar St Courthouse Bldg
## 4010                                   301 S Chestnut St
## 4011                                   301 S Chestnut St
## 4012                                   301 S Chestnut St
## 4013                                   301 S Chestnut St
## 4014                                   301 S Chestnut St
## 4015                                   301 S Chestnut St
## 4016                                   301 S Chestnut St
## 4017                                   301 S Chestnut St
## 4018                                       1005 Maple St
## 4019                                    1178 Willow ByRd
## 4020                                      305 Bozeman St
## 4021                                       402 EGreen St
## 4022                                     3572 La Hwy 603
## 4023                                      224 La Hwy 602
## 4024                                      309 W Askew St
## 4025                                     100 Magnolia St
## 4026                                         204 N Cedar
## 4027                                          P O Box 29
## 4028                                       Rt 2 Box 116C
## 4029                                         598 Wood St
## 4030                                         204 N Cedar
## 4031                                       Rt 2 Box 116C
## 4032                                     412 Claudine St
## 4033                                          P O Box 29
## 4034                                          P O Box 29
## 4035                                          P O Box 29
## 4036                                       Rt 2 Box 116C
## 4037                                       Rt 2 Box 116C
## 4038                                       Rt 2 Box 116C
## 4039                                     412 Claudine St
## 4040                                     412 Claudine St
## 4041                                     412 Claudine St
## 4042                                         204 N Cedar
## 4043                                         204 N Cedar
## 4044                                         204 N Cedar
## 4045                                         204 N Cedar
## 4046                                         204 N Cedar
## 4047                                                    
## 4048                                                    
## 4049                                                    
## 4050                                                    
## 4051                                                    
## 4052                                                    
## 4053                                                    
## 4054                                                    
## 4055                                                    
## 4056                                                    
## 4057                                                    
## 4058                                                    
## 4059                                                    
## 4060                                                    
## 4061                                                    
## 4062                                                    
## 4063                                                    
## 4064                                                    
## 4065                                                    
## 4066                                                    
## 4067                                      351 S Franklin
## 4068                                        P O Box 1543
## 4069                                         PO Box 1177
## 4070                                 1110 Leavell Street
## 4071                                125 East Madison Ave
## 4072                                         P O Box 509
## 4073                                         P O Box 509
## 4074                                         P O Box 509
## 4075                                         P O Box 509
## 4076                                         P O Box 509
## 4077                                         P O Box 509
## 4078                                      P O Drawer 391
## 4079                                      P O Drawer 391
## 4080                                          PO Box 872
## 4081                                         P O Box 872
## 4082                                         P O Box 872
## 4083                                         P O Box 872
## 4084                                         P O Box 872
## 4085                                         P O Box 872
## 4086                                         P O Box 872
## 4087                                 3407 Bayou Acres Dr
## 4088                              16284 Hughes Chapel Rd
## 4089                                          PO Box 174
## 4090                                          PO Box 415
## 4091                                 14558 Old Bonita Rd
## 4092                                   10650 Pleasant Dr
## 4093                                 16162 Old Berlin Rd
## 4094                                    16813 McGinty Rd
## 4095                                 3419 Bayou Acres Dr
## 4096                              16350 Hughes Chapel Rd
## 4097                                          PO Box 232
## 4098                                          PO Box 205
## 4099                                 14665 Old Bonita Rd
## 4100                                                    
## 4101                                 16162 Old Berlin Rd
## 4102                                  15265 Lakeshore Rd
## 4103                                         P O Box 431
## 4104                                         P O Box 278
## 4105                                         P O Box 148
## 4106                                         P O Box 238
## 4107                                          P O Box 58
## 4108                                         P O Box 431
## 4109                                         P O Box 431
## 4110                                         P O Box 431
## 4111                                         P O Box 431
## 4112                                         P O Box 431
## 4113                                         P O Box 431
## 4114                                         P O Box 431
## 4115                                         P O Box 431
## 4116                                         P O Box 431
## 4117                                         P O Box 278
## 4118                                         P O Box 278
## 4119                                         P O Box 278
## 4120                                                    
## 4121                                         P O Box 148
## 4122                                         P O Box 148
## 4123                                         P O Box 148
## 4124                                         P O Box 238
## 4125                                         P O Box 238
## 4126                                         P O Box 238
## 4127                                          P O Box 58
## 4128                                          P O Box 58
## 4129                                          P O Box 58
## 4130                                                    
## 4131                                                    
## 4132                                                    
## 4133                                                    
## 4134                                                    
## 4135                                                    
## 4136                                                    
## 4137                                                    
## 4138                                                    
## 4139                                                    
## 4140                                                    
## 4141                                                    
## 4142                                                    
## 4143                                                    
## 4144                                                    
## 4145                                                    
## 4146                                                    
## 4147                                                    
## 4148                                                    
## 4149                                                    
## 4150                                                    
## 4151                                                    
## 4152                                                    
## 4153                                                    
## 4154                                                    
## 4155                                                    
## 4156                                         P O Box 266
## 4157                                         P O Box 476
## 4158                                          PO Box 201
## 4159                                          PO Box 799
## 4160                                                    
## 4161                                                    
## 4162                                                    
## 4163                                                    
## 4164                                                    
## 4165                                                    
## 4166                                          P O Box 70
## 4167                                          P O Box 70
## 4168                                           PO Box 16
## 4169                                        310 Royal St
## 4170                                        310 Royal St
## 4171                                        310 Royal St
## 4172                                        310 Royal St
## 4173                                        310 Royal St
## 4174                                        310 Royal St
## 4175                                        310 Royal St
## 4176                                        310 Royal St
## 4177                                        310 Royal St
## 4178                                        310 Royal St
## 4179                                          PO Box 673
## 4180                                      10363 LaHwy120
## 4181                                     2735 La Hwy 119
## 4182                                121 Ray Grillette Rd
## 4183                                  296 Edgar Olive Rd
## 4184                                          PO Box 366
## 4185                                          P O Box 37
## 4186                                          PO Box 216
## 4187                                         P O Box 327
## 4188                                         P O Box 309
## 4189                                         P O Box 216
## 4190                                         P O Box 229
## 4191                                         P O Box 126
## 4192                                         P O Box 400
## 4193                                         P O Box 217
## 4194                                    197 Edenborne St
## 4195                                         P O Box 327
## 4196                                         P O Box 309
## 4197                                         P O Box 216
## 4198                                         P O Box 229
## 4199                                         P O Box 126
## 4200                                         P O Box 400
## 4201                                         P O Box 217
## 4202                                          P O Box 37
## 4203                                         P O Box 309
## 4204                                         P O Box 309
## 4205                                         P O Box 309
## 4206                                         P O Box 216
## 4207                                         P O Box 216
## 4208                                         P O Box 216
## 4209                                         P O Box 229
## 4210                                         P O Box 229
## 4211                                         P O Box 229
## 4212                                         P O Box 126
## 4213                                         P O Box 126
## 4214                                         P O Box 126
## 4215                                         P O Box 400
## 4216                                         P O Box 400
## 4217                                         P O Box 400
## 4218                                         P O Box 217
## 4219                                         P O Box 217
## 4220                                         P O Box 217
## 4221                                         P O Box 327
## 4222                                         P O Box 327
## 4223                                         P O Box 327
## 4224                                          P O Box 37
## 4225                                          P O Box 37
## 4226                                          P O Box 37
## 4227                                          P O Box 37
## 4228                                    197 Edenborne St
## 4229                                    197 Edenborne St
## 4230                                    197 Edenborne St
## 4231                                    197 Edenborne St
## 4232                                    197 Edenborne St
## 4233                                                    
## 4234                                                    
## 4235                                                    
## 4236                                                    
## 4237                                                    
## 4238                                                    
## 4239                                                    
## 4240                                                    
## 4241                                                    
## 4242                                                    
## 4243                                                    
## 4244                                                    
## 4245                                                    
## 4246                                                    
## 4247                                                    
## 4248                                                    
## 4249                                                    
## 4250                                                    
## 4251                                                    
## 4252                                                    
## 4253                                                    
## 4254                                                    
## 4255                                                    
## 4256                                                    
## 4257                                                    
## 4258                                                    
## 4259                                                    
## 4260                                                    
## 4261                                                    
## 4262                                                    
## 4263                                                    
## 4264                                                    
## 4265                                                    
## 4266                                                    
## 4267                                                    
## 4268                                                    
## 4269                                                    
## 4270                                                    
## 4271                                                    
## 4272                                                    
## 4273                                                    
## 4274                                                    
## 4275                                                    
## 4276                                                    
## 4277                                                    
## 4278                                                    
## 4279                                                    
## 4280                                                    
## 4281                                                    
## 4282                                                    
## 4283                                                    
## 4284                                                    
## 4285                                                    
## 4286                                                    
## 4287                                                    
## 4288                                                    
## 4289                                                    
## 4290                                                    
## 4291                                                    
## 4292                                                    
## 4293                                                    
## 4294                                                    
## 4295                                                    
## 4296                                                    
## 4297                                                    
## 4298                                                    
## 4299                                                    
## 4300                                                    
## 4301                                                    
## 4302                                                    
## 4303                                                    
## 4304                                                    
## 4305                                                    
## 4306                                                    
## 4307                                                    
## 4308                                                    
## 4309                                                    
## 4310                                                    
## 4311                                                    
## 4312                                                    
## 4313                                                    
## 4314                                                    
## 4315                                                    
## 4316                                                    
## 4317                                                    
## 4318                                                    
## 4319                                                    
## 4320                                                    
## 4321                                                    
## 4322                                                    
## 4323                                                    
## 4324                                                    
## 4325                                                    
## 4326                                                    
## 4327                                                    
## 4328                                                    
## 4329                                                    
## 4330                                                    
## 4331                                                    
## 4332                                                    
## 4333                                                    
## 4334                                                    
## 4335                                                    
## 4336                                                    
## 4337                                                    
## 4338                                                    
## 4339                                                    
## 4340                                                    
## 4341                                                    
## 4342                                                    
## 4343                                                    
## 4344                                                    
## 4345                                                    
## 4346                                      421 Loyola Ave
## 4347                                      421 Loyola Ave
##                OfficeAddr2               City State    Zipcode
## 1                                                LA           
## 2                                                LA           
## 3                                                LA           
## 4                                                LA           
## 5                                                LA           
## 6                                                LA           
## 7                                                LA           
## 8                                                LA           
## 9                                                LA           
## 10                                               LA           
## 11                                               LA           
## 12                                               LA           
## 13                                               LA           
## 14                                               LA           
## 15                                               LA           
## 16                                               LA           
## 17                                               LA           
## 18                                               LA           
## 19                                               LA           
## 20                                               LA           
## 21                                               LA           
## 22                                               LA           
## 23                                               LA           
## 24                                               LA           
## 25                                               LA           
## 26                                               LA           
## 27                                               LA           
## 28                                               LA           
## 29                                               LA           
## 30                                               LA           
## 31                                               LA           
## 32                                               LA           
## 33                                               LA           
## 34                                               LA           
## 35                                               LA           
## 36                                               LA           
## 37                                               LA           
## 38                                               LA           
## 39                                               LA           
## 40                                               LA           
## 41                                               LA           
## 42                                               LA           
## 43                                               LA           
## 44                                               LA           
## 45                                               LA           
## 46                                               LA           
## 47                                               LA           
## 48                                               LA           
## 49                                               LA           
## 50                                               LA           
## 51                                               LA           
## 52                                               LA           
## 53                                               LA           
## 54                                               LA           
## 55                                               LA           
## 56                                               LA           
## 57                                               LA           
## 58                                               LA           
## 59                                               LA           
## 60                                               LA           
## 61                                               LA           
## 62                                               LA           
## 63                                               LA           
## 64                                               LA           
## 65                                               LA           
## 66                                               LA           
## 67                                               LA           
## 68                                               LA           
## 69                                               LA           
## 70                                               LA           
## 71                                               LA           
## 72                                               LA           
## 73                                               LA           
## 74                                               LA           
## 75                                               LA           
## 76                                               LA           
## 77                                               LA           
## 78                                               LA           
## 79                                               LA           
## 80                                               LA           
## 81                                               LA           
## 82                                               LA           
## 83                                               LA           
## 84                                               LA           
## 85                                               LA           
## 86                                               LA           
## 87                                               LA           
## 88                                               LA           
## 89                                               LA           
## 90                                               LA           
## 91                                               LA           
## 92                                               LA           
## 93                                               LA           
## 94                                               LA           
## 95                                               LA           
## 96                                               LA           
## 97                                               LA           
## 98                                               LA           
## 99                                               LA           
## 100                                              LA           
## 101                                              LA           
## 102                                              LA           
## 103                                              LA           
## 104                                              LA           
## 105                                              LA           
## 106                                              LA           
## 107                                              LA           
## 108                                              LA           
## 109                                              LA           
## 110                                              LA           
## 111                                              LA           
## 112                                              LA           
## 113                                              LA           
## 114                                              LA           
## 115                                              LA           
## 116                                              LA           
## 117                                              LA           
## 118                                              LA           
## 119                                              LA           
## 120                                              LA           
## 121                                              LA           
## 122                                              LA           
## 123                                              LA           
## 124                                              LA           
## 125                                              LA           
## 126                                              LA           
## 127                                              LA           
## 128                                              LA           
## 129                                              LA           
## 130                                              LA           
## 131                                              LA           
## 132                                              LA           
## 133                                              LA           
## 134                                              LA           
## 135                                              LA           
## 136                                              LA           
## 137                                              LA           
## 138                                              LA           
## 139                                              LA           
## 140                                              LA           
## 141                                              LA           
## 142                                              LA           
## 143                                              LA           
## 144                                              LA           
## 145                                              LA           
## 146                                              LA           
## 147                                              LA           
## 148                                              LA           
## 149                                              LA           
## 150                                              LA           
## 151                                              LA           
## 152                                              LA           
## 153                                              LA           
## 154                                              LA           
## 155                                              LA           
## 156                                              LA           
## 157                                              LA           
## 158                                              LA           
## 159                                              LA           
## 160                                              LA           
## 161                                              LA           
## 162                                              LA           
## 163                                              LA           
## 164                                              LA           
## 165                                              LA           
## 166                                              LA           
## 167                                              LA           
## 168                                              LA           
## 169                                              LA           
## 170                                              LA           
## 171                                              LA           
## 172                                              LA           
## 173                                              LA           
## 174                                              LA           
## 175                                              LA           
## 176                                              LA           
## 177                                              LA           
## 178                                              LA           
## 179                                              LA           
## 180                                              LA           
## 181                                              LA           
## 182                                              LA           
## 183                                              LA           
## 184                                              LA           
## 185                                              LA           
## 186                                              LA           
## 187                                              LA           
## 188                                              LA           
## 189                                              LA           
## 190                                              LA           
## 191                                              LA           
## 192                                              LA           
## 193                                              LA           
## 194                                              LA           
## 195                                              LA           
## 196                                              LA           
## 197                                              LA           
## 198                                              LA           
## 199                                              LA           
## 200                                              LA           
## 201                                              LA           
## 202                                              LA           
## 203                                              LA           
## 204                                              LA           
## 205                                              LA           
## 206                                              LA           
## 207                                              LA           
## 208                                              LA           
## 209                                              LA           
## 210                                              LA           
## 211                                              LA           
## 212                                              LA           
## 213                                              LA           
## 214                                              LA           
## 215                                              LA           
## 216                                              LA           
## 217                                              LA           
## 218                                              LA           
## 219                                              LA           
## 220                                              LA           
## 221                                              LA           
## 222                                              LA           
## 223                                              LA           
## 224                                              LA           
## 225                                              LA           
## 226                                              LA           
## 227                                              LA           
## 228                                              LA           
## 229                                              LA           
## 230                                              LA           
## 231                                              LA           
## 232                                              LA           
## 233                                              LA           
## 234                                              LA           
## 235                                              LA           
## 236                                              LA           
## 237                                              LA           
## 238                                              LA           
## 239                                              LA           
## 240                                              LA           
## 241                                              LA           
## 242                                              LA           
## 243                                              LA           
## 244                                              LA           
## 245                                              LA           
## 246                                              LA           
## 247                                              LA           
## 248                                              LA           
## 249                                              LA           
## 250                                              LA           
## 251                                              LA           
## 252                                              LA           
## 253                                              LA           
## 254                                              LA           
## 255                                              LA           
## 256                                              LA           
## 257                                              LA           
## 258                                              LA           
## 259                                              LA           
## 260                                              LA           
## 261                                              LA           
## 262                                              LA           
## 263                                              LA           
## 264                                              LA           
## 265                                              LA           
## 266                                              LA           
## 267                                              LA           
## 268                                              LA           
## 269                                              LA           
## 270                                              LA           
## 271                                              LA           
## 272                                              LA           
## 273                                              LA           
## 274                                              LA           
## 275                                              LA           
## 276                                              LA           
## 277                                              LA           
## 278                                              LA           
## 279                                              LA           
## 280                                              LA           
## 281                                              LA           
## 282                                              LA           
## 283                                              LA           
## 284                                              LA           
## 285                                              LA           
## 286                                              LA           
## 287                                              LA           
## 288                                              LA           
## 289                                              LA           
## 290                                              LA           
## 291                                              LA           
## 292                                              LA           
## 293                                              LA           
## 294                                              LA           
## 295                                              LA           
## 296                                              LA           
## 297                                              LA           
## 298                                              LA           
## 299                                              LA           
## 300                                              LA           
## 301                                              LA           
## 302                                              LA           
## 303                                              LA           
## 304                                              LA           
## 305                                              LA           
## 306                                              LA           
## 307                                              LA           
## 308                                              LA           
## 309                                              LA           
## 310                                              LA           
## 311                                              LA           
## 312                                              LA           
## 313                                              LA           
## 314                                              LA           
## 315                                              LA           
## 316                                              LA           
## 317                                              LA           
## 318                                              LA           
## 319                                              LA           
## 320                                              LA           
## 321                                              LA           
## 322                                              LA           
## 323                                              LA           
## 324                                              LA           
## 325                                              LA           
## 326                                              LA           
## 327                                              LA           
## 328                                              LA           
## 329                                              LA           
## 330                                              LA           
## 331                                              LA           
## 332                                              LA           
## 333                                              LA           
## 334                                              LA           
## 335                                              LA           
## 336                                              LA           
## 337                                              LA           
## 338                                              LA           
## 339                                              LA           
## 340                                              LA           
## 341                                              LA           
## 342                                              LA           
## 343                                              LA           
## 344                                              LA           
## 345                                              LA           
## 346                                              LA           
## 347                                              LA           
## 348                                              LA           
## 349                                              LA           
## 350                                              LA           
## 351                                              LA           
## 352                                              LA           
## 353                                              LA           
## 354                                              LA           
## 355                                              LA           
## 356                                              LA           
## 357                                              LA           
## 358                                              LA           
## 359                                              LA           
## 360                                              LA           
## 361                                              LA           
## 362                                              LA           
## 363                                              LA           
## 364                                              LA           
## 365                                              LA           
## 366                                              LA           
## 367                                              LA           
## 368                                              LA           
## 369                                              LA           
## 370                                              LA           
## 371                                              LA           
## 372                                              LA           
## 373                                              LA           
## 374                                              LA           
## 375                                              LA           
## 376                                              LA           
## 377                                              LA           
## 378                                              LA           
## 379                                              LA           
## 380                                              LA           
## 381                                              LA           
## 382                                              LA           
## 383                                              LA           
## 384                                              LA           
## 385                                              LA           
## 386                                              LA           
## 387                                              LA           
## 388                                              LA           
## 389                                              LA           
## 390                                              LA           
## 391                                              LA           
## 392                                              LA           
## 393                                              LA           
## 394                                              LA           
## 395                                              LA           
## 396                                              LA           
## 397                                              LA           
## 398                                              LA           
## 399                                              LA           
## 400                                              LA           
## 401                                              LA           
## 402                                              LA           
## 403                                              LA           
## 404                                              LA           
## 405                                              LA           
## 406                                              LA           
## 407                                              LA           
## 408                                              LA           
## 409                                              LA           
## 410                                              LA           
## 411                                              LA           
## 412                                              LA           
## 413                                              LA           
## 414                                              LA           
## 415                                              LA           
## 416                                              LA           
## 417                                              LA           
## 418                                              LA           
## 419                                              LA           
## 420                                              LA           
## 421                                              LA           
## 422                                              LA           
## 423                                              LA           
## 424                                              LA           
## 425                                              LA           
## 426                                              LA           
## 427                                              LA           
## 428                                              LA           
## 429                                              LA           
## 430                                              LA           
## 431                                              LA           
## 432                                              LA           
## 433                                              LA           
## 434                                              LA           
## 435                                              LA           
## 436                                              LA           
## 437                                              LA           
## 438                                              LA           
## 439                                              LA           
## 440                                              LA           
## 441                                              LA           
## 442                                              LA           
## 443                                              LA           
## 444                               Baton Rouge    LA 70804-9004
## 445                               Baton Rouge    LA 70804-4243
## 446                               Baton Rouge    LA 70804-9125
## 447                               Baton Rouge    LA 70804-9005
## 448                               Baton Rouge    LA 70804-0154
## 449                               Baton Rouge    LA 70821-0631
## 450                               Baton Rouge    LA 70804-9214
## 451                            500 Poydras St    LA           
## 452                            500 Poydras St    LA           
## 453                                  Metairie    LA      70002
## 454                               New Orleans    LA      70130
## 455                                  Gonzales    LA      70737
## 456                                Shreveport    LA      71105
## 457                                    Monroe    LA      71201
## 458                               Baton Rouge    LA      70808
## 459                               New Orleans    LA      70130
## 460                               New Orleans    LA      70130
## 461                               New Orleans    LA      70130
## 462                               New Orleans    LA      70130
## 463                               New Orleans    LA      70130
## 464                               New Orleans    LA      70130
## 465                               New Orleans    LA      70130
## 466                               Baton Rouge    LA      70802
## 467                               Baton Rouge    LA      70802
## 468                               Baton Rouge    LA      70802
## 469                               Baton Rouge    LA      70802
## 470                               Baton Rouge    LA      70802
## 471                               Baton Rouge    LA      70802
## 472                               Baton Rouge    LA      70802
## 473                               Baton Rouge    LA      70802
## 474                               Baton Rouge    LA      70802
## 475                               Baton Rouge    LA      70802
## 476                               Baton Rouge    LA      70802
## 477                               Baton Rouge    LA      70802
## 478                                Shreveport    LA      71101
## 479                                Shreveport    LA      71101
## 480                                Shreveport    LA      71101
## 481                                Shreveport    LA      71101
## 482                                Shreveport    LA      71101
## 483                                Shreveport    LA      71101
## 484                                Shreveport    LA      71101
## 485                                Shreveport    LA      71101
## 486                                Shreveport    LA      71101
## 487                                Shreveport    LA      71101
## 488                              Lake Charles    LA      70601
## 489                              Lake Charles    LA      70601
## 490                              Lake Charles    LA      70601
## 491                              Lake Charles    LA      70601
## 492                              Lake Charles    LA      70601
## 493                              Lake Charles    LA      70601
## 494                              Lake Charles    LA      70601
## 495                              Lake Charles    LA      70601
## 496                              Lake Charles    LA      70601
## 497                              Lake Charles    LA      70601
## 498                              Lake Charles    LA      70601
## 499                              Lake Charles    LA      70601
## 500                               New Orleans    LA      70130
## 501                               New Orleans    LA      70130
## 502                               New Orleans    LA      70130
## 503                               New Orleans    LA      70130
## 504                               New Orleans    LA      70130
## 505                               New Orleans    LA      70130
## 506                               New Orleans    LA      70130
## 507                               New Orleans    LA      70130
## 508                               New Orleans    LA      70130
## 509                               New Orleans    LA      70130
## 510                               New Orleans    LA      70130
## 511                               New Orleans    LA      70130
## 512                                    Gretna    LA      70053
## 513                                    Gretna    LA      70053
## 514                                    Gretna    LA      70053
## 515                                    Gretna    LA      70053
## 516                                    Gretna    LA      70053
## 517                                    Gretna    LA      70053
## 518                                    Gretna    LA      70053
## 519                                    Gretna    LA      70053
## 520                               Baton Rouge    LA 70821-9154
## 521                               Baton Rouge    LA 70821-9154
## 522                               Baton Rouge    LA 70821-9154
## 523                               Baton Rouge    LA 70821-9154
## 524                               Baton Rouge    LA 70821-9154
## 525                               Baton Rouge    LA 70804-9064
## 526                               Baton Rouge    LA 70804-9064
## 527                               Baton Rouge    LA 70804-9064
## 528                               Baton Rouge    LA 70804-9064
## 529                               Baton Rouge    LA 70804-9064
## 530                               Baton Rouge    LA 70804-9064
## 531                               Baton Rouge    LA 70804-9064
## 532                               Baton Rouge    LA 70804-9064
## 533                               Baton Rouge    LA      70804
## 534                               Baton Rouge    LA      70804
## 535                               Baton Rouge    LA      70804
## 536                               Baton Rouge    LA      70804
## 537                               Baton Rouge    LA      70804
## 538                               Baton Rouge    LA      70804
## 539                               Baton Rouge    LA      70804
## 540                               Baton Rouge    LA      70804
## 541                               Baton Rouge    LA      70804
## 542                               Baton Rouge    LA      70804
## 543                               Baton Rouge    LA      70804
## 544                               Baton Rouge    LA      70804
## 545                               Baton Rouge    LA      70804
## 546                               Baton Rouge    LA      70804
## 547                               Baton Rouge    LA      70804
## 548                               Baton Rouge    LA      70804
## 549                               Baton Rouge    LA      70804
## 550                               Baton Rouge    LA      70804
## 551                               Baton Rouge    LA      70804
## 552                               Baton Rouge    LA      70804
## 553                               Baton Rouge    LA      70804
## 554                               Baton Rouge    LA      70804
## 555                               Baton Rouge    LA      70804
## 556                               Baton Rouge    LA      70804
## 557                               Baton Rouge    LA      70804
## 558                               Baton Rouge    LA      70804
## 559                               Baton Rouge    LA      70804
## 560                               Baton Rouge    LA      70804
## 561                               Baton Rouge    LA      70804
## 562                               Baton Rouge    LA      70804
## 563                               Baton Rouge    LA      70804
## 564                               Baton Rouge    LA      70804
## 565                               Baton Rouge    LA      70804
## 566                               Baton Rouge    LA      70804
## 567                               Baton Rouge    LA      70804
## 568                               Baton Rouge    LA      70804
## 569                               Baton Rouge    LA      70804
## 570                               Baton Rouge    LA      70804
## 571                               Baton Rouge    LA      70804
## 572                               Baton Rouge    LA      70804
## 573                               Baton Rouge    LA      70804
## 574                               Baton Rouge    LA      70804
## 575                               Baton Rouge    LA      70804
## 576                               Baton Rouge    LA      70804
## 577                               Baton Rouge    LA      70804
## 578                               Baton Rouge    LA      70804
## 579                               Baton Rouge    LA      70804
## 580                               Baton Rouge    LA      70804
## 581                               Baton Rouge    LA      70804
## 582                               Baton Rouge    LA      70804
## 583                               Baton Rouge    LA      70804
## 584                               Baton Rouge    LA      70804
## 585                               Baton Rouge    LA      70804
## 586                               Baton Rouge    LA      70804
## 587                               Baton Rouge    LA      70804
## 588                               Baton Rouge    LA      70804
## 589                               Baton Rouge    LA      70804
## 590                               Baton Rouge    LA      70804
## 591                               Baton Rouge    LA      70804
## 592                               Baton Rouge    LA      70804
## 593                               Baton Rouge    LA      70804
## 594                               Baton Rouge    LA      70804
## 595                               Baton Rouge    LA      70804
## 596                               Baton Rouge    LA      70804
## 597                               Baton Rouge    LA      70804
## 598                               Baton Rouge    LA      70804
## 599                               Baton Rouge    LA      70804
## 600                               Baton Rouge    LA      70804
## 601                               Baton Rouge    LA      70804
## 602                               Baton Rouge    LA      70804
## 603                               Baton Rouge    LA      70804
## 604                               Baton Rouge    LA      70804
## 605                               Baton Rouge    LA      70804
## 606                               Baton Rouge    LA      70804
## 607                               Baton Rouge    LA      70804
## 608                               Baton Rouge    LA      70804
## 609                               Baton Rouge    LA      70804
## 610                               Baton Rouge    LA      70804
## 611                               Baton Rouge    LA      70804
## 612                               Baton Rouge    LA      70804
## 613                               Baton Rouge    LA      70804
## 614                               Baton Rouge    LA      70804
## 615                               Baton Rouge    LA      70804
## 616                               Baton Rouge    LA      70804
## 617                               Baton Rouge    LA      70804
## 618                               Baton Rouge    LA      70804
## 619                               Baton Rouge    LA      70804
## 620                               Baton Rouge    LA      70804
## 621                               Baton Rouge    LA      70804
## 622                               Baton Rouge    LA      70804
## 623                               Baton Rouge    LA      70804
## 624                               Baton Rouge    LA      70804
## 625                               Baton Rouge    LA      70804
## 626                               Baton Rouge    LA      70804
## 627                               Baton Rouge    LA      70804
## 628                               Baton Rouge    LA      70804
## 629                               Baton Rouge    LA      70804
## 630                               Baton Rouge    LA      70804
## 631                               Baton Rouge    LA      70804
## 632                               Baton Rouge    LA      70804
## 633                               Baton Rouge    LA      70804
## 634                               Baton Rouge    LA      70804
## 635                               Baton Rouge    LA      70804
## 636                               Baton Rouge    LA      70804
## 637                               Baton Rouge    LA      70804
## 638                               Baton Rouge    LA      70804
## 639                               Baton Rouge    LA      70804
## 640                               Baton Rouge    LA      70804
## 641                               Baton Rouge    LA      70804
## 642                               Baton Rouge    LA      70804
## 643                               Baton Rouge    LA      70804
## 644                               Baton Rouge    LA      70804
## 645                               Baton Rouge    LA      70804
## 646                               Baton Rouge    LA      70804
## 647                               Baton Rouge    LA      70804
## 648                               Baton Rouge    LA      70804
## 649                               Baton Rouge    LA      70804
## 650                               Baton Rouge    LA      70804
## 651                               Baton Rouge    LA      70804
## 652                               Baton Rouge    LA      70804
## 653                               Baton Rouge    LA      70804
## 654                               Baton Rouge    LA      70804
## 655                               Baton Rouge    LA      70804
## 656                               Baton Rouge    LA      70804
## 657                               Baton Rouge    LA      70804
## 658                               Baton Rouge    LA      70804
## 659                               Baton Rouge    LA      70804
## 660                               Baton Rouge    LA      70804
## 661                               Baton Rouge    LA      70804
## 662                               Baton Rouge    LA      70804
## 663                               Baton Rouge    LA      70804
## 664                               Baton Rouge    LA      70804
## 665                               Baton Rouge    LA      70804
## 666                               Baton Rouge    LA      70804
## 667                               Baton Rouge    LA      70804
## 668                               Baton Rouge    LA      70804
## 669                               Baton Rouge    LA      70804
## 670                               Baton Rouge    LA      70804
## 671                               Baton Rouge    LA      70804
## 672                               Baton Rouge    LA      70804
## 673                               Baton Rouge    LA      70804
## 674                               Baton Rouge    LA      70804
## 675                               Baton Rouge    LA      70804
## 676                               Baton Rouge    LA      70804
## 677                                              LA           
## 678                                              LA           
## 679                                              LA           
## 680                                              LA           
## 681                                              LA           
## 682                                              LA           
## 683                                              LA           
## 684                                              LA           
## 685                                              LA           
## 686                                              LA           
## 687                                              LA           
## 688                                              LA           
## 689                                              LA           
## 690                                              LA           
## 691                                              LA           
## 692                                              LA           
## 693                                              LA           
## 694                                              LA           
## 695                                              LA           
## 696                                              LA           
## 697                                              LA           
## 698                                              LA           
## 699                                              LA           
## 700                                              LA           
## 701                                              LA           
## 702                                              LA           
## 703                                              LA           
## 704                                              LA           
## 705                                              LA           
## 706                                              LA           
## 707                                              LA           
## 708                                              LA           
## 709                                              LA           
## 710                                              LA           
## 711                                              LA           
## 712                                              LA           
## 713                                              LA           
## 714                                              LA           
## 715                                              LA           
## 716                                              LA           
## 717                                              LA           
## 718                                              LA           
## 719                                              LA           
## 720                                              LA           
## 721                                              LA           
## 722                                              LA           
## 723                                              LA           
## 724                                              LA           
## 725                                              LA           
## 726                                              LA           
## 727                                              LA           
## 728                                              LA           
## 729                                              LA           
## 730                                              LA           
## 731                                              LA           
## 732                                              LA           
## 733                                              LA           
## 734                                              LA           
## 735                                              LA           
## 736                                              LA           
## 737                                              LA           
## 738                                              LA           
## 739                                              LA           
## 740                                              LA           
## 741                                              LA           
## 742                                              LA           
## 743                                              LA           
## 744                                              LA           
## 745                                              LA           
## 746                                              LA           
## 747                                              LA           
## 748                                              LA           
## 749                                              LA           
## 750                                              LA           
## 751                                              LA           
## 752                                              LA           
## 753                                              LA           
## 754                                              LA           
## 755                                              LA           
## 756                                              LA           
## 757                                              LA           
## 758                                              LA           
## 759                                              LA           
## 760                                              LA           
## 761                                              LA           
## 762                                              LA           
## 763                                              LA           
## 764                                              LA           
## 765                                              LA           
## 766                                              LA           
## 767                                              LA           
## 768                                              LA           
## 769                                              LA           
## 770                                              LA           
## 771                                              LA           
## 772                                              LA           
## 773                                              LA           
## 774                                              LA           
## 775                                              LA           
## 776                                              LA           
## 777                                              LA           
## 778                                              LA           
## 779                                              LA           
## 780                                              LA           
## 781                                              LA           
## 782                                              LA           
## 783                                              LA           
## 784                                              LA           
## 785                                              LA           
## 786                                              LA           
## 787                                              LA           
## 788                                              LA           
## 789                                              LA           
## 790                                              LA           
## 791                                              LA           
## 792                                              LA           
## 793                                              LA           
## 794                                              LA           
## 795                                              LA           
## 796                                              LA           
## 797                                              LA           
## 798                                              LA           
## 799                                              LA           
## 800                                              LA           
## 801                                              LA           
## 802                                              LA           
## 803                                              LA           
## 804                                              LA           
## 805                                              LA           
## 806                                              LA           
## 807                                              LA           
## 808                                              LA           
## 809                                              LA           
## 810                                              LA           
## 811                                              LA           
## 812                                              LA           
## 813                                              LA           
## 814                                              LA           
## 815                                              LA           
## 816                                              LA           
## 817                                              LA           
## 818                                              LA           
## 819                                              LA           
## 820                                              LA           
## 821                                              LA           
## 822                                              LA           
## 823                                              LA           
## 824                                              LA           
## 825                                              LA           
## 826                                              LA           
## 827                                              LA           
## 828                                              LA           
## 829                                              LA           
## 830                                              LA           
## 831                                              LA           
## 832                                              LA           
## 833                                              LA           
## 834                                              LA           
## 835                                              LA           
## 836                                              LA           
## 837                                              LA           
## 838                                              LA           
## 839                                              LA           
## 840                                              LA           
## 841                                              LA           
## 842                                              LA           
## 843                                              LA           
## 844                                              LA           
## 845                                     Houma    LA      70361
## 846                                     Houma    LA      70361
## 847                                     Houma    LA      70360
## 848                                     Houma    LA      70361
## 849                                     Houma    LA      70360
## 850                                              LA           
## 851                                              LA           
## 852                                              LA           
## 853                                              LA           
## 854                                              LA           
## 855                                              LA           
## 856                                              LA           
## 857                                              LA           
## 858                                              LA           
## 859                                              LA           
## 860                                              LA           
## 861                                              LA           
## 862                                              LA           
## 863                                              LA           
## 864                                              LA           
## 865                                              LA           
## 866                                              LA           
## 867                                              LA           
## 868                                              LA           
## 869                                              LA           
## 870                                              LA           
## 871                                              LA           
## 872                                              LA           
## 873                                              LA           
## 874                                              LA           
## 875                                              LA           
## 876                                              LA           
## 877                                              LA           
## 878                                              LA           
## 879                                              LA           
## 880                                              LA           
## 881                                              LA           
## 882                                                           
## 883                                              LA           
## 884                                              LA           
## 885                                              LA           
## 886                                              LA           
## 887                                              LA           
## 888                                              LA           
## 889                                              LA           
## 890                                              LA           
## 891                                              LA           
## 892                                              LA           
## 893                                              LA           
## 894                                              LA           
## 895                                              LA           
## 896                                Shreveport    LA 71101-5400
## 897                                     Homer    LA      71040
## 898                                    Ruston    LA 71273-0777
## 899                                    Monroe    LA      71210
## 900                                  Rayville    LA      71269
## 901                                  Tallulah    LA 71284-0043
## 902                                   Vidalia    LA      71373
## 903                                 Winnfield    LA 71483-1374
## 904                                Alexandria    LA      71309
## 905                              Natchitoches    LA 71458-0838
## 906                                      Many    LA      71449
## 907                                Marksville    LA      71351
## 908                              Ville Platte    LA      70586
## 909                              Lake Charles    LA      70602
## 910                                 Lafayette    LA      70502
## 911                                New Iberia    LA 70560-4583
## 912                                 Thibodaux    LA      70301
## 913                                Plaquemine    LA 70765-0880
## 914                               Baton Rouge    LA      70802
## 915                                   Jackson    LA      70748
## 916                                     Amite    LA      70422
## 917                                 Covington    LA      70433
## 918                             Napoleonville    LA      70390
## 919                                    Gretna    LA      70053
## 920                         Pointe-a-la-hache    LA      70082
## 921                                    Benton    LA      71006
## 922                                 Opelousas    LA      70571
## 923                                      Jena    LA      71342
## 924                                    Luling    LA      70070
## 925                                 Leesville    LA      71446
## 926                                  Jennings    LA      70546
## 927                                     Houma    LA      70360
## 928                                    Kinder    LA      70648
## 929                                 Chalmette    LA 70044-0947
## 930                                    Colfax    LA      71417
## 931                                  DeRidder    LA      70634
## 932                                  Columbia    LA      71418
## 933                                   Cameron    LA      70631
## 934                                 Coushatta    LA      71019
## 935                                   LaPlace    LA      70068
## 936                                 Mansfield    LA 71052-0432
## 937                               New Orleans    LA      70119
## 938                                    Eunice    LA      70535
## 939                                Shreveport    LA      71101
## 940                                Shreveport    LA      71101
## 941                                Shreveport    LA      71101
## 942                                Shreveport    LA      71101
## 943                                    Eunice    LA 70535-1106
## 944                                Shreveport    LA      71101
## 945                                 Broussard    LA      70518
## 946                                  DeRidder    LA      70634
## 947                                    Eunice    LA 70535-1106
## 948                                Shreveport    LA 71130-1109
## 949                               Arnaudville    LA 70512-1010
## 950                                    Basile    LA 70515-0308
## 951                                 Delcambre    LA 70528-3099
## 952                                     Duson    LA 70529-0010
## 953                                Downsville    LA      71234
## 954                             Junction City    LA      71749
## 955                                 Broussard    LA      70518
## 956                                    Eunice    LA 70535-1106
## 957                               Arnaudville    LA 70512-1010
## 958                                    Basile    LA 70515-0308
## 959                                 Delcambre    LA 70528-3099
## 960                                Downsville    LA      71234
## 961                             Junction City    LA      71749
## 962                                    Eunice    LA 70535-1106
## 963                                    Basile    LA 70515-0308
## 964                                 Broussard    LA      70518
## 965                                  DeRidder    LA      70634
## 966                                  DeRidder    LA      70634
## 967                                    Basile    LA 70515-0308
## 968                                 Delcambre    LA 70528-3099
## 969                                    Basile    LA 70515-0308
## 970                                 Delcambre    LA 70528-3099
## 971                                    Basile    LA 70515-0308
## 972                                 Delcambre    LA 70528-3099
## 973                                    Basile    LA 70515-0308
## 974                                 Delcambre    LA 70528-3099
## 975                                 Delcambre    LA 70528-3099
## 976                               Arnaudville    LA 70512-1010
## 977                               Arnaudville    LA 70512-1010
## 978                               Arnaudville    LA 70512-1010
## 979                               Arnaudville    LA 70512-1010
## 980                               Arnaudville    LA 70512-1010
## 981                                     Duson    LA 70529-0010
## 982                                     Duson    LA 70529-0010
## 983                                     Duson    LA 70529-0010
## 984                                     Duson    LA 70529-0010
## 985                                     Duson    LA 70529-0010
## 986                                Downsville    LA      71234
## 987                                Downsville    LA      71234
## 988                                Downsville    LA      71234
## 989                             Junction City    LA      71749
## 990                             Junction City    LA      71749
## 991                             Junction City    LA      71749
## 992                                    Eunice    LA 70535-1106
## 993                                    Eunice    LA 70535-1106
## 994                                    Eunice    LA 70535-1106
## 995                                    Eunice    LA 70535-1106
## 996                                Shreveport    LA 71130-1109
## 997                                Shreveport    LA 71130-1109
## 998                                Shreveport    LA 71130-1109
## 999                                Shreveport    LA 71130-1109
## 1000                               Shreveport    LA 71130-1109
## 1001                               Shreveport    LA 71130-1109
## 1002                               Shreveport    LA 71130-1109
## 1003                                Broussard    LA      70518
## 1004                                 DeRidder    LA      70634
## 1005                                Broussard    LA      70518
## 1006                                 DeRidder    LA      70634
## 1007                                Broussard    LA      70518
## 1008                                 DeRidder    LA      70634
## 1009                                Broussard    LA      70518
## 1010                                 DeRidder    LA      70634
## 1011                                Broussard    LA      70518
## 1012                                 DeRidder    LA      70634
## 1013                                Broussard    LA      70518
## 1014                                             LA           
## 1015                                             LA           
## 1016                                             LA           
## 1017                                             LA           
## 1018                                             LA           
## 1019                                             LA           
## 1020                                             LA           
## 1021                                             LA           
## 1022                                             LA           
## 1023                                             LA           
## 1024                                             LA           
## 1025                                             LA           
## 1026                                             LA           
## 1027                                             LA           
## 1028                                             LA           
## 1029                                             LA           
## 1030                                             LA           
## 1031                                             LA           
## 1032                                             LA           
## 1033                                             LA           
## 1034                                             LA           
## 1035                                  Crowley    LA      70527
## 1036                                  Crowley    LA      70527
## 1037                                  Crowley    LA 70527-1329
## 1038                                    Rayne    LA      70578
## 1039                                  Crowley    LA 70527-6001
## 1040                                  Crowley    LA 70527-6001
## 1041                                  Crowley    LA 70527-6001
## 1042                                  Crowley    LA 70527-6001
## 1043                                  Crowley    LA 70527-6001
## 1044                                  Crowley    LA 70527-6001
## 1045                                  Crowley    LA 70527-6001
## 1046                                  Crowley    LA 70527-6001
## 1047                                  Crowley    LA      70526
## 1048                                    Rayne    LA      70578
## 1049                                  Crowley    LA      70526
## 1050                                    Rayne    LA      70578
## 1051                                  Crowley    LA 70527-0309
## 1052                                  Crowley    LA 70527-0309
## 1053                                  Crowley    LA 70527-0309
## 1054                                  Crowley    LA 70527-0309
## 1055                                  Crowley    LA 70527-0309
## 1056                                  Crowley    LA 70527-0309
## 1057                                  Crowley    LA 70527-0309
## 1058                                  Crowley    LA 70527-0309
## 1059                                   Branch    LA      70516
## 1060                             Church Point    LA      70525
## 1061                                     Iota    LA      70543
## 1062                                    Morse    LA      70559
## 1063                                             LA           
## 1064                                   Branch    LA      70516
## 1065                             Church Point    LA      70525
## 1066                                     Iota    LA      70543
## 1067                                Esterwood    LA      70534
## 1068                                   Eunice    LA      70535
## 1069                                  Crowley    LA 70527-1463
## 1070                                    Rayne    LA      70578
## 1071                             Church Point    LA      70525
## 1072                                     Iota    LA      70543
## 1073                               Estherwood    LA 70534-0167
## 1074                                Mermentau    LA      70556
## 1075                                    Morse    LA      70559
## 1076                                  Crowley    LA 70527-1463
## 1077                                    Rayne    LA      70578
## 1078                             Church Point    LA      70525
## 1079                                     Iota    LA      70543
## 1080                               Estherwood    LA 70534-0167
## 1081                                Mermentau    LA      70556
## 1082                                    Morse    LA      70559
## 1083                                  Crowley    LA 70527-1463
## 1084                                             LA           
## 1085                                     Iota    LA      70543
## 1086                                     Iota    LA      70543
## 1087                                     Iota    LA      70543
## 1088                                     Iota    LA      70543
## 1089                                     Iota    LA      70543
## 1090                               Estherwood    LA 70534-0167
## 1091                               Estherwood    LA 70534-0167
## 1092                               Estherwood    LA 70534-0167
## 1093                                Mermentau    LA      70556
## 1094                                Mermentau    LA      70556
## 1095                                Mermentau    LA      70556
## 1096                                    Morse    LA      70559
## 1097                                    Morse    LA      70559
## 1098                                    Morse    LA      70559
## 1099                                    Rayne    LA      70578
## 1100                                  Crowley    LA 70527-1463
## 1101                                  Crowley    LA 70527-1463
## 1102                             Church Point    LA      70525
## 1103                                             LA           
## 1104                                  Crowley    LA 70527-1463
## 1105                                  Crowley    LA 70527-1463
## 1106                             Church Point    LA      70525
## 1107                                             LA           
## 1108                                  Crowley    LA 70527-1463
## 1109                                  Crowley    LA 70527-1463
## 1110                             Church Point    LA      70525
## 1111                                             LA           
## 1112                                  Crowley    LA 70527-1463
## 1113                                  Crowley    LA 70527-1463
## 1114                             Church Point    LA      70525
## 1115                             Church Point    LA      70525
## 1116                                             LA           
## 1117                                             LA           
## 1118                                             LA           
## 1119                                             LA           
## 1120                                             LA           
## 1121                                             LA           
## 1122                                             LA           
## 1123                                             LA           
## 1124                                             LA           
## 1125                                             LA           
## 1126                                             LA           
## 1127                                             LA           
## 1128                                             LA           
## 1129                                             LA           
## 1130                                             LA           
## 1131                                             LA           
## 1132                                  Oberlin    LA      70655
## 1133                                  Oberlin    LA      70655
## 1134                                  Oberlin    LA      70655
## 1135                                  Oakdale    LA      71463
## 1136                                  Oberlin    LA      70655
## 1137                                  Oberlin    LA      70655
## 1138                                  Oberlin    LA      70655
## 1139                                  Oberlin    LA      70655
## 1140                                  Oberlin    LA      70655
## 1141                                  Oberlin    LA      70655
## 1142                                  Oberlin    LA      70655
## 1143                                  Oakdale    LA      71463
## 1144                                  Oakdale    LA      71463
## 1145                                  Oberlin    LA      70655
## 1146                                  Oberlin    LA           
## 1147                                  Oberlin    LA           
## 1148                                  Oberlin    LA           
## 1149                                  Oberlin    LA           
## 1150                                  Oberlin    LA           
## 1151                                  Oberlin    LA           
## 1152                                  Oberlin    LA      70655
## 1153                                   Kinder    LA      70648
## 1154                                   Reeves    LA      70658
## 1155                                   Mittie    LA      70654
## 1156                                  Oberlin    LA      70655
## 1157                                   Kinder    LA      70648
## 1158                                   Reeves    LA      70658
## 1159                                   Pitkin    LA      70656
## 1160                                  Oakdale    LA      71463
## 1161                                Elizabeth    LA      70638
## 1162                                   Kinder    LA      70648
## 1163                                  Oberlin    LA      70655
## 1164                                   Reeves    LA      70658
## 1165                                  Oakdale    LA      71463
## 1166                                Elizabeth    LA      70638
## 1167                                   Kinder    LA      70648
## 1168                                  Oberlin    LA      70655
## 1169                                   Reeves    LA      70658
## 1170                                             LA           
## 1171                                  Oakdale    LA      71463
## 1172                                   Kinder    LA      70648
## 1173                                  Oberlin    LA      70655
## 1174                                  Oberlin    LA      70655
## 1175                                  Oberlin    LA      70655
## 1176                                  Oberlin    LA      70655
## 1177                                Elizabeth    LA      70638
## 1178                                Elizabeth    LA      70638
## 1179                                Elizabeth    LA      70638
## 1180                                Elizabeth    LA      70638
## 1181                                Elizabeth    LA      70638
## 1182                                   Reeves    LA      70658
## 1183                                   Reeves    LA      70658
## 1184                                   Reeves    LA      70658
## 1185                                  Oakdale    LA      71463
## 1186                                   Kinder    LA      70648
## 1187                                  Oakdale    LA      71463
## 1188                                   Kinder    LA      70648
## 1189                                  Oakdale    LA      71463
## 1190                                   Kinder    LA      70648
## 1191                                  Oakdale    LA      71463
## 1192                                   Kinder    LA      70648
## 1193                                             LA           
## 1194                                             LA           
## 1195                                             LA           
## 1196                                             LA           
## 1197                                             LA           
## 1198                                             LA           
## 1199                                             LA           
## 1200                                             LA           
## 1201                                             LA           
## 1202                                             LA           
## 1203                                             LA           
## 1204                                             LA           
## 1205                                             LA           
## 1206                                             LA           
## 1207                                             LA           
## 1208                                             LA           
## 1209                                             LA           
## 1210                                             LA           
## 1211                                             LA           
## 1212                                             LA           
## 1213                                             LA           
## 1214                                             LA           
## 1215                                             LA           
## 1216                                             LA           
## 1217                                             LA           
## 1218                                             LA           
## 1219                                             LA           
## 1220                                             LA           
## 1221                                             LA           
## 1222                                 Gonzales    LA      70737
## 1223                           Donaldsonville    LA      70346
## 1224                           Donaldsonville    LA      70346
## 1225                           Donaldsonville    LA      70346
## 1226                                 Gonzales    LA      70737
## 1227                                 Gonzales    LA      70737
## 1228                                 Gonzales    LA      70737
## 1229                                 Gonzales    LA      70737
## 1230                                 Gonzales    LA      70737
## 1231                                 Gonzales    LA      70737
## 1232                                 Gonzales    LA      70737
## 1233                                 Gonzales    LA      70737
## 1234                                 Gonzales    LA      70737
## 1235                                 Gonzales    LA      70737
## 1236                                 Gonzales    LA      70737
## 1237                                 Gonzales    LA      70737
## 1238                                 Gonzales    LA      70737
## 1239                           Donaldsonville    LA      70346
## 1240                           Donaldsonville    LA      70346
## 1241                           Donaldsonville    LA      70346
## 1242                           Donaldsonville    LA      70346
## 1243                           Donaldsonville    LA      70346
## 1244                           Donaldsonville    LA      70346
## 1245                           Donaldsonville    LA      70346
## 1246                           Donaldsonville    LA      70346
## 1247                           Donaldsonville    LA      70346
## 1248                           Donaldsonville    LA      70346
## 1249                           Donaldsonville    LA      70346
## 1250                           Donaldsonville    LA      70346
## 1251                                 Gonzales    LA      70737
## 1252                                 St Amant    LA      70774
## 1253                           Donaldsonville    LA      70346
## 1254                                 Gonzales    LA      70737
## 1255                                 St Amant    LA      70774
## 1256                           Donaldsonville    LA      70346
## 1257                                 Gonzales    LA      70737
## 1258                                 Sorrento    LA      70778
## 1259                                 Gonzales    LA      70737
## 1260                                 Sorrento    LA      70778
## 1261                                 Sorrento    LA      70778
## 1262                           Donaldsonville    LA      70346
## 1263                           Donaldsonville    LA      70346
## 1264                           Donaldsonville    LA      70346
## 1265                           Donaldsonville    LA      70346
## 1266                           Donaldsonville    LA      70346
## 1267                                 Gonzales    LA      70737
## 1268                                 Gonzales    LA      70737
## 1269                                 Gonzales    LA      70737
## 1270                                 Gonzales    LA      70737
## 1271                                 Gonzales    LA      70737
## 1272                                 Sorrento    LA      70778
## 1273                                 Sorrento    LA      70778
## 1274                                 Sorrento    LA      70778
## 1275                                 Sorrento    LA      70778
## 1276                                 Sorrento    LA      70778
## 1277                                             LA           
## 1278                                             LA           
## 1279                                             LA           
## 1280                                             LA           
## 1281                                             LA           
## 1282                                             LA           
## 1283                                             LA           
## 1284                                             LA           
## 1285                                             LA           
## 1286                                             LA           
## 1287                                             LA           
## 1288                                             LA           
## 1289                                             LA           
## 1290                                             LA           
## 1291                                             LA           
## 1292                                             LA           
## 1293                                             LA           
## 1294                                             LA           
## 1295                                             LA           
## 1296                                             LA           
## 1297                            Napoleonville    LA      70390
## 1298                            Napoleonville    LA      70390
## 1299                            Napoleonville    LA      70390
## 1300                            Napoleonville    LA      70390
## 1301                            Napoleonville    LA      70390
## 1302                            Napoleonville    LA      70390
## 1303                            Napoleonville    LA      70390
## 1304                            Napoleonville    LA      70390
## 1305                            Napoleonville    LA      70390
## 1306                            Napoleonville    LA      70390
## 1307                            Napoleonville    LA      70390
## 1308                            Napoleonville    LA      70390
## 1309                            Napoleonville    LA      70390
## 1310                            Napoleonville    LA      70390
## 1311                            Napoleonville    LA      70390
## 1312                            Napoleonville    LA      70390
## 1313                            Napoleonville    LA      70390
## 1314                            Napoleonville    LA      70390
## 1315                            Napoleonville    LA      70390
## 1316                            Napoleonville    LA      70390
## 1317                            Napoleonville    LA      70390
## 1318                            Napoleonville    LA      70390
## 1319                            Napoleonville    LA      70390
## 1320                                Thibodaux    LA      70301
## 1321                              Pierre Part    LA      70339
## 1322                             Plattenville    LA      70393
## 1323                            Napoleonville    LA      70390
## 1324                              Pierre Part    LA      70339
## 1325                            Napoleonville    LA      70390
## 1326                            Napoleonville    LA      70390
## 1327                            Napoleonville    LA      70390
## 1328                            Napoleonville    LA      70390
## 1329                                             LA           
## 1330                                             LA           
## 1331                                             LA           
## 1332                                             LA           
## 1333                                             LA           
## 1334                                             LA           
## 1335                                             LA           
## 1336                                             LA           
## 1337                                             LA           
## 1338                                             LA           
## 1339                                             LA           
## 1340                                             LA           
## 1341                                             LA           
## 1342                                             LA           
## 1343                                             LA           
## 1344                                             LA           
## 1345                                             LA           
## 1346                                             LA           
## 1347                                             LA           
## 1348                                             LA           
## 1349                               Marksville    LA      71351
## 1350                               Marksville    LA      71351
## 1351                               Marksville    LA      71351
## 1352                               Marksville    LA      71351
## 1353                               Marksville    LA      71351
## 1354                               Marksville    LA      71351
## 1355                               Marksville    LA      71351
## 1356                               Marksville    LA      71351
## 1357                               Marksville    LA      71351
## 1358                               Marksville    LA      71351
## 1359                               Marksville    LA      71351
## 1360                               Marksville    LA      71351
## 1361                               Marksville    LA      71351
## 1362                                   Bunkie    LA      71322
## 1363                               Marksville    LA      71351
## 1364                                   Bunkie    LA      71322
## 1365                               Marksville    LA      71351
## 1366                               Marksville    LA      71351
## 1367                               Marksville    LA      71351
## 1368                               Marksville    LA      71351
## 1369                               Marksville    LA      71351
## 1370                               Marksville    LA      71351
## 1371                               Marksville    LA      71351
## 1372                               Marksville    LA      71351
## 1373                               Marksville    LA      71351
## 1374                               Marksville    LA      71351
## 1375                                             LA      71323
## 1376                                  Mansura    LA      71350
## 1377                                  Hessmer    LA      71341
## 1378                               Marksville    LA      71351
## 1379                              Moreauville    LA      71355
## 1380                               Simmesport    LA      71369
## 1381                                   Dupont    LA      71329
## 1382                               Cottonport    LA      71327
## 1383                               Cottonport    LA      71327
## 1384                                    Effie    LA      71331
## 1385                                  Mansura    LA      71350
## 1386                                  Hessmer    LA      71341
## 1387                               Marksville    LA      71351
## 1388                              Moreauville    LA      71355
## 1389                               Simmesport    LA      71369
## 1390                             Plaucheville    LA      71362
## 1391                               Cottonport    LA      71327
## 1392                              Moreauville    LA      71355
## 1393                                   Bunkie    LA      71322
## 1394                               Marksville    LA 71351-2490
## 1395                               Cottonport    LA      71327
## 1396                                Evergreen    LA      71333
## 1397                                  Mansura    LA      71350
## 1398                               Simmesport    LA      71369
## 1399                                  Hessmer    LA 71341-0125
## 1400                              Moreauville    LA      71355
## 1401                             Plaucheville    LA      71362
## 1402                                   Bunkie    LA      71322
## 1403                               Cottonport    LA      71327
## 1404                                  Mansura    LA      71350
## 1405                               Simmesport    LA      71369
## 1406                                  Hessmer    LA 71341-0125
## 1407                                Evergreen    LA      71333
## 1408                                   Bunkie    LA      71322
## 1409                               Simmesport    LA      71369
## 1410                                             LA           
## 1411                                   Bunkie    LA      71322
## 1412                               Marksville    LA 71351-2490
## 1413                               Simmesport    LA      71369
## 1414                                   Bunkie    LA      71322
## 1415                               Marksville    LA 71351-2490
## 1416                               Simmesport    LA      71369
## 1417                                   Bunkie    LA      71322
## 1418                               Marksville    LA 71351-2490
## 1419                               Simmesport    LA      71369
## 1420                                   Bunkie    LA      71322
## 1421                               Marksville    LA 71351-2490
## 1422                               Simmesport    LA      71369
## 1423                               Marksville    LA 71351-2490
## 1424                                Evergreen    LA      71333
## 1425                                Evergreen    LA      71333
## 1426                                Evergreen    LA      71333
## 1427                                Evergreen    LA      71333
## 1428                                Evergreen    LA      71333
## 1429                                  Mansura    LA      71350
## 1430                                  Mansura    LA      71350
## 1431                                  Mansura    LA      71350
## 1432                                  Mansura    LA      71350
## 1433                                  Mansura    LA      71350
## 1434                                  Hessmer    LA 71341-0125
## 1435                                  Hessmer    LA 71341-0125
## 1436                                  Hessmer    LA 71341-0125
## 1437                              Moreauville    LA      71355
## 1438                              Moreauville    LA      71355
## 1439                              Moreauville    LA      71355
## 1440                             Plaucheville    LA      71362
## 1441                             Plaucheville    LA      71362
## 1442                             Plaucheville    LA      71362
## 1443                               Cottonport    LA      71327
## 1444                               Cottonport    LA      71327
## 1445                               Cottonport    LA      71327
## 1446                               Cottonport    LA      71327
## 1447                                             LA           
## 1448                                             LA           
## 1449                                             LA           
## 1450                                             LA           
## 1451                                             LA           
## 1452                                             LA           
## 1453                                             LA           
## 1454                                             LA           
## 1455                                             LA           
## 1456                                             LA           
## 1457                                             LA           
## 1458                                             LA           
## 1459                                             LA           
## 1460                                             LA           
## 1461                                             LA           
## 1462                                             LA           
## 1463                                             LA           
## 1464                                             LA           
## 1465                                             LA           
## 1466                                             LA           
## 1467                                             LA           
## 1468                                             LA           
## 1469                                             LA           
## 1470                                             LA           
## 1471                                             LA           
## 1472                                             LA           
## 1473                                             LA           
## 1474                                 DeRidder    LA      70634
## 1475                                 DeRidder    LA      70634
## 1476                                 DeRidder    LA      70634
## 1477                                 DeRidder    LA      70634
## 1478                                 DeRidder    LA      70634
## 1479                                 DeRidder    LA      70634
## 1480                                 DeRidder    LA      70634
## 1481                                 DeRidder    LA      70634
## 1482                                 DeRidder    LA      70634
## 1483                                 DeRidder    LA      70634
## 1484                                 DeRidder    LA      70634
## 1485                                 DeRidder    LA      70634
## 1486                                 DeRidder    LA      70634
## 1487                                 DeRidder    LA      70634
## 1488                                 DeRidder    LA      70634
## 1489                                 DeRidder    LA      70634
## 1490                                 DeRidder    LA      70634
## 1491                                 DeRidder    LA      70634
## 1492                                 DeRidder    LA      70634
## 1493                                 DeRidder    LA      70634
## 1494                                 DeRidder    LA      70634
## 1495                                 DeRidder    LA      70634
## 1496                                 DeRidder    LA      70634
## 1497                                             LA           
## 1498                                   Fields    LA      70653
## 1499                               Merryville    LA      70653
## 1500                                   Ragley    LA      70657
## 1501                                 DeRidder    LA      70634
## 1502                                   Singer    LA      70660
## 1503                               Merryville    LA      70653
## 1504                                Longville    LA      70652
## 1505                                Sugartown    LA      70662
## 1506                               Merryville    LA      70653
## 1507                               Merryville    LA      70653
## 1508                               Merryville    LA      70653
## 1509                               Merryville    LA      70653
## 1510                               Merryville    LA      70653
## 1511                               Merryville    LA      70653
## 1512                               Merryville    LA      70653
## 1513                                             LA           
## 1514                                             LA           
## 1515                                             LA           
## 1516                                             LA           
## 1517                                             LA           
## 1518                                             LA           
## 1519                                             LA           
## 1520                                             LA           
## 1521                                             LA           
## 1522                                             LA           
## 1523                                             LA           
## 1524                                             LA           
## 1525                                             LA           
## 1526                                             LA           
## 1527                                             LA           
## 1528                                             LA           
## 1529                                  Arcadia    LA      71001
## 1530                                  Arcadia    LA      71001
## 1531                                  Arcadia    LA      71001
## 1532                                  Arcadia    LA      71001
## 1533                                  Arcadia    LA      71001
## 1534                                  Arcadia    LA      71001
## 1535                                  Arcadia    LA      71001
## 1536                                  Arcadia    LA      71001
## 1537                                  Arcadia    LA      71001
## 1538                                  Arcadia    LA      71001
## 1539                                  Arcadia    LA      71001
## 1540                                  Arcadia    LA      71001
## 1541                                  Arcadia    LA      71001
## 1542                                  Arcadia    LA      71001
## 1543                                  Arcadia    LA      71001
## 1544                                  Arcadia    LA      71001
## 1545                                  Arcadia    LA      71001
## 1546                                  Arcadia    LA      71001
## 1547                                  Arcadia    LA      71001
## 1548                                 Gibsland    LA      71028
## 1549                                   Castor    LA      71016
## 1550                                Jamestown    LA      71045
## 1551                                   Saline    LA      71070
## 1552                                  Arcadia    LA      71001
## 1553                                 Gibsland    LA      71028
## 1554                                   Castor    LA      71016
## 1555                                 Ringgold    LA      71068
## 1556                                Bienville    LA      71008
## 1557                                  Arcadia    LA      71001
## 1558                                 Gibsland    LA      71028
## 1559                            Mount Lebanon    LA 71028-0588
## 1560                                 Ringgold    LA      71068
## 1561                                Bienville    LA      71008
## 1562                                Bryceland    LA      71008
## 1563                                   Castor    LA      71016
## 1564                                Jamestown    LA      71045
## 1565                                   Castor    LA      71016
## 1566                                   Saline    LA      71070
## 1567                                  Arcadia    LA      71001
## 1568                                 Gibsland    LA      71028
## 1569                                 Ringgold    LA      71068
## 1570                                   Castor    LA      71016
## 1571                                   Saline    LA      71070
## 1572                                 Gibsland    LA      71028
## 1573                                 Gibsland    LA      71028
## 1574                                 Gibsland    LA      71028
## 1575                                 Gibsland    LA      71028
## 1576                            Mount Lebanon    LA 71028-0588
## 1577                            Mount Lebanon    LA 71028-0588
## 1578                            Mount Lebanon    LA 71028-0588
## 1579                            Mount Lebanon    LA 71028-0588
## 1580                            Mount Lebanon    LA 71028-0588
## 1581                                Bienville    LA      71008
## 1582                                Bienville    LA      71008
## 1583                                Bienville    LA      71008
## 1584                                Bryceland    LA      71008
## 1585                                Bryceland    LA      71008
## 1586                                Bryceland    LA      71008
## 1587                                   Castor    LA      71016
## 1588                                   Castor    LA      71016
## 1589                                   Castor    LA      71016
## 1590                                Jamestown    LA      71045
## 1591                                Jamestown    LA      71045
## 1592                                Jamestown    LA      71045
## 1593                                   Castor    LA      71016
## 1594                                   Castor    LA      71016
## 1595                                   Castor    LA      71016
## 1596                                   Saline    LA      71070
## 1597                                   Saline    LA      71070
## 1598                                   Saline    LA      71070
## 1599                                   Saline    LA      71070
## 1600                                   Saline    LA      71070
## 1601                                  Arcadia    LA      71001
## 1602                                  Arcadia    LA      71001
## 1603                                  Arcadia    LA      71001
## 1604                                  Arcadia    LA      71001
## 1605                                  Arcadia    LA      71001
## 1606                                 Ringgold    LA      71068
## 1607                                 Ringgold    LA      71068
## 1608                                 Ringgold    LA      71068
## 1609                                 Ringgold    LA      71068
## 1610                                 Ringgold    LA      71068
## 1611                                             LA           
## 1612                                             LA           
## 1613                                             LA           
## 1614                                             LA           
## 1615                                             LA           
## 1616                                             LA           
## 1617                                             LA           
## 1618                                             LA           
## 1619                                             LA           
## 1620                                             LA           
## 1621                                             LA           
## 1622                                             LA           
## 1623                                             LA           
## 1624                                             LA           
## 1625                                             LA           
## 1626                                             LA           
## 1627                                             LA           
## 1628                                             LA           
## 1629                                             LA           
## 1630                                             LA           
## 1631                                             LA           
## 1632                                             LA           
## 1633                                             LA           
## 1634                                             LA           
## 1635                                             LA           
## 1636                                             LA           
## 1637                                             LA           
## 1638                                             LA           
## 1639                                             LA           
## 1640                                             LA           
## 1641                                   Benton    LA      71006
## 1642                                   Benton    LA 71006-0746
## 1643                                   Benton    LA 71006-0325
## 1644                             Bossier City    LA      71112
## 1645                                   Benton    LA      71006
## 1646                                   Benton    LA      71006
## 1647                                   Benton    LA      71006
## 1648                                   Benton    LA      71006
## 1649                                   Benton    LA      71006
## 1650                                   Benton    LA      71006
## 1651                                   Benton    LA      71006
## 1652                                   Benton    LA      71006
## 1653                                   Benton    LA      71006
## 1654                                   Benton    LA      71006
## 1655                                   Benton    LA      71006
## 1656                                   Benton    LA      71006
## 1657                             Bossier City    LA      71111
## 1658                             Bossier City    LA      71111
## 1659                                   Benton    LA      71006
## 1660                                   Benton    LA      71006
## 1661                                   Benton    LA      71006
## 1662                                   Benton    LA      71006
## 1663                                   Benton    LA      71006
## 1664                                   Benton    LA      71006
## 1665                                   Benton    LA      71006
## 1666                                   Benton    LA      71006
## 1667                                   Benton    LA      71006
## 1668                                   Benton    LA      71006
## 1669                                   Benton    LA      71006
## 1670                                   Benton    LA      71006
## 1671                             Bossier City    LA 71112-5042
## 1672                            Plain Dealing    LA      71064
## 1673                            Plain Dealing    LA      71064
## 1674                            Plain Dealing    LA      71064
## 1675                                   Benton    LA      71006
## 1676                                Princeton    LA      71067
## 1677                                Princeton    LA      71067
## 1678                             Bossier City    LA 71112-4922
## 1679                            Plain Dealing    LA      71064
## 1680                            Plain Dealing    LA      71064
## 1681                            Plain Dealing    LA      71064
## 1682                                   Benton    LA      71006
## 1683                                 Haughton    LA      71037
## 1684                                 Haughton    LA      71037
## 1685                             Bossier City    LA 71171-5337
## 1686                             Bossier City    LA 71171-5337
## 1687                                   Benton    LA      71006
## 1688                                 Haughton    LA      71037
## 1689                            Plain Dealing    LA      71064
## 1690                                   Benton    LA      71006
## 1691                                 Haughton    LA      71037
## 1692                            Plain Dealing    LA      71064
## 1693                             Bossier City    LA 71171-5337
## 1694                             Bossier City    LA 71171-5337
## 1695                             Bossier City    LA 71171-5337
## 1696                             Bossier City    LA 71171-5337
## 1697                            Plain Dealing    LA      71064
## 1698                            Plain Dealing    LA      71064
## 1699                            Plain Dealing    LA      71064
## 1700                                   Benton    LA      71006
## 1701                                   Benton    LA      71006
## 1702                                 Haughton    LA      71037
## 1703                                 Haughton    LA      71037
## 1704                                 Haughton    LA      71037
## 1705                                 Haughton    LA      71037
## 1706                            Plain Dealing    LA      71064
## 1707                            Plain Dealing    LA      71064
## 1708                             Bossier City    LA 71171-5337
## 1709                             Bossier City    LA 71171-5337
## 1710                             Bossier City    LA 71171-5337
## 1711                             Bossier City    LA 71171-5337
## 1712                             Bossier City    LA 71171-5337
## 1713                             Bossier City    LA 71171-5337
## 1714                             Bossier City    LA 71171-5337
## 1715                             Bossier City    LA 71171-5337
## 1716                                             LA           
## 1717                                             LA           
## 1718                                             LA           
## 1719                                             LA           
## 1720                                             LA           
## 1721                                             LA           
## 1722                                             LA           
## 1723                                             LA           
## 1724                                             LA           
## 1725                                             LA           
## 1726                                             LA           
## 1727                                             LA           
## 1728                                             LA           
## 1729                                             LA           
## 1730                                             LA           
## 1731                                             LA           
## 1732                                             LA           
## 1733                                             LA           
## 1734                                             LA           
## 1735                                             LA           
## 1736                                             LA           
## 1737                                             LA           
## 1738                                             LA           
## 1739                                             LA           
## 1740                                             LA           
## 1741                                             LA           
## 1742                                             LA           
## 1743                                             LA           
## 1744                                             LA           
## 1745                                             LA           
## 1746                                             LA           
## 1747                                             LA           
## 1748                                             LA           
## 1749                                             LA           
## 1750                               Shreveport    LA      71101
## 1751                               Shreveport    LA      71101
## 1752                               Shreveport    LA      71101
## 1753                               Shreveport    LA 71101-5410
## 1754                               Shreveport    LA      71101
## 1755                               Shreveport    LA      71101
## 1756                               Shreveport    LA      71101
## 1757                               Shreveport    LA 71101-5409
## 1758                               Shreveport    LA 71101-5409
## 1759                               Shreveport    LA 71101-5409
## 1760                               Shreveport    LA 71101-5409
## 1761                               Shreveport    LA 71101-5409
## 1762                               Shreveport    LA 71101-5409
## 1763                               Shreveport    LA 71101-5409
## 1764                               Shreveport    LA 71101-5409
## 1765                               Shreveport    LA 71101-5409
## 1766                               Shreveport    LA 71101-5409
## 1767                               Shreveport    LA 71101-5409
## 1768                               Shreveport    LA 71101-5409
## 1769                               Shreveport    LA 71130-2000
## 1770                               Shreveport    LA      71108
## 1771                               Shreveport    LA      71108
## 1772                               Shreveport    LA      71108
## 1773                               Shreveport    LA      71108
## 1774                               Shreveport    LA      71108
## 1775                               Shreveport    LA      71108
## 1776                               Shreveport    LA      71108
## 1777                               Shreveport    LA      71108
## 1778                               Shreveport    LA      71108
## 1779                               Shreveport    LA      71108
## 1780                               Shreveport    LA      71108
## 1781                                  Belcher    LA      71004
## 1782                                 Oil City    LA 71061-9704
## 1783                                   Vivian    LA 71082-8563
## 1784                                Blanchard    LA      71009
## 1785                                Greenwood    LA 71033-3338
## 1786                               Shreveport    LA 71129-9740
## 1787                               Shreveport    LA      71136
## 1788                                Shrevport    LA 71106-8331
## 1789                                      Ida    LA      71044
## 1790                             Mooringsport    LA 71060-8620
## 1791                               Shreveport    LA 71107-9118
## 1792                                 Oil City    LA      71061
## 1793                                 Oil City    LA      71061
## 1794                                Blanchard    LA      71009
## 1795                             Mooringsport    LA      71060
## 1796                               Shreveport    LA 71101-5409
## 1797                               Keithville    LA 71047-7551
## 1798                               Keithville    LA      71047
## 1799                               Shreveport    LA 71106-8331
## 1800                                  Hosston    LA 71043-0193
## 1801                                Blanchard    LA      71009
## 1802                                Greenwood    LA      71033
## 1803                             Mooringsport    LA      71060
## 1804                                 Oil City    LA      71061
## 1805                                   Vivian    LA      71082
## 1806                                  Belcher    LA      71004
## 1807                                  Gilliam    LA 71029-0129
## 1808                                  Hosston    LA      71043
## 1809                                      Ida    LA      71044
## 1810                                  Rodessa    LA      71069
## 1811                                Blanchard    LA      71009
## 1812                             Mooringsport    LA      71060
## 1813                                   Vivian    LA      71082
## 1814                                  Belcher    LA      71004
## 1815                                  Gilliam    LA 71029-0129
## 1816                                  Hosston    LA      71043
## 1817                                      Ida    LA      71044
## 1818                                Greenwood    LA      71033
## 1819                                   Vivian    LA      71082
## 1820                             Mooringsport    LA      71060
## 1821                             Mooringsport    LA      71060
## 1822                                 Oil City    LA      71061
## 1823                                 Oil City    LA      71061
## 1824                                 Oil City    LA      71061
## 1825                                 Oil City    LA      71061
## 1826                                 Oil City    LA      71061
## 1827                                Greenwood    LA      71033
## 1828                                Greenwood    LA      71033
## 1829                                Greenwood    LA      71033
## 1830                                Greenwood    LA      71033
## 1831                                Blanchard    LA      71009
## 1832                                Blanchard    LA      71009
## 1833                                Blanchard    LA      71009
## 1834                                Blanchard    LA      71009
## 1835                                Blanchard    LA      71009
## 1836                                  Belcher    LA      71004
## 1837                                  Belcher    LA      71004
## 1838                                  Belcher    LA      71004
## 1839                                  Gilliam    LA 71029-0129
## 1840                                  Gilliam    LA 71029-0129
## 1841                                  Gilliam    LA 71029-0129
## 1842                                  Hosston    LA      71043
## 1843                                  Hosston    LA      71043
## 1844                                  Hosston    LA      71043
## 1845                                      Ida    LA      71044
## 1846                                      Ida    LA      71044
## 1847                                      Ida    LA      71044
## 1848                                  Rodessa    LA      71069
## 1849                                  Rodessa    LA      71069
## 1850                                  Rodessa    LA      71069
## 1851                                   Vivian    LA      71082
## 1852                                   Vivian    LA      71082
## 1853                                   Vivian    LA      71082
## 1854                                   Vivian    LA      71082
## 1855                             Mooringsport    LA      71060
## 1856                             Mooringsport    LA      71060
## 1857                             Mooringsport    LA      71060
## 1858                                             LA           
## 1859                                             LA           
## 1860                                             LA           
## 1861                                             LA           
## 1862                                             LA           
## 1863                                             LA           
## 1864                                             LA           
## 1865                                             LA           
## 1866                                             LA           
## 1867                                             LA           
## 1868                                             LA           
## 1869                                             LA           
## 1870                                             LA           
## 1871                                             LA           
## 1872                                             LA           
## 1873                                             LA           
## 1874                                             LA           
## 1875                                             LA           
## 1876                                             LA           
## 1877                                             LA           
## 1878                                             LA           
## 1879                                             LA           
## 1880                                             LA           
## 1881                                             LA           
## 1882                                             LA           
## 1883                                             LA           
## 1884                                             LA           
## 1885                                             LA           
## 1886                                             LA           
## 1887                                             LA           
## 1888                                             LA           
## 1889                                             LA           
## 1890                                             LA           
## 1891                                             LA           
## 1892                                             LA           
## 1893                                             LA           
## 1894                                             LA           
## 1895                                             LA           
## 1896                                             LA           
## 1897                                             LA           
## 1898                             Lake Charles    LA      70602
## 1899                             Lake Charles    LA      70602
## 1900                             Lake Charles    LA      70602
## 1901                             Lake Charles    LA      70601
## 1902                             Lake Charles    LA 70602-3287
## 1903                             Lake Charles    LA 70602-3287
## 1904                             Lake Charles    LA 70602-3287
## 1905                             Lake Charles    LA 70602-3287
## 1906                             Lake Charles    LA 70602-3287
## 1907                             Lake Charles    LA 70602-3287
## 1908                             Lake Charles    LA 70602-3287
## 1909                             Lake Charles    LA 70602-3287
## 1910                             Lake Charles    LA 70602-3287
## 1911                             Lake Charles    LA 70602-3287
## 1912                             Lake Charles    LA 70602-3287
## 1913                             Lake Charles    LA 70602-3287
## 1914                             Lake Charles    LA 70602-3287
## 1915                             Lake Charles    LA 70602-3287
## 1916                             Lake Charles    LA 70602-3287
## 1917                                  Sulphur    LA      70663
## 1918                             Lake Charles    LA      70602
## 1919                             Lake Charles    LA      70602
## 1920                             Lake Charles    LA      70602
## 1921                                  Sulphur    LA      70663
## 1922                             Lake Charles    LA      70615
## 1923                             Lake Charles    LA      70601
## 1924                             Lake Charles    LA      70601
## 1925                             Lake Charles    LA      70601
## 1926                             Lake Charles    LA      70601
## 1927                             Lake Charles    LA      70601
## 1928                             Lake Charles    LA      70601
## 1929                             Lake Charles    LA      70601
## 1930                             Lake Charles    LA      70601
## 1931                             Lake Charles    LA      70601
## 1932                             Lake Charles    LA      70601
## 1933                             Lake Charles    LA      70601
## 1934                             Lake Charles    LA      70601
## 1935                             Lake Charles    LA      70601
## 1936                             Lake Charles    LA      70601
## 1937                             Lake Charles    LA      70611
## 1938                                    Hayes    LA      70646
## 1939                                   Starks    LA      70661
## 1940                                 DeQuincy    LA      70633
## 1941                                   Vinton    LA      70668
## 1942                             Lake Charles    LA      70615
## 1943                             Lake Charles    LA      70611
## 1944                                    Hayes    LA      70646
## 1945                                   Starks    LA      70661
## 1946                                 DeQuincy    LA      70633
## 1947                                   Vinton    LA      70668
## 1948                             Lake Charles    LA      70615
## 1949                                 DeQuincy    LA      70633
## 1950                             Lake Charles    LA 70602-0900
## 1951                             Lake Charles    LA 70602-0900
## 1952                                  Sulphur    LA 70664-1309
## 1953                                 Westlake    LA 70669-0700
## 1954                                     Iowa    LA      70647
## 1955                                   Vinton    LA      70668
## 1956                                   Vinton    LA      70668
## 1957                                 Westlake    LA      70669
## 1958                                     Iowa    LA      70647
## 1959                                   Vinton    LA      70668
## 1960                                 DeQuincy    LA      70633
## 1961                                     Iowa    LA      70647
## 1962                                     Iowa    LA      70647
## 1963                                     Iowa    LA      70647
## 1964                                     Iowa    LA      70647
## 1965                                     Iowa    LA      70647
## 1966                                 Westlake    LA      70669
## 1967                                             LA           
## 1968                                             LA           
## 1969                                             LA           
## 1970                                             LA           
## 1971                                 DeQuincy    LA      70633
## 1972                                  Sulphur    LA 70664-1309
## 1973                                 DeQuincy    LA      70633
## 1974                                  Sulphur    LA 70664-1309
## 1975                                 DeQuincy    LA      70633
## 1976                                  Sulphur    LA 70664-1309
## 1977                                 DeQuincy    LA      70633
## 1978                                  Sulphur    LA 70664-1309
## 1979                                  Sulphur    LA 70664-1309
## 1980                             Lake Charles    LA 70602-0900
## 1981                             Lake Charles    LA 70602-0900
## 1982                             Lake Charles    LA 70602-0900
## 1983                             Lake Charles    LA 70602-0900
## 1984                             Lake Charles    LA 70602-0900
## 1985                             Lake Charles    LA 70602-0900
## 1986                             Lake Charles    LA 70602-0900
## 1987                             Lake Charles    LA 70602-0900
## 1988                             Lake Charles    LA 70602-0900
## 1989                             Lake Charles    LA 70602-0900
## 1990                             Lake Charles    LA 70602-0900
## 1991                                   Vinton    LA      70668
## 1992                                   Vinton    LA      70668
## 1993                                   Vinton    LA      70668
## 1994                                   Vinton    LA      70668
## 1995                                   Vinton    LA      70668
## 1996                                             LA           
## 1997                                             LA           
## 1998                                             LA           
## 1999                                             LA           
## 2000                                             LA           
## 2001                                             LA           
## 2002                                             LA           
## 2003                                             LA           
## 2004                                             LA           
## 2005                                             LA           
## 2006                                             LA           
## 2007                                             LA           
## 2008                                             LA           
## 2009                                             LA           
## 2010                                             LA           
## 2011                                             LA           
## 2012                                 Columbia    LA      71418
## 2013                                 Columbia    LA      71418
## 2014                                 Columbia    LA      71418
## 2015                                 Columbia    LA      71418
## 2016                                 Columbia    LA      71418
## 2017                                 Columbia    LA      71418
## 2018                                 Columbia    LA      71418
## 2019                                 Columbia    LA      71418
## 2020                                 Columbia    LA      71418
## 2021                                 Columbia    LA      71418
## 2022                                 Columbia    LA      71418
## 2023                                 Columbia    LA      71418
## 2024                                 Columbia    LA      71418
## 2025                                 Columbia    LA      71418
## 2026                                 Columbia    LA      71418
## 2027                                 Columbia    LA      71418
## 2028                                 Columbia    LA      71418
## 2029                                 Columbia    LA      71418
## 2030                                 Columbia    LA      71418
## 2031                                 Columbia    LA      71418
## 2032                                 Columbia    LA      71418
## 2033                                 Columbia    LA      71418
## 2034                                   Clarks    LA      71415
## 2035                                 Columbia    LA      71418
## 2036                                  Grayson    LA      71435
## 2037                                 Columbia    LA      71418
## 2038                                  Grayson    LA      71435
## 2039                                   Clarks    LA      71415
## 2040                                   Clarks    LA      71415
## 2041                                   Clarks    LA      71415
## 2042                                   Clarks    LA      71415
## 2043                                   Clarks    LA      71415
## 2044                                  Grayson    LA      71435
## 2045                                  Grayson    LA      71435
## 2046                                  Grayson    LA      71435
## 2047                                 Columbia    LA      71418
## 2048                                 Columbia    LA      71418
## 2049                                 Columbia    LA      71418
## 2050                                 Columbia    LA      71418
## 2051                                 Columbia    LA      71418
## 2052                                             LA           
## 2053                                             LA           
## 2054                                             LA           
## 2055                                             LA           
## 2056                                             LA           
## 2057                                             LA           
## 2058                                             LA           
## 2059                                             LA           
## 2060                                             LA           
## 2061                                             LA           
## 2062                                             LA           
## 2063                                             LA           
## 2064                                             LA           
## 2065                                             LA           
## 2066                                             LA           
## 2067                                             LA           
## 2068                                             LA           
## 2069                                             LA           
## 2070                                  Cameron    LA      70631
## 2071                                  Cameron    LA      70631
## 2072                                  Cameron    LA      70631
## 2073                                   Creole    LA      70632
## 2074                                  Cameron    LA      70631
## 2075                                  Cameron    LA      70631
## 2076                                  Cameron    LA      70631
## 2077                                  Cameron    LA      70631
## 2078                                  Cameron    LA      70631
## 2079                                  Cameron    LA      70631
## 2080                                  Cameron    LA      70631
## 2081                                  Cameron    LA      70631
## 2082                                  Cameron    LA 70631-1548
## 2083                                  Cameron    LA 70631-1548
## 2084                                  Cameron    LA 70631-1548
## 2085                                  Cameron    LA 70631-1548
## 2086                                  Cameron    LA 70631-1548
## 2087                                  Cameron    LA 70631-1548
## 2088                                             LA           
## 2089                            Grand Chenier    LA      70643
## 2090                                  Cameron    LA      70631
## 2091                             Lake Charles    LA      70607
## 2092                                  Cameron    LA      70631
## 2093                                Hackberry    LA      70645
## 2094                                  Gueydan    LA      70549
## 2095                            Grand Chenier    LA      70643
## 2096                                  Cameron    LA      70631
## 2097                             Lake Charles    LA      70607
## 2098                                  Cameron    LA      70631
## 2099                                Hackberry    LA      70645
## 2100                                             LA           
## 2101                                             LA           
## 2102                                             LA           
## 2103                                             LA           
## 2104                                             LA           
## 2105                                             LA           
## 2106                                             LA           
## 2107                                             LA           
## 2108                                             LA           
## 2109                                             LA           
## 2110                                             LA           
## 2111                                             LA           
## 2112                                             LA           
## 2113                                             LA           
## 2114                                             LA           
## 2115                                             LA           
## 2116                                             LA           
## 2117                                             LA           
## 2118                                             LA           
## 2119                                             LA           
## 2120                                             LA           
## 2121                                             LA           
## 2122                             Harrisonburg    LA      71340
## 2123                             Harrisonburg    LA      71340
## 2124                             Harrisonburg    LA      71340
## 2125                             Harrisonburg    LA      71340
## 2126                             Harrisonburg    LA      71340
## 2127                             Harrisonburg    LA      71340
## 2128                             Harrisonburg    LA      71340
## 2129                             Harrisonburg    LA      71340
## 2130                             Harrisonburg    LA      71340
## 2131                             Harrisonburg    LA      71340
## 2132                             Harrisonburg    LA      71340
## 2133                             Harrisonburg    LA      71340
## 2134                             Harrisonburg    LA      71340
## 2135                             Harrisonburg    LA      71340
## 2136                             Harrisonburg    LA      71340
## 2137                             Harrisonburg    LA      71340
## 2138                             Harrisonburg    LA      71340
## 2139                             Harrisonburg    LA      71340
## 2140                             Harrisonburg    LA      71340
## 2141                             Harrisonburg    LA      71340
## 2142                             Harrisonburg    LA      71340
## 2143                             Harrisonburg    LA      71340
## 2144                            Sicily Island    LA      71368
## 2145                               Jonesville    LA      71343
## 2146                               Jonesville    LA      71343
## 2147                            Sicily Island    LA      71368
## 2148                               Jonesville    LA      71343
## 2149                               Jonesville    LA      71343
## 2150                               Jonesville    LA      71343
## 2151                             Harrisonburg    LA      71340
## 2152                            Sicily Island    LA      71368
## 2153                             Harrisonburg    LA      71340
## 2154                               Jonesville    LA      71343
## 2155                               Jonesville    LA      71343
## 2156                               Jonesville    LA      71343
## 2157                               Jonesville    LA      71343
## 2158                               Jonesville    LA      71343
## 2159                             Harrisonburg    LA      71340
## 2160                             Harrisonburg    LA      71340
## 2161                             Harrisonburg    LA      71340
## 2162                            Sicily Island    LA      71368
## 2163                            Sicily Island    LA      71368
## 2164                            Sicily Island    LA      71368
## 2165                                             LA           
## 2166                                             LA           
## 2167                                             LA           
## 2168                                             LA           
## 2169                                             LA           
## 2170                                             LA           
## 2171                                             LA           
## 2172                                             LA           
## 2173                                             LA           
## 2174                                             LA           
## 2175                                             LA           
## 2176                                             LA           
## 2177                                             LA           
## 2178                                             LA           
## 2179                                             LA           
## 2180                                             LA           
## 2181                                             LA           
## 2182                                             LA           
## 2183                                             LA           
## 2184                                             LA           
## 2185                                             LA           
## 2186                                             LA           
## 2187                                             LA           
## 2188                                    Homer    LA      71040
## 2189                                    Homer    LA      71040
## 2190                                    Homer    LA      71040
## 2191                                    Homer    LA      71040
## 2192                                    Homer    LA      71040
## 2193                                    Homer    LA      71040
## 2194                                    Homer    LA      71040
## 2195                                    Homer    LA      71040
## 2196                                    Homer    LA      71040
## 2197                                    Homer    LA      71040
## 2198                                    Homer    LA      71040
## 2199                                    Homer    LA      71040
## 2200                                    Homer    LA      71040
## 2201                                    Homer    LA      71040
## 2202                                    Homer    LA      71040
## 2203                                    Homer    LA      71040
## 2204                                    Homer    LA      71040
## 2205                                    Homer    LA      71040
## 2206                                    Homer    LA      71040
## 2207                                    Homer    LA      71040
## 2208                                    Homer    LA      71040
## 2209                                    Homer    LA      71040
## 2210                                    Homer    LA      71040
## 2211                                    Homer    LA      71040
## 2212                              Haynesville    LA      71038
## 2213                                    Homer    LA      71040
## 2214                                  Bernice    LA      71222
## 2215                              Haynesville    LA 71038-7580
## 2216                                    Homer    LA 71040-8646
## 2217                                    Homer    LA      71040
## 2218                              Haynesville    LA      71038
## 2219                                    Homer    LA      71040
## 2220                                   Athens    LA      71003
## 2221                                   Lisbon    LA      71048
## 2222                              Haynesville    LA      71038
## 2223                                   Athens    LA      71003
## 2224                                    Homer    LA      71040
## 2225                                   Athens    LA      71003
## 2226                                   Athens    LA      71003
## 2227                                   Athens    LA      71003
## 2228                                   Lisbon    LA      71048
## 2229                                   Lisbon    LA      71048
## 2230                                   Lisbon    LA      71048
## 2231                              Haynesville    LA      71038
## 2232                              Haynesville    LA      71038
## 2233                              Haynesville    LA      71038
## 2234                              Haynesville    LA      71038
## 2235                              Haynesville    LA      71038
## 2236                                    Homer    LA      71040
## 2237                                    Homer    LA      71040
## 2238                                    Homer    LA      71040
## 2239                                    Homer    LA      71040
## 2240                                    Homer    LA      71040
## 2241                                             LA           
## 2242                                             LA           
## 2243                                             LA           
## 2244                                             LA           
## 2245                                             LA           
## 2246                                             LA           
## 2247                                             LA           
## 2248                                             LA           
## 2249                                             LA           
## 2250                                             LA           
## 2251                                             LA           
## 2252                                             LA           
## 2253                                             LA           
## 2254                                             LA           
## 2255                                             LA           
## 2256                                             LA           
## 2257                                             LA           
## 2258                                             LA           
## 2259                                             LA           
## 2260                                             LA           
## 2261                                  Vidalia    LA      71373
## 2262                                  Vidalia    LA      71373
## 2263                                  Vidalia    LA      71373
## 2264                                 Ferriday    LA      71334
## 2265                                  Vidalia    LA      71373
## 2266                                  Vidalia    LA      71373
## 2267                                  Vidalia    LA      71373
## 2268                                  Vidalia    LA      71373
## 2269                                  Vidalia    LA      71373
## 2270                                  Vidalia    LA      71373
## 2271                                  Vidalia    LA      71373
## 2272                                  Vidalia    LA      71373
## 2273                                  Vidalia    LA      71373
## 2274                                  Vidalia    LA      71373
## 2275                                  Vidalia    LA      71373
## 2276                                  Vidalia    LA      71373
## 2277                                  Vidalia    LA      71373
## 2278                                  Vidalia    LA      71373
## 2279                                  Vidalia    LA      71373
## 2280                                  Vidalia    LA      71373
## 2281                                  Vidalia    LA      71373
## 2282                                  Vidalia    LA      71373
## 2283                                  Vidalia    LA      71373
## 2284                                  Vidalia    LA      71373
## 2285                                 Ferriday    LA      71334
## 2286                                  Vidalia    LA      71373
## 2287                                  Vidalia    LA      71373
## 2288                                 Ferriday    LA      71334
## 2289                                 Ferriday    LA      71334
## 2290                                 Monterey    LA      71354
## 2291                                 Ferriday    LA      71334
## 2292                                  Vidalia    LA      71373
## 2293                                  Vidalia    LA      71373
## 2294                                  Vidalia    LA      71373
## 2295                                 Ferriday    LA      71334
## 2296                                 Monterey    LA      71354
## 2297                                  Clayton    LA      71326
## 2298                                 Ferriday    LA      71334
## 2299                               Ridgecrest    LA      71334
## 2300                                  Vidalia    LA      71373
## 2301                                  Clayton    LA      71326
## 2302                               Ridgecrest    LA      71334
## 2303                                  Vidalia    LA      71373
## 2304                                  Vidalia    LA      71373
## 2305                                  Vidalia    LA      71373
## 2306                                  Vidalia    LA      71373
## 2307                                  Vidalia    LA      71373
## 2308                                  Vidalia    LA      71373
## 2309                                 Ferriday    LA      71334
## 2310                                 Ferriday    LA      71334
## 2311                                 Ferriday    LA      71334
## 2312                                 Ferriday    LA      71334
## 2313                                 Ferriday    LA      71334
## 2314                                  Clayton    LA      71326
## 2315                                  Clayton    LA      71326
## 2316                                  Clayton    LA      71326
## 2317                                  Clayton    LA      71326
## 2318                                  Clayton    LA      71326
## 2319                               Ridgecrest    LA      71334
## 2320                               Ridgecrest    LA      71334
## 2321                               Ridgecrest    LA      71334
## 2322                               Ridgecrest    LA      71334
## 2323                               Ridgecrest    LA      71334
## 2324                                             LA           
## 2325                                             LA           
## 2326                                             LA           
## 2327                                             LA           
## 2328                                             LA           
## 2329                                             LA           
## 2330                                             LA           
## 2331                                             LA           
## 2332                                             LA           
## 2333                                             LA           
## 2334                                             LA           
## 2335                                             LA           
## 2336                                             LA           
## 2337                                             LA           
## 2338                                             LA           
## 2339                                             LA           
## 2340                                             LA           
## 2341                                             LA           
## 2342                                             LA           
## 2343                                             LA           
## 2344                                             LA           
## 2345                                             LA           
## 2346                                             LA           
## 2347                                             LA           
## 2348                                             LA           
## 2349                                Mansfield    LA      71052
## 2350                                Mansfield    LA      71052
## 2351                                Mansfield    LA      71052
## 2352                                Mansfield    LA      71052
## 2353                                Mansfield    LA      71052
## 2354                                Mansfield    LA      71052
## 2355                                Mansfield    LA      71052
## 2356                                Mansfield    LA      71052
## 2357                                Mansfield    LA      71052
## 2358                                Mansfield    LA      71052
## 2359                                Mansfield    LA      71052
## 2360                                Mansfield    LA      71052
## 2361                                Mansfield    LA      71052
## 2362                                Mansfield    LA      71052
## 2363                                Mansfield    LA      71052
## 2364                                Mansfield    LA      71052
## 2365                                Mansfield    LA      71052
## 2366                                Mansfield    LA      71052
## 2367                                Mansfield    LA      71052
## 2368                                Mansfield    LA      71052
## 2369                                Mansfield    LA      71052
## 2370                                Mansfield    LA      71052
## 2371                                Mansfield    LA      71052
## 2372                                Mansfield    LA      71052
## 2373                                Mansfield    LA      71052
## 2374                                Mansfield    LA      71052
## 2375                               Logansport    LA      71049
## 2376                                Stonewall    LA      71078
## 2377                               Logansport    LA      71049
## 2378                                Mansfield    LA      71052
## 2379                                  Pelican    LA      71063
## 2380                               Logansport    LA      71049
## 2381                               Logansport    LA      71049
## 2382                                  Gloster    LA      71030
## 2383                                Mansfield    LA      71052
## 2384                                Mansfield    LA      71052
## 2385                                Mansfield    LA      71052
## 2386                               Logansport    LA      71049
## 2387                                Mansfield    LA      71052
## 2388                                   Keachi    LA      71046
## 2389                               Logansport    LA      71049
## 2390                                Stonewall    LA      71078
## 2391                               Grand Cane    LA      71032
## 2392                               Longstreet    LA      71050
## 2393                          South Mansfield    LA      71052
## 2394                               Logansport    LA      71049
## 2395                               Logansport    LA      71049
## 2396                                Stonewall    LA      71078
## 2397                               Logansport    LA      71049
## 2398                               Logansport    LA      71049
## 2399                                Mansfield    LA      71052
## 2400                                Mansfield    LA      71052
## 2401                                Mansfield    LA      71052
## 2402                                Mansfield    LA      71052
## 2403                                Mansfield    LA      71052
## 2404                               Grand Cane    LA      71032
## 2405                               Grand Cane    LA      71032
## 2406                               Grand Cane    LA      71032
## 2407                          South Mansfield    LA      71052
## 2408                          South Mansfield    LA      71052
## 2409                          South Mansfield    LA      71052
## 2410                               Logansport    LA      71049
## 2411                               Logansport    LA      71049
## 2412                               Logansport    LA      71049
## 2413                               Logansport    LA      71049
## 2414                               Logansport    LA      71049
## 2415                               Logansport    LA      71049
## 2416                               Logansport    LA      71049
## 2417                               Logansport    LA      71049
## 2418                               Logansport    LA      71049
## 2419                               Logansport    LA      71049
## 2420                               Logansport    LA      71049
## 2421                                Stonewall    LA      71078
## 2422                                Stonewall    LA      71078
## 2423                                Stonewall    LA      71078
## 2424                                Stonewall    LA      71078
## 2425                                Stonewall    LA      71078
## 2426                               Longstreet    LA      71050
## 2427                               Longstreet    LA      71050
## 2428                               Longstreet    LA      71050
## 2429                                   Keachi    LA      71046
## 2430                                   Keachi    LA      71046
## 2431                                   Keachi    LA      71046
## 2432                                   Keachi    LA      71046
## 2433                                   Keachi    LA      71046
## 2434                                             LA           
## 2435                                             LA           
## 2436                                             LA           
## 2437                                             LA           
## 2438                                             LA           
## 2439                                             LA           
## 2440                                             LA           
## 2441                                             LA           
## 2442                                             LA           
## 2443                                             LA           
## 2444                                             LA           
## 2445                                             LA           
## 2446                                             LA           
## 2447                                             LA           
## 2448                                             LA           
## 2449                                             LA           
## 2450                                             LA           
## 2451                                             LA           
## 2452                                             LA           
## 2453                                             LA           
## 2454                                             LA           
## 2455                                             LA           
## 2456                                             LA           
## 2457                                             LA           
## 2458                                             LA           
## 2459                                             LA           
## 2460                                             LA           
## 2461                                             LA           
## 2462                                             LA           
## 2463                                             LA           
## 2464                                             LA           
## 2465                                             LA           
## 2466                                             LA           
## 2467                                             LA           
## 2468                              Baton Rouge    LA      70807
## 2469                              Baton Rouge    LA      70807
## 2470                              Baton Rouge    LA      70801
## 2471                              Baton Rouge    LA           
## 2472                              Baton Rouge    LA      70801
## 2473                              Baton Rouge    LA      70801
## 2474                              Baton Rouge    LA      70821
## 2475                              Baton Rouge    LA      70821
## 2476                              Baton Rouge    LA      70802
## 2477                              Baton Rouge    LA      70801
## 2478                              Baton Rouge    LA      70802
## 2479                              Baton Rouge    LA      70802
## 2480                              Baton Rouge    LA      70802
## 2481                              Baton Rouge    LA      70802
## 2482                              Baton Rouge    LA      70802
## 2483                              Baton Rouge    LA      70802
## 2484                              Baton Rouge    LA      70802
## 2485                              Baton Rouge    LA      70802
## 2486                              Baton Rouge    LA      70802
## 2487                              Baton Rouge    LA      70802
## 2488                              Baton Rouge    LA      70802
## 2489                              Baton Rouge    LA      70802
## 2490                              Baton Rouge    LA      70802
## 2491                                    Baker    LA 70714-0001
## 2492                                  Zachary    LA      70791
## 2493                              Baton Rouge    LA 70821-3438
## 2494                              Baton Rouge    LA 70821-3438
## 2495                              Baton Rouge    LA 70821-3438
## 2496                              Baton Rouge    LA 70821-3438
## 2497                              Baton Rouge    LA 70821-3438
## 2498                              Baton Rouge    LA 70821-3438
## 2499        3755 Church St            Zachary    LA      70791
## 2500                              Baton Rouge    LA      70719
## 2501                              Baton Rouge    LA      70719
## 2502                              Baton Rouge    LA      70719
## 2503                              Baton Rouge    LA      70719
## 2504                              Baton Rouge    LA      70719
## 2505                              Baton Rouge    LA      70719
## 2506                              Baton Rouge    LA      70719
## 2507                              Baton Rouge    LA      70719
## 2508                              Baton Rouge    LA      70806
## 2509 10510 Joor Rd Ste 300            Central    LA      70818
## 2510                                    Baker    LA      70714
## 2511                              Baton Rouge    LA      70821
## 2512                                             LA           
## 2513                                    Baker    LA      70714
## 2514                              Baton Rouge    LA      70821
## 2515                                             LA           
## 2516                                    Baker    LA      70714
## 2517                              Baton Rouge    LA      70821
## 2518                                             LA           
## 2519                                    Baker    LA      70714
## 2520                              Baton Rouge    LA      70821
## 2521                                             LA           
## 2522                                    Baker    LA      70714
## 2523                              Baton Rouge    LA      70821
## 2524                                             LA           
## 2525                              Baton Rouge    LA      70821
## 2526                                             LA           
## 2527                              Baton Rouge    LA      70821
## 2528                              Baton Rouge    LA      70821
## 2529                              Baton Rouge    LA      70821
## 2530                              Baton Rouge    LA      70821
## 2531                                             LA           
## 2532                                             LA           
## 2533                                             LA           
## 2534                                             LA           
## 2535                                             LA           
## 2536                                             LA           
## 2537                        Greenwell Springs    LA      70739
## 2538                                  Zachary    LA      70791
## 2539                              Baton Rouge    LA      70874
## 2540                              Baton Rouge    LA      70818
## 2541                              Baton Rouge    LA      70816
## 2542                              Baton Rouge    LA      70810
## 2543                                    Baker    LA      70714
## 2544                              Baton Rouge    LA 70818-2900
## 2545                                  Zachary    LA 70791-0310
## 2546                                    Baker    LA      70714
## 2547                              Baton Rouge    LA      70818
## 2548                                  Zachary    LA 70791-0310
## 2549                              Baton Rouge    LA      70818
## 2550                              Baton Rouge    LA      70818
## 2551                              Baton Rouge    LA      70818
## 2552                              Baton Rouge    LA      70818
## 2553                              Baton Rouge    LA      70818
## 2554                                    Baker    LA      70714
## 2555                                             LA           
## 2556                                    Baker    LA      70714
## 2557                                             LA           
## 2558                                    Baker    LA      70714
## 2559                                             LA           
## 2560                                    Baker    LA      70714
## 2561                                    Baker    LA      70714
## 2562                                             LA           
## 2563                                    Baker    LA      70714
## 2564                                             LA           
## 2565                                             LA           
## 2566                                             LA           
## 2567                                             LA           
## 2568                                             LA           
## 2569                                             LA           
## 2570                                             LA           
## 2571                                             LA           
## 2572                                             LA           
## 2573                                             LA           
## 2574                                             LA           
## 2575                                             LA           
## 2576                                             LA           
## 2577                                             LA           
## 2578                                             LA           
## 2579                                             LA           
## 2580                                             LA           
## 2581                                             LA           
## 2582                                             LA           
## 2583                                             LA           
## 2584                                             LA           
## 2585                          Lake Providence    LA      71254
## 2586                          Lake Providence    LA      71254
## 2587                          Lake Providence    LA      71254
## 2588                          Lake Providence    LA      71254
## 2589                          Lake Providence    LA      71254
## 2590                          Lake Providence    LA      71254
## 2591                          Lake Providence    LA      71254
## 2592                          Lake Providence    LA      71254
## 2593                          Lake Providence    LA      71254
## 2594                          Lake Providence    LA      71254
## 2595                          Lake Providence    LA      71254
## 2596                          Lake Providence    LA      71254
## 2597                          Lake Providence    LA      71254
## 2598                          Lake Providence    LA      71254
## 2599                          Lake Providence    LA      71254
## 2600                          Lake Providence    LA      71254
## 2601                          Lake Providence    LA      71254
## 2602                          Lake Providence    LA      71254
## 2603                          Lake Providence    LA      71254
## 2604                          Lake Providence    LA      71254
## 2605                          Lake Providence    LA      71254
## 2606                          Lake Providence    LA      71254
## 2607                          Lake Providence    LA      71254
## 2608                          Lake Providence    LA      71254
## 2609                          Lake Providence    LA      71254
## 2610                          Lake Providence    LA      71254
## 2611                          Lake Providence    LA      71254
## 2612                                             LA           
## 2613                                             LA           
## 2614                                             LA           
## 2615                                             LA           
## 2616                                             LA           
## 2617                                             LA           
## 2618                                             LA           
## 2619                                             LA           
## 2620                                             LA           
## 2621                                             LA           
## 2622                                             LA           
## 2623                                             LA           
## 2624                                             LA           
## 2625                                             LA           
## 2626                                             LA           
## 2627                                             LA           
## 2628                                             LA           
## 2629                                             LA           
## 2630                                             LA           
## 2631                                             LA           
## 2632                                  Clinton    LA      70722
## 2633                                  Clinton    LA      70722
## 2634                                  Clinton    LA      70722
## 2635                                  Clinton    LA      70722
## 2636                                  Clinton    LA      70722
## 2637                                  Clinton    LA      70722
## 2638                                  Clinton    LA      70722
## 2639                                  Clinton    LA      70722
## 2640                                  Clinton    LA      70722
## 2641                                  Clinton    LA      70722
## 2642                                  Clinton    LA      70722
## 2643                                  Clinton    LA      70722
## 2644                                  Clinton    LA      70722
## 2645                                  Clinton    LA      70722
## 2646                                  Clinton    LA      70722
## 2647                                  Clinton    LA      70722
## 2648                                  Clinton    LA      70722
## 2649                                  Clinton    LA      70722
## 2650                                  Clinton    LA      70722
## 2651                                  Clinton    LA      70722
## 2652                                  Clinton    LA      70722
## 2653                                  Clinton    LA      70722
## 2654                                  Clinton    LA      70722
## 2655                                  Clinton    LA      70722
## 2656                                  Clinton    LA      70722
## 2657                                    Ethel    LA      70730
## 2658                                  Jackson    LA      70748
## 2659                                  Clinton    LA      70722
## 2660                                  Clinton    LA      70722
## 2661                                Slaughter    LA      70777
## 2662                                  Jackson    LA      70748
## 2663                                  Clinton    LA      70722
## 2664                                  Clinton    LA      70722
## 2665                                  Clinton    LA      70722
## 2666                                  Jackson    LA      70748
## 2667                                Slaughter    LA 70777-0029
## 2668                                  Norwood    LA      70761
## 2669                                   Wilson    LA      70789
## 2670                                Slaughter    LA 70777-0029
## 2671                                  Jackson    LA      70748
## 2672                                  Clinton    LA      70722
## 2673                                  Clinton    LA      70722
## 2674                                  Clinton    LA      70722
## 2675                                  Clinton    LA      70722
## 2676                                  Clinton    LA      70722
## 2677                                Slaughter    LA 70777-0029
## 2678                                Slaughter    LA 70777-0029
## 2679                                Slaughter    LA 70777-0029
## 2680                                Slaughter    LA 70777-0029
## 2681                                Slaughter    LA 70777-0029
## 2682                                  Norwood    LA      70761
## 2683                                  Norwood    LA      70761
## 2684                                  Norwood    LA      70761
## 2685                                   Wilson    LA      70789
## 2686                                   Wilson    LA      70789
## 2687                                   Wilson    LA      70789
## 2688                                   Wilson    LA      70789
## 2689                                   Wilson    LA      70789
## 2690                                   Wilson    LA      70789
## 2691                                  Jackson    LA      70748
## 2692                                  Jackson    LA      70748
## 2693                                  Jackson    LA      70748
## 2694                                  Jackson    LA      70748
## 2695                                  Jackson    LA      70748
## 2696                                             LA           
## 2697                                             LA           
## 2698                                             LA           
## 2699                                             LA           
## 2700                                             LA           
## 2701                                             LA           
## 2702                                             LA           
## 2703                                             LA           
## 2704                                             LA           
## 2705                                             LA           
## 2706                                             LA           
## 2707                                             LA           
## 2708                                             LA           
## 2709                                             LA           
## 2710                                             LA           
## 2711                                             LA           
## 2712                                             LA           
## 2713                                             LA           
## 2714                                             LA           
## 2715                                             LA           
## 2716                                             LA           
## 2717                                             LA           
## 2718                                             LA           
## 2719                                             LA           
## 2720                                             LA           
## 2721                             Ville Platte    LA      70586
## 2722                             Ville Platte    LA      70586
## 2723                             Ville Platte    LA      70286
## 2724                             Ville Platte    LA      70586
## 2725                             Ville Platte    LA 70586-4490
## 2726                             Ville Platte    LA 70586-4490
## 2727                             Ville Platte    LA 70586-4490
## 2728                             Ville Platte    LA 70586-4490
## 2729                             Ville Platte    LA 70586-4490
## 2730                             Ville Platte    LA 70586-4490
## 2731                             Ville Platte    LA 70586-4490
## 2732                             Ville Platte    LA 70586-4490
## 2733                             Ville Platte    LA 70586-4490
## 2734                             Ville Platte    LA      70586
## 2735                             Ville Platte    LA      70586
## 2736                             Ville Platte    LA      70586
## 2737                             Ville Platte    LA      70586
## 2738                             Ville Platte    LA      70586
## 2739                             Ville Platte    LA      70586
## 2740                             Ville Platte    LA      70586
## 2741                             Ville Platte    LA      70586
## 2742                             Ville Platte    LA      70586
## 2743                             Ville Platte    LA      70586
## 2744                             Ville Platte    LA      70586
## 2745                             Ville Platte    LA      70586
## 2746                             Ville Platte    LA      70586
## 2747                             Ville Platte    LA      70586
## 2748                             Ville Platte    LA      70586
## 2749                                   Basile    LA      70515
## 2750                                   Basile    LA      70515
## 2751                                    Mamou    LA 70554-2907
## 2752                             Pine Prairie    LA      70576
## 2753                             Ville Platte    LA      70586
## 2754                                   Basile    LA      70515
## 2755                                   Basile    LA      70515
## 2756                                    Mamou    LA 70580-0017
## 2757                             Ville Platte    LA      70586
## 2758                             Ville Platte    LA      70586
## 2759                             Ville Platte    LA      70586
## 2760                                    Mamou    LA      70554
## 2761                              Chataignier    LA      70524
## 2762                             Pine Prairie    LA      70576
## 2763                             Turkey Creek    LA      70585
## 2764                             Ville Platte    LA      70586
## 2765                                    Mamou    LA      70554
## 2766                              Chataignier    LA      70524
## 2767                             Pine Prairie    LA      70576
## 2768                             Turkey Creek    LA      70585
## 2769                                             LA           
## 2770                                    Mamou    LA      70554
## 2771                                    Mamou    LA      70554
## 2772                                    Mamou    LA      70554
## 2773                                    Mamou    LA      70554
## 2774                             Ville Platte    LA      70586
## 2775                             Ville Platte    LA      70586
## 2776                             Ville Platte    LA      70586
## 2777                             Ville Platte    LA      70586
## 2778                             Ville Platte    LA      70586
## 2779                             Ville Platte    LA      70586
## 2780                              Chataignier    LA      70524
## 2781                              Chataignier    LA      70524
## 2782                              Chataignier    LA      70524
## 2783                             Pine Prairie    LA      70576
## 2784                             Pine Prairie    LA      70576
## 2785                             Pine Prairie    LA      70576
## 2786                             Turkey Creek    LA      70585
## 2787                             Turkey Creek    LA      70585
## 2788                             Turkey Creek    LA      70585
## 2789                                             LA           
## 2790                                             LA           
## 2791                                             LA           
## 2792                                             LA           
## 2793                                             LA           
## 2794                                             LA           
## 2795                                             LA           
## 2796                                             LA           
## 2797                                             LA           
## 2798                                             LA           
## 2799                                             LA           
## 2800                                             LA           
## 2801                                             LA           
## 2802                                             LA           
## 2803                                             LA           
## 2804                                             LA           
## 2805                                             LA           
## 2806                                             LA           
## 2807                                             LA           
## 2808                                             LA           
## 2809                                             LA           
## 2810                                             LA           
## 2811                                Winnsboro    LA      71295
## 2812                                Winnsboro    LA      71295
## 2813                                Winnsboro    LA      71295
## 2814                                Winnsboro    LA      71295
## 2815                                Winnsboro    LA      71295
## 2816                                Winnsboro    LA      71295
## 2817                                Winnsboro    LA      71295
## 2818                                Winnsboro    LA      71295
## 2819                                Winnsboro    LA      71295
## 2820                                Winnsboro    LA      71295
## 2821                                Winnsboro    LA      71295
## 2822                                Winnsboro    LA      71295
## 2823                                Winnsboro    LA      71295
## 2824                                Winnsboro    LA      71295
## 2825                                Winnsboro    LA      71295
## 2826                                Winnsboro    LA      71295
## 2827                                Winnsboro    LA      71295
## 2828                                Winnsboro    LA      71295
## 2829                                Winnsboro    LA      71295
## 2830                                Winnsboro    LA      71295
## 2831                                    Delhi    LA      71232
## 2832                                Winnsboro    LA      71295
## 2833                                Winnsboro    LA      71295
## 2834                                  Gilbert    LA      71336
## 2835                                   Wisner    LA      71378
## 2836                                   Wisner    LA      71378
## 2837                                Winnsboro    LA      71295
## 2838                                Crowville    LA      71232
## 2839                                   Baskin    LA      71219
## 2840                                Winnsboro    LA      71295
## 2841                                  Gilbert    LA      71336
## 2842                                   Wisner    LA      71378
## 2843                                   Wisner    LA      71378
## 2844                                Winnsboro    LA      71295
## 2845                                Winnsboro    LA      71295
## 2846                                   Wisner    LA      71378
## 2847                                   Baskin    LA      71219
## 2848                                  Gilbert    LA      71336
## 2849                                Winnsboro    LA      71295
## 2850                                   Wisner    LA      71378
## 2851                                   Baskin    LA      71219
## 2852                                  Gilbert    LA      71336
## 2853                                   Wisner    LA      71378
## 2854                                   Wisner    LA      71378
## 2855                                   Wisner    LA      71378
## 2856                                   Wisner    LA      71378
## 2857                                   Wisner    LA      71378
## 2858                                   Baskin    LA      71219
## 2859                                   Baskin    LA      71219
## 2860                                   Baskin    LA      71219
## 2861                                  Gilbert    LA      71336
## 2862                                  Gilbert    LA      71336
## 2863                                  Gilbert    LA      71336
## 2864                                Winnsboro    LA      71295
## 2865                                Winnsboro    LA      71295
## 2866                                Winnsboro    LA      71295
## 2867                                Winnsboro    LA      71295
## 2868                                Winnsboro    LA      71295
## 2869                                             LA           
## 2870                                             LA           
## 2871                                             LA           
## 2872                                             LA           
## 2873                                             LA           
## 2874                                             LA           
## 2875                                             LA           
## 2876                                             LA           
## 2877                                             LA           
## 2878                                             LA           
## 2879                                             LA           
## 2880                                             LA           
## 2881                                             LA           
## 2882                                             LA           
## 2883                                             LA           
## 2884                                             LA           
## 2885                                             LA           
## 2886                                             LA           
## 2887                                             LA           
## 2888                                   Colfax    LA      71417
## 2889                                   Colfax    LA      71417
## 2890                                   Colfax    LA      71417
## 2891                                   Colfax    LA      71417
## 2892                                   Colfax    LA      71417
## 2893                                   Colfax    LA      71417
## 2894                                   Colfax    LA      71417
## 2895                                   Colfax    LA      71417
## 2896                                   Colfax    LA      71417
## 2897                                   Colfax    LA      71417
## 2898                                   Colfax    LA      71417
## 2899                                   Colfax    LA      71417
## 2900                                   Colfax    LA      71417
## 2901                                   Colfax    LA      71417
## 2902                                   Colfax    LA      71417
## 2903                                   Colfax    LA      71417
## 2904                                   Colfax    LA      71417
## 2905                                   Colfax    LA      71417
## 2906                                   Colfax    LA      71417
## 2907                                   Colfax    LA      71417
## 2908                               Montgomery    LA      71454
## 2909                                   Colfax    LA      71417
## 2910                                Dry Prong    LA      71423
## 2911                                  Pollock    LA      71467
## 2912                                Dry Prong    LA      71423
## 2913                               Montgomery    LA      71454
## 2914                                   Colfax    LA      71417
## 2915                                  Pollock    LA      71467
## 2916                                  Pollock    LA      71467
## 2917                                Dry Prong    LA      71423
## 2918                                   Colfax    LA      71417
## 2919                               Montgomery    LA      71454
## 2920                                  Pollock    LA      71467
## 2921                                Dry Prong    LA      71423
## 2922                                Dry Prong    LA      71423
## 2923                               Georgetown    LA      71432
## 2924                                  Pollock    LA      71467
## 2925                                Dry Prong    LA      71423
## 2926                               Georgetown    LA      71432
## 2927                                   Colfax    LA      71417
## 2928                                   Colfax    LA      71417
## 2929                                   Colfax    LA      71417
## 2930                                   Colfax    LA      71417
## 2931                                   Colfax    LA      71417
## 2932                                Dry Prong    LA      71423
## 2933                                Dry Prong    LA      71423
## 2934                                Dry Prong    LA      71423
## 2935                                Dry Prong    LA      71423
## 2936                                Dry Prong    LA      71423
## 2937                                Dry Prong    LA      71423
## 2938                               Georgetown    LA      71432
## 2939                               Georgetown    LA      71432
## 2940                               Georgetown    LA      71432
## 2941                               Montgomery    LA      71454
## 2942                               Montgomery    LA      71454
## 2943                               Montgomery    LA      71454
## 2944                               Montgomery    LA      71454
## 2945                               Montgomery    LA      71454
## 2946                                  Pollock    LA      71467
## 2947                                  Pollock    LA      71467
## 2948                                  Pollock    LA      71467
## 2949                                  Pollock    LA      71467
## 2950                                  Pollock    LA      71467
## 2951                                             LA           
## 2952                                             LA           
## 2953                                             LA           
## 2954                                             LA           
## 2955                                             LA           
## 2956                                             LA           
## 2957                                             LA           
## 2958                                             LA           
## 2959                                             LA           
## 2960                                             LA           
## 2961                                             LA           
## 2962                                             LA           
## 2963                                             LA           
## 2964                                             LA           
## 2965                                             LA           
## 2966                                             LA           
## 2967                                             LA           
## 2968                                             LA           
## 2969                                             LA           
## 2970                                             LA           
## 2971                                             LA           
## 2972                                             LA           
## 2973                                             LA           
## 2974                                             LA           
## 2975                                             LA           
## 2976                                             LA           
## 2977                                             LA           
## 2978                                             LA           
## 2979                                             LA           
## 2980                                             LA           
## 2981                                             LA           
## 2982                                             LA           
## 2983                                             LA           
## 2984                               New Iberia    LA 70560-4584
## 2985                               New Iberia    LA 70562-2010
## 2986                               New Iberia    LA      70560
## 2987                               Jeanerette    LA      70544
## 2988                               New Iberia    LA 70560-4543
## 2989                               New Iberia    LA 70560-4543
## 2990                               New Iberia    LA 70560-4543
## 2991                               New Iberia    LA 70560-4543
## 2992                               New Iberia    LA 70560-4543
## 2993                               New Iberia    LA 70560-4543
## 2994                               New Iberia    LA 70560-4543
## 2995                               New Iberia    LA 70560-4543
## 2996                               New Iberia    LA 70560-4543
## 2997                               New Iberia    LA 70560-4543
## 2998                               New Iberia    LA 70560-4543
## 2999                               New Iberia    LA 70560-4543
## 3000                               New Iberia    LA 70560-4543
## 3001                               New Iberia    LA 70560-4543
## 3002                               New Iberia    LA 70560-4543
## 3003                               Jeanerette    LA      70544
## 3004                               New Iberia    LA 70560-3700
## 3005                               Jeanerette    LA      70544
## 3006                               New Iberia    LA 70560-3700
## 3007                               New Iberia    LA 70562-0200
## 3008                               New Iberia    LA 70562-0200
## 3009                               New Iberia    LA 70562-0200
## 3010                               New Iberia    LA 70562-0200
## 3011                               New Iberia    LA 70562-0200
## 3012                               New Iberia    LA 70562-0200
## 3013                               New Iberia    LA 70562-0200
## 3014                               New Iberia    LA 70562-0200
## 3015                               New Iberia    LA 70562-0200
## 3016                               New Iberia    LA 70562-0200
## 3017                               New Iberia    LA 70562-0200
## 3018                               New Iberia    LA 70562-0200
## 3019                               New Iberia    LA 70562-0200
## 3020                               New Iberia    LA 70562-0200
## 3021                               New Iberia    LA      70560
## 3022                               New IberIA    LA      70560
## 3023                               New Iberia    LA      70563
## 3024                               New Iberia    LA      70560
## 3025                               New Iberia    LA      70560
## 3026                               New Iberia    LA      70563
## 3027                               Jeanerette    LA      70544
## 3028                               New Iberia    LA 70560-3700
## 3029                              Loreauville    LA      70552
## 3030                               Jeanerette    LA      70544
## 3031                               New Iberia    LA 70560-3700
## 3032                              Loreauville    LA      70552
## 3033                              Loreauville    LA      70552
## 3034                              Loreauville    LA      70552
## 3035                               Jeanerette    LA      70544
## 3036                               Jeanerette    LA      70544
## 3037                               Jeanerette    LA      70544
## 3038                               Jeanerette    LA      70544
## 3039                               New Iberia    LA 70560-3700
## 3040                               New Iberia    LA 70560-3700
## 3041                               New Iberia    LA 70560-3700
## 3042                               New Iberia    LA 70560-3700
## 3043                               New Iberia    LA 70560-3700
## 3044                               New Iberia    LA 70560-3700
## 3045                                             LA           
## 3046                                             LA           
## 3047                                             LA           
## 3048                                             LA           
## 3049                                             LA           
## 3050                                             LA           
## 3051                                             LA           
## 3052                                             LA           
## 3053                                             LA           
## 3054                                             LA           
## 3055                                             LA           
## 3056                                             LA           
## 3057                                             LA           
## 3058                                             LA           
## 3059                                             LA           
## 3060                                             LA           
## 3061                                             LA           
## 3062                                             LA           
## 3063                                             LA           
## 3064                                             LA           
## 3065                                             LA           
## 3066                                             LA           
## 3067                                             LA           
## 3068                                             LA           
## 3069                                             LA           
## 3070                                             LA           
## 3071                                             LA           
## 3072                                             LA           
## 3073                                             LA           
## 3074                               Plaquemine    LA      70765
## 3075                               Plaquemine    LA      70765
## 3076                               Plaquemine    LA      70765
## 3077                               Plaquemine    LA      70764
## 3078                               Plaquemine    LA 70765-0389
## 3079                               Plaquemine    LA 70765-0389
## 3080                               Plaquemine    LA 70765-0389
## 3081                               Plaquemine    LA 70765-0389
## 3082                               Plaquemine    LA 70765-0389
## 3083                               Plaquemine    LA 70765-0389
## 3084                               Plaquemine    LA 70765-0389
## 3085                               Plaquemine    LA 70765-0389
## 3086                               Plaquemine    LA 70765-0389
## 3087                               Plaquemine    LA 70765-0389
## 3088                               Plaquemine    LA 70765-0389
## 3089                               Plaquemine    LA 70765-0389
## 3090                               Plaquemine    LA 70765-0389
## 3091                               Plaquemine    LA 70765-0389
## 3092                               Plaquemine    LA      70764
## 3093                               Plaquemine    LA      70764
## 3094                               Plaquemine    LA      70764
## 3095                               Plaquemine    LA 70765-0151
## 3096                               Plaquemine    LA 70765-0151
## 3097                               Plaquemine    LA 70765-0151
## 3098                               Plaquemine    LA 70765-0151
## 3099                               Plaquemine    LA 70765-0151
## 3100                               Plaquemine    LA 70765-0151
## 3101                               Plaquemine    LA 70765-0151
## 3102                               Plaquemine    LA 70765-0151
## 3103                               Plaquemine    LA 70765-0151
## 3104                               Plaquemine    LA 70765-0151
## 3105                               Plaquemine    LA 70765-0151
## 3106                               Plaquemine    LA 70765-0151
## 3107                               Plaquemine    LA 70765-0151
## 3108                               Plaquemine    LA 70765-0151
## 3109                             White Castle    LA      70788
## 3110                                 Carville    LA      70721
## 3111                               Plaquemine    LA      70764
## 3112                               Plaquemine    LA      70765
## 3113                               Plaquemine    LA      70764
## 3114                               Maringouin    LA      70757
## 3115                             White Castle    LA      70788
## 3116                                 Sunshine    LA      70780
## 3117                               Plaquemine    LA      70764
## 3118                               Plaquemine    LA      70764
## 3119                               Plaquemine    LA      70764
## 3120                              Grosse Tete    LA      70740
## 3121                               Plaquemine    LA      70765
## 3122                               St Gabriel    LA      70776
## 3123                               Maringouin    LA 70757-0010
## 3124                             White Castle    LA      70788
## 3125                              Grosse Tete    LA      70740
## 3126                                 Rosedale    LA      70772
## 3127                               Plaquemine    LA      70765
## 3128                               St Gabriel    LA      70776
## 3129                               Maringouin    LA 70757-0010
## 3130                             White Castle    LA      70788
## 3131                              Grosse Tete    LA      70740
## 3132                                 Rosedale    LA      70772
## 3133                                 Rosedale    LA      70772
## 3134                                 Rosedale    LA      70772
## 3135                                 Rosedale    LA      70772
## 3136                               Maringouin    LA 70757-0010
## 3137                               Maringouin    LA 70757-0010
## 3138                               Maringouin    LA 70757-0010
## 3139                               Maringouin    LA 70757-0010
## 3140                               Maringouin    LA 70757-0010
## 3141                             White Castle    LA      70788
## 3142                             White Castle    LA      70788
## 3143                             White Castle    LA      70788
## 3144                             White Castle    LA      70788
## 3145                             White Castle    LA      70788
## 3146                              Grosse Tete    LA      70740
## 3147                              Grosse Tete    LA      70740
## 3148                              Grosse Tete    LA      70740
## 3149                               Plaquemine    LA      70765
## 3150                               Plaquemine    LA      70765
## 3151                               Plaquemine    LA      70765
## 3152                               Plaquemine    LA      70765
## 3153                               Plaquemine    LA      70765
## 3154                               Plaquemine    LA      70765
## 3155                               Plaquemine    LA      70765
## 3156                               Plaquemine    LA      70765
## 3157                               Plaquemine    LA      70765
## 3158                               Plaquemine    LA      70765
## 3159                               Plaquemine    LA      70765
## 3160                                             LA           
## 3161                                             LA           
## 3162                                             LA           
## 3163                                             LA           
## 3164                                             LA           
## 3165                                             LA           
## 3166                                             LA           
## 3167                                             LA           
## 3168                                             LA           
## 3169                                             LA           
## 3170                                             LA           
## 3171                                             LA           
## 3172                                             LA           
## 3173                                             LA           
## 3174                                             LA           
## 3175                                             LA           
## 3176                                Jonesboro    LA      71251
## 3177                                Jonesboro    LA      71251
## 3178                                Jonesboro    LA      71251
## 3179                                Jonesboro    LA      71251
## 3180                                Jonesboro    LA      71251
## 3181                                Jonesboro    LA      71251
## 3182                                Jonesboro    LA      71251
## 3183                                Jonesboro    LA      71251
## 3184                                Jonesboro    LA      71251
## 3185                                Jonesboro    LA      71251
## 3186                                Jonesboro    LA      71251
## 3187                                Jonesboro    LA      71251
## 3188                                Jonesboro    LA      71251
## 3189                                Jonesboro    LA      71251
## 3190                                Jonesboro    LA      71251
## 3191                                Jonesboro    LA      71251
## 3192                                Jonesboro    LA      71251
## 3193                                Jonesboro    LA      71251
## 3194                                  Quitman    LA      71268
## 3195                                  Quitman    LA      71268
## 3196                                  Chatham    LA      71226
## 3197                                    Hodge    LA      71247
## 3198                                Jonesboro    LA      71251
## 3199                                  Quitman    LA      71268
## 3200                                   Ruston    LA      71270
## 3201                                  Chatham    LA      71226
## 3202                                Jonesboro    LA      71251
## 3203                                Jonesboro    LA      71251
## 3204                                  Chatham    LA      71226
## 3205                                     Eros    LA      71238
## 3206                                Jonesboro    LA 71251-0610
## 3207                               East Hodge    LA      71247
## 3208                                    Hodge    LA      71247
## 3209                              North Hodge    LA      71247
## 3210                                  Quitman    LA      71268
## 3211                                  Chatham    LA      71226
## 3212                                     Eros    LA      71238
## 3213                                Jonesboro    LA 71251-0610
## 3214                               East Hodge    LA      71247
## 3215                                    Hodge    LA      71247
## 3216                              North Hodge    LA      71247
## 3217                                  Quitman    LA      71268
## 3218                                             LA           
## 3219                                Jonesboro    LA 71251-0610
## 3220                                Jonesboro    LA 71251-0610
## 3221                                Jonesboro    LA 71251-0610
## 3222                                Jonesboro    LA 71251-0610
## 3223                                  Chatham    LA      71226
## 3224                                  Chatham    LA      71226
## 3225                                  Chatham    LA      71226
## 3226                                  Chatham    LA      71226
## 3227                                  Chatham    LA      71226
## 3228                                     Eros    LA      71238
## 3229                                     Eros    LA      71238
## 3230                                     Eros    LA      71238
## 3231                               East Hodge    LA      71247
## 3232                               East Hodge    LA      71247
## 3233                               East Hodge    LA      71247
## 3234                                    Hodge    LA      71247
## 3235                                    Hodge    LA      71247
## 3236                                    Hodge    LA      71247
## 3237                              North Hodge    LA      71247
## 3238                              North Hodge    LA      71247
## 3239                              North Hodge    LA      71247
## 3240                                  Quitman    LA      71268
## 3241                                  Quitman    LA      71268
## 3242                                  Quitman    LA      71268
## 3243                                             LA           
## 3244                                             LA           
## 3245                                             LA           
## 3246                                             LA           
## 3247                                             LA           
## 3248                                             LA           
## 3249                                             LA           
## 3250                                             LA           
## 3251                                             LA           
## 3252                                             LA           
## 3253                                             LA           
## 3254                                             LA           
## 3255                                             LA           
## 3256                                             LA           
## 3257                                             LA           
## 3258                                             LA           
## 3259                                             LA           
## 3260                                             LA           
## 3261                                             LA           
## 3262                                             LA           
## 3263                                             LA           
## 3264                                             LA           
## 3265                                             LA           
## 3266                                             LA           
## 3267                                             LA           
## 3268                                             LA           
## 3269                                             LA           
## 3270                                             LA           
## 3271                                             LA           
## 3272                                             LA           
## 3273                                             LA           
## 3274                                             LA           
## 3275                                             LA           
## 3276                                             LA           
## 3277                                             LA           
## 3278                                             LA           
## 3279                                             LA           
## 3280                                             LA           
## 3281                                             LA           
## 3282                                             LA           
## 3283                                             LA           
## 3284                                             LA           
## 3285                                             LA           
## 3286                                             LA           
## 3287                                             LA           
## 3288                                             LA           
## 3289                                             LA           
## 3290                                             LA           
## 3291                                             LA           
## 3292                                             LA           
## 3293                                             LA           
## 3294                                 Metairie    LA      70003
## 3295                                 Metairie    LA      70003
## 3296                                   Gretna    LA      70053
## 3297                                   Gretna    LA      70053
## 3298                                   Harvey    LA      70059
## 3299                                   Harvey    LA      70059
## 3300                                   Harvey    LA      70059
## 3301                                   Gretna    LA      70054
## 3302                                   Gretna    LA      70054
## 3303                                   Gretna    LA      70053
## 3304                                   Harvey    LA      70058
## 3305                                   Gretna    LA      70054
## 3306                                   Gretna    LA      70054
## 3307                                   Gretna    LA      70054
## 3308                                   Gretna    LA      70054
## 3309                                   Gretna    LA      70054
## 3310                                   Gretna    LA      70054
## 3311                                   Gretna    LA      70054
## 3312                                   Gretna    LA      70054
## 3313                                   Harvey    LA      70058
## 3314                                  Marrero    LA      70072
## 3315                                  Marrero    LA      70072
## 3316                                  Marrero    LA      70072
## 3317                                  Marrero    LA      70072
## 3318                                  Marrero    LA      70072
## 3319                                  Marrero    LA      70072
## 3320                                  Marrero    LA      70072
## 3321                                  Marrero    LA      70072
## 3322                                   Gretna    LA      70056
## 3323                                  Marrero    LA      70072
## 3324                                  Lafitte    LA      70067
## 3325                               Grand Isle    LA      70358
## 3326                                 Metairie    LA      70001
## 3327                                   Kenner    LA      70065
## 3328                                 Avondale    LA      70094
## 3329                                   Kenner    LA      70065
## 3330                                Terrytown    LA      70056
## 3331                                  Marrero    LA      70072
## 3332                                Barataria    LA      70036
## 3333                               Grand Isle    LA      70358
## 3334                                 Metairie    LA      70005
## 3335                              River Ridge    LA      70123
## 3336                                 Avondale    LA      70094
## 3337                                   Kenner    LA      70065
## 3338                                   Gretna    LA      70054
## 3339                                  Harahan    LA      70123
## 3340                                   Kenner    LA      70062
## 3341                                 Westwego    LA      70094
## 3342                               Grand Isle    LA      70358
## 3343                                  Lafitte    LA      70067
## 3344                                   Gretna    LA      70054
## 3345                                   Gretna    LA      70054
## 3346                                  Harahan    LA      70123
## 3347                                   Kenner    LA      70062
## 3348                                 Westwego    LA      70094
## 3349                                 Westwego    LA      70094
## 3350                               Grand Isle    LA      70358
## 3351                                   Kenner    LA      70062
## 3352                                   Kenner    LA      70062
## 3353                                   Gretna    LA      70054
## 3354                                   Gretna    LA      70054
## 3355                                 Westwego    LA      70094
## 3356                                 Westwego    LA      70094
## 3357                                   Gretna    LA      70054
## 3358                                 Westwego    LA      70094
## 3359                                   Gretna    LA      70054
## 3360                                 Westwego    LA      70094
## 3361                                   Gretna    LA      70054
## 3362                                   Gretna    LA      70054
## 3363                                 Westwego    LA      70094
## 3364                                 Westwego    LA      70094
## 3365                               Grand Isle    LA      70358
## 3366                               Grand Isle    LA      70358
## 3367                               Grand Isle    LA      70358
## 3368                               Grand Isle    LA      70358
## 3369                               Grand Isle    LA      70358
## 3370                                   Gretna    LA      70054
## 3371                                  Harahan    LA      70123
## 3372                                  Harahan    LA      70123
## 3373                                  Harahan    LA      70123
## 3374                                  Harahan    LA      70123
## 3375                                  Harahan    LA      70123
## 3376                                   Kenner    LA      70062
## 3377                                   Kenner    LA      70062
## 3378                                   Kenner    LA      70062
## 3379                                   Kenner    LA      70062
## 3380                                   Kenner    LA      70062
## 3381                                  Lafitte    LA      70067
## 3382                                  Lafitte    LA      70067
## 3383                                  Lafitte    LA      70067
## 3384                                  Lafitte    LA      70067
## 3385                                  Lafitte    LA      70067
## 3386                                             LA           
## 3387                                             LA           
## 3388                                             LA           
## 3389                                             LA           
## 3390                                             LA           
## 3391                                             LA           
## 3392                                             LA           
## 3393                                             LA           
## 3394                                             LA           
## 3395                                             LA           
## 3396                                             LA           
## 3397                                             LA           
## 3398                                             LA           
## 3399                                             LA           
## 3400                                             LA           
## 3401                                             LA           
## 3402                                             LA           
## 3403                                             LA           
## 3404                                             LA           
## 3405                                             LA           
## 3406                                             LA           
## 3407                                             LA           
## 3408                                             LA           
## 3409                                             LA           
## 3410                                             LA           
## 3411                                             LA           
## 3412                                             LA           
## 3413                                             LA           
## 3414                                 Jennings    LA      70546
## 3415                                 Jennings    LA      70546
## 3416                                 Jennings    LA      70546
## 3417                                 Jennings    LA      70546
## 3418                                 Jennings    LA      70546
## 3419                                 Jennings    LA      70546
## 3420                                 Jennings    LA      70546
## 3421                                 Jennings    LA      70546
## 3422                                 Jennings    LA      70546
## 3423                                 Jennings    LA      70546
## 3424                                 Jennings    LA      70546
## 3425                                 Jennings    LA      70546
## 3426                                 Jennings    LA      70546
## 3427                                 Jennings    LA      70546
## 3428                                 Jennings    LA      70546
## 3429                                 Jennings    LA      70546
## 3430                                 Jennings    LA      70546
## 3431                                 Jennings    LA      70546
## 3432                                 Jennings    LA      70546
## 3433                                 Jennings    LA      70546
## 3434                                 Jennings    LA      70546
## 3435                                 Jennings    LA      70546
## 3436                                 Jennings    LA      70546
## 3437                                 Jennings    LA      70546
## 3438                                 Jennings    LA      70546
## 3439                                 Jennings    LA      70546
## 3440                                 Jennings    LA      70546
## 3441                                 Jennings    LA      70546
## 3442                                 Jennings    LA      70546
## 3443                                 Jennings    LA      70546
## 3444                                 Jennings    LA      70546
## 3445                                 Jennings    LA      70546
## 3446                              Lake Arthur    LA      70549
## 3447                                    Elton    LA      70532
## 3448                                     Iowa    LA      70647
## 3449                                    Welsh    LA      70591
## 3450                                 Jennings    LA      70546
## 3451                                     Iowa    LA      70647
## 3452                              Lake Arthur    LA      70549
## 3453                                    Elton    LA      70532
## 3454                                   Kinder    LA      70648
## 3455                                    Welsh    LA 70591-4709
## 3456                                  Jennins    LA      70546
## 3457                                Lacassine    LA      70650
## 3458                                 Jennings    LA      70546
## 3459                                    Elton    LA      70532
## 3460                              Lake Arthur    LA      70549
## 3461                                    Welsh    LA      70591
## 3462                                   Fenton    LA 70640-0310
## 3463                                    Elton    LA      70532
## 3464                              Lake Arthur    LA      70549
## 3465                                    Welsh    LA      70591
## 3466                                             LA           
## 3467                                    Welsh    LA      70591
## 3468                                    Welsh    LA      70591
## 3469                                    Welsh    LA      70591
## 3470                                    Welsh    LA      70591
## 3471                                    Welsh    LA      70591
## 3472                                   Fenton    LA 70640-0310
## 3473                                   Fenton    LA 70640-0310
## 3474                                   Fenton    LA 70640-0310
## 3475                                    Elton    LA      70532
## 3476                                    Elton    LA      70532
## 3477                                    Elton    LA      70532
## 3478                                    Elton    LA      70532
## 3479                                    Elton    LA      70532
## 3480                              Lake Arthur    LA      70549
## 3481                              Lake Arthur    LA      70549
## 3482                              Lake Arthur    LA      70549
## 3483                              Lake Arthur    LA      70549
## 3484                              Lake Arthur    LA      70549
## 3485                                 Jennings    LA      70546
## 3486                                 Jennings    LA      70546
## 3487                                 Jennings    LA      70546
## 3488                                 Jennings    LA      70546
## 3489                                 Jennings    LA      70546
## 3490                                             LA           
## 3491                                             LA           
## 3492                                             LA           
## 3493                                             LA           
## 3494                                             LA           
## 3495                                             LA           
## 3496                                             LA           
## 3497                                             LA           
## 3498                                             LA           
## 3499                                             LA           
## 3500                                             LA           
## 3501                                             LA           
## 3502                                             LA           
## 3503                                             LA           
## 3504                                             LA           
## 3505                                             LA           
## 3506                                             LA           
## 3507                                             LA           
## 3508                                             LA           
## 3509                                             LA           
## 3510                                             LA           
## 3511                                             LA           
## 3512                                             LA           
## 3513                                             LA           
## 3514                                             LA           
## 3515                                             LA           
## 3516                                             LA           
## 3517                                             LA           
## 3518                                Lafayette    LA      70502
## 3519                                Lafayette    LA      70502
## 3520                                Lafayette    LA 70502-3325
## 3521                                Lafayette    LA      70502
## 3522                                Lafayette    LA      70502
## 3523                                Lafayette    LA      70502
## 3524                                Lafayette    LA      70502
## 3525                                Lafayette    LA      70502
## 3526                                Lafayette    LA      70502
## 3527                                Lafayette    LA      70502
## 3528                                Lafayette    LA      70502
## 3529                                Lafayette    LA      70502
## 3530                                Lafayette    LA      70502
## 3531                                Lafayette    LA      70502
## 3532                                Lafayette    LA      70502
## 3533                                Lafayette    LA      70502
## 3534                                Lafayette    LA 70502-2158
## 3535                                Lafayette    LA 70502-2158
## 3536                                Lafayette    LA 70502-2158
## 3537                                Lafayette    LA 70502-2158
## 3538                                Lafayette    LA 70502-2158
## 3539                                Lafayette    LA 70502-2158
## 3540                                Lafayette    LA 70502-2158
## 3541                                Lafayette    LA 70502-2158
## 3542                                Lafayette    LA 70502-2158
## 3543                                    Scott    LA      70583
## 3544                                    Duson    LA      70529
## 3545                              Youngsville    LA      70592
## 3546                                Broussard    LA      70518
## 3547                                 Carencro    LA      70520
## 3548                                 Carencro    LA      70520
## 3549                                Lafayette    LA      70508
## 3550                                Lafayette    LA      70503
## 3551                              Youngsville    LA      70592
## 3552                                    Scott    LA      70583
## 3553                                    Rayne    LA      70578
## 3554                              Youngsville    LA      70592
## 3555                                Broussard    LA      70518
## 3556                                 Carencro    LA      70520
## 3557                                 Carencro    LA      70520
## 3558                                Lafayette    LA      70508
## 3559                                    Scott    LA      70583
## 3560                              Youngsville    LA      70592
## 3561                                 Carencro    LA      70520
## 3562                                    Scott    LA      70583
## 3563                              Youngsville    LA      70592
## 3564                                 Carencro    LA      70520
## 3565                                    Scott    LA      70583
## 3566                              Youngsville    LA      70592
## 3567                                             LA           
## 3568                                 Carencro    LA      70520
## 3569                                 Carencro    LA      70520
## 3570                                 Carencro    LA      70520
## 3571                                 Carencro    LA      70520
## 3572                                 Carencro    LA      70520
## 3573                                    Scott    LA      70583
## 3574                                    Scott    LA      70583
## 3575                                    Scott    LA      70583
## 3576                                    Scott    LA      70583
## 3577                              Youngsville    LA      70592
## 3578                              Youngsville    LA      70592
## 3579                              Youngsville    LA      70592
## 3580                              Youngsville    LA      70592
## 3581                              Youngsville    LA      70592
## 3582                                             LA           
## 3583                                             LA           
## 3584                                             LA           
## 3585                                             LA           
## 3586                                             LA           
## 3587                                             LA           
## 3588                                             LA           
## 3589                                             LA           
## 3590                                             LA           
## 3591                                             LA           
## 3592                                             LA           
## 3593                                             LA           
## 3594                                             LA           
## 3595                                             LA           
## 3596                                             LA           
## 3597                                             LA           
## 3598                                             LA           
## 3599                                             LA           
## 3600                                             LA           
## 3601                                             LA           
## 3602                                             LA           
## 3603                                             LA           
## 3604                                             LA           
## 3605                                             LA           
## 3606                                Thibodaux    LA      70302
## 3607                                Thibodaux    LA 70302-0818
## 3608                                Thibodaux    LA      70301
## 3609                                 Raceland    LA      70394
## 3610                                Thibodaux    LA      70302
## 3611                                Thibodaux    LA      70302
## 3612                                Thibodaux    LA      70302
## 3613                                Thibodaux    LA      70302
## 3614                                Thibodaux    LA      70302
## 3615                                Thibodaux    LA      70302
## 3616                                Thibodaux    LA      70302
## 3617                                Thibodaux    LA      70302
## 3618                                Thibodaux    LA      70302
## 3619                                Thibodaux    LA      70302
## 3620                                Thibodaux    LA      70302
## 3621                                Thibodaux    LA      70302
## 3622                                Thibodaux    LA      70302
## 3623                                Thibodaux    LA 70301-0879
## 3624                                Thibodaux    LA 70301-0879
## 3625                                Thibodaux    LA 70301-0879
## 3626                                Thibodaux    LA 70301-0879
## 3627                                Thibodaux    LA 70301-0879
## 3628                                Thibodaux    LA 70301-0879
## 3629                                Thibodaux    LA 70301-0879
## 3630                                Thibodaux    LA 70301-0879
## 3631                                Thibodaux    LA 70301-0879
## 3632                                Thibodaux    LA 70301-0879
## 3633                                Thibodaux    LA 70301-0879
## 3634                                Thibodaux    LA 70301-0879
## 3635                                Thibodaux    LA 70301-0879
## 3636                                Thibodaux    LA 70301-0879
## 3637                                 Galliano    LA      70354
## 3638                                             LA           
## 3639                                             LA           
## 3640                                             LA           
## 3641                                             LA           
## 3642                                             LA           
## 3643                                             LA           
## 3644                                             LA           
## 3645                                             LA           
## 3646                                Thibodaux    LA      70301
## 3647                                 Raceland    LA      70394
## 3648                                   Larose    LA      70373
## 3649                                 Galliano    LA      70354
## 3650                                Thibodaux    LA      70301
## 3651                                 Raceland    LA      70394
## 3652                                 Raceland    LA      70394
## 3653                                 Galliano    LA      70354
## 3654                                Thibodaux    LA      70302
## 3655                            Golden Meadow    LA      70357
## 3656                                 Lockport    LA      70374
## 3657                            Golden Meadow    LA      70357
## 3658                                 Lockport    LA      70374
## 3659                                Thibodaux    LA      70302
## 3660                                Thibodaux    LA      70302
## 3661                                 Lockport    LA      70374
## 3662                                 Lockport    LA      70374
## 3663                                 Lockport    LA      70374
## 3664                                 Lockport    LA      70374
## 3665                                 Lockport    LA      70374
## 3666                                Thibodaux    LA      70302
## 3667                                Thibodaux    LA      70302
## 3668                                Thibodaux    LA      70302
## 3669                            Golden Meadow    LA      70357
## 3670                            Golden Meadow    LA      70357
## 3671                            Golden Meadow    LA      70357
## 3672                            Golden Meadow    LA      70357
## 3673                            Golden Meadow    LA      70357
## 3674                                             LA           
## 3675                                             LA           
## 3676                                             LA           
## 3677                                             LA           
## 3678                                             LA           
## 3679                                             LA           
## 3680                                             LA           
## 3681                                             LA           
## 3682                                             LA           
## 3683                                             LA           
## 3684                                             LA           
## 3685                                             LA           
## 3686                                             LA           
## 3687                                             LA           
## 3688                                             LA           
## 3689                                             LA           
## 3690                                             LA           
## 3691                                             LA           
## 3692                                             LA           
## 3693                                             LA           
## 3694                                             LA           
## 3695                                             LA           
## 3696                                             LA           
## 3697                                             LA           
## 3698                                             LA           
## 3699                                             LA           
## 3700                                     Jena    LA      71342
## 3701                                     Jena    LA      71342
## 3702                                     Jena    LA      71342
## 3703                                     Jena    LA      71342
## 3704                                     Jena    LA      71342
## 3705                                     Jena    LA      71342
## 3706                                     Jena    LA      71342
## 3707                                     Jena    LA      71342
## 3708                                     Jena    LA      71342
## 3709                                     Jena    LA      71342
## 3710                                     Jena    LA      71342
## 3711                                     Jena    LA      71342
## 3712                                     Jena    LA      71342
## 3713                                     Jena    LA      71342
## 3714                                     Jena    LA      71342
## 3715                                     Jena    LA      71342
## 3716                                     Jena    LA      71342
## 3717                                     Jena    LA      71342
## 3718                                     Jena    LA      71342
## 3719                                     Jena    LA      71342
## 3720                                     Jena    LA      71342
## 3721                                     Jena    LA      71342
## 3722                                     Jena    LA      71342
## 3723                                     Jena    LA      71342
## 3724                                     Olla    LA      71456
## 3725                                     Olla    LA      71456
## 3726                                    Trout    LA      71371
## 3727                                     Jena    LA      71342
## 3728                                     Jena    LA      71342
## 3729                                     Olla    LA      71465
## 3730                                     Olla    LA      71465
## 3731                                     Jena    LA      71342
## 3732                                     Jena    LA      71342
## 3733                                     Jena    LA      71342
## 3734                                     Jena    LA      71342
## 3735                                     Olla    LA      71465
## 3736                                   Tullos    LA      71479
## 3737                                   Urania    LA      71480
## 3738                                     Jena    LA      71342
## 3739                                     Olla    LA      71465
## 3740                                   Tullos    LA      71479
## 3741                                   Urania    LA      71480
## 3742                                     Olla    LA      71465
## 3743                                     Olla    LA      71465
## 3744                                     Olla    LA      71465
## 3745                                     Olla    LA      71465
## 3746                                     Olla    LA      71465
## 3747                                   Tullos    LA      71479
## 3748                                   Tullos    LA      71479
## 3749                                   Tullos    LA      71479
## 3750                                   Tullos    LA      71479
## 3751                                   Tullos    LA      71479
## 3752                                   Urania    LA      71480
## 3753                                   Urania    LA      71480
## 3754                                   Urania    LA      71480
## 3755                                   Urania    LA      71480
## 3756                                   Urania    LA      71480
## 3757                                     Jena    LA      71342
## 3758                                     Jena    LA      71342
## 3759                                     Jena    LA      71342
## 3760                                     Jena    LA      71342
## 3761                                     Jena    LA      71342
## 3762                                             LA           
## 3763                                             LA           
## 3764                                             LA           
## 3765                                             LA           
## 3766                                             LA           
## 3767                                             LA           
## 3768                                             LA           
## 3769                                             LA           
## 3770                                             LA           
## 3771                                             LA           
## 3772                                             LA           
## 3773                                             LA           
## 3774                                             LA           
## 3775                                             LA           
## 3776                                             LA           
## 3777                                             LA           
## 3778                                             LA           
## 3779                                             LA           
## 3780                                             LA           
## 3781                                             LA           
## 3782                                             LA           
## 3783                                             LA           
## 3784                                             LA           
## 3785                                             LA           
## 3786                                             LA           
## 3787                                             LA           
## 3788                                             LA           
## 3789                                             LA           
## 3790                                             LA           
## 3791                                             LA           
## 3792                                   Ruston    LA      71273
## 3793                                   Ruston    LA      71270
## 3794                                   Ruston    LA 71273-1218
## 3795                                   Ruston    LA      71270
## 3796                                   Ruston    LA 71273-0979
## 3797                                   Ruston    LA 71273-0979
## 3798                                   Ruston    LA 71273-0979
## 3799                                   Ruston    LA 71273-0979
## 3800                                   Ruston    LA 71273-0979
## 3801                                   Ruston    LA 71273-0979
## 3802                                   Ruston    LA 71273-0979
## 3803                                   Ruston    LA 71273-0979
## 3804                                   Ruston    LA 71273-0979
## 3805                                   Ruston    LA 71273-0979
## 3806                                   Ruston    LA 71273-0979
## 3807                                   Ruston    LA 71273-0979
## 3808                                   Ruston    LA 71273-1821
## 3809                                   Ruston    LA 71273-1821
## 3810                                   Ruston    LA      71270
## 3811                                   Ruston    LA 71270-4699
## 3812                                   Ruston    LA 71270-4699
## 3813                                   Ruston    LA 71270-4699
## 3814                                   Ruston    LA 71270-4699
## 3815                                   Ruston    LA 71270-4699
## 3816                                   Ruston    LA 71270-4699
## 3817                                   Ruston    LA 71270-4699
## 3818                                   Ruston    LA 71270-4699
## 3819                                   Ruston    LA 71270-4699
## 3820                                   Ruston    LA 71270-4699
## 3821                                   Ruston    LA 71270-4699
## 3822                                Grambling    LA      71245
## 3823                                 Simsboro    LA      71275
## 3824                                   Dubach    LA      71235
## 3825                                Choudrant    LA      71227
## 3826                                Grambling    LA      71245
## 3827                                 Simsboro    LA      71275
## 3828                                   Dubach    LA      71235
## 3829                                Choudrant    LA      71227
## 3830                                Grambling    LA      71245
## 3831                                   Ruston    LA 71273-2069
## 3832                                   Dubach    LA      71235
## 3833                                   Ruston    LA      71273
## 3834                                Choudrant    LA      71227
## 3835                                 Simsboro    LA      71275
## 3836                                             LA           
## 3837                                Choudrant    LA      71227
## 3838                                 Simsboro    LA      71275
## 3839                                Choudrant    LA      71227
## 3840                                Choudrant    LA      71227
## 3841                                Choudrant    LA      71227
## 3842                                 Simsboro    LA      71275
## 3843                                 Simsboro    LA      71275
## 3844                                 Simsboro    LA      71275
## 3845                                   Ruston    LA 71273-2069
## 3846                                   Ruston    LA 71273-2069
## 3847                                   Ruston    LA 71273-2069
## 3848                                   Ruston    LA 71273-2069
## 3849                                   Ruston    LA 71273-2069
## 3850                                Grambling    LA      71245
## 3851                                Grambling    LA      71245
## 3852                                Grambling    LA      71245
## 3853                                Grambling    LA      71245
## 3854                                Grambling    LA      71245
## 3855                                   Dubach    LA      71235
## 3856                                   Dubach    LA      71235
## 3857                                   Dubach    LA      71235
## 3858                                   Dubach    LA      71235
## 3859                                   Dubach    LA      71235
## 3860                                   Ruston    LA      71273
## 3861                                   Ruston    LA      71273
## 3862                                   Ruston    LA      71273
## 3863                                             LA           
## 3864                                             LA           
## 3865                                             LA           
## 3866                                             LA           
## 3867                                             LA           
## 3868                                             LA           
## 3869                                             LA           
## 3870                                             LA           
## 3871                                             LA           
## 3872                                             LA           
## 3873                                             LA           
## 3874                                             LA           
## 3875                                             LA           
## 3876                                             LA           
## 3877                                             LA           
## 3878                                             LA           
## 3879                           Cenham Springs    LA      70726
## 3880                                             LA           
## 3881                                             LA           
## 3882                                             LA           
## 3883                                             LA           
## 3884                                             LA           
## 3885                                             LA           
## 3886                                             LA           
## 3887                                             LA           
## 3888                               Livingston    LA      70754
## 3889                               Livingston    LA      70754
## 3890                               Livingston    LA      70754
## 3891                           Denham Springs    LA      70726
## 3892                               Livingston    LA      70754
## 3893                               Livingston    LA      70754
## 3894                               Livingston    LA      70754
## 3895                               Livingston    LA      70754
## 3896                               Livingston    LA      70754
## 3897                               Livingston    LA      70754
## 3898                               Livingston    LA      70754
## 3899                               Livingston    LA      70754
## 3900                               Livingston    LA      70754
## 3901                               Livingston    LA      70754
## 3902                           Denham Springs    LA      70726
## 3903                           Denham Springs    LA      70726
## 3904                               Livingston    LA      70754
## 3905                               Livingston    LA      70754
## 3906                               Livingston    LA      70754
## 3907                               Livingston    LA      70754
## 3908                               Livingston    LA      70754
## 3909                               Livingston    LA      70754
## 3910                               Livingston    LA      70754
## 3911                               Livingston    LA      70754
## 3912                               Livingston    LA      70754
## 3913                                   Watson    LA      70786
## 3914                                             LA           
## 3915                                   Albany    LA      70711
## 3916                                 Maurepas    LA      70449
## 3917                              Springfield    LA      70462
## 3918                           Denham Springs    LA      70726
## 3919                                   Walker    LA      70785
## 3920                               Livingston    LA      70754
## 3921                              Springfield    LA      70462
## 3922                                   Walker    LA      70785
## 3923                           Denham Springs    LA      70726
## 3924                               Livingston    LA      70754
## 3925                                   Albany    LA      70711
## 3926                                 Maurepas    LA      70449
## 3927                              Springfield    LA      70462
## 3928                           Denham Springs    LA      70726
## 3929                               Livingston    LA      70754
## 3930                               Livingston    LA      70754
## 3931                              Springfield    LA      70462
## 3932                                   Walker    LA      70785
## 3933                           Denham Springs    LA 70727-1629
## 3934                                   Walker    LA      70785
## 3935                                   Albany    LA      70711
## 3936                              Springfield    LA      70462
## 3937                               Livingston    LA      70754
## 3938                              Springfield    LA      70462
## 3939                              Springfield    LA      70462
## 3940                        French Settlement    LA      70733
## 3941                             Port Vincent    LA      70726
## 3942                                   Walker    LA      70785
## 3943                                   Albany    LA      70711
## 3944                               Livingston    LA      70754
## 3945                        French Settlement    LA      70733
## 3946                                   Walker    LA      70785
## 3947                                   Walker    LA      70785
## 3948                                   Walker    LA      70785
## 3949                                   Walker    LA      70785
## 3950                                   Walker    LA      70785
## 3951                                   Walker    LA      70785
## 3952                              Springfield    LA      70462
## 3953                              Springfield    LA      70462
## 3954                              Springfield    LA      70462
## 3955                              Springfield    LA      70462
## 3956                              Springfield    LA      70462
## 3957                              Springfield    LA      70462
## 3958                              Springfield    LA      70462
## 3959                              Springfield    LA      70462
## 3960                              Springfield    LA      70462
## 3961                              Springfield    LA      70462
## 3962                               Livingston    LA      70754
## 3963                               Livingston    LA      70754
## 3964                               Livingston    LA      70754
## 3965                               Livingston    LA      70754
## 3966                               Livingston    LA      70754
## 3967                              Springfield    LA      70462
## 3968                              Springfield    LA      70462
## 3969                              Springfield    LA      70462
## 3970                              Springfield    LA      70462
## 3971                              Springfield    LA      70462
## 3972                        French Settlement    LA      70733
## 3973                        French Settlement    LA      70733
## 3974                        French Settlement    LA      70733
## 3975                             Port Vincent    LA      70726
## 3976                             Port Vincent    LA      70726
## 3977                             Port Vincent    LA      70726
## 3978                           Denham Springs    LA 70727-1629
## 3979                           Denham Springs    LA 70727-1629
## 3980                           Denham Springs    LA 70727-1629
## 3981                           Denham Springs    LA 70727-1629
## 3982                           Denham Springs    LA 70727-1629
## 3983                                   Albany    LA      70711
## 3984                                   Albany    LA      70711
## 3985                                   Albany    LA      70711
## 3986                                             LA           
## 3987                                             LA           
## 3988                                             LA           
## 3989                                             LA           
## 3990                                             LA           
## 3991                                             LA           
## 3992                                             LA           
## 3993                                             LA           
## 3994                                             LA           
## 3995                                             LA           
## 3996                                             LA           
## 3997                                             LA           
## 3998                                             LA           
## 3999                                             LA           
## 4000                                             LA           
## 4001                                 Tallulah    LA      71282
## 4002                                 Tallulah    LA      71282
## 4003                                 Tallulah    LA      71284
## 4004                                 Tallulah    LA      71282
## 4005                                 Tallulah    LA      71282
## 4006                                 Tallulah    LA      71282
## 4007                                 Tallulah    LA      71282
## 4008                                 Tallulah    LA      71282
## 4009                                 Tallulah    LA      71282
## 4010                                 Tallulah    LA      71282
## 4011                                 Tallulah    LA      71282
## 4012                                 Tallulah    LA      71282
## 4013                                 Tallulah    LA      71282
## 4014                                 Tallulah    LA      71282
## 4015                                 Tallulah    LA      71282
## 4016                                 Tallulah    LA      71282
## 4017                                 Tallulah    LA      71282
## 4018                                 Tallulah    LA      71282
## 4019                                 Tallulah    LA      71282
## 4020                                 Tallulah    LA      71282
## 4021                                 Tallulah    LA      71282
## 4022                                 Tallulah    LA      71282
## 4023                                 Tallulah    LA      71282
## 4024                                 Tallulah    LA      71282
## 4025                                 Tallulah    LA      71282
## 4026                                 Tallulah    LA      71282
## 4027                                    Delta    LA      71233
## 4028                                    Mound    LA      71282
## 4029                                 Richmond    LA      71282
## 4030                                 Tallulah    LA      71282
## 4031                                    Mound    LA      71282
## 4032                                 Richmond    LA      71282
## 4033                                    Delta    LA      71233
## 4034                                    Delta    LA      71233
## 4035                                    Delta    LA      71233
## 4036                                    Mound    LA      71282
## 4037                                    Mound    LA      71282
## 4038                                    Mound    LA      71282
## 4039                                 Richmond    LA      71282
## 4040                                 Richmond    LA      71282
## 4041                                 Richmond    LA      71282
## 4042                                 Tallulah    LA      71282
## 4043                                 Tallulah    LA      71282
## 4044                                 Tallulah    LA      71282
## 4045                                 Tallulah    LA      71282
## 4046                                 Tallulah    LA      71282
## 4047                                             LA           
## 4048                                             LA           
## 4049                                             LA           
## 4050                                             LA           
## 4051                                             LA           
## 4052                                             LA           
## 4053                                             LA           
## 4054                                             LA           
## 4055                                             LA           
## 4056                                             LA           
## 4057                                             LA           
## 4058                                             LA           
## 4059                                             LA           
## 4060                                             LA           
## 4061                                             LA           
## 4062                                             LA           
## 4063                                             LA           
## 4064                                             LA           
## 4065                                             LA           
## 4066                                             LA           
## 4067                                  Bastrop    LA      71220
## 4068                                  Bastrop    LA 71221-1543
## 4069                                  Bastrop    LA 71221-1177
## 4070                                  Bastrop    LA      71220
## 4071                                  Bastrop    LA      71220
## 4072                                  Bastrop    LA 71221-0509
## 4073                                  Bastrop    LA 71221-0509
## 4074                                  Bastrop    LA 71221-0509
## 4075                                  Bastrop    LA 71221-0509
## 4076                                  Bastrop    LA 71221-0509
## 4077                                  Bastrop    LA 71221-0509
## 4078                                  Bastrop    LA      71220
## 4079                                  Bastrop    LA      71220
## 4080                                  Bastrop    LA      71221
## 4081                                  Bastrop    LA      71220
## 4082                                  Bastrop    LA      71220
## 4083                                  Bastrop    LA      71220
## 4084                                  Bastrop    LA      71220
## 4085                                  Bastrop    LA      71220
## 4086                                  Bastrop    LA      71220
## 4087                                  Bastrop    LA      71220
## 4088                                  Bastrop    LA      71220
## 4089                                Oak Ridge    LA      71264
## 4090                                Mer Rouge    LA      71264
## 4091                                  Bastrop    LA      71220
## 4092                                  Bastrop    LA      71220
## 4093                                  Bastrop    LA      71220
## 4094                                  Bastrop    LA      71250
## 4095                                  Bastrop    LA      71220
## 4096                                  Bastrop    LA      71220
## 4097                                Oak Ridge    LA      71264
## 4098                                Mer Rouge    LA      71261
## 4099                                  Bastrop    LA      71220
## 4100                                             LA           
## 4101                                  Bastrop    LA      71220
## 4102                                   Bonita    LA      71233
## 4103                                  Bastrop    LA 71221-0431
## 4104                                   Bonita    LA      71223
## 4105                               Collinston    LA      71229
## 4106                                Mer Rouge    LA      71261
## 4107                                Oak Ridge    LA      71264
## 4108                                  Bastrop    LA 71221-0431
## 4109                                  Bastrop    LA 71221-0431
## 4110                                  Bastrop    LA 71221-0431
## 4111                                  Bastrop    LA 71221-0431
## 4112                                  Bastrop    LA 71221-0431
## 4113                                  Bastrop    LA 71221-0431
## 4114                                  Bastrop    LA 71221-0431
## 4115                                  Bastrop    LA 71221-0431
## 4116                                  Bastrop    LA 71221-0431
## 4117                                   Bonita    LA      71223
## 4118                                   Bonita    LA      71223
## 4119                                   Bonita    LA      71223
## 4120                                                          
## 4121                               Collinston    LA      71229
## 4122                               Collinston    LA      71229
## 4123                               Collinston    LA      71229
## 4124                                Mer Rouge    LA      71261
## 4125                                Mer Rouge    LA      71261
## 4126                                Mer Rouge    LA      71261
## 4127                                Oak Ridge    LA      71264
## 4128                                Oak Ridge    LA      71264
## 4129                                Oak Ridge    LA      71264
## 4130                                             LA           
## 4131                                             LA           
## 4132                                             LA           
## 4133                                             LA           
## 4134                                             LA           
## 4135                                             LA           
## 4136                                             LA           
## 4137                                             LA           
## 4138                                             LA           
## 4139                                             LA           
## 4140                                             LA           
## 4141                                             LA           
## 4142                                             LA           
## 4143                                             LA           
## 4144                                             LA           
## 4145                                             LA           
## 4146                                             LA           
## 4147                                             LA           
## 4148                                             LA           
## 4149                                             LA           
## 4150                                             LA           
## 4151                                             LA           
## 4152                                             LA           
## 4153                                             LA           
## 4154                                             LA           
## 4155                                             LA           
## 4156                             Natchitoches    LA      71458
## 4157                             Natchitoches    LA 71458-0476
## 4158                             Natchitoches    LA      71457
## 4159                             Natchitoches    LA      71458
## 4160                                                          
## 4161                                                          
## 4162                                                          
## 4163                                                          
## 4164                                                          
## 4165                                                          
## 4166                             Natchitoches    LA 71458-0070
## 4167                             Natchitoches    LA 71458-0070
## 4168                             Natchitoches    LA      71458
## 4169                             Natchitoches    LA      71457
## 4170                             Natchitoches    LA      71457
## 4171                             Natchitoches    LA      71457
## 4172                             Natchitoches    LA      71457
## 4173                             Natchitoches    LA      71457
## 4174                             Natchitoches    LA      71457
## 4175                             Natchitoches    LA      71457
## 4176                             Natchitoches    LA      71457
## 4177                             Natchitoches    LA      71457
## 4178                             Natchitoches    LA      71457
## 4179                                   Campti    LA 71411-0673
## 4180                                 Robeline    LA      71469
## 4181                                  Melrose    LA 71452-3414
## 4182                                   Campti    LA 71411-4361
## 4183                              Marthaville    LA 71450-3118
## 4184                            Cloutierville    LA      71416
## 4185                             Natchitoches    LA 71457-0037
## 4186                                   Campti    LA      71411
## 4187                                  Ashland    LA      71002
## 4188                                 Clarence    LA      71414
## 4189                                 Goldonna    LA      71031
## 4190                                  Natchez    LA      71456
## 4191                                 Powhatan    LA      71066
## 4192                                Provencal    LA      71468
## 4193                                 Robeline    LA      71469
## 4194                                   Campti    LA      71411
## 4195                                  Ashland    LA      71002
## 4196                                 Clarence    LA      71414
## 4197                                 Goldonna    LA      71031
## 4198                                  Natchez    LA 71456-0229
## 4199                                 Powhatan    LA      71066
## 4200                                Provencal    LA      71468
## 4201                                 Robeline    LA      71469
## 4202                             Natchitoches    LA 71457-0037
## 4203                                 Clarence    LA      71414
## 4204                                 Clarence    LA      71414
## 4205                                 Clarence    LA      71414
## 4206                                 Goldonna    LA      71031
## 4207                                 Goldonna    LA      71031
## 4208                                 Goldonna    LA      71031
## 4209                                  Natchez    LA 71456-0229
## 4210                                  Natchez    LA 71456-0229
## 4211                                  Natchez    LA 71456-0229
## 4212                                 Powhatan    LA      71066
## 4213                                 Powhatan    LA      71066
## 4214                                 Powhatan    LA      71066
## 4215                                Provencal    LA      71468
## 4216                                Provencal    LA      71468
## 4217                                Provencal    LA      71468
## 4218                                 Robeline    LA      71469
## 4219                                 Robeline    LA      71469
## 4220                                 Robeline    LA      71469
## 4221                                  Ashland    LA      71002
## 4222                                  Ashland    LA      71002
## 4223                                  Ashland    LA      71002
## 4224                             Natchitoches    LA 71457-0037
## 4225                             Natchitoches    LA 71457-0037
## 4226                             Natchitoches    LA 71457-0037
## 4227                             Natchitoches    LA 71457-0037
## 4228                                   Campti    LA      71411
## 4229                                   Campti    LA      71411
## 4230                                   Campti    LA      71411
## 4231                                   Campti    LA      71411
## 4232                                   Campti    LA      71411
## 4233                                             LA           
## 4234                                             LA           
## 4235                                             LA           
## 4236                                             LA           
## 4237                                             LA           
## 4238                                             LA           
## 4239                                             LA           
## 4240                                             LA           
## 4241                                             LA           
## 4242                                             LA           
## 4243                                             LA           
## 4244                                             LA           
## 4245                                             LA           
## 4246                                             LA           
## 4247                                             LA           
## 4248                                             LA           
## 4249                                             LA           
## 4250                                             LA           
## 4251                                             LA           
## 4252                                             LA           
## 4253                                             LA           
## 4254                                             LA           
## 4255                                             LA           
## 4256                                             LA           
## 4257                                             LA           
## 4258                                             LA           
## 4259                                             LA           
## 4260                                             LA           
## 4261                                             LA           
## 4262                                             LA           
## 4263                                             LA           
## 4264                                             LA           
## 4265                                             LA           
## 4266                                             LA           
## 4267                                             LA           
## 4268                                             LA           
## 4269                                             LA           
## 4270                                             LA           
## 4271                                             LA           
## 4272                                             LA           
## 4273                                             LA           
## 4274                                             LA           
## 4275                                             LA           
## 4276                                             LA           
## 4277                                             LA           
## 4278                                             LA           
## 4279                                             LA           
## 4280                                             LA           
## 4281                                             LA           
## 4282                                             LA           
## 4283                                             LA           
## 4284                                             LA           
## 4285                                             LA           
## 4286                                             LA           
## 4287                                             LA           
## 4288                                             LA           
## 4289                                             LA           
## 4290                                             LA           
## 4291                                             LA           
## 4292                                             LA           
## 4293                                             LA           
## 4294                                             LA           
## 4295                                             LA           
## 4296                                             LA           
## 4297                                             LA           
## 4298                                             LA           
## 4299                                             LA           
## 4300                                             LA           
## 4301                                             LA           
## 4302                                             LA           
## 4303                                             LA           
## 4304                                             LA           
## 4305                                             LA           
## 4306                                             LA           
## 4307                                             LA           
## 4308                                             LA           
## 4309                                             LA           
## 4310                                             LA           
## 4311                                             LA           
## 4312                                             LA           
## 4313                                             LA           
## 4314                                             LA           
## 4315                                             LA           
## 4316                                             LA           
## 4317                                             LA           
## 4318                                             LA           
## 4319                                             LA           
## 4320                                             LA           
## 4321                                             LA           
## 4322                                             LA           
## 4323                                             LA           
## 4324                                             LA           
## 4325                                             LA           
## 4326                                             LA           
## 4327                                             LA           
## 4328                                             LA           
## 4329                                             LA           
## 4330                                             LA           
## 4331                                             LA           
## 4332                                             LA           
## 4333                                             LA           
## 4334                                             LA           
## 4335                                             LA           
## 4336                                             LA           
## 4337                                             LA           
## 4338                                             LA           
## 4339                                             LA           
## 4340                                             LA           
## 4341                                             LA           
## 4342                                             LA           
## 4343                                             LA           
## 4344                                             LA           
## 4345                                             LA           
## 4346                              New Orleans    LA      70112
## 4347                              New Orleans    LA      70112
##       OfficePhone               Parish                       CandidateName
## 1                                                      Helen Godfrey Smith
## 2                                                                         
## 3                                                           Frances Kelley
## 4                                                    Frederic D Washington
## 5                                                           Barbara Norton
## 6                                                            Steve Jackson
## 7                                                            June Phillips
## 8                                                          Larry Ferdinand
## 9                                                              Nita Steele
## 10                                                              Artis Cash
## 11                                                         Allison McClung
## 12                                                          Lee A Jeter Sr
## 13                                                        Cynthia Williams
## 14                                                       Johnny C McFerren
## 15                                                 Linda Pitchford Jackson
## 16                                                         Ronald Griffing
## 17                                                         Deborah B Knapp
## 18                                                                        
## 19                                                             Pattie Odom
## 20                                                               John Agan
## 21                                                             Tara Hollis
## 22                                                            Glenn Hollis
## 23                                                                        
## 24                                                                        
## 25                                                                        
## 26                                                         Bobby Culpepper
## 27                                                     Brenda HensleySmith
## 28                                                          Fred Huenefeld
## 29                                                            Mary Kincade
## 30                                                         Charles Kincade
## 31                                                         Katrina Jackson
## 32                                                          Ronnie Traylor
## 33                                                            Billye Burns
## 34                                                           Marcus Hunter
## 35                                                                        
## 36                                                            Stephen Juge
## 37                                                    Linda Jenkins Turner
## 38                                                  Charles Walter Cochran
## 39                                                           Mary E Cooper
## 40                                                 Gregory Greg Richardson
## 41                                                 Leslie Dandridge Durham
## 42                                                                        
## 43                                                             Mary Bonier
## 44                                                              Johnny Cox
## 45                                                  Mozella Jeanetter Bell
## 46                                                             Larry Paige
## 47                                                         Gloria H Ruffin
## 48                                                         Willie Banks Jr
## 49                                                 Nancy Grandquist Fields
## 50                                                            Chris Roy Sr
## 51                                                       Mary L Wardsworth
## 52                                                         Herbert B Dixon
## 53                                                   Gloria Williams Hearn
## 54                                                            Stanley Lott
## 55                                                            Caina Munson
## 56                                                               Dan McKay
## 57                                                           Regina Barrow
## 58                                                  Rawlston D Phillips Jr
## 59                                                       Frankie Mae Evans
## 60                                                            Alton Bailey
## 61                                                   Denise Tauzin D'Amato
## 62                                                                        
## 63                                                        Patricia R Jones
## 64                                                           J Craig Jones
## 65                                                           Myrna Bennett
## 66                                                         Charles Bennett
## 67                                                         Edwina Medearis
## 68                                                           Davante Lewis
## 69                                                              Evia Hodge
## 70                                                        Maurice Griffith
## 71                                                    Diana Handy Hamilton
## 72                                                           David Darbone
## 73                                                       Torrie Thibodeaux
## 74                                                          Kieran Coleman
## 75                                                        Jennifer Vidrine
## 76                                                            Dirk Deville
## 77                                                Valerie Broussard Boston
## 78                                                         Danny L Uriegas
## 79                                                       Leona Henry Boxie
## 80                                                        Robert  J Wilson
## 81                                                                        
## 82                                                   Marshall A Thibodeaux
## 83                                                          Dianne Granger
## 84                                                           James Proctor
## 85                                                     Evanette C Richards
## 86                                                         Frank Art Flynn
## 87                                                        Tonya BoldenBall
## 88                                               Joseph J B Bowman Cormier
## 89                                                          Sally O Donlon
## 90                                                        John D Bernhardt
## 91                                                          Lynda T Guidry
## 92                                                            Shane Riddle
## 93                                                 Cynthia Sudduth Campisi
## 94                                                            Ronald Darby
## 95                                                                        
## 96                                                            Perry Segura
## 97                                                  Aquicline Rener Arnold
## 98                                                         Elbert S Dawson
## 99                                                            Thai Browder
## 100                                                 Anthony Troy Dennis Jr
## 101                                                      Anna B Cunningham
## 102                                                     Wayne J Thibodeaux
## 103                                                          Karen Dillard
## 104                                                      Clarence Williams
## 105                                                       Arlanda Williams
## 106                                                            S P LaRussa
## 107                                                            Nell Guidry
## 108                                                          Albert Guidry
## 109                                                        Carol R Leblanc
## 110                                                          Peter Jenkins
## 111                                                           Judy B Songy
## 112                                                            Joey Murray
## 113                                                       Lynncal T Bering
## 114                                                          Randal Gaines
## 115                                                                       
## 116                                                          Oliver Joseph
## 117                                                                       
## 118                                                            Armand Link
## 119                                                       Karen St Germain
## 120                                                Edward A Lucky Songy Jr
## 121                                                      C Denise Marcelle
## 122                                                      Alfred C Williams
## 123                                                                       
## 124                                                        Jim Mack Parker
## 125                                                         Elaine G Davis
## 126                                                         Ronald Rodgers
## 127                                                  Juanita CarterSanford
## 128                                                          Roger Sanford
## 129                                                            Maura Lewis
## 130                                                          Dalton Honore
## 131                                                       Jane Scheuermann
## 132                                                          Brett Jackson
## 133                                                  Patricia Haynes Smith
## 134                                                            Ben Jeffers
## 135                                                          Robin Shelbia
## 136                                                          James Bullman
## 137                                                 Elizabeth Betty Powers
## 138                                                           Kevin Garner
## 139                                             Charlotte McDaniel McGehee
## 140                                                       Brandon J DeCuir
## 141                                                         Paeton Burkett
## 142                                                        Ronnie H Wilson
## 143                                                     Linda Guy Phillips
## 144                                                        Nathaniel Adams
## 145                                                                       
## 146                                                   Robert Tiger Hammond
## 147                                                   Alicia Walker Breaux
## 148                                                            Alan B Tusa
## 149                                                          Patsy Ritchie
## 150                                                             Brad Orman
## 151                                                     Elsie P Burkhalter
## 152                                                         Lionel J Hicks
## 153                                                                       
## 154                                                     James K Jim Harlan
## 155                                                             Gilda Reed
## 156                                                                       
## 157                                                                       
## 158                                                                       
## 159                                                        Dwan S Hilferty
## 160                                                        David Gereighty
## 161                                                                       
## 162                                                            Tomy Acosta
## 163                                                                       
## 164                                                            Donald Blum
## 165                                              Sharlayne Jackson Prevost
## 166                                                          Kyle Green Jr
## 167                                                          Nora B Romano
## 168                                                       Patrick J DeJean
## 169                                                                       
## 170                                                           Rudy S Smith
## 171                                                                       
## 172                                                          Kelly S Wells
## 173                                                      Danielle Duffourc
## 174                                                           Paul Johnson
## 175                                                         Lesile Jackson
## 176                                                          Kyle Gautreau
## 177                                                            Erin Powell
## 178                                                                       
## 179                                              d'Andrea McMooain Chatman
## 180                                                           T J Smith Jr
## 181                                                         Diana E Bajoie
## 182                                                            Jay H Banks
## 183                                                    Malinda HillsHolmes
## 184                                                     Keith M Hutchinson
## 185                                                  Karen Carter Peterson
## 186                                                            James Perry
## 187                                                       Deborah Langhoff
## 188                                                         Nolan Marshall
## 189                                                       Cassandra Butler
## 190                                                    Randall Randy Albin
## 191                                                       Maggie F Daniels
## 192                                                           Marlon Lewis
## 193                                                   Cynthia HedgeMorrell
## 194                                                       Arthur A Morrell
## 195                                                        Irma Muse Dixon
## 196                                                        Marshall Hevron
## 197                                                      Elaine BoutteYost
## 198                                                        Wesley T Bishop
## 199                                                Jerrelda DrummerSanders
## 200                                                           Willie Jones
## 201                                                           Dawn Collins
## 202                                                       Edward Ted James
## 203                                                    Ericka EdwardsJones
## 204                                                    Joseph Broussard Jr
## 205                                                       Barbara R Keller
## 206                                                         Reed Henderson
## 207                                                      Brenda Ann Palmer
## 208                                                        Carlo Hernandez
## 209                                                         Lisa Ray Diggs
## 210                                                         Morris Reed Jr
## 211                                                                       
## 212                                                           Matt Varnell
## 213                                                        JeanPaul Guidry
## 214                                                                       
## 215                                                        Neil B Carlisle
## 216                                                           Sandy McDade
## 217                                                       Stephen C Gibson
## 218                                                        Ronnie Remedies
## 219                                                      Randall J Wallace
## 220                                                          Alan Seabaugh
## 221                                                          Jimmy C Allen
## 222                                                 Edward Eddie Brossette
## 223                                                          John C Kay Jr
## 224                                                          Harold Coates
## 225                                                               Ron Webb
## 226                                                     Bryan B Norwood Jr
## 227                                                           Lindell Webb
## 228                                                             Anne Price
## 229                                                            Duke Lowrie
## 230                                                                       
## 231                                                         Holly K Talley
## 232                                                            Laura Adley
## 233                                                       E Charles Jacobs
## 234                                                     Jerri Ray dePingre
## 235                                                  Thomas Harold Garrett
## 236                                                   Jennifer Daulton Ham
## 237                                                             Lisa Owens
## 238                                                            Gina Garris
## 239                                                          Sandra Rhodes
## 240                                                          Dusty Hampton
## 241                                                         Arron McGuffee
## 242                                                     Patsy P Montgomery
## 243                                                          Suzan S Betts
## 244                                               Deborah Wisdom McCulloch
## 245                                                 M Randall Randy Donald
## 246                                                          Gordon Dasher
## 247                                                           John Cooksey
## 248                                                       Kay Kellogg Katz
## 249                                                              Paul Hurd
## 250                                                                       
## 251                                                                       
## 252                                                     William Bill Davis
## 253                                                            Ambia Baker
## 254                                                       Doyle E Robinson
## 255                                                             Neil Riser
## 256                                                       Henry Herford Jr
## 257                                                           Bob Strozier
## 258                                                        William Guthrie
## 259                                                             Sam Brimer
## 260                                                         Billie Turnley
## 261                                                           Paul Johnson
## 262                                                            Rick Nowlin
## 263                                                       Bobby E Williams
## 264                                                          Valmore Byles
## 265                                                           Chuck Tosten
## 266                                                             Wayne Ryan
## 267                                                                       
## 268                                                           Kim P Knight
## 269                                                              Gena Gore
## 270                                                          Edwin B Jones
## 271                                                            Olivia Nash
## 272                                                              Van Kojis
## 273                                                                       
## 274                                                            Steven Iles
## 275                                                     Logan Oscar Morris
## 276                                                         Ross Little Jr
## 277                                                    William P Mills III
## 278                                                     Nathan G Broussard
## 279                                                Llewellyn Biscuit Smith
## 280                                                   William E Bill Murry
## 281                                                 Lillie Wilkinson Brady
## 282                                                            Billy White
## 283                                                          Nathan Curtis
## 284                                                            Chris Brown
## 285                                                          James Boswell
## 286                                                         John Hoffpauir
## 287                                                  Eric Scott Fitzgerald
## 288                                                          Korey S Dugas
## 289                                                    Chester Lee Mallett
## 290                                                  David Emile Marcantel
## 291                                                            Dan R Poret
## 292                                                          Jimmy LaFleur
## 293                                                          Julie Emerson
## 294                                                   Michael Louis Hebert
## 295                                                           Kenny Boagni
## 296                                                        Suzanne Bercier
## 297                                                       Russell P Pavich
## 298                                                        Janice Hartiens
## 299                                                          Larry M Lege'
## 300                                                       Brandy P Edwards
## 301                                                           Chris Pettus
## 302                                                           Tim Reynolds
## 303                                                 Sandra Sandy Hindelang
## 304                                                        Deborah R Young
## 305                                                    W Thomas Tom Angers
## 306                                                                       
## 307                                                        Hannah Joy Dake
## 308                                                            Blake Douet
## 309                                                    Joseph Rick Pearson
## 310                                                       Russell Ferguson
## 311                                                           Dexter Duhon
## 312                                                         Kristian Magar
## 313                                                        James Wyche III
## 314                                                       Simone Champagne
## 315                                                            Jude Savoie
## 316                                                        Christian J Gil
## 317                                                          Jessie Morton
## 318                                                       Leilani N Hardee
## 319                                                                       
## 320                                                     Beryl Adams Amedee
## 321                                                           Fred Fondren
## 322                                                       Theresa Ellender
## 323                                                          Lenar Whitney
## 324                                                          Brent Callais
## 325                                                        Matthew Alleman
## 326                                                           David Gauthe
## 327                                                        Garrett C Monti
## 328                                                     Beth Anne Billings
## 329                                                    David W Dave Millet
## 330                                                       Nicholas M James
## 331                                                    Charles B Carpenter
## 332                                                           Paul Goppelt
## 333                                                           Tonya Veazey
## 334                                                       George Valentine
## 335                                                       Arthur N Bagwell
## 336                                                             Dan Richey
## 337                                                          Rick Guillory
## 338                                                           Jimmy Kaiser
## 339                                                         Barbara Thomas
## 340                                                  Gordon William Atwell
## 341                                                    Valarie Hope Hodges
## 342                                                            Neal Cotton
## 343                                                          Scott Wilfong
## 344                                                         Brennan Easley
## 345                                                           Barry D Ivey
## 346                                                            Gene Guffey
## 347                                                        Malcolm Richard
## 348                                                         Ray E Williams
## 349                                                         Elizabeth Dent
## 350                                                         Lynda Carville
## 351                                                     James Morgan Field
## 352                                                         Connie Bernard
## 353                                                        Bryan Jeansonne
## 354                                                           Tommy French
## 355                                                             Ryan Booth
## 356                                                   Jonathan Brandenburg
## 357                                                     Kathleen Edgeworth
## 358                                                          Charlie Davis
## 359                                                               Dan Kyle
## 360                                                          Craig Lindsay
## 361                                                    Robert W Bob Morgan
## 362                                                      Jon Chris Comeaux
## 363                                                   Donna Carlisle Erdey
## 364                                                    Charles D Christmas
## 365                                                         Adonica Duggan
## 366                                                   Elizabeth Beth Davis
## 367                                                          George Holton
## 368                                                                       
## 369                                                            Scott Simon
## 370                                                     Christopher Trahan
## 371                                                     Mary S Beth Mizell
## 372                                                            Merlin Duke
## 373                                                Virginia Ginger Corkern
## 374                                                             Mark Sigur
## 375                                                           Drew LaPlace
## 376                                                         Robert A Deese
## 377                                                              A G Crowe
## 378                                                            Mark Wright
## 379                                                          Lester P Dore
## 380                                                   Sandra BaileySimmons
## 381                                                 George R Buddy Blue Jr
## 382                                                            Joe Spinato
## 383                                                          Debbie Cooper
## 384                                                      Ralph E Brandt Jr
## 385                                                         Bryan J St Cyr
## 386                                                 Philip Phil L Capitano
## 387                                                           Betty Bonura
## 388                                                  Debbie Mabile Settoon
## 389                                                          Archie Corder
## 390                                                   Vinson J Vince Serio
## 391                                                        Lynn E Skidmore
## 392                                                    Joseph P Lopinto Jr
## 393                                                         Charlotte Ruiz
## 394                                                     Roger F Villere Jr
## 395                                                          Eric Skrmetta
## 396                                                          Monica Monica
## 397                                                           Jeffrey Zewe
## 398                                                          Daniel Shanks
## 399                                                       Bruce P Donnelly
## 400                                                      George A Peterson
## 401                                                     Ashleigh Carpenter
## 402                                                            Rickey Ullo
## 403                                                        Michael O'Brien
## 404                                                           Keith B Hall
## 405                                                           Billy Arnold
## 406                                                       Wallace Lucas Sr
## 407                                                                       
## 408                                                                       
## 409                                                             Earl Price
## 410                                                         Floyd Gonzalez
## 411                                                                       
## 412                                                                       
## 413                                                   Jan Conlin McAlister
## 414                                                         Lynn Pablovich
## 415                                                           Pat Phillips
## 416                                                            Dewey Spies
## 417                                                         John R Morello
## 418                                                            Tony Jurich
## 419                                                     Jonathan D Johnson
## 420                                                         Tiffany Parker
## 421                                                          John P O'Neil
## 422                                                        George White Jr
## 423                                                        Sherry Willmott
## 424                                                            Penny Frame
## 425                                                         J Bryan Wagner
## 426                                                       John Jay Batt Jr
## 427                                             Salvador Sal Palmisano III
## 428                                                                       
## 429                                                             David Toso
## 430                                                        Stephen M Swain
## 431                                                         Lloyd A Harsch
## 432                                                       Louis Gurvich Jr
## 433                                                           David Kepper
## 434                                                         Rafael Perales
## 435                                                                       
## 436                                                                       
## 437                                                         Andrew Bautsch
## 438                                                             Joseph Cao
## 439                                                          Mark A Madary
## 440                                                                       
## 441                                                         Michael Bayham
## 442                                                           Jeff Dimarco
## 443                                                         Ray Griffin Jr
## 444  504-342-7015                                             Bobby Jindal
## 445  504-342-7009                                             Jay Dardenne
## 446  225-342-4479                                             Tom Schedler
## 447  225-326-6000                                   James D Buddy Caldwell
## 448  504-342-0010                                             John Kennedy
## 449  225-922-1234                                    Michael G Mike Strain
## 450  225-342-5900                                              Jim Donelon
## 451                                                          Mary Landrieu
## 452                                                           David Vitter
## 453  504-837-1259                                            Steve Scalise
## 454  504-589-2274                                          Cedric Richmond
## 455  225-621-8490                                    Charles W Boustany Jr
## 456  318-798-2254                                             John Fleming
## 457  318-322-3500                                         Rodney Alexander
## 458  225-929-7711                                     William Bill Cassidy
## 459  504-310-2300                                              Greg Guidry
## 460  504-310-2300                                        Jeffrey P Victory
## 461  504-310-2300                                  Jeannette Theriot Knoll
## 462  504-310-2300                                           Marcus R Clark
## 463  504-310-2300                                              Jeff Hughes
## 464  504-310-2300                                            John L Weimer
## 465  504-310-2300                                  Bernette Joshua Johnson
## 466  225-382-3000                                Toni Manning Higginbotham
## 467  225-382-3000                                            Mike McDonald
## 468  225-382-3000                                       Jewel E Duke Welch
## 469  225-382-3000                                      John Michael Guidry
## 470  225-382-3000                                         John T Pettigrew
## 471  225-382-3000                                            Mitch Theriot
## 472  225-382-3000                                     Randolph Randy Parro
## 473  225-382-3000                                    Vanessa GuidryWhipple
## 474  225-382-3000                                       James E Jimmy Kuhn
## 475  225-382-3000                                           Page McClendon
## 476  225-382-3000                                  Ernest G Ernie Drake Jr
## 477  225-382-3000                                     William J Will Crain
## 478  318-227-3700                                   Felicia Toney Williams
## 479  318-227-3700                                        John Larry Lolley
## 480  318-227-3700                                       D Milton Moore III
## 481  318-227-3700                                        James Jay Caraway
## 482  318-227-3700                                         R Harmon Drew Jr
## 483  318-227-3700                                              Henry Brown
## 484  318-227-3700                                       James E Stewart Sr
## 485  318-227-3700                                           Frances Pitman
## 486  318-227-3700                                            Fred C Sexton
## 487  318-227-3700                                         Jeanette Garrett
## 488  318-433-9403                                      Elizabeth A Pickett
## 489  318-433-9403                                          Jimmie C Peters
## 490  318-433-9403                                 Shannon James Gremillion
## 491  318-433-9403                                  Ulysses Gene Thibodeaux
## 492  318-433-9403                                     Joseph David Painter
## 493  318-433-9403                                            Billy H Ezell
## 494  318-433-9403                                            John Saunders
## 495  318-433-9403                                           Sylvia R Cooks
## 496  318-433-9403                                            John E Conery
## 497  318-433-9403                                                 Marc Amy
## 498  318-433-9403                                 Phyllis Montgomery Keaty
## 499  318-433-9403                                           Jimmy Genovese
## 500  504-412-6001                                           Roland Belsome
## 501  504-412-6001                                        James F McKay III
## 502  504-412-6001                                          Edwin A Lombard
## 503  504-412-6001                                               Paul Bonin
## 504  504-412-6001                                     Dennis R Bagneris Sr
## 505  504-412-6001                                          Max N Tobias Jr
## 506  504-412-6001                                               Terri Love
## 507  504-412-6001                                     Madeleine M Landrieu
## 508  504-412-6001                                               Rose Ledet
## 509  504-412-6001                                   Sandra Cabrina Jenkins
## 510  504-412-6001                                Joyce Cossich Joy Lobrano
## 511  504-412-6001                                          Daniel L Dysart
## 512  504-376-1400                                           Marc E Johnson
## 513  504-376-1400                                Fredericka Homberg Wicker
## 514  504-376-1400                                         Susan M Chehardy
## 515  504-376-1400                                      Stephen J Windhorst
## 516  504-376-1400                                           Hans Liljeberg
## 517  504-376-1400                                          Robert M Murphy
## 518  504-376-1400                                           Jude G Gravois
## 519  504-376-1400                                        Robert A Chaisson
## 520  225-342-4404                                            Eric Skrmetta
## 521  225-342-4404                                          Scott A Angelle
## 522  225-342-4404                                  Lambert C Boissiere III
## 523  225-342-4404                                         Clyde C Holloway
## 524  225-342-4404                                          Foster Campbell
## 525  225-342-5840                                         James Jim Garvey
## 526  225-342-5840                                        Kira Orange Jones
## 527  225-342-5840                                    Lottie Polozola Beebe
## 528  225-342-5840                                             Walter C Lee
## 529  225-342-5840                                              Jay Guillot
## 530  225-342-5840                                 Charles E Chas Roemer IV
## 531  225-342-5840                                              Holly Boffy
## 532  225-342-5840                                             Carolyn Hill
## 533  225-342-2040                                                A G Crowe
## 534  225-342-2040                                             Troy E Brown
## 535  225-342-2040                                              J P Morrell
## 536  225-342-2040                                        Edwin R Ed Murray
## 537  225-342-2040                                    Karen Carter Peterson
## 538  225-342-2040                                       Mack Bodi White Jr
## 539  225-342-2040                                          David Heitmeier
## 540  225-342-2040                                         John A Alario Jr
## 541  225-342-2040                                             Conrad Appel
## 542  225-342-2040                                   Daniel R Danny Martiny
## 543  225-342-2040                                          Jack Donahue Jr
## 544  225-342-2040                                               Ben Nevers
## 545  225-342-2040                                               Dale Erdey
## 546  225-342-2040                                            Yvonne Dorsey
## 547  225-342-2040                                     Sharon Weston Broome
## 548  225-342-2040                                              Dan Claitor
## 549  225-342-2040                                            Rick Ward III
## 550  225-342-2040                                              Jody Amedee
## 551  225-342-2040                                          Gary L Smith Jr
## 552  225-342-2040                                            Norby Chabert
## 553  225-342-2040                                       R L Bret Allain II
## 554  225-342-2040                                      Fred TFred Mills Jr
## 555  225-342-2040                                      Patrick Page Cortez
## 556  225-342-2040                                      Elbert Lee Guillory
## 557  225-342-2040                                        Dan Blade Morrish
## 558  225-342-2040                                           Jonathan Perry
## 559  225-342-2040                                             Ronnie Johns
## 560  225-342-2040                                             Eric LaFleur
## 561  225-342-2040                                              Rick Gallot
## 562  225-342-2040                                               John Smith
## 563  225-342-2040                                              Gerald Long
## 564  225-342-2040                                               Neil Riser
## 565  225-342-2040                                 Michael A Mike Walsworth
## 566  225-342-2040                                         Francis Thompson
## 567  225-342-2040                                    Robert W Bob Kostelka
## 568  225-342-2040                                             Robert Adley
## 569  225-342-2040                                           Barrow Peacock
## 570  225-342-2040                                       Sherri Smith Cheek
## 571  225-342-2040                                           Gregory Tarver
## 572  225-342-6945                                       James H Jim Morris
## 573  225-342-6945                                            Roy A Burrell
## 574  225-342-6945                                           Barbara Norton
## 575  225-342-6945                                       Patrick C Williams
## 576  225-342-6945                                            Alan Seabaugh
## 577  225-342-6945                                Thomas Gaughan Carmody Jr
## 578  225-342-6945                                   Richard Richie Burford
## 579  225-342-6945                                            Jeff Thompson
## 580  225-342-6945                                            Henry L Burns
## 581  225-342-6945                                            Gene Reynolds
## 582  225-342-6945                                      Patrick O Jefferson
## 583  225-342-6945                                              Rob Shadoin
## 584  225-342-6945                                       James R Jim Fannin
## 585  225-342-6945                                               Jay Morris
## 586  225-342-6945                                           Frank Hoffmann
## 587  225-342-6945                                          Katrina Jackson
## 588  225-342-6945                                            Marcus Hunter
## 589  225-342-6945                                            Major Thibaut
## 590  225-342-6945                                   Charles R Bubba Chaney
## 591  225-342-6945                                          Steven E Pylant
## 592  225-342-6945                                              Andy Anders
## 593  225-342-6945                                        Terry Ralph Brown
## 594  225-342-6945                                                Kenny Cox
## 595  225-342-6945                                           Frankie Howard
## 596  225-342-6945                                             Lance Harris
## 597  225-342-6945                                          Herbert B Dixon
## 598  225-342-6945                                              Chris Hazel
## 599  225-342-6945                                           Robert Johnson
## 600  225-342-6945                                     Regina AshfordBarrow
## 601  225-342-6945                                        James K Armes III
## 602  225-342-6945                                             Nancy Landry
## 603  225-342-6945                                         Dorothy Sue Hill
## 604  225-342-6945                                             Mike Danahay
## 605  225-342-6945                                             A B Franklin
## 606  225-342-6945                                            Brett Geymann
## 607  225-342-6945                                           Chuck Kleckley
## 608  225-342-6945                                      John E Johnny Guinn
## 609  225-342-6945                                          H Bernard LeBas
## 610  225-342-6945                                           Stephen Ortego
## 611  225-342-6945                                 Ledricka Johnson Thierry
## 612  225-342-6945                                        Mickey J Guillory
## 613  225-342-6945                                           Jack Montoucet
## 614  225-342-6945                                          Stuart J Bishop
## 615  225-342-6945                                         Vincent J Pierre
## 616  225-342-6945                                           Joel Robideaux
## 617  225-342-6945                                          Mike Pete Huval
## 618  225-342-6945                                             Bob Hensgens
## 619  225-342-6945                                            Taylor Barras
## 620  225-342-6945                                       Simone B Champagne
## 621  225-342-6945                                                Sam Jones
## 622  225-342-6945                                      Joseph Joe Harrison
## 623  225-342-6945                                              Gordon Dove
## 624  225-342-6945                                            Lenar Whitney
## 625  225-342-6945                                     Jerry Truck Gisclair
## 626  225-342-6945                                       Jerome Dee Richard
## 627  225-342-6945                                         Gregory A Miller
## 628  225-342-6945                                          Randal L Gaines
## 629  225-342-6945                                                 Ed Price
## 630  225-342-6945                                          Eddie J Lambert
## 631  225-342-6945                                         Karen St Germain
## 632  225-342-6945                                        Alfred C Williams
## 633  225-342-6945                                             Kenny Havard
## 634  225-342-6945                                          Dalton W Honore
## 635  225-342-6945                                           Valarie Hodges
## 636  225-342-6945                                               Barry Ivey
## 637  225-342-6945                                            Hunter Greene
## 638  225-342-6945                                         Patricia H Smith
## 639  225-342-6945                                   Stephen F Steve Carter
## 640  225-342-6945                                              Erich Ponti
## 641  225-342-6945                                            Franklin Foil
## 642  225-342-6945                                            J Rogers Pope
## 643  225-342-6945                                         John Bel Edwards
## 644  225-342-6945                                               Steve Pugh
## 645  225-342-6945                                            Scott M Simon
## 646  225-342-6945                                         Harold L Ritchie
## 647  225-342-6945                                            Kevin Pearson
## 648  225-342-6945                                          John M Schroder
## 649  225-342-6945                                              Kirk Talbot
## 650  225-342-6945                                             Julie Stokes
## 651  225-342-6945                                           Joseph Lopinto
## 652  225-342-6945                                         Clay Schexnayder
## 653  225-342-6945                                       J Cameron Henry Jr
## 654  225-342-6945                                         Robert E Billiot
## 655  225-342-6945                                          Patrick Connick
## 656  225-342-6945                                              Bryan Adams
## 657  225-342-6945                                         Chris Broadwater
## 658  225-342-6945                                      Girod H Jackson III
## 659  225-342-6945                                  John A Johnny Berthelot
## 660  225-342-6945                                                Tim Burns
## 661  225-342-6945                                              Greg Cromer
## 662  225-342-6945                                           Walt Leger III
## 663  225-342-6945                                             Tom Willmott
## 664  225-342-6945                                            Helena Moreno
## 665  225-342-6945                                  Nicholas J Nick Lorusso
## 666  225-342-6945                                           Sherman Q Mack
## 667  225-342-6945                                             Terry Landry
## 668  225-342-6945                                           Jared Brossett
## 669  225-342-6945                                            Neil Abramson
## 670  225-342-6945                                          Wesley T Bishop
## 671  225-342-6945                                             Austin Badon
## 672  225-342-6945                                         Edward Ted James
## 673  225-342-6945                                      Jeffery Jeff Arnold
## 674  225-342-6945                                             Ray Garofalo
## 675  225-342-6945                                              Paul Hollis
## 676  225-342-6945                                            Chris Leopold
## 677                                                         Ramona Emanuel
## 678                                                         Leon L Emanuel
## 679                                                         John Mosely Jr
## 680                                                          Ramon Lafitte
## 681                                                       Scott J Crichton
## 682                                                                       
## 683                                                         Craig Marcotte
## 684                                                 Robert P Bobby Waddell
## 685                                                            Mike Pitman
## 686                                                       Katherine Dorroh
## 687                                                             Roy L Brun
## 688                                                    Jenifer Ward Clason
## 689                                                             Jimmy Teat
## 690                                                           Glenn Fallin
## 691                                                        Cynthia Woodard
## 692                                                          R Wayne Smith
## 693                                                         Jay B McCallum
## 694                                                             Carl Sharp
## 695                                                         Benjamin Jones
## 696                                                          Alvin R Sharp
## 697                                                       Robert C Johnson
## 698                                                            Scott Leehy
## 699                                                 Sharon Ingram Marchman
## 700                                                      John Wilson Rambo
## 701                                                       Stephens Winters
## 702                                                             Fred Amman
## 703                                                        Wendell Manning
## 704                                                 Daniel Joseph Ellender
## 705                                                        Terry A Doughty
## 706                                                 James M Jimbo Stephens
## 707                                                          Rudy McIntyre
## 708                                                    Michael E Lancaster
## 709                                                         John D Crigler
## 710                                                          Kathy Johnson
## 711                                                             Leo Boothe
## 712                                                            Jacque Derr
## 713                                                         Donald Johnson
## 714                                                    George C Metoyer Jr
## 715                                                      Thomas Tom Yeager
## 716                                                     Mary Lauve Doggett
## 717                                                        John C Davidson
## 718                                                    Patricia Evans Koch
## 719                                                         Harry F Randow
## 720                                                        Rick Harrington
## 721                                                        Dee A Hawthorne
## 722                                                        Stephen Beasley
## 723                                                         Mark Jeansonne
## 724                                                William J Billy Bennett
## 725                                                        J Larry Vidrine
## 726                                                    Thomas Tom Fuselier
## 727                                                          Lilynn Cutrer
## 728                                                       Wilford D Carter
## 729                                                               Ron Ware
## 730                                                          Clayton Davis
## 731                                                          Guy Bradberry
## 732                                                         Robert L Wyatt
## 733                                                   Michael Mike Canaday
## 734                                                          D Kent Savoie
## 735                                                          David Ritchie
## 736                                                        Jules D Edwards
## 737                                                               Ed Rubin
## 738                                                          Herman Clause
## 739                                                       David A Blanchet
## 740                                                      Thomas Duplantier
## 741                                           Patrick Louis Rick Michot Sr
## 742                                                       Marilyn C Castle
## 743                                                           Susan Theall
## 744                                                          John D Trahan
## 745                                                          Glenn Everett
## 746                                                      Kristian D Earles
## 747                                                           Ed Broussard
## 748                                                         Durwood Conque
## 749                                                       Charles L Porter
## 750                                                          Lori A Landry
## 751                                                      Gerard B Wattigny
## 752                                                            Paul deMahy
## 753                                                        Vincent J Borne
## 754                                                     James R McClelland
## 755                                                          Keith Comeaux
## 756                                                   Edward Ed Leonard Jr
## 757                                                           John LeBlanc
## 758                                             Jerome J Jerry Barbera III
## 759                                                    Walter I Lanier III
## 760                                                          Bruce Simpson
## 761                                                    F Hugh Buddy Larose
## 762                                                       Alvin Batiste Jr
## 763                                                       William C Dupont
## 764                                                           J Robin Free
## 765                                                           James J Best
## 766                                                     Donald Don Johnson
## 767                                                           Janice Clark
## 768                                                            Trudy White
## 769                                                         Bonnie Jackson
## 770                                                          Wilson Fields
## 771                                                         Todd Hernandez
## 772                                                     Richard D Anderson
## 773                                                             Mike Erwin
## 774                                                              Kay Bates
## 775                                                 Richard Chip Moore III
## 776                                                         Louis R Daniel
## 777                                                        William Morvant
## 778                                                             Tim Kelley
## 779                                            Anthony J Tony Marabella Jr
## 780                                                     R Michael Caldwell
## 781                                                               Hal Ware
## 782                                                   William G Carmichael
## 783                                                        Wayne Ray Chutz
## 784                                                        Bruce C Bennett
## 785                                              Robert H Bob Morrison III
## 786                                                   Milton D Doug Hughes
## 787                                                   Brenda Bedsole Ricks
## 788                                                   Elizabeth Beth Wolfe
## 789                                                                       
## 790                                             Zorraine M Zoey Waguespack
## 791                                                  Blair Downing Edwards
## 792                                                          Ray Childress
## 793                                                               A J Hand
## 794                                                    Richard Rick Swartz
## 795                                                         Peter J Garcia
## 796                                                  William J Bill Burris
## 797                                                         Martin E Coady
## 798                                                        Hillary J Crain
## 799                                                Allison Hopkins Penzato
## 800                                                     Reginald T Badeaux
## 801                                                   William Rusty Knight
## 802                                                 Mary Clemence Devereux
## 803                                                           Dawn Amacker
## 804                                                        Alvin Turner Jr
## 805                                                           Ralph Tureau
## 806                                                           Tom Kliebert
## 807                                                          Guy Holdridge
## 808                                                         Jessie LeBlanc
## 809                                                  Robert A Bob Pitre Jr
## 810                                                          Ross P LaDart
## 811                                                      Raymond Ray Steib
## 812                                                    Walter J Rothschild
## 813                                                        Michael P Mentz
## 814                                                          Steve Enright
## 815                                                    Ellen Shirer Kovach
## 816                                               Donald A Donnie Rowan Jr
## 817                                                        Glenn B Ansardi
## 818                                                         Nancy A Miller
## 819                                                  June Berry Darensburg
## 820                                                      Lee V Faulkner Jr
## 821                                                   Stephen Steve Grefer
## 822                                                    Henry G Sullivan Jr
## 823                                                 Cornelius E Conn Regan
## 824                                                     John J Molaison Jr
## 825                                                           Kevin Conner
## 826                                                      Michael D Clement
## 827                                                     Michael Mike Craig
## 828                                                      Ford E Stinson Jr
## 829                                                               Jeff Cox
## 830                                                        John M Robinson
## 831                                                            Mike Nerren
## 832                                                            Parker Self
## 833                                                          Alonzo Harris
## 834                                                 James P Jim Doherty Jr
## 835                                                        Donald W Hebert
## 836                                                         Ellis J Daigle
## 837                                                   J Christopher Peters
## 838                                                      Emile R St Pierre
## 839                                                          Lauren Lemmon
## 840                                                          Michele Morel
## 841                                                         Vernon B Clark
## 842                                                              John Ford
## 843                                                   James R Jim Mitchell
## 844                                                          Steve Gunnell
## 845  985-873-6540                                        George J Larke Jr
## 846  985-873-6550                                            John R Walker
## 847  985-873-6560                                       Timothy C Ellender
## 848  985-873-6570                                        David W Arceneaux
## 849  985-873-6580                              Randall L Randy Bethancourt
## 850                                                             Joel Davis
## 851                                                          Patricia Cole
## 852                                                   Robert A Bob Buckley
## 853                                               Manuel A Manny Fernandez
## 854                                                          Perry Nicosia
## 855                                                          Kirk A Vaughn
## 856                                                      Jacques A Sanborn
## 857                                            Warren Daniel Danny Willett
## 858                                                      Martha Ann O'Neal
## 859                                                         Kerry Anderson
## 860                                                            Don C Burns
## 861                                                 Penelope Quinn Richard
## 862                                                           Lewis O Sams
## 863                                                     Mary Hotard Becnel
## 864                                                       Madeline Jasmine
## 865                                                        Sterling Snowdy
## 866                                                       Robert E Burgess
## 867                                                        Charles B Adams
## 868                                                  Tiffany Gautier Chase
## 869                                                     Regina Bartholomew
## 870                                                      Sidney H Cates IV
## 871                                                      Lloyd J Medley Jr
## 872                                                          Clare Jupiter
## 873                                                Christopher Chris Bruno
## 874                                                        Robin Giarrusso
## 875                                                     Michael G Bagneris
## 876                                                          Piper Griffin
## 877                                                            Paula Brown
## 878                                                                       
## 879                                                           Kern A Reese
## 880                                                         Paulette Irons
## 881                                                           Ethel Julien
## 882                                                     Bernadette D'Souza
## 883                                                           Laurie White
## 884                                               Tracey FlemingsDavillier
## 885                                                     Benedict J Willard
## 886                                                        Frank A Marullo
## 887                                                    Keva LandrumJohnson
## 888                                                          Robin Pittman
## 889                                                        Julian A Parker
## 890                                                          Camille Buras
## 891                                                           Karen Herman
## 892                                                        Darryl Derbigny
## 893                                                          Arthur Hunter
## 894                                                         Franz Zibilich
## 895                                                        Gerard J Hansen
## 896  318-226-6956                                        Charles Rex Scott
## 897  318-927-4862                                       Jonathan M Stewart
## 898  318-251-5100                                            Robert W Levy
## 899  318-388-4720                                            Jerry L Jones
## 900  318-728-3227                                      John Mack Lancaster
## 901  318-574-4771                                           James E Paxton
## 902  318-336-5526                                         Bradley R Burget
## 903  318-628-2141                                         R C Chris Nevils
## 904  318-473-6650                                        James C Jam Downs
## 905  318-357-2214                                              Van H Kyzar
## 906  318-256-3072                                            Don M Burkett
## 907  318-253-6587                               Charles Charlie Riddle III
## 908  337-363-3438                                            Trent Brignac
## 909  337-437-3400                                            John DeRosier
## 910  318-232-5170                                           Michael Harson
## 911  337-369-4420                                             J Phil Haney
## 912  985-447-2003                                 Camille A Cam Morvant II
## 913  225-687-5210                                  Richard J Ricky Ward Jr
## 914  225-389-3400                                         Hillar Moore III
## 915  225-634-2535                                            Sam D'Aquilla
## 916  985-748-7890                                       Scott M Perrilloux
## 917  985-898-2392                                            Walter P Reed
## 918  504-369-3568                                              Ricky Babin
## 919                                                      Paul D Connick Jr
## 920  504-392-6690                                         Charles J Ballay
## 921  318-965-2332                                          Schuyler Marvin
## 922  337-948-3041                                              Earl Taylor
## 923  318-992-2603                                             Reed Walters
## 924  985-785-0374                                       Joel T Chaisson II
## 925  337-239-3742                                              Asa Skinner
## 926  337-824-0315                                        Michael C Cassidy
## 927  985-873-6500                                             Joe Waitz Jr
## 928  318-738-5561                                             H Todd Nesom
## 929  504-271-1658                                       John F Jack Rowley
## 930  318-627-3205                                      James P Jay Lemoine
## 931  337-463-5578                                             David Burton
## 932  318-649-2508                                             W Mark McKee
## 933  337-775-5713                                           Cecil R Sanner
## 934  318-932-4035                                            Julie C Jones
## 935  985-652-9757                                         Thomas Tom Daley
## 936  318-872-2991                                     Richard Z Johnson Jr
## 937  504-827-2414                                     Leon A Cannizzaro Jr
## 938  318-457-6535                                     Lynette Young Feucht
## 939  318-673-5870                                              R Lee Irvin
## 940  318-673-5885                                               Bill Kelly
## 941  318-673-5890                                          Pammela Lattier
## 942  318-673-5878                                               Sheva Sims
## 943  337-457-6580                                         Terry J Darbonne
## 944  318-673-6800                                         Charlie Caldwell
## 945  337-837-6681                                     Charles E Langlinais
## 946  337-462-8900                                              Ron Roberts
## 947  337-457-6516                                        Claud Rusty Moody
## 948  318-673-5262                                          Cedric B Glover
## 949  337-754-5911                                         Kathy  M Richard
## 950  337-432-6693                                        Berline B Sonnier
## 951  337-685-4462                                          Carol Broussard
## 952  337-873-6754                                        Johnny Thibodeaux
## 953  318-982-5344                                          Reggie G Skains
## 954  318-986-4459                                           Preston Rogers
## 955  337-837-6681                                          Brannon J Decou
## 956  337-457-6516                                              Ronald Dies
## 957  337-754-5911                                         Richard  B Mizzi
## 958  337-432-6693                                           Allen Ivory Jr
## 959  337-985-4462                                          James Broussard
## 960  318-982-5344                                             Earl Roberts
## 961  318-986-4459                                         Mark A McLelland
## 962  337-457-6516                                 I Jackson Jack Burson Jr
## 963  337-432-6693                                         John J J Jenkins
## 964                                                         Johnnie M Foco
## 965  337-462-2461                                            Vincent Labue
## 966  337-462-2461                                           Hayward Steele
## 967  337-432-6693                                          Rodney J Bellon
## 968  337-685-4462                                            Scott Saunier
## 969  337-432-6693                                           Mona F Jenkins
## 970  337-685-4462                                           Sarah A Trahan
## 971  337-432-6693                                             Dwayne Smith
## 972  337-685-4462                                      Timothy Slim Derise
## 973  337-432-6693                                          Frank Ceasar Sr
## 974  337-685-4462                                     Donald Phonse Martin
## 975  337-685-4462                                      Mildred D Delcambre
## 976  337-754-5911                                         Annette K Guidry
## 977  337-754-5911                                         Ricky J Lagrange
## 978  337-754-5911                                               Todd Meche
## 979  337-754-5911                                 Stephanie Stelly Navarre
## 980  337-754-5911                                          Louis  E Stelly
## 981  337-873-6754                                      Eugene Gene Cahanin
## 982  337-873-6754                                          Jimmy Champagne
## 983  337-873-6754                                       Daniel J Forestier
## 984  337-873-6754                                 Marquita Robertson Henry
## 985  337-873-6754                                           Carroll Pepper
## 986  318-982-5344                                           Sheree H Allen
## 987  318-982-5344                                               Myron Toft
## 988  318-982-5344                                      John Edward Wallace
## 989  318-986-4459                                        Barbara B Daniels
## 990  318-986-4459                                       William Terry Enis
## 991  318-986-4459                                             Arnold Jones
## 992  337-457-6516                                            Roland Miller
## 993  337-457-6516                                         Germaine Simpson
## 994  337-457-6516                                        James Jr Bergeron
## 995  337-457-6516                                           Scott Fontenot
## 996  318-673-5262                                    Rose Wilson McCulloch
## 997  318-673-5262                                             Jeff Everson
## 998  318-673-5262                                           Oliver Jenkins
## 999  318-673-5262                                         Michael D Corbin
## 1000 318-673-5262                                                 Ron Webb
## 1001 318-673-5262                                                Joe Shyne
## 1002 318-673-5262                                  Samuel L Sam Jenkins Jr
## 1003 337-837-6681                                  Angelique G Angel Racca
## 1004 337-462-2461                                           Robert Bo Rice
## 1005 337-837-6681                                            David M Bonin
## 1006 337-462-2461                                     Faith Buckley Thomas
## 1007 337-837-6681                                              Ray Bourque
## 1008 337-462-2461                                         Gordon C Jenkins
## 1009 337-837-6681                                           Harold Johnson
## 1010 337-462-2461                                 Elizabeth Storer Granger
## 1011 337-837-6681                                       Kenny Higginbotham
## 1012 337-462-2461                                     Joseph Joe Siciliano
## 1013 337-837-6681                                                 Ray Gary
## 1014                            ACADIA                      Jerrl Thompson
## 1015                            ACADIA                                    
## 1016                            ACADIA                                    
## 1017                            ACADIA                                    
## 1018                            ACADIA                                    
## 1019                            ACADIA                                    
## 1020                            ACADIA                                    
## 1021                            ACADIA                                    
## 1022                            ACADIA                                    
## 1023                            ACADIA                         Steve Barry
## 1024                            ACADIA                         Rick Beslin
## 1025                            ACADIA                       Eric Fontenot
## 1026                            ACADIA                       Bryan Francis
## 1027                            ACADIA                                    
## 1028                            ACADIA                                    
## 1029                            ACADIA                        Sandi Maples
## 1030                            ACADIA                       Louis Soileau
## 1031                            ACADIA                  Helen Blue Garrett
## 1032                            ACADIA                   Frank Bergeron Jr
## 1033                            ACADIA                       Mac Atteberry
## 1034                            ACADIA                      Larry G Miller
## 1035 337-788-8700               ACADIA                      Wayne Melancon
## 1036 337-788-8881               ACADIA             Robert T Robby Barousse
## 1037 337-788-8871               ACADIA             James J Jimbo Petitjean
## 1038 337-334-7551               ACADIA                         Mark Dawson
## 1039 337-788-8800               ACADIA                  Alton Al Stevenson
## 1040 337-788-8800               ACADIA                  AJ Fatty Broussard
## 1041 337-788-8800               ACADIA                Julie LeJeune Borill
## 1042 337-788-8800               ACADIA                         Dale Trahan
## 1043 337-788-8800               ACADIA                     Jimmie Pellerin
## 1044 337-788-8800               ACADIA                       A Jay Credeur
## 1045 337-788-8800               ACADIA                         David Savoy
## 1046 337-788-8800               ACADIA                     Robert J Guidry
## 1047 337-788-4118               ACADIA          Marie Elise M'elise Trahan
## 1048 337-334-9677               ACADIA          James M Jim Cunningham III
## 1049 337-788-4120               ACADIA                     Glenn J Deville
## 1050 337-334-9677               ACADIA                    Alex Joe Lacroix
## 1051 337-783-3664               ACADIA                      Israel G Syria
## 1052 337-783-3664               ACADIA           Douglas John Doug LaCombe
## 1053 337-783-3664               ACADIA                        Lynn Shamsie
## 1054 337-783-3664               ACADIA                        John A Suire
## 1055 337-783-3664               ACADIA                     Janet Boudreaux
## 1056 337-783-3664               ACADIA                       Gene I Daigle
## 1057 337-783-3664               ACADIA              James Boz Higginbotham
## 1058 337-783-3664               ACADIA                        Milton Simar
## 1059 337-334-4584               ACADIA                        Wayne Doucet
## 1060 337-684-2331               ACADIA                   Elton Bee Cormier
## 1061 337-779-2571               ACADIA                     Elridge Pousson
## 1062 337-788-0934               ACADIA         Lawrence Rusty Broussard Jr
## 1063                            ACADIA                     Horace Darbonne
## 1064 337-334-5004               ACADIA                    James June Meche
## 1065 337-684-2818               ACADIA                       Ferdie Miller
## 1066 337-779-2441               ACADIA                         Mike Habetz
## 1067 337-788-2207               ACADIA                          Treg Myers
## 1068 337-457-3243               ACADIA             Suzellen Stroderd Lopez
## 1069 337-783-0824               ACADIA                        Greg A Jones
## 1070 337-334-3121               ACADIA                    Roland Boudreaux
## 1071 337-684-5692               ACADIA                     Roger Boudreaux
## 1072 337-779-2597               ACADIA            Cynthia F Cindy McDaniel
## 1073 337-783-0464               ACADIA                      Anthony Borill
## 1074 337-824-8466               ACADIA                         David Fruge
## 1075 337-783-7555               ACADIA                  Robert Butch Istre
## 1076 337-783-0824               ACADIA                          K P Gibson
## 1077 337-334-3121               ACADIA                      Carroll Stelly
## 1078 337-684-5692               ACADIA                 Albert J Venable Sr
## 1079 337-779-2597               ACADIA                 David Scott Pousson
## 1080 337-783-0464               ACADIA                       Kevin LeBlanc
## 1081 337-824-8466               ACADIA                    Ricky S Istre II
## 1082 337-783-7555               ACADIA                  Jason Todd Richard
## 1083 337-783-0824               ACADIA                   Steven C Premeaux
## 1084                            ACADIA                        Paul Molbert
## 1085 337-779-2597               ACADIA              Nicholas Nick Bouterie
## 1086 337-779-2597               ACADIA                          Troy Lantz
## 1087 337-779-2597               ACADIA                      Raleigh Miller
## 1088 337-779-2597               ACADIA                      Warren Pousson
## 1089 337-779-2597               ACADIA                    Brenda H Prather
## 1090 337-783-0464               ACADIA                  Donna Kay Bertrand
## 1091 337-783-0464               ACADIA                     Donald Don Popp
## 1092 337-783-0464               ACADIA                          Tim Savant
## 1093 337-824-8466               ACADIA                        Troy Cormier
## 1094 337-824-8466               ACADIA            Ernest Sheeney Gautreaux
## 1095 337-824-8466               ACADIA                         Darla Istre
## 1096 337-783-7555               ACADIA                  Roger Red Fuselier
## 1097 337-783-7555               ACADIA                      Peggy S Romero
## 1098 337-783-7555               ACADIA                  Darlene Thibodeaux
## 1099 337-334-3121               ACADIA         Anna Ann DomingueWashington
## 1100 337-783-0824               ACADIA                        Jeffrey Dore
## 1101 337-783-0824               ACADIA            Kathleen Kitty Valdetero
## 1102 337-684-5692               ACADIA                  Debra GuidryThomas
## 1103                            ACADIA                  Jude Butch Abshire
## 1104 337-783-0824               ACADIA                        Bryan Borill
## 1105 337-783-0824               ACADIA                  Lyle O Fogleman Jr
## 1106 337-684-5692               ACADIA                          Joy Daigle
## 1107                            ACADIA                      Michael Doucet
## 1108 337-783-0824               ACADIA                  Vernon Step Martin
## 1109 337-783-0824               ACADIA                      Laurita D Pete
## 1110 337-684-5692               ACADIA                    Gary J Duplechin
## 1111                            ACADIA                      Gerald Foreman
## 1112 337-783-0824               ACADIA                         Elliot Dore
## 1113 337-783-0824               ACADIA                     Mary T Melancon
## 1114 337-684-5692               ACADIA                   Aimia MiMi Doucet
## 1115 337-684-5692               ACADIA                      Donald LeJeune
## 1116                             ALLEN                      Jonathan Jones
## 1117                             ALLEN                                    
## 1118                             ALLEN                                    
## 1119                             ALLEN                     Joe Abrusley Jr
## 1120                             ALLEN                                    
## 1121                             ALLEN                                    
## 1122                             ALLEN                                    
## 1123                             ALLEN                                    
## 1124                             ALLEN                    Margaret E Murry
## 1125                             ALLEN                                    
## 1126                             ALLEN                                    
## 1127                             ALLEN                                    
## 1128                             ALLEN                                    
## 1129                             ALLEN                                    
## 1130                             ALLEN                                    
## 1131                             ALLEN                                    
## 1132 318-639-4353                ALLEN                         Doug Hebert
## 1133 337-639-4351                ALLEN                   Gerald Harrington
## 1134 318-639-4391                ALLEN                      Richard C Earl
## 1135 318-335-4881                ALLEN                           Don Nesom
## 1136 337-639-4328                ALLEN                    Ruffin George Jr
## 1137 337-639-4328                ALLEN                        Heath Ardoin
## 1138 337-639-4328                ALLEN                  John W Strother Jr
## 1139 337-639-4328                ALLEN                   Huey Creig Vizena
## 1140 337-639-4328                ALLEN                        Doug Sonnier
## 1141 337-639-4328                ALLEN                       Matt Fontenot
## 1142 337-639-4328                ALLEN                       Kent Fontenot
## 1143 318-335-1121                ALLEN                       Judi Abrusley
## 1144 318-335-0518                ALLEN                   Joseph Lockett Sr
## 1145 337-639-4311                ALLEN                      Alma W Johnson
## 1146 337-783-3664                ALLEN                        Cathy Farris
## 1147 337-783-3664                ALLEN                      Steven Sumbler
## 1148 337-783-3664                ALLEN                        Jason Turner
## 1149 337-783-3664                ALLEN                    Gregory Monceaux
## 1150 337-783-3664                ALLEN                      Carolyn Manuel
## 1151 337-783-3664                ALLEN                       Brett Fawcett
## 1152 337-639-4929                ALLEN                      Ronald Craiger
## 1153 337-738-6559                ALLEN                         Ron Craiger
## 1154 337-666-2427                ALLEN                  Billie Faye Felice
## 1155 318-634-5317                ALLEN                         Chad Reeves
## 1156 337-639-2699                ALLEN               Wilbert Lucian LeBleu
## 1157 337-738-7665                ALLEN                        Donnie Shuff
## 1158 337-666-2685                ALLEN                     Ryland Dunnehoo
## 1159 337-634-7895                ALLEN                   Donald Don Dowies
## 1160 318-335-3629                ALLEN                           Gene Paul
## 1161 318-634-5100                ALLEN                  Robert Bob Crafton
## 1162 337-738-2620                ALLEN                        Estes Ledoux
## 1163 318-639-4333                ALLEN                          Rick Smith
## 1164 318-666-2613                ALLEN                      Scott R Walker
## 1165 318-335-3629                ALLEN                      Scotty LaBorde
## 1166 318-634-5100                ALLEN                          Shane Ware
## 1167 318-738-2620                ALLEN                      Gary G Pelican
## 1168 318-639-4333                ALLEN                      Grady K Haynes
## 1169 337-666-2613                ALLEN                         Buddy Estay
## 1170                             ALLEN                     Wayne Courville
## 1171 318-335-3629                ALLEN                    George A Ashy II
## 1172 318-738-2620                ALLEN                         CJ Fontenot
## 1173 318-639-4333                ALLEN                       Mark E Manuel
## 1174 318-639-4333                ALLEN                          Phil Beard
## 1175 318-639-4333                ALLEN                  Linda Whip Boulden
## 1176 318-639-4333                ALLEN                        Janice Simon
## 1177 318-634-5100                ALLEN                        Wayne A Earl
## 1178 318-634-5100                ALLEN                        Lydia Kingan
## 1179 318-634-5100                ALLEN                      Bobby Saunders
## 1180 318-634-5100                ALLEN                          Dave Smith
## 1181 318-634-5100                ALLEN                       Shirley Smith
## 1182 337-666-2613                ALLEN                      Michael Dotson
## 1183 337-666-2613                ALLEN                          Mick Estay
## 1184 337-666-2613                ALLEN                 Jean Jeanne Markway
## 1185 318-335-3629                ALLEN                  Gwendolyn Alsburry
## 1186 318-738-2620                ALLEN                        Ferda Wykoff
## 1187 318-335-3629                ALLEN                Fredrick Pos Douglas
## 1188 318-738-2620                ALLEN                         Lowell Keys
## 1189 318-335-3629                ALLEN                     Ervin Willis Sr
## 1190 318-738-2620                ALLEN                       Susan Doumite
## 1191 318-335-3629                ALLEN                     Ralph Stapleton
## 1192 318-738-2620                ALLEN Angela Weatherford Angie Van Norman
## 1193                         ASCENSION                            LC Irvin
## 1194                         ASCENSION                       Jerry Thibeau
## 1195                         ASCENSION                       Oliver Joseph
## 1196                         ASCENSION                                    
## 1197                         ASCENSION                     Jesse J Bartley
## 1198                         ASCENSION                                    
## 1199                         ASCENSION                    Alton AJ Nickens
## 1200                         ASCENSION                                    
## 1201                         ASCENSION                     Larry H Christy
## 1202                         ASCENSION                                    
## 1203                         ASCENSION                                    
## 1204                         ASCENSION                  Shirley Waguespack
## 1205                         ASCENSION                                    
## 1206                         ASCENSION                     Todd P Gautreau
## 1207                         ASCENSION                     Kathryn Goppelt
## 1208                         ASCENSION                    Coral CJ Lambert
## 1209                         ASCENSION           Ernest F Joe Opperman III
## 1210                         ASCENSION                        Alvin Robert
## 1211                         ASCENSION                       Dwayne Bailey
## 1212                         ASCENSION                    Elsie JoAn Brown
## 1213                         ASCENSION                        Robert W Lee
## 1214                         ASCENSION                  Milton Clouatre Jr
## 1215                         ASCENSION                     Kathy Edmonston
## 1216                         ASCENSION                                    
## 1217                         ASCENSION          Douglas A Doug Hillensbeck
## 1218                         ASCENSION                         Jeremy Epps
## 1219                         ASCENSION                     Cheryl Fontenot
## 1220                         ASCENSION                       Tiffani Brown
## 1221                         ASCENSION                 Samantha Thibodeaux
## 1222 225-621-8504            ASCENSION                     Marilyn Lambert
## 1223 225-473-8671            ASCENSION                     Jeffrey F Wiley
## 1224 225-473-9866            ASCENSION                 Kermit Hart Bourque
## 1225 225-473-9239            ASCENSION                  M J Mert Smiley Jr
## 1226 225-644-4743            ASCENSION                      John F Fraiche
## 1227 225-621-8577            ASCENSION                      Tommy Martinez
## 1228 225-621-8577            ASCENSION                       Oliver Joseph
## 1229 225-621-8577            ASCENSION                  Kent A Schexnaydre
## 1230 225-621-8577            ASCENSION                       Travis Turner
## 1231 225-621-8577            ASCENSION                Daniel Doc Satterlee
## 1232 225-621-8577            ASCENSION                     Dempsey Lambert
## 1233 225-621-8577            ASCENSION                 Randy T Clouatre Sr
## 1234 225-621-8577            ASCENSION                          Chris Loar
## 1235 225-621-8577            ASCENSION                          Teri Casso
## 1236 225-621-8577            ASCENSION                        Todd Lambert
## 1237 225-621-8577            ASCENSION                      Bryan Melancon
## 1238 225-621-8577            ASCENSION                       Benny Johnson
## 1239 225-473-7981            ASCENSION                   Catherine C Davis
## 1240 225-473-7981            ASCENSION                 Thomas Moose Pearce
## 1241 225-473-7981            ASCENSION                 Richard Coach Brown
## 1242 225-473-7981            ASCENSION                          Kerry Diez
## 1243 225-473-7981            ASCENSION                       John D Murphy
## 1244 225-473-7981            ASCENSION                         A J Nickens
## 1245 225-473-7981            ASCENSION                   Taft C Kleinpeter
## 1246 225-473-7981            ASCENSION                   Lorraine Wimberly
## 1247 225-473-7981            ASCENSION                   Jamie L Bourgeois
## 1248 225-473-7981            ASCENSION                  Troy J Gautreau Sr
## 1249 225-473-7981            ASCENSION                  Patricia Pat Russo
## 1250 225-473-4407            ASCENSION                       Andrew Falcon
## 1251 225-647-3753            ASCENSION                   Leroy J Laiche Jr
## 1252 225-644-1512            ASCENSION                       John C Hebert
## 1253 225-473-3526            ASCENSION               Andrew Banana LeBlanc
## 1254 225-647-1306            ASCENSION                  Danny P Thibodeaux
## 1255 225-644-3815            ASCENSION               James E Chief LeBlanc
## 1256 225-473-4247            ASCENSION                   Leroy Sullivan Sr
## 1257 225-647-2841            ASCENSION                  Barney D Arceneaux
## 1258 225-675-5337            ASCENSION               Wilson Longanecker Jr
## 1259 225-647-2841            ASCENSION                     Sherman Jackson
## 1260 225-675-5337            ASCENSION                     Earl Theriot Jr
## 1261 225-675-5337            ASCENSION                   Earl L Theriot Jr
## 1262 225-473-4247            ASCENSION               Lauthaught Delaney Sr
## 1263 225-473-4247            ASCENSION                      Raymond Aucoin
## 1264 225-473-4247            ASCENSION                 Reginald Francis Sr
## 1265 225-473-4247            ASCENSION                       Charles Brown
## 1266 225-473-4247            ASCENSION                       Emile J Spano
## 1267 225-647-2841            ASCENSION               Kenneth Kenny Matassa
## 1268 225-647-2841            ASCENSION                      Kirk Boudreaux
## 1269 225-647-2841            ASCENSION                   Timothy Vessel Sr
## 1270 225-647-2841            ASCENSION                     Terance L Irvin
## 1271 225-647-2841            ASCENSION                      Gary J Lacombe
## 1272 225-675-5337            ASCENSION                       Jason R Adams
## 1273 225-675-5337            ASCENSION                          Randy Anny
## 1274 225-675-5337            ASCENSION                     Marvin L Martin
## 1275 225-675-5337            ASCENSION          Milton Needlenose Vicknair
## 1276 225-675-5337            ASCENSION                         John Wright
## 1277                        ASSUMPTION                                    
## 1278                        ASSUMPTION                     Patrick Lawless
## 1279                        ASSUMPTION                    Darlene D Landry
## 1280                        ASSUMPTION                                    
## 1281                        ASSUMPTION                                    
## 1282                        ASSUMPTION                   Spergeon Holly Jr
## 1283                        ASSUMPTION                  Christopher Carter
## 1284                        ASSUMPTION                                    
## 1285                        ASSUMPTION                    Karen St Germain
## 1286                        ASSUMPTION                                    
## 1287                        ASSUMPTION                                    
## 1288                        ASSUMPTION                                    
## 1289                        ASSUMPTION                                    
## 1290                        ASSUMPTION                                    
## 1291                        ASSUMPTION                                    
## 1292                        ASSUMPTION                         Abby Daigle
## 1293                        ASSUMPTION                                    
## 1294                        ASSUMPTION                                    
## 1295                        ASSUMPTION                                    
## 1296                        ASSUMPTION                                    
## 1297 225-369-7281           ASSUMPTION                     Mike Waguespack
## 1298 985-369-6653           ASSUMPTION                      Darlene Landry
## 1299 985-369-6385           ASSUMPTION                 Wayne Cat Blanchard
## 1300 985-369-6485           ASSUMPTION                        Keith Landry
## 1301 985-369-7435           ASSUMPTION                     Patrick Lawless
## 1302 985-369-7435           ASSUMPTION               Jeff Big Daddy Naquin
## 1303 985-369-7435           ASSUMPTION                      Irving Comeaux
## 1304 985-369-7435           ASSUMPTION                     Patrick Johnson
## 1305 985-369-7435           ASSUMPTION                        Marty Triche
## 1306 985-369-7435           ASSUMPTION                     Calvin JC James
## 1307 985-369-7435           ASSUMPTION                       Henry J Dupre
## 1308 985-369-7435           ASSUMPTION                    Booster J Breaux
## 1309 985-369-7435           ASSUMPTION                    Myron J Matherne
## 1310 985-369-7251           ASSUMPTION                       Honoray Lewis
## 1311 985-369-7251           ASSUMPTION                        Lee Meyer Sr
## 1312 985-369-7251           ASSUMPTION                       Andrea Barras
## 1313 985-369-7251           ASSUMPTION             Electa Fletcher Mickens
## 1314 985-369-7251           ASSUMPTION               Lawrence Larry Howell
## 1315 985-369-7251           ASSUMPTION              Daniel Jack Washington
## 1316 985-369-7251           ASSUMPTION                           John Beck
## 1317 985-369-7251           ASSUMPTION                Jessica Kooney Ourso
## 1318 985-369-7251           ASSUMPTION                         Doris Dugas
## 1319 985-369-2591           ASSUMPTION                       Donna B Booty
## 1320 985-526-8694           ASSUMPTION                     Roselyn Peltier
## 1321 985-252-6010           ASSUMPTION                Bridget Marie Landry
## 1322 985-369-7426           ASSUMPTION                    Maurice Southall
## 1323 985-369-6645           ASSUMPTION              Richard Roach Arcement
## 1324 985-252-6767           ASSUMPTION                    Jamie P Ponville
## 1325 985-369-6365           ASSUMPTION                      Ron Animashaun
## 1326 985-369-6365           ASSUMPTION                          Joyce Bell
## 1327 985-369-6365           ASSUMPTION                     Richard Bilello
## 1328 985-369-6365           ASSUMPTION                     Renard Southall
## 1329                         AVOYELLES                                    
## 1330                         AVOYELLES                                    
## 1331                         AVOYELLES                                    
## 1332                         AVOYELLES                                    
## 1333                         AVOYELLES                                    
## 1334                         AVOYELLES                                    
## 1335                         AVOYELLES                                    
## 1336                         AVOYELLES                                    
## 1337                         AVOYELLES                                    
## 1338                         AVOYELLES                                    
## 1339                         AVOYELLES                                    
## 1340                         AVOYELLES                                    
## 1341                         AVOYELLES                                    
## 1342                         AVOYELLES                                    
## 1343                         AVOYELLES                                    
## 1344                         AVOYELLES                                    
## 1345                         AVOYELLES                                    
## 1346                         AVOYELLES                                    
## 1347                         AVOYELLES                                    
## 1348                         AVOYELLES                                    
## 1349 318-253-4000            AVOYELLES                    Douglas Anderson
## 1350 318-253-7523            AVOYELLES                  Connie B Couvillon
## 1351 318-253-4507            AVOYELLES                        Emeric Dupuy
## 1352 318-253-7077            AVOYELLES                 Lovell LJ Mayeux Jr
## 1353 318-253-9208            AVOYELLES                   Samuel Sam Piazza
## 1354 318-253-9208            AVOYELLES                     Kirby A Roy III
## 1355 318-253-9208            AVOYELLES                         Mark Borrel
## 1356 318-253-9208            AVOYELLES                    Glenn B McKinley
## 1357 318-253-9208            AVOYELLES                 Charles Sonny Jones
## 1358 318-253-9208            AVOYELLES                 McKinley Pop Keller
## 1359 318-253-9208            AVOYELLES             Jimmy J Dr Jim Guillory
## 1360 318-253-9208            AVOYELLES                         John Earles
## 1361 318-253-9208            AVOYELLES                    George L Mayeaux
## 1362 318-346-2948            AVOYELLES                       James H Mixon
## 1363 318-253-6423            AVOYELLES                   Angelo Piazza III
## 1364 318-346-7250            AVOYELLES                      Fred Carmouche
## 1365 318-253-4481            AVOYELLES                       Floyd Voinche
## 1366 318-240-0201            AVOYELLES                        Freeman Ford
## 1367 318-240-0201            AVOYELLES                       Darrell Wiley
## 1368 318-240-0201            AVOYELLES                  Carlos A Mayeux Jr
## 1369 318-240-0201            AVOYELLES                      James Gauthier
## 1370 318-240-0201            AVOYELLES                Shelia BlackmanDupas
## 1371 318-240-0201            AVOYELLES                      Lizzie Liz Ned
## 1372 318-240-0201            AVOYELLES                 Michael Pea Lacombe
## 1373 318-240-0201            AVOYELLES                           Van Kojis
## 1374                         AVOYELLES                  Cynthia Cindy Hill
## 1375 318-253-4707            AVOYELLES                  Jerry Wayne McNeal
## 1376 318-964-2097            AVOYELLES                      Sterling Hayes
## 1377 318-563-8346            AVOYELLES                          Gerald Roy
## 1378 318-253-6182            AVOYELLES                 Christine Carmouche
## 1379 318-997-2129            AVOYELLES              Eugenia Geane Desselle
## 1380 318-941-2843            AVOYELLES                     Ronald McDonald
## 1381 318-922-3785            AVOYELLES                   Ronald A McDonald
## 1382 318-876-3498            AVOYELLES                     Chris J Lemoine
## 1383                         AVOYELLES                    Robert J Lemoine
## 1384 318-253-5591            AVOYELLES                      John M Hathorn
## 1385 318-964-2433            AVOYELLES                        Bert Lemoine
## 1386 318-563-4430            AVOYELLES                          Marvin Roy
## 1387 318-253-4781            AVOYELLES                     Michele Guillot
## 1388 318-447-1475            AVOYELLES                     Ernest Desselle
## 1389 318-941-2520            AVOYELLES                  Sylvester Callihan
## 1390 318-922-3176            AVOYELLES                   Leon Ray Rabalais
## 1391 318-876-2470            AVOYELLES                      Jason Bergeron
## 1392 318-985-2183            AVOYELLES              Sandra D Sandy Lemoine
## 1393 318-346-7663            AVOYELLES                      Mike Robertson
## 1394 318-253-9500            AVOYELLES                        John Lemoine
## 1395 318-876-3485            AVOYELLES                William Scotty Scott
## 1396 318-346-9844            AVOYELLES                       John M Armand
## 1397 318-964-2152            AVOYELLES                  Kenneth Pickett Sr
## 1398 318-941-2493            AVOYELLES                           Eric Rusk
## 1399 318-563-4511            AVOYELLES                       Travis Franks
## 1400 318-985-2338            AVOYELLES                     Timmy A Lemoine
## 1401 318-922-3111            AVOYELLES                    Terryl St Romain
## 1402 318-346-7663            AVOYELLES                       Mary L Fanara
## 1403 318-876-3485            AVOYELLES                    Earnest Anderson
## 1404 318-964-2152            AVOYELLES                        John Johnson
## 1405 318-941-2493            AVOYELLES                       Dale J Dupuis
## 1406 318-563-4511            AVOYELLES                       Kenneth Smith
## 1407 318-346-9014            AVOYELLES                   Charles Mayeux Jr
## 1408 318-346-7663            AVOYELLES                      Greg Prudhomme
## 1409                         AVOYELLES                   Charles Austin Jr
## 1410                         AVOYELLES                  Curtis J Francisco
## 1411 318-346-7663            AVOYELLES                      Brenda Sampson
## 1412 318-253-9500            AVOYELLES                        Earl R Adams
## 1413 318-941-2493            AVOYELLES                          Ted Turner
## 1414 318-346-7663            AVOYELLES                      Craig W Foster
## 1415 318-253-9500            AVOYELLES                     Mike Gremillion
## 1416 318-941-2493            AVOYELLES                     Kenneth L Marsh
## 1417 318-346-7663            AVOYELLES                       Travis Armand
## 1418 318-253-9500            AVOYELLES               Elliot Pete Jordan Jr
## 1419 318-941-2493            AVOYELLES                   Myron Keith Brown
## 1420 318-346-7663            AVOYELLES              Clayton Rick Henderson
## 1421 318-253-9500            AVOYELLES                         Joyce Prier
## 1422 318-941-2493            AVOYELLES                   Sherman R Bell Sr
## 1423 318-253-9500            AVOYELLES                     Daniel L Decuir
## 1424 318-346-9014            AVOYELLES                       Wanda S Clark
## 1425 318-346-9014            AVOYELLES               Michelle Mayeux Dupuy
## 1426 318-346-9014            AVOYELLES                    Kathy A Joffrion
## 1427 318-346-9014            AVOYELLES               Heather Oliver Juneau
## 1428 318-346-9014            AVOYELLES                Kenneth Ken Thompson
## 1429 318-964-2152            AVOYELLES               Judy Augustine Bazert
## 1430 318-964-2152            AVOYELLES                     Connie D Ducote
## 1431 318-964-2152            AVOYELLES                       Gaon E Escude
## 1432 318-964-2152            AVOYELLES                     Lucille B Hayes
## 1433 318-964-2152            AVOYELLES              Phillip Pecan Lucas Jr
## 1434 318-563-4511            AVOYELLES                      Keith P Armand
## 1435 318-563-4511            AVOYELLES                      Donald Bernard
## 1436 318-563-4511            AVOYELLES                          Joshua Roy
## 1437 318-985-2338            AVOYELLES                      Felix Benjamin
## 1438 318-985-2338            AVOYELLES                   Oscar OP Goody Jr
## 1439 318-985-2338            AVOYELLES                        Penn Lemoine
## 1440 318-922-3111            AVOYELLES                    Craig Gremillion
## 1441 318-922-3111            AVOYELLES                    Andrea G Lemoine
## 1442 318-922-3111            AVOYELLES               Lawrence Chock Taylor
## 1443 318-876-3485            AVOYELLES             Margaret Prater Jenkins
## 1444 318-876-3485            AVOYELLES                    Kenneth W Friels
## 1445 318-876-3485            AVOYELLES                          Luke Welch
## 1446 318-876-3485            AVOYELLES                 Brenda Moore Bazile
## 1447                        BEAUREGARD                   Frankie Mae Evans
## 1448                        BEAUREGARD                      Jennifer Handy
## 1449                        BEAUREGARD               Michael Dwayne Harris
## 1450                        BEAUREGARD                      Jonnie F Mango
## 1451                        BEAUREGARD                      Robert Bo Rice
## 1452                        BEAUREGARD                                    
## 1453                        BEAUREGARD                                    
## 1454                        BEAUREGARD                   Kathy JonesBruner
## 1455                        BEAUREGARD                                    
## 1456                        BEAUREGARD                      Linda D Bailey
## 1457                        BEAUREGARD                                    
## 1458                        BEAUREGARD                                    
## 1459                        BEAUREGARD                                    
## 1460                        BEAUREGARD                                    
## 1461                        BEAUREGARD                                    
## 1462                        BEAUREGARD                     David R Lestage
## 1463                        BEAUREGARD                James Ramsey Lestage
## 1464                        BEAUREGARD                                    
## 1465                        BEAUREGARD                                    
## 1466                        BEAUREGARD                                    
## 1467                        BEAUREGARD                                    
## 1468                        BEAUREGARD                                    
## 1469                        BEAUREGARD                                    
## 1470                        BEAUREGARD                                    
## 1471                        BEAUREGARD                                    
## 1472                        BEAUREGARD                                    
## 1473                        BEAUREGARD                                    
## 1474 337-463-3281           BEAUREGARD                       Ricky L Moses
## 1475 337-463-8595           BEAUREGARD                     Brian S Lestage
## 1476 337-463-8945           BEAUREGARD                    Brent Rutherford
## 1477 337-463-9890           BEAUREGARD                      Flynn A Taylor
## 1478 337-463-7019           BEAUREGARD                     Gerald M McLeod
## 1479 337-463-7019           BEAUREGARD                N R Rusty Williamson
## 1480 337-463-7019           BEAUREGARD                     Carlos Archield
## 1481 337-463-7019           BEAUREGARD                      SE Teddy Welch
## 1482 337-463-7019           BEAUREGARD                   Johnnie E Bennett
## 1483 337-463-7019           BEAUREGARD                        Gary D Crowe
## 1484 337-463-7019           BEAUREGARD                     Jerry L Shirley
## 1485 337-463-7019           BEAUREGARD                         Brad Harris
## 1486 337-463-7019           BEAUREGARD             Llewellyn Biscuit Smith
## 1487 337-463-7019           BEAUREGARD                       Ronnie Libick
## 1488 337-463-5551           BEAUREGARD                 Russell W Havens Jr
## 1489 337-463-5551           BEAUREGARD                    Charles E Hudson
## 1490 337-463-5551           BEAUREGARD                   Kathy JonesBruner
## 1491                        BEAUREGARD                       Jimmy Barrett
## 1492 337-463-5551           BEAUREGARD                     David Q Vidrine
## 1493 337-463-5551           BEAUREGARD                         Randy Brown
## 1494 337-463-5551           BEAUREGARD                     Wesley M Taylor
## 1495 337-463-5551           BEAUREGARD                       Darrin Manuel
## 1496 337-463-5551           BEAUREGARD                        Jerry Cooley
## 1497 337-463-5551           BEAUREGARD                            Don Gray
## 1498 337-743-6375           BEAUREGARD                     Allen Ray Brown
## 1499 337-825-6390           BEAUREGARD           Connie E Sissy Williamson
## 1500 337-725-3175           BEAUREGARD                      Clyde H Dennis
## 1501 337-463-2758           BEAUREGARD                      Ruthie Huckaby
## 1502 337-463-2599           BEAUREGARD                     Alfred Al Doyle
## 1503 337-825-6418           BEAUREGARD                       Leonard Stark
## 1504 337-725-3667           BEAUREGARD                        Tony Deville
## 1505 337-328-7186           BEAUREGARD                         Ray Dickens
## 1506 337-825-8740           BEAUREGARD                       Larry Carroll
## 1507 337-825-8740           BEAUREGARD                        Craig Lanier
## 1508 337-825-8740           BEAUREGARD                        Mark W Allen
## 1509 337-825-8740           BEAUREGARD                       Alton Bennett
## 1510 337-825-8740           BEAUREGARD                   Beaver B Knighton
## 1511 337-825-8740           BEAUREGARD                      Amanda Pointer
## 1512 337-825-8740           BEAUREGARD                         Mance Stark
## 1513                         BIENVILLE                        Roy Lilly Jr
## 1514                         BIENVILLE                                    
## 1515                         BIENVILLE                                    
## 1516                         BIENVILLE                                    
## 1517                         BIENVILLE                                    
## 1518                         BIENVILLE                                    
## 1519                         BIENVILLE                                    
## 1520                         BIENVILLE                                    
## 1521                         BIENVILLE                          Kathy Sims
## 1522                         BIENVILLE                                    
## 1523                         BIENVILLE                                    
## 1524                         BIENVILLE                                    
## 1525                         BIENVILLE                                    
## 1526                         BIENVILLE                                    
## 1527                         BIENVILLE                                    
## 1528                         BIENVILLE                                    
## 1529 318-263-2215            BIENVILLE                     John E Ballance
## 1530 318-263-2123            BIENVILLE                  James W Jim Martin
## 1531 318-263-2214            BIENVILLE                      Jimmie D Smith
## 1532 318-263-7434            BIENVILLE                           Don Smith
## 1533 318-263-2019            BIENVILLE                           Bill Sims
## 1534 318-263-2019            BIENVILLE                      Jerry Roberson
## 1535 318-263-2019            BIENVILLE                        Darryl Ryder
## 1536 318-263-2019            BIENVILLE                         Greg Wilson
## 1537 318-263-2019            BIENVILLE                  Joseph Tony Lawson
## 1538 318-263-2019            BIENVILLE                       Mike McCarthy
## 1539 318-263-2019            BIENVILLE                      Raymond Malone
## 1540 318-263-9416            BIENVILLE                           Dan K Loe
## 1541 318-263-9416            BIENVILLE             Esther Ballard Sullivan
## 1542 318-263-9416            BIENVILLE                  Freddie Mae R Blow
## 1543 318-263-9416            BIENVILLE                     Bonita Reliford
## 1544 318-263-9416            BIENVILLE                      Martha B Grigg
## 1545 318-263-9416            BIENVILLE                Kenneth Larry Knotts
## 1546 318-263-9416            BIENVILLE                      Richard Walker
## 1547 318-263-8807            BIENVILLE                        David E Cook
## 1548 318-843-9747            BIENVILLE                       Reginald Shaw
## 1549 318-544-2427            BIENVILLE                      Melanie Jordan
## 1550 318-894-3309            BIENVILLE                      Ryanie O Evans
## 1551 318-259-8451            BIENVILLE                   David W McConathy
## 1552 318-263-8699            BIENVILLE                     Craig A Jenkins
## 1553 318-843-6367            BIENVILLE                     Darren Brackens
## 1554 318-544-2427            BIENVILLE                     Randall Bradley
## 1555 318-894-3020            BIENVILLE              Eugene L Rudy Basinger
## 1556 318-385-9926            BIENVILLE                       R Yale Poland
## 1557 318-263-8456            BIENVILLE                        Eugene Smith
## 1558 318-843-6141            BIENVILLE                            Odis Key
## 1559 318-843-6458            BIENVILLE                     Charles Andrews
## 1560 318-894-4699            BIENVILLE                     Stephone Taylor
## 1561                         BIENVILLE                       Wesley Boddie
## 1562 318-263-8981            BIENVILLE                  Donald Donnie Byrd
## 1563 318-544-8718            BIENVILLE                       Vicki Pickett
## 1564 318-894-3612            BIENVILLE                    James Ralph Todd
## 1565 318-576-3348            BIENVILLE                    Tommy L Thompson
## 1566 318-576-3545            BIENVILLE                  Robert R D Slayton
## 1567 318-263-8456            BIENVILLE                       Victor Rogers
## 1568 318-843-6141            BIENVILLE                       Shelton Scott
## 1569 318-894-4699            BIENVILLE                     Rickey A Pearce
## 1570 318-576-3348            BIENVILLE                       Victor Mcneal
## 1571 318-576-3545            BIENVILLE                      Sammy Matthews
## 1572 318-843-6141            BIENVILLE                        Timmy L Cato
## 1573 318-843-6141            BIENVILLE                     Marketris Jones
## 1574 318-843-6141            BIENVILLE                    Alvin Pearson Jr
## 1575 318-843-6141            BIENVILLE                      Delinda Wright
## 1576 318-843-6658            BIENVILLE                         Aaron Clark
## 1577 318-843-6658            BIENVILLE                       Ruby L Grubbs
## 1578 318-843-6658            BIENVILLE                      Herbert Newman
## 1579 318-843-6658            BIENVILLE               Ora Elizabeth H Towns
## 1580 318-843-6658            BIENVILLE                      Philip L Towns
## 1581 318-385-7533            BIENVILLE                    Dorothy Anderson
## 1582 318-385-7533            BIENVILLE                       Marcie Boston
## 1583 318-385-7533            BIENVILLE                     Roy Steve Walls
## 1584 318-263-2405            BIENVILLE                        James E Moss
## 1585 318-263-2405            BIENVILLE                        Don M Travis
## 1586 318-263-2405            BIENVILLE                      Eugene Venzant
## 1587 318-544-8718            BIENVILLE                      Charles Harper
## 1588 318-544-8718            BIENVILLE                       Mark Plunkett
## 1589 318-544-8718            BIENVILLE                         Beth Warren
## 1590 318-894-3612            BIENVILLE                     Conley Ray Bare
## 1591 318-894-3612            BIENVILLE                          Kelly Todd
## 1592 318-894-3612            BIENVILLE                     James G Wiggins
## 1593 318-576-3348            BIENVILLE                     Columbus Boston
## 1594 318-576-3348            BIENVILLE                       Raymond Calep
## 1595 318-576-3348            BIENVILLE                       Devertis Lard
## 1596 318-576-3545            BIENVILLE                     Brenda Matthews
## 1597 318-576-3545            BIENVILLE                 Jennifer M Matthews
## 1598 318-576-3545            BIENVILLE                     Dorothy Satcher
## 1599 318-576-3545            BIENVILLE                   Patricia Sullivan
## 1600 318-576-3545            BIENVILLE                  Sherwon Williamson
## 1601 318-263-8456            BIENVILLE                     Doreatha Nelson
## 1602 318-263-8456            BIENVILLE                   Maggie C Roberson
## 1603 318-263-8456            BIENVILLE                          Billy Cook
## 1604 318-263-8456            BIENVILLE                   Mattye Lou Harris
## 1605 318-263-8456            BIENVILLE                       Gary Carlisle
## 1606 318-894-4699            BIENVILLE                 Johnny Lee Shepherd
## 1607 318-894-4699            BIENVILLE                          Bobby Guin
## 1608 318-894-4699            BIENVILLE                          Larry Hays
## 1609 318-894-4699            BIENVILLE                     Keith C Johnson
## 1610 318-894-4699            BIENVILLE                       Alan Clayborn
## 1611                           BOSSIER                      Lee A Jeter Sr
## 1612                           BOSSIER                                    
## 1613                           BOSSIER                                    
## 1614                           BOSSIER                                    
## 1615                           BOSSIER                                    
## 1616                           BOSSIER                                    
## 1617                           BOSSIER                                    
## 1618                           BOSSIER                                    
## 1619                           BOSSIER                                    
## 1620                           BOSSIER                                    
## 1621                           BOSSIER                                    
## 1622                           BOSSIER                                    
## 1623                           BOSSIER                                    
## 1624                           BOSSIER                         Laura Adley
## 1625                           BOSSIER                    Bobby W Edmiston
## 1626                           BOSSIER                         Duke Lowrie
## 1627                           BOSSIER                      Mike McConnell
## 1628                           BOSSIER                       Jeff Thompson
## 1629                           BOSSIER                                    
## 1630                           BOSSIER                                    
## 1631                           BOSSIER                        Mike Collier
## 1632                           BOSSIER                                    
## 1633                           BOSSIER                         Richard Ray
## 1634                           BOSSIER                          Anne Price
## 1635                           BOSSIER                                    
## 1636                           BOSSIER                          Ryan Gatti
## 1637                           BOSSIER                                    
## 1638                           BOSSIER                                    
## 1639                           BOSSIER                          Jerry Kutz
## 1640                           BOSSIER                                    
## 1641 318-965-3410              BOSSIER                Julian C Whittington
## 1642 318-965-2336              BOSSIER                      Cindy Johnston
## 1643 318-965-2273              BOSSIER                    Bobby W Edmiston
## 1644 318-549-3415              BOSSIER                     John M Chandler
## 1645 318-965-2329              BOSSIER                Coach Bob Brotherton
## 1646 318-965-2329              BOSSIER                        Glenn Benton
## 1647 318-965-2329              BOSSIER                     Wanda S Bennett
## 1648 318-965-2329              BOSSIER                          Sonny Cook
## 1649 318-965-2329              BOSSIER                    Jack Bump Skaggs
## 1650 318-965-2329              BOSSIER                        Rick L Avery
## 1651 318-965-2329              BOSSIER               James O Jimmy Cochran
## 1652 318-965-2329              BOSSIER               Douglas E Doug Rimmer
## 1653 318-965-2329              BOSSIER                     Freddy Shewmake
## 1654 318-965-2329              BOSSIER                        Jerome Darby
## 1655 318-965-2329              BOSSIER                     W Wayne Hammack
## 1656 318-965-2329              BOSSIER                  Paul M Mac Plummer
## 1657 318-741-8587              BOSSIER            Thomas A Tommy Wilson Jr
## 1658 318-741-8855              BOSSIER                         Lynn Austin
## 1659 318-549-5000              BOSSIER                          Jack Raley
## 1660 318-549-5000              BOSSIER                       Brad Bockhaus
## 1661 318-549-5000              BOSSIER                   Allison O Brigham
## 1662 318-549-5000              BOSSIER                   Tammy Armer Smith
## 1663 318-549-5000              BOSSIER                 Michael Mike Mosura
## 1664 318-549-5000              BOSSIER             Glenwood L Glen Bullard
## 1665 318-549-5000              BOSSIER                           J W Slack
## 1666 318-549-5000              BOSSIER                     Kenneth Wiggins
## 1667 318-549-5000              BOSSIER                    Eddy Ray Presley
## 1668 318-549-5000              BOSSIER                   Sandra Samm Darby
## 1669 318-549-5000              BOSSIER                      Barbara B Rudd
## 1670 318-549-5000              BOSSIER                    Kay Padgett Byrd
## 1671 318-746-4526              BOSSIER                        Tom Carleton
## 1672 318-326-4384              BOSSIER                     Clifford Cannon
## 1673 318-326-4384              BOSSIER                      Robert Hamiter
## 1674 318-326-5120              BOSSIER                      Julia A Budwah
## 1675 318-965-0093              BOSSIER                 Lorraine S Ragsdale
## 1676 318-949-2581              BOSSIER                        Charles Gray
## 1677 318-949-2581              BOSSIER                      Cullen B Keith
## 1678 318-742-2942              BOSSIER                     Charles R Logan
## 1679 318-326-7477              BOSSIER                      Eddie Chandler
## 1680 318-326-7477              BOSSIER                    Roy Tony Jenkins
## 1681 318-326-4049              BOSSIER               Ronald Ronnie Matlock
## 1682 318-965-0093              BOSSIER                      Charles Scholz
## 1683 318-949-0322              BOSSIER                    Kenneth Stephens
## 1684 318-949-0322              BOSSIER                          Jeff Weems
## 1685 318-741-8520              BOSSIER                    Lorenz Lo Walker
## 1686 318-741-8520              BOSSIER                    Lorenz Lo Walker
## 1687 318-965-2932              BOSSIER                      Wayne Cathcart
## 1688 318-949-9401              BOSSIER             Carlton Peewee Anderson
## 1689 318-326-4234              BOSSIER                      Wiley Robinson
## 1690 318-965-2932              BOSSIER                   Charles Pilkinton
## 1691 318-949-9401              BOSSIER                   Rodney Farrington
## 1692 318-326-4234              BOSSIER                       Ronnie Murray
## 1693 318-741-8520              BOSSIER                          Tim Larkin
## 1694 318-741-8520              BOSSIER                      Timothy Larkin
## 1695 318-741-8520              BOSSIER               David A Montgomery Jr
## 1696 318-741-8520              BOSSIER               David A Montgomery Jr
## 1697 318-326-4234              BOSSIER                       Ronnie Griggs
## 1698 318-326-4234              BOSSIER                         Jeff Benson
## 1699 318-326-4234              BOSSIER                  Terry J Richardson
## 1700 318-965-2932              BOSSIER                     Richard Jackson
## 1701 318-965-2932              BOSSIER                     Linda Ann Gates
## 1702 318-949-9401              BOSSIER                        Doris Grappe
## 1703 318-949-9401              BOSSIER                          Jack Hicks
## 1704 318-949-9401              BOSSIER                   Martha Wynn McGee
## 1705 318-949-9401              BOSSIER                     Elbert Winfield
## 1706 318-326-4234              BOSSIER             Charlotte Giles Hamiter
## 1707 318-326-4234              BOSSIER                       Linda Hamiter
## 1708 318-741-8520              BOSSIER                       Scott P Irwin
## 1709 318-741-8520              BOSSIER                        Jeff D Darby
## 1710 318-741-8520              BOSSIER                Jeffery D Jeff Darby
## 1711 318-741-8520              BOSSIER                  Don Bubba Williams
## 1712 318-741-8520              BOSSIER                  Don Bubba Williams
## 1713 318-823-2128              BOSSIER                           Jeff Free
## 1714 318-823-2128              BOSSIER                         David Jones
## 1715 318-823-2128              BOSSIER                       Larry Hanisee
## 1716                             CADDO                     Willie Bradford
## 1717                             CADDO                          Artis Cash
## 1718                             CADDO                  Earnestine Coleman
## 1719                             CADDO                     Larry Ferdinand
## 1720                             CADDO                Deloris Deedee Lynch
## 1721                             CADDO                     Allison A Jones
## 1722                             CADDO                    Lyndon B Johnson
## 1723                             CADDO                       June Phillips
## 1724                             CADDO                      Frances Kelley
## 1725                             CADDO                      Lillian Priest
## 1726                             CADDO                       Steve Jackson
## 1727                             CADDO                     Stephanie Lynch
## 1728                             CADDO                Michelle M AndrePont
## 1729                             CADDO                        Eileen Velez
## 1730                             CADDO                                    
## 1731                             CADDO                   Michael D Hall Sr
## 1732                             CADDO                    James E Heard Sr
## 1733                             CADDO                       Harold Coates
## 1734                             CADDO                        Alan W Koloc
## 1735                             CADDO                     Creighton Light
## 1736                             CADDO                        Betsy Malone
## 1737                             CADDO                        Barry Rachal
## 1738                             CADDO                     Neil B Carlisle
## 1739                             CADDO                      Nancy T Adcock
## 1740                             CADDO                                    
## 1741                             CADDO              Edward Eddie Brossette
## 1742                             CADDO                                    
## 1743                             CADDO                                    
## 1744                             CADDO                                    
## 1745                             CADDO                    Louis R Avallone
## 1746                             CADDO                       Jimmy C Allen
## 1747                             CADDO                    Stephen C Gibson
## 1748                             CADDO                                    
## 1749                             CADDO                     Micheal Collins
## 1750 318-226-6757                CADDO                        Shonda Stone
## 1751 318-226-6755                CADDO                          Paul Young
## 1752 318-226-6755                CADDO                       David Matlock
## 1753 318-681-0687                CADDO                Stephen Steve Prator
## 1754 318-226-6780                CADDO                         Gary Loftin
## 1755 318-226-6711                CADDO              Charles R Henington Jr
## 1756 318-226-6881                CADDO                        Todd G Thoma
## 1757 318-226-6596                CADDO                       Doug Dominick
## 1758 318-226-6596                CADDO                    Lyndon B Johnson
## 1759 318-226-6596                CADDO                    Michael Williams
## 1760 318-226-6596                CADDO                        Matthew Linn
## 1761 318-226-6596                CADDO                        Joyce Bowman
## 1762 318-226-6596                CADDO                     Lindora L Baker
## 1763 318-226-6596                CADDO                     Stephanie Lynch
## 1764 318-226-6596                CADDO                         John Escude
## 1765 318-226-6596                CADDO             Michael Mike Thibodeaux
## 1766 318-226-6596                CADDO                         David F Cox
## 1767 318-226-6596                CADDO                           Jim Smith
## 1768 318-226-6596                CADDO                     Ken Epperson Sr
## 1769 318-603-6509                CADDO                         Steve Riall
## 1770 318-603-6509                CADDO                     Jasmine R Green
## 1771 318-603-6509                CADDO                   Carl A Pierson Sr
## 1772 318-603-6509                CADDO                   Charlotte Crawley
## 1773 318-603-6509                CADDO                      Curtis L Hooks
## 1774 318-603-6509                CADDO                      Mary A Trammel
## 1775 318-603-6509                CADDO                      Lillian Priest
## 1776 318-603-6509                CADDO                     Bonita Crawford
## 1777 318-603-6509                CADDO                        Barry Rachal
## 1778 318-603-6509                CADDO                        Larry Ramsey
## 1779 318-603-6509                CADDO                    Ginger Armstrong
## 1780 318-603-6509                CADDO                         Dottie Bell
## 1781 318-378-4504                CADDO                      Barbara Douget
## 1782 318-995-0403                CADDO                     Ruth W Johnston
## 1783 318-375-3158                CADDO                        Joe Caldwell
## 1784 318-929-4830                CADDO                   Carl W Pete Copes
## 1785 318-938-1896                CADDO                          Tom Bryson
## 1786 318-925-2286                CADDO                Glenda Ennis Britton
## 1787 318-687-5319                CADDO                       Susan Waddell
## 1788 318-797-4014                CADDO                    Gregory M Taylor
## 1789 318-284-3528                CADDO                       Dale A Hopper
## 1790 318-996-7068                CADDO                 Melvin Gene Presley
## 1791 318-797-1673                CADDO                           Paul Sapp
## 1792 318-994-6329                CADDO                        H P Johnston
## 1793 318-955-6438                CADDO                  Tommy E Poindexter
## 1794 318-929-4612                CADDO                         Mike Lowery
## 1795 318-996-7523                CADDO                          Dale G Nix
## 1796                             CADDO                          Don Majure
## 1797 318-925-2719                CADDO                        T A Tom Hyer
## 1798 318-925-2209                CADDO                         John McGrew
## 1799 318-797-4014                CADDO                       Eric Hatfield
## 1800 318-287-3976                CADDO                        J Perry Hart
## 1801 318-929-7593                CADDO                  Johnny V Digilormo
## 1802 318-938-7261                CADDO                       Frank Stawasz
## 1803 318-996-7661                CADDO                    Ann Holt Dearing
## 1804 318-995-6681                CADDO                 Charles Chip Dickey
## 1805 318-375-3856                CADDO                      Stephen Taylor
## 1806 318-378-4206                CADDO                     Jennifer C Fant
## 1807 318-296-4393                CADDO                         Helen Adger
## 1808 318-287-3225                CADDO                         Susie Giles
## 1809 318-284-3231                CADDO                  Kenneth Kenny Shaw
## 1810 318-223-4211                CADDO                      Paul W Lockard
## 1811 318-929-7593                CADDO                      Gary Presswood
## 1812 318-996-7661                CADDO                         Dale Nix Jr
## 1813 318-375-3856                CADDO                         Ryan Nelson
## 1814 318-378-4206                CADDO                          Major Fant
## 1815 318-296-4393                CADDO                        John D Stone
## 1816 318-287-3225                CADDO                          Whit Giles
## 1817 318-284-3231                CADDO                   David C Austin Jr
## 1818 318-938-7261                CADDO                    Travis McCracken
## 1819 318-375-3856                CADDO                        Belton Moore
## 1820 318-996-7661                CADDO                        Robbin Haley
## 1821 318-996-7661                CADDO                       William Moore
## 1822 318-995-6681                CADDO                   Phillip A Sparaco
## 1823 318-995-6681                CADDO                       Donny Jackson
## 1824 318-995-6681                CADDO                        James T Sims
## 1825 318-995-6681                CADDO                       Sharon Emmons
## 1826 318-995-6681                CADDO                    James Clifton Sr
## 1827 318-938-7261                CADDO                         Gary V Cook
## 1828 318-938-7261                CADDO                        Jewel Jaudon
## 1829 318-938-7261                CADDO                       Thomas Newsom
## 1830 318-938-7261                CADDO                       Brad Edwardes
## 1831 318-929-7593                CADDO                        Nathan Ashby
## 1832 318-929-7593                CADDO                     Allison A Jones
## 1833 318-929-7593                CADDO                         Patsy A Lee
## 1834 318-929-7593                CADDO                  Ross V Prewett III
## 1835 318-929-7593                CADDO                   Jimmy Whittington
## 1836 318-378-4206                CADDO                        Sandy Duncan
## 1837 318-378-4206                CADDO                       Kathy Jackson
## 1838 318-378-4206                CADDO                     David L Strahan
## 1839 318-296-4393                CADDO                     Estelle Holemon
## 1840 318-296-4393                CADDO                         Karen Logan
## 1841 318-296-4393                CADDO                      Ginger R Stone
## 1842 318-287-3225                CADDO                Ramona EubanksAnders
## 1843 318-287-3225                CADDO                  Lydia Born Stewart
## 1844 318-287-3225                CADDO                        Susan Tinney
## 1845 318-284-3231                CADDO                   Betty Biddie Dial
## 1846 318-284-3231                CADDO                   Joseph Arien Gott
## 1847 318-284-3231                CADDO                           Tom Tebbe
## 1848 318-223-4211                CADDO                      Penny Harville
## 1849 318-223-4211                CADDO                      Chad R Perkins
## 1850 318-223-4211                CADDO                      Carroll Slaton
## 1851 318-375-3856                CADDO                   John Pete Shepard
## 1852 318-375-3856                CADDO                 Michael Van Schoick
## 1853 318-375-3856                CADDO                         Judy Wilson
## 1854 318-375-3856                CADDO               Raymond Earl Williams
## 1855 318-996-7661                CADDO                       Jane H Player
## 1856 318-996-7661                CADDO                     Phillip J Green
## 1857 318-996-7661                CADDO              Elmer H Sonny Cates Jr
## 1858                         CALCASIEU                    Maurice Griffith
## 1859                         CALCASIEU                Diana Handy Hamilton
## 1860                         CALCASIEU                         Frank Hyatt
## 1861                         CALCASIEU                  Claude Buddy Leach
## 1862                         CALCASIEU                    George A Navarro
## 1863                         CALCASIEU                   Mary Leach Werner
## 1864                         CALCASIEU                  Maurice A Griffith
## 1865                         CALCASIEU                       Mary L Morris
## 1866                         CALCASIEU                   Ellaweena G Woods
## 1867                         CALCASIEU                                    
## 1868                         CALCASIEU               Dorothy DurrettRomero
## 1869                         CALCASIEU                                    
## 1870                         CALCASIEU                     Lewis R Mefford
## 1871                         CALCASIEU                       David Darbone
## 1872                         CALCASIEU                           Neva Nash
## 1873                         CALCASIEU                                    
## 1874                         CALCASIEU                                    
## 1875                         CALCASIEU                                    
## 1876                         CALCASIEU                                    
## 1877                         CALCASIEU                                    
## 1878                         CALCASIEU                                    
## 1879                         CALCASIEU                       R A Bob Dewey
## 1880                         CALCASIEU                     Charles Enright
## 1881                         CALCASIEU                      Vaughn Peltier
## 1882                         CALCASIEU               Tiffany Nabours Pence
## 1883                         CALCASIEU                     Michael M Kurth
## 1884                         CALCASIEU                                    
## 1885                         CALCASIEU                    Frank D Pellerin
## 1886                         CALCASIEU                                    
## 1887                         CALCASIEU                     Tore J Carlberg
## 1888                         CALCASIEU                                    
## 1889                         CALCASIEU                                    
## 1890                         CALCASIEU                       Karen Drewett
## 1891                         CALCASIEU                                    
## 1892                         CALCASIEU                                    
## 1893                         CALCASIEU                                    
## 1894                         CALCASIEU                                    
## 1895                         CALCASIEU                                    
## 1896                         CALCASIEU                                    
## 1897                         CALCASIEU                    David A Johnston
## 1898 337-491-3715            CALCASIEU                        Tony Mancuso
## 1899 337-437-3550            CALCASIEU                          Lynn Jones
## 1900 337-721-3000            CALCASIEU              Wendy Curphy Aguillard
## 1901 337-477-7537            CALCASIEU                         Terry Welke
## 1902 337-721-3500            CALCASIEU                       Shannon Spell
## 1903 337-721-3500            CALCASIEU                          James Mayo
## 1904 337-721-3500            CALCASIEU      Elizabeth Conway T Bet Griffin
## 1905 337-721-3500            CALCASIEU                       Tony Guillory
## 1906 337-721-3500            CALCASIEU                 Nicholas Nic Hunter
## 1907 337-721-3500            CALCASIEU                    Dennis Ray Scott
## 1908 337-721-3500            CALCASIEU                        Chris Landry
## 1909 337-721-3500            CALCASIEU                           Guy Brame
## 1910 337-721-3500            CALCASIEU                        Kevin Guidry
## 1911 337-721-3500            CALCASIEU                         Tony Stelly
## 1912 337-721-3500            CALCASIEU                         Sandy Treme
## 1913 337-721-3500            CALCASIEU                          Ray Taylor
## 1914 337-721-3500            CALCASIEU                   Francis Andrepont
## 1915 337-721-3500            CALCASIEU                        Hal McMillin
## 1916 337-721-3500            CALCASIEU                          Les Farnum
## 1917 337-527-7006            CALCASIEU                    Charlie Schrumpf
## 1918 337-491-1305            CALCASIEU                      Thomas P Quirk
## 1919 337-491-1305            CALCASIEU                         John S Hood
## 1920 337-491-1304            CALCASIEU                         Joey Alcede
## 1921 337-527-7006            CALCASIEU                        Billy Guidry
## 1922 337-491-1600            CALCASIEU                         R L Webb Jr
## 1923 337-491-1600            CALCASIEU                  Fredman Fred Hardy
## 1924 337-491-1600            CALCASIEU                       Clara F Duhon
## 1925 337-491-1600            CALCASIEU                     Annette Ballard
## 1926 337-491-1600            CALCASIEU                        Dale Bernard
## 1927 337-491-1600            CALCASIEU                      Bill Jongbloed
## 1928 337-491-1600            CALCASIEU                  Mack Dellafosse Jr
## 1929 337-491-1600            CALCASIEU                        Jim Schooler
## 1930 337-491-1600            CALCASIEU              Randall Randy Burleigh
## 1931 337-491-1600            CALCASIEU                      James Jim Karr
## 1932 337-491-1600            CALCASIEU                         Chad Guidry
## 1933 337-491-1600            CALCASIEU                       Joe Andrepont
## 1934 337-491-1600            CALCASIEU                        Billy Breaux
## 1935 337-491-1600            CALCASIEU                    Roman L Thompson
## 1936 337-491-1600            CALCASIEU                      Bryan Larocque
## 1937 337-855-3496            CALCASIEU                      Ashton Richard
## 1938 337-622-3417            CALCASIEU                        Percy Aucoin
## 1939 337-743-5318            CALCASIEU                   Gerald A Fountain
## 1940 337-786-4000            CALCASIEU                     Darlene Nortman
## 1941 337-589-7844            CALCASIEU                        Danny Landry
## 1942 337-582-3180            CALCASIEU                   Norman Butch Ryan
## 1943 337-855-4065            CALCASIEU                      Louis Michiels
## 1944 337-622-3423            CALCASIEU               Roland Perch Bertrand
## 1945 337-743-6201            CALCASIEU                      Arnold L Smith
## 1946 337-786-2589            CALCASIEU                     Rickey Brummett
## 1947 337-589-0036            CALCASIEU                      Wayne Doucette
## 1948 337-582-3411            CALCASIEU                    Orgy J Broussard
## 1949 337-786-8241            CALCASIEU                   William L Henagan
## 1950 337-491-1201            CALCASIEU                 Randall Randy Roach
## 1951 337-491-1201            CALCASIEU                         Randy Roach
## 1952 337-527-4500            CALCASIEU            Christopher Chris Duncan
## 1953 337-433-0691            CALCASIEU                Daniel W Danny Cupit
## 1954 337-582-3535            CALCASIEU             Carol Hilburn Ponthieux
## 1955 337-589-7453            CALCASIEU                  Kenneth  O Stinson
## 1956 337-589-7453            CALCASIEU                   Kenneth O Stinson
## 1957 337-433-0691            CALCASIEU                   Michael Dickerson
## 1958 337-582-3535            CALCASIEU                Howard Keith Vincent
## 1959 337-589-7453            CALCASIEU                           Ricky Fox
## 1960 337-786-8241            CALCASIEU                       Denise Maddox
## 1961 337-582-3535            CALCASIEU                   Jeannie Guillotte
## 1962 337-582-3535            CALCASIEU                       Larry J Hardy
## 1963 337-582-3535            CALCASIEU                      Errol Marshall
## 1964 337-582-3535            CALCASIEU                       Thomas Talbot
## 1965 337-582-3535            CALCASIEU                       Gerald Guidry
## 1966 337-433-0691            CALCASIEU                      John M Cradure
## 1967                         CALCASIEU                 Lori Ellis Peterson
## 1968                         CALCASIEU                      Wally Anderson
## 1969                         CALCASIEU                    Daniel Dan Racca
## 1970                         CALCASIEU                   Robert Bob Hardey
## 1971 337-786-8241            CALCASIEU                 Mark James Peloquin
## 1972 337-527-4500            CALCASIEU               Drusilla Dru Ellender
## 1973 337-786-8241            CALCASIEU                        Ronda Jacobs
## 1974 337-527-4500            CALCASIEU                 Michael Mike Koonce
## 1975 337-786-8241            CALCASIEU                         Judy Landry
## 1976 337-527-4500            CALCASIEU                    Veronica Allison
## 1977 337-786-8241            CALCASIEU                    Andrea D Coleman
## 1978 337-527-4500            CALCASIEU                  Joseph Randy Favre
## 1979 337-527-4500            CALCASIEU                         Stuart Moss
## 1980 337-491-1201            CALCASIEU                  Marshall Simien Jr
## 1981 337-491-1201            CALCASIEU                     Luvertha August
## 1982 337-491-1201            CALCASIEU                        Rodney Geyen
## 1983 337-491-1201            CALCASIEU                        Rodney Geyen
## 1984 337-491-1201            CALCASIEU                         John Ieyoub
## 1985 337-491-1201            CALCASIEU                         John Ieyoub
## 1986 337-491-1201            CALCASIEU                  Stuart Weatherford
## 1987 337-491-1201            CALCASIEU                  Stuart Weatherford
## 1988 337-491-1201            CALCASIEU                   Dana Carl Jackson
## 1989 337-491-1201            CALCASIEU                   Dana Carl Jackson
## 1990 337-491-1201            CALCASIEU                         Mark Eckard
## 1991 337-589-7453            CALCASIEU                        Bliss Bujard
## 1992 337-589-7453            CALCASIEU                      Harold R Douga
## 1993 337-589-7453            CALCASIEU                            B B Loyd
## 1994 337-589-7453            CALCASIEU                      Kevin Merchant
## 1995 337-589-7453            CALCASIEU                          Paul Patin
## 1996                          CALDWELL                    Betty J Robinson
## 1997                          CALDWELL                        Jane Roberts
## 1998                          CALDWELL                                    
## 1999                          CALDWELL                                    
## 2000                          CALDWELL                                    
## 2001                          CALDWELL                                    
## 2002                          CALDWELL                                    
## 2003                          CALDWELL                                    
## 2004                          CALDWELL                       James E Mixon
## 2005                          CALDWELL                                    
## 2006                          CALDWELL                                    
## 2007                          CALDWELL                                    
## 2008                          CALDWELL                                    
## 2009                          CALDWELL                                    
## 2010                          CALDWELL                                    
## 2011                          CALDWELL                                    
## 2012 318-649-2345             CALDWELL                        Steven E May
## 2013 318-649-2272             CALDWELL                         Eugene Dunn
## 2014 318-649-2636             CALDWELL                      Scott Meredith
## 2015 318-649-2311             CALDWELL                 Charles Chuck Clack
## 2016 318-649-2681             CALDWELL                           Gary Mott
## 2017 318-649-2681             CALDWELL                          Lanny Dark
## 2018 318-649-2681             CALDWELL                     Bobbie Harrison
## 2019 318-649-2681             CALDWELL                        Eddie Hearns
## 2020 318-649-2681             CALDWELL               Archie Lloyd Williams
## 2021 318-649-2681             CALDWELL                      Glenn Barnhill
## 2022 318-649-2681             CALDWELL             Charles Flukie Braddock
## 2023 318-649-2689             CALDWELL                           David May
## 2024 318-649-2689             CALDWELL                       Jodi B Kenney
## 2025 318-649-2689             CALDWELL                 John Frank Robinson
## 2026 318-649-2689             CALDWELL                       Baron D Glass
## 2027 318-649-2689             CALDWELL                  Clarence CR Martin
## 2028 318-649-2689             CALDWELL                   Jack McKeithen Jr
## 2029 318-649-2689             CALDWELL                   Hershel Volentine
## 2030 318-649-7979             CALDWELL                      Debbie Westrup
## 2031 318-649-0208             CALDWELL                         Mary Taylor
## 2032 318-649-7926             CALDWELL                    J N Buddy Bailes
## 2033 318-649-5117             CALDWELL                     Larry Adkins Jr
## 2034 318-649-7218             CALDWELL                      Phyllis Holmes
## 2035 318-649-6174             CALDWELL                    Charles D Simons
## 2036 318-649-7148             CALDWELL                       Carmen M Head
## 2037 318-649-6174             CALDWELL                        Clay Bennett
## 2038 318-649-7148             CALDWELL              Mitchell Mitch Bratton
## 2039 318-649-7218             CALDWELL                         Ann Breland
## 2040 318-649-7218             CALDWELL                    Crystal Buckalew
## 2041 318-649-7218             CALDWELL                         Gary Holmes
## 2042 318-649-7218             CALDWELL                Kristen Krissy Jolly
## 2043 318-649-7218             CALDWELL                   Crystal Weeks Lee
## 2044 318-649-7148             CALDWELL             Thomas Wesley Wes Burns
## 2045 318-649-7148             CALDWELL                       Raymond Cruse
## 2046 318-649-7148             CALDWELL              Sandra Hillestad Evans
## 2047 318-649-2631             CALDWELL                Kenneth Ken Brockner
## 2048 318-649-2631             CALDWELL                   Bonnie M Crockett
## 2049 318-649-2631             CALDWELL                       Bruce Frazier
## 2050 318-649-2631             CALDWELL                    Richard Meredith
## 2051 318-649-2631             CALDWELL                   Melvin D Robinson
## 2052                           CAMERON                         Hilda Crain
## 2053                           CAMERON                      Lee J Harrison
## 2054                           CAMERON                        Garner Nunez
## 2055                           CAMERON                                    
## 2056                           CAMERON                                    
## 2057                           CAMERON                                    
## 2058                           CAMERON                                    
## 2059                           CAMERON                                    
## 2060                           CAMERON                                    
## 2061                           CAMERON                                    
## 2062                           CAMERON                                    
## 2063                           CAMERON                                    
## 2064                           CAMERON                                    
## 2065                           CAMERON                                    
## 2066                           CAMERON                                    
## 2067                           CAMERON                                    
## 2068                           CAMERON                                    
## 2069                           CAMERON                                    
## 2070 337-616-8808              CAMERON                         Ron Johnson
## 2071 337-775-5316              CAMERON                      Carl Broussard
## 2072 337-775-5416              CAMERON                  Romona Mona Kelley
## 2073 337-542-4201              CAMERON                     Richard Sanders
## 2074 337-905-1190              CAMERON                     Curtis Fountain
## 2075 337-475-9167              CAMERON                  Anthony Dino Hicks
## 2076 337-475-9167              CAMERON                          Kirk Quinn
## 2077 337-475-9167              CAMERON                       Terry M Beard
## 2078 337-475-9167              CAMERON                       Kirk Burleigh
## 2079 337-475-9167              CAMERON                        Joe B Dupont
## 2080 337-475-9167              CAMERON                       Darryl Farque
## 2081 337-905-5784              CAMERON                       Marsha Trahan
## 2082 337-475-9167              CAMERON                       Dwayne Sanner
## 2083 337-475-9167              CAMERON                       R Scott Nunez
## 2084 337-475-9167              CAMERON                 Dorothy Dot Theriot
## 2085 337-475-9167              CAMERON                        Tracy Carter
## 2086 337-475-9167              CAMERON                   James N Boudreaux
## 2087 337-475-9167              CAMERON                   Karen Faulk Nunez
## 2088                           CAMERON                  Carrie J Broussard
## 2089 337-538-2446              CAMERON                      Nadine Richard
## 2090 337-775-5072              CAMERON                                    
## 2091 337-598-2934              CAMERON               Mckinley Wayne Guidry
## 2092 337-569-2661              CAMERON                     Connie A Trahan
## 2093 337-762-4626              CAMERON                    Brian Desormeaux
## 2094 337-774-2923              CAMERON                   Nolan J Broussard
## 2095 337-538-2254              CAMERON                   Freddie A Theriot
## 2096 337-775-7138              CAMERON                          Davy Doxey
## 2097 337-598-3127              CAMERON                John Buck Stephenson
## 2098 337-569-2562              CAMERON                          Tim Trahan
## 2099 337-762-3555              CAMERON               Gwen Sanner Constance
## 2100                         CATAHOULA                     Jack F Owens Jr
## 2101                         CATAHOULA                       John C Reeves
## 2102                         CATAHOULA                       James H Terry
## 2103                         CATAHOULA                                    
## 2104                         CATAHOULA                                    
## 2105                         CATAHOULA                                    
## 2106                         CATAHOULA                                    
## 2107                         CATAHOULA                                    
## 2108                         CATAHOULA                                    
## 2109                         CATAHOULA                                    
## 2110                         CATAHOULA                                    
## 2111                         CATAHOULA                                    
## 2112                         CATAHOULA                        Paul A Lemke
## 2113                         CATAHOULA                                    
## 2114                         CATAHOULA                                    
## 2115                         CATAHOULA                                    
## 2116                         CATAHOULA                                    
## 2117                         CATAHOULA                                    
## 2118                         CATAHOULA                                    
## 2119                         CATAHOULA                                    
## 2120                         CATAHOULA                                    
## 2121                         CATAHOULA                                    
## 2122 318-744-5411            CATAHOULA                    James Glen Kelly
## 2123 318-744-5497            CATAHOULA                       Janet T Payne
## 2124 318-744-5291            CATAHOULA                         Matt Taylor
## 2125 318-744-5411            CATAHOULA                       Raymond Rouse
## 2126 318-744-5435            CATAHOULA                 Billy D Fletcher Sr
## 2127 318-744-5435            CATAHOULA                Albert Kaline Patten
## 2128 318-744-5435            CATAHOULA                      Raymond Nugent
## 2129 318-744-5435            CATAHOULA                       J D Alexander
## 2130 318-744-5435            CATAHOULA                    Delores McEntyre
## 2131 318-744-5435            CATAHOULA                          Libby Ford
## 2132 318-744-5435            CATAHOULA                      Benny Vault Jr
## 2133 318-744-5435            CATAHOULA                       Joe Barber Sr
## 2134 318-744-5435            CATAHOULA                        Jackie Paulk
## 2135 318-744-5727            CATAHOULA                 Dorothy Jean Watson
## 2136 318-744-5727            CATAHOULA                         Jane Martin
## 2137 318-744-5727            CATAHOULA                    Dewey W Stockman
## 2138 318-744-5727            CATAHOULA                     Lillian S Aplin
## 2139 318-744-5727            CATAHOULA                     Cynthia F Brown
## 2140 318-744-5727            CATAHOULA                  Michael Mike Davis
## 2141 318-744-5727            CATAHOULA                     Josephine Jones
## 2142 318-744-5727            CATAHOULA                    Letishia Hatcher
## 2143 318-744-5727            CATAHOULA                       Katie T Adams
## 2144 318-389-5772            CATAHOULA                       Richard Price
## 2145 318-339-9212            CATAHOULA            Robert T Bobby Alexander
## 2146 318-339-7566            CATAHOULA                        TeRan S Book
## 2147 318-389-5390            CATAHOULA                   H C Trey Peck III
## 2148 318-339-9522            CATAHOULA                       Rickey Morris
## 2149 318-339-9313            CATAHOULA                    Albert L Coleman
## 2150 318-339-8596            CATAHOULA                         Hiram Evans
## 2151 318-744-5794            CATAHOULA                       Michael Tubre
## 2152 318-389-4472            CATAHOULA                      Margie F Price
## 2153 318-744-5794            CATAHOULA                      Lyndell Atkins
## 2154 318-339-8596            CATAHOULA                    Benny L Vault Sr
## 2155 318-339-8596            CATAHOULA                   Stephen R Mophett
## 2156 318-339-8596            CATAHOULA                      Josie Bullitts
## 2157 318-339-8596            CATAHOULA                     Catina R Branch
## 2158 318-339-8596            CATAHOULA                        Tommy Branch
## 2159 318-744-5794            CATAHOULA                  Louis FiveO Hatten
## 2160 318-744-5794            CATAHOULA                        Harold Sones
## 2161 318-744-5794            CATAHOULA                          Greg Terry
## 2162 318-389-4472            CATAHOULA                     Derrick Frazier
## 2163 318-389-4472            CATAHOULA                       Linda J Kerry
## 2164 318-389-4472            CATAHOULA                   Walter Pot Krause
## 2165                         CLAIBORNE                         Tara Hollis
## 2166                         CLAIBORNE              Cynthia Gladney Steele
## 2167                         CLAIBORNE                                    
## 2168                         CLAIBORNE                                    
## 2169                         CLAIBORNE                                    
## 2170                         CLAIBORNE                                    
## 2171                         CLAIBORNE                                    
## 2172                         CLAIBORNE                                    
## 2173                         CLAIBORNE                                    
## 2174                         CLAIBORNE                                    
## 2175                         CLAIBORNE                                    
## 2176                         CLAIBORNE                                    
## 2177                         CLAIBORNE                       Kenneth White
## 2178                         CLAIBORNE                                    
## 2179                         CLAIBORNE                                    
## 2180                         CLAIBORNE                                    
## 2181                         CLAIBORNE                                    
## 2182                         CLAIBORNE                                    
## 2183                         CLAIBORNE                                    
## 2184                         CLAIBORNE                                    
## 2185                         CLAIBORNE                                    
## 2186                         CLAIBORNE                                    
## 2187                         CLAIBORNE                                    
## 2188 318-927-2011            CLAIBORNE                          Ken Bailey
## 2189 318-927-9601            CLAIBORNE               James Patrick Gladney
## 2190 318-927-3022            CLAIBORNE                        Bob Robinson
## 2191 318-327-3571            CLAIBORNE                     Donald K Haynes
## 2192 318-927-2222            CLAIBORNE                 D'Arcy R Stevens Jr
## 2193 318-927-2222            CLAIBORNE                         Mark Furlow
## 2194 318-927-2222            CLAIBORNE                   Robert E McDaniel
## 2195 318-927-2222            CLAIBORNE                       Joe A Sturges
## 2196 318-927-2222            CLAIBORNE                       Lavelle Penix
## 2197 318-927-2222            CLAIBORNE                      Scott Davidson
## 2198 318-927-2222            CLAIBORNE                           Roy Lewis
## 2199 318-927-2222            CLAIBORNE                          Roy Mardis
## 2200 318-927-2222            CLAIBORNE                      Jerry A Adkins
## 2201 318-927-2222            CLAIBORNE                        Willie Young
## 2202 318-927-3502            CLAIBORNE                       Danny Doc Lee
## 2203 318-927-3502            CLAIBORNE                    William H Maddox
## 2204 318-927-3502            CLAIBORNE                          Linda Knox
## 2205 318-927-3502            CLAIBORNE                   Yolanda L Coleman
## 2206 318-927-3502            CLAIBORNE                       Robert Haynes
## 2207 318-927-3502            CLAIBORNE                   Thomas E Davidson
## 2208 318-927-3502            CLAIBORNE               Vera R Walker Meadors
## 2209 318-927-3502            CLAIBORNE                    Almeter H Willis
## 2210 318-927-3502            CLAIBORNE                          Joey White
## 2211 318-927-3502            CLAIBORNE                   B Stewart Griffin
## 2212 318-624-0057            CLAIBORNE                   Charles F Clawson
## 2213 318-927-2149            CLAIBORNE                     Ronnie McKenzie
## 2214 318-353-6808            CLAIBORNE                       Amanda Verdin
## 2215 318-624-0951            CLAIBORNE                 William Earl Maddox
## 2216 318-927-3796            CLAIBORNE                        James A Pike
## 2217 318-343-6553            CLAIBORNE                         Frank Speer
## 2218 318-624-0911            CLAIBORNE                       Sherman Brown
## 2219 318-927-3555            CLAIBORNE                Alecia Nychole Smith
## 2220 318-258-5275            CLAIBORNE                       Hubie D James
## 2221                         CLAIBORNE                        Wayne Tanner
## 2222 318-624-0911            CLAIBORNE                 Anthony Craig Smith
## 2223 318-258-5275            CLAIBORNE                       Jack Spurlock
## 2224 318-927-3555            CLAIBORNE                       Russell Mills
## 2225 318-258-5275            CLAIBORNE                      Melver Stassen
## 2226 318-258-5275            CLAIBORNE                  Prentis Washington
## 2227 318-258-5275            CLAIBORNE                      Ardis Willhite
## 2228                         CLAIBORNE                    Jerry W Clements
## 2229                         CLAIBORNE                Marilyn Lowrey Myers
## 2230                         CLAIBORNE                        Andy Roberts
## 2231 318-624-0911            CLAIBORNE                   Valinda Faye Webb
## 2232 318-624-0911            CLAIBORNE                      Herbert Taylor
## 2233 318-624-0911            CLAIBORNE          Barbara Beene Net Torrence
## 2234 318-624-0911            CLAIBORNE                         Brian Bogle
## 2235 318-624-0911            CLAIBORNE                 Carla Frasier Smith
## 2236 318-927-3555            CLAIBORNE                Linda Ferrell Mozeke
## 2237 318-927-3555            CLAIBORNE                      Michael J Wade
## 2238 318-927-3555            CLAIBORNE                        Don McCalman
## 2239 318-927-3555            CLAIBORNE                    Carlette Sanford
## 2240 318-927-3555            CLAIBORNE                  Patricia K Jenkins
## 2241                         CONCORDIA                          Don W Tate
## 2242                         CONCORDIA                                    
## 2243                         CONCORDIA              William H Billy Rucker
## 2244                         CONCORDIA                                    
## 2245                         CONCORDIA                                    
## 2246                         CONCORDIA                                    
## 2247                         CONCORDIA                                    
## 2248                         CONCORDIA                                    
## 2249                         CONCORDIA                                    
## 2250                         CONCORDIA                     Ray F Routon Jr
## 2251                         CONCORDIA                                    
## 2252                         CONCORDIA                                    
## 2253                         CONCORDIA              Elizabeth Liz Brooking
## 2254                         CONCORDIA                                    
## 2255                         CONCORDIA                                    
## 2256                         CONCORDIA                          Susan Rabb
## 2257                         CONCORDIA                     Ronnie Bradford
## 2258                         CONCORDIA                                    
## 2259                         CONCORDIA                                    
## 2260                         CONCORDIA                                    
## 2261 318-336-5231            CONCORDIA                     Kenneth Hedrick
## 2262 318-336-4204            CONCORDIA                    Clyde Ray Webber
## 2263 318-336-5122            CONCORDIA                         Jerry Clark
## 2264 318-757-7000            CONCORDIA                        Daryle Price
## 2265 318-336-7151            CONCORDIA                          Carey Cook
## 2266 318-336-7151            CONCORDIA                     Joe Bear Parker
## 2267 318-336-7151            CONCORDIA                     Willie J Dunbar
## 2268 318-336-7151            CONCORDIA                        Randy Temple
## 2269 318-336-7151            CONCORDIA                       Whest Shirley
## 2270 318-336-7151            CONCORDIA                        Jerry Beatty
## 2271 318-336-7151            CONCORDIA                   Melvin Ferrington
## 2272 318-336-7151            CONCORDIA                      Jimmy Jernigan
## 2273 318-336-7151            CONCORDIA                    Tommy Red Tiffee
## 2274 318-336-5272            CONCORDIA                  George C Murray Jr
## 2275 318-336-6255            CONCORDIA                           Jim Boren
## 2276 318-336-4226            CONCORDIA                      Fred T Butcher
## 2277 318-336-4226            CONCORDIA                     Mary H Campbell
## 2278 318-336-4226            CONCORDIA                     Raymond T Riley
## 2279 318-336-4226            CONCORDIA                        Gary Parnham
## 2280 318-336-4226            CONCORDIA                       Cheryl Probst
## 2281 318-336-4226            CONCORDIA                     Charles E Minor
## 2282 318-336-4226            CONCORDIA                     Jeffery Goodman
## 2283 318-336-4226            CONCORDIA                   Warren S Enterkin
## 2284 318-336-4226            CONCORDIA                       Darlene Baker
## 2285 318-757-2834            CONCORDIA                     Benja R Fussell
## 2286 318-336-9534            CONCORDIA                      Frank Duson Jr
## 2287 318-336-5723            CONCORDIA                     Russell Wagoner
## 2288 318-757-7613            CONCORDIA                     Jerry Stallings
## 2289 318-757-8977            CONCORDIA             Charles E Charlie White
## 2290 318-386-7193            CONCORDIA                        Tim Charrier
## 2291 318-757-2714            CONCORDIA                       Rosa W Elaine
## 2292 318-336-9968            CONCORDIA                      Rickey Hollins
## 2293 318-336-5105            CONCORDIA                          Susan Rabb
## 2294 318-336-7681            CONCORDIA                  Ferris Bull Durham
## 2295 318-757-2526            CONCORDIA                        John H Cowan
## 2296 318-386-2649            CONCORDIA                        Jerry Lipsey
## 2297 318-757-8540            CONCORDIA                       Rydell Turner
## 2298 318-757-3411            CONCORDIA                          Gene Allen
## 2299 318-757-4497            CONCORDIA                      Dwayne T Sikes
## 2300 318-336-5206            CONCORDIA                      Hyram Copeland
## 2301 318-757-8540            CONCORDIA               Clarence PaPa Skipper
## 2302 318-757-4497            CONCORDIA                Edwin Larry Lawrence
## 2303 318-336-5206            CONCORDIA                   Arthur K Lewis Sr
## 2304 318-336-5206            CONCORDIA                          Tron McCoy
## 2305 318-336-5206            CONCORDIA                      Vernon Stevens
## 2306 318-336-5206            CONCORDIA                           Jon Betts
## 2307 318-336-5206            CONCORDIA               Richard S Ricky Knapp
## 2308 318-336-5206            CONCORDIA                 Maureen Mo Saunders
## 2309 318-757-3411            CONCORDIA                         Somer Lance
## 2310 318-757-3411            CONCORDIA                Elijah Stepper Banks
## 2311 318-757-3411            CONCORDIA                   Sandra Gail Pryor
## 2312 318-757-3411            CONCORDIA                       Johnnie Brown
## 2313 318-757-3411            CONCORDIA                        Gloria Lloyd
## 2314 318-757-8540            CONCORDIA                      Floyd L Barber
## 2315 318-757-8540            CONCORDIA                      Houston Holmes
## 2316 318-757-8540            CONCORDIA                     Irene Jefferson
## 2317 318-757-8540            CONCORDIA                         Leroy Kelly
## 2318 318-757-8540            CONCORDIA               Shannon Burns Madison
## 2319 318-757-4497            CONCORDIA                      Jamie Harrison
## 2320 318-757-4497            CONCORDIA                       Robert Maples
## 2321 318-757-4497            CONCORDIA                   Bobby Sheppard Sr
## 2322 318-757-4497            CONCORDIA                         Wanda Smith
## 2323 318-757-4497            CONCORDIA                   Courtney Thompson
## 2324                           DE SOTO                  Thomas Bryce Alger
## 2325                           DE SOTO                     George L Thomas
## 2326                           DE SOTO                                    
## 2327                           DE SOTO                                    
## 2328                           DE SOTO                                    
## 2329                           DE SOTO                                    
## 2330                           DE SOTO                                    
## 2331                           DE SOTO                      Richard Fuller
## 2332                           DE SOTO                        Jeri Burrell
## 2333                           DE SOTO                                    
## 2334                           DE SOTO                    Cynthia Williams
## 2335                           DE SOTO                                    
## 2336                           DE SOTO                                    
## 2337                           DE SOTO                                    
## 2338                           DE SOTO                                    
## 2339                           DE SOTO                                    
## 2340                           DE SOTO                                    
## 2341                           DE SOTO                                    
## 2342                           DE SOTO                                    
## 2343                           DE SOTO                                    
## 2344                           DE SOTO                                    
## 2345                           DE SOTO                                    
## 2346                           DE SOTO                  Bryan B Norwood Jr
## 2347                           DE SOTO                                    
## 2348                           DE SOTO                                    
## 2349 318-872-3956              DE SOTO                   Rodney G Arbuckle
## 2350 318-872-3110              DE SOTO                        Jeremy Evans
## 2351 318-872-3610              DE SOTO                         Anne Gannon
## 2352 318-872-0516              DE SOTO                     Jeffrey L Evans
## 2353 318-872-0738              DE SOTO                     Charlie Roberts
## 2354 318-872-0738              DE SOTO                    Dewayne Mitchell
## 2355 318-872-0738              DE SOTO                     Jarrell O Burch
## 2356 318-872-0738              DE SOTO                        A W McDonald
## 2357 318-872-0738              DE SOTO                  Gregory Greg Baker
## 2358 318-872-0738              DE SOTO                      Richard Fuller
## 2359 318-872-0738              DE SOTO                        Jeff L Heard
## 2360 318-872-0738              DE SOTO                         Ernel Jones
## 2361 318-872-0738              DE SOTO                     Thomas Jones Jr
## 2362 318-872-0738              DE SOTO                          Reggie Roe
## 2363 318-872-0738              DE SOTO                    Ricky McPhearson
## 2364 318-872-3993              DE SOTO                      Dudley M Glenn
## 2365 318-872-3993              DE SOTO                      Neil Henderson
## 2366 318-872-3993              DE SOTO                McLawrence Fuller Sr
## 2367 318-872-3993              DE SOTO              Donald B Donnie Dufour
## 2368 318-872-3993              DE SOTO                        Steavy Clark
## 2369 318-872-3993              DE SOTO                      Coday Johnston
## 2370 318-872-3993              DE SOTO                        Coach Haynes
## 2371 318-872-3993              DE SOTO                     Larry Mark Ross
## 2372 318-872-3993              DE SOTO                         Tommy Craig
## 2373 318-872-3993              DE SOTO                      Garland Spivey
## 2374 318-872-3993              DE SOTO                   L J Mayweather Jr
## 2375 318-697-5707              DE SOTO                        Helen Holmes
## 2376 318-925-0569              DE SOTO                 Gloria J McPhearson
## 2377 318-697-5361              DE SOTO                    S Phillip Joyner
## 2378 318-872-3291              DE SOTO                  Wilbur T Purvis Jr
## 2379 318-755-2391              DE SOTO                                    
## 2380 318-697-4920              DE SOTO                        Jerry L Lowe
## 2381 318-697-5852              DE SOTO                       Hollis Holmes
## 2382 318-925-1240              DE SOTO                 Troy Bubba Yopp III
## 2383 318-697-4731              DE SOTO                        Billy Murphy
## 2384 318-697-4731              DE SOTO             Travis Bubba English Jr
## 2385 318-872-4794              DE SOTO              Linda Wilburn Davidson
## 2386 318-697-5438              DE SOTO                          E J Barber
## 2387 318-872-0406              DE SOTO                      Curtis W McCoy
## 2388                           DE SOTO                    Travis Whitfield
## 2389 318-697-5359              DE SOTO                   Katherine Freeman
## 2390 318-925-9338              DE SOTO                      Charles Waldon
## 2391 318-858-3251              DE SOTO               Marsha Lea Richardson
## 2392 318-697-0226              DE SOTO              Wanda Sue Lewis Fields
## 2393 318-872-3960              DE SOTO                  Euricka Mayweather
## 2394 318-697-4768              DE SOTO                    Altheaon H Burch
## 2395 318-697-4768              DE SOTO                        Scotty Liles
## 2396 318-925-9338              DE SOTO             Thomas Henry Dufrene Jr
## 2397 318-697-4768              DE SOTO                 David Glen Burch Sr
## 2398 318-697-4768              DE SOTO                 David Glen Burch Sr
## 2399 318-872-0406              DE SOTO                   GB Sonny Hall III
## 2400 318-872-0406              DE SOTO                      Troy N Terrell
## 2401 318-872-0406              DE SOTO                      Mitchell Lewis
## 2402 318-872-0406              DE SOTO                      Joseph Hall Jr
## 2403 318-872-0406              DE SOTO                     Cynthia T Cruse
## 2404 318-858-3251              DE SOTO                 William H Bill Cook
## 2405 318-858-3251              DE SOTO                  Rhonda Hughes Meek
## 2406 318-858-3251              DE SOTO                   Albert M Rives IV
## 2407 318-872-3960              DE SOTO                       Ola Mae Evans
## 2408 318-872-3960              DE SOTO                       Dianne Hudson
## 2409 318-872-3960              DE SOTO                       Kevin Vanzant
## 2410 318-697-4768              DE SOTO                         Dwena Henry
## 2411 318-697-4768              DE SOTO                       Dwena M Henry
## 2412 318-697-4768              DE SOTO                     Clemmie P McCoy
## 2413 318-697-4768              DE SOTO             Clemmie Permenter McCoy
## 2414 318-697-4768              DE SOTO                     Mark A Murphrey
## 2415 318-697-4768              DE SOTO                     Mark A Murphrey
## 2416                           DE SOTO                     Norman Arbuckle
## 2417                           DE SOTO                  Judge S Cordray Jr
## 2418                           DE SOTO                  Martha P Guillotte
## 2419                           DE SOTO                         Dale Morvan
## 2420                           DE SOTO               Edith Duncan Williams
## 2421 318-925-9338              DE SOTO                Margaret A Dickerson
## 2422 318-925-9338              DE SOTO                Nicholas Nick Gasper
## 2423 318-925-9338              DE SOTO                   Patrick Loftus Jr
## 2424 318-925-9338              DE SOTO                       Curtis McCune
## 2425 318-925-9338              DE SOTO                     Dorothy Simmons
## 2426 318-697-0226              DE SOTO                      Connie Jackson
## 2427 318-697-0226              DE SOTO                         Billy G Lee
## 2428 318-697-0226              DE SOTO                    Queenie V Rogers
## 2429                           DE SOTO                 Jeanette Pons Avila
## 2430                           DE SOTO                        Chad Burford
## 2431                           DE SOTO                       Lorice Pipkin
## 2432                           DE SOTO                       Audrey Rachal
## 2433                           DE SOTO                        Angela Toney
## 2434                  EAST BATON ROUGE                   Donald C Hodge Jr
## 2435                  EAST BATON ROUGE          Charlotte McDaniel McGehee
## 2436                  EAST BATON ROUGE                       Larry Selders
## 2437                  EAST BATON ROUGE              Dean Deaneaux Vicknair
## 2438                  EAST BATON ROUGE                        W T Winfield
## 2439                  EAST BATON ROUGE                     Brenda B Carter
## 2440                  EAST BATON ROUGE                       Linda Perkins
## 2441                  EAST BATON ROUGE                       Brett Jackson
## 2442                  EAST BATON ROUGE                        Dawn Collins
## 2443                  EAST BATON ROUGE                      Ronnie Edwards
## 2444                  EAST BATON ROUGE                Verna BradleyJackson
## 2445                  EAST BATON ROUGE                      Anthony Nelson
## 2446                  EAST BATON ROUGE                      Tinicia Turner
## 2447                  EAST BATON ROUGE                       Tawanda Green
## 2448                  EAST BATON ROUGE                   Carolyn R Coleman
## 2449                  EAST BATON ROUGE              Elizabeth Betty Powers
## 2450                  EAST BATON ROUGE                    Brandon J DeCuir
## 2451                  EAST BATON ROUGE                      Elizabeth Dent
## 2452                  EAST BATON ROUGE                        Tommy French
## 2453                  EAST BATON ROUGE                 Louis Woody Jenkins
## 2454                  EAST BATON ROUGE                            Dan Kyle
## 2455                  EAST BATON ROUGE                       Darrell White
## 2456                  EAST BATON ROUGE                        John Coghlan
## 2457                  EAST BATON ROUGE                          Ryan Cross
## 2458                  EAST BATON ROUGE                      Richie Edmonds
## 2459                  EAST BATON ROUGE                          Jr Shelton
## 2460                  EAST BATON ROUGE                     Harold Williams
## 2461                  EAST BATON ROUGE                          Dan Richey
## 2462                  EAST BATON ROUGE          Philemon APhil St Amant II
## 2463                  EAST BATON ROUGE                  Linda Price Thomas
## 2464                  EAST BATON ROUGE                         Jay Lindsey
## 2465                  EAST BATON ROUGE                        Karla Doucet
## 2466                  EAST BATON ROUGE                        Jerry Arbour
## 2467                  EAST BATON ROUGE                      Connie Bernard
## 2468 225-354-1230     EAST BATON ROUGE             Kathleen Stewart Richey
## 2469 225-354-1250     EAST BATON ROUGE                  Pam Taylor Johnson
## 2470 225-389-7657     EAST BATON ROUGE                  Lisa WoodruffWhite
## 2471 225-389-4673     EAST BATON ROUGE                Charlene Charlet Day
## 2472 225-389-4676     EAST BATON ROUGE                           Pam Baker
## 2473 225-389-4678     EAST BATON ROUGE                    Annette Lassalle
## 2474 225-389-5000     EAST BATON ROUGE                 Sid J Gautreaux III
## 2475 225-389-3950     EAST BATON ROUGE                        Doug Welborn
## 2476 225-389-3933     EAST BATON ROUGE                        Brian Wilson
## 2477 225-389-3047     EAST BATON ROUGE                  William Beau Clark
## 2478 225-389-3100     EAST BATON ROUGE                   Melvin Kip Holden
## 2479 225-389-3123     EAST BATON ROUGE                          Trae Welch
## 2480 225-389-3123     EAST BATON ROUGE                  Chauna BanksDaniel
## 2481 225-389-3123     EAST BATON ROUGE                      Chandler Loupe
## 2482 225-389-3123     EAST BATON ROUGE                        Scott Wilson
## 2483 225-389-3123     EAST BATON ROUGE                      Ronnie Edwards
## 2484 225-389-3123     EAST BATON ROUGE                  Donna CollinsLewis
## 2485 225-389-3123     EAST BATON ROUGE                   C Denise Marcelle
## 2486 225-389-3123     EAST BATON ROUGE                       Buddy Amoroso
## 2487 225-389-3123     EAST BATON ROUGE                           Joel Boe'
## 2488 225-389-3123     EAST BATON ROUGE                         Tara Wicker
## 2489 225-389-3123     EAST BATON ROUGE                    Ryan Eugene Heck
## 2490 225-389-3123     EAST BATON ROUGE                        John Delgado
## 2491 225-778-1866     EAST BATON ROUGE                     Kirk A Williams
## 2492 225-654-0044     EAST BATON ROUGE                       Lonny A Myles
## 2493 225-389-3025     EAST BATON ROUGE                Kelli Terrell Temple
## 2494 225-389-5006     EAST BATON ROUGE          Yvette Mansfield Alexander
## 2495 225-389-3021     EAST BATON ROUGE                 Laura Prosser Davis
## 2496 225-389-3346     EAST BATON ROUGE                     Alex Brick Wall
## 2497 225-389-3095     EAST BATON ROUGE                      Suzan S Ponder
## 2498 225-389-3004     EAST BATON ROUGE                 Reginald R Brown Sr
## 2499 225-658-4969     EAST BATON ROUGE                       Gaynell Young
## 2500 225-658-4969     EAST BATON ROUGE                     J Scott Swilley
## 2501 225-658-4969     EAST BATON ROUGE                       Sharon Samuel
## 2502 225-658-4969     EAST BATON ROUGE                    Kenneth R Mackie
## 2503 225-658-4969     EAST BATON ROUGE                          Hubie Owen
## 2504 225-658-4969     EAST BATON ROUGE                       Jannie Rogers
## 2505 225-658-4969     EAST BATON ROUGE                      Boyce Smith Jr
## 2506 225-658-4969     EAST BATON ROUGE          Reginald D Donnie Dykes Jr
## 2507 225-658-4969     EAST BATON ROUGE                        David Dayton
## 2508 225-922-5618     EAST BATON ROUGE                        David Tatman
## 2509                  EAST BATON ROUGE                         James Lloyd
## 2510 225-774-5795     EAST BATON ROUGE                      Elaine G Davis
## 2511 225-922-5618     EAST BATON ROUGE                          Vereta Lee
## 2512                  EAST BATON ROUGE                    Roxanne Atkinson
## 2513 225-774-5795     EAST BATON ROUGE                      Dana Carpenter
## 2514 225-922-5618     EAST BATON ROUGE                Kenyetta NelsonSmith
## 2515                  EAST BATON ROUGE                      G David Walker
## 2516 225-774-5795     EAST BATON ROUGE                         Troy Watson
## 2517 225-922-5618     EAST BATON ROUGE                       Tarvald Smith
## 2518                  EAST BATON ROUGE                 Willard Will Easley
## 2519 225-774-5795     EAST BATON ROUGE                         Shona Boxie
## 2520 225-922-5618     EAST BATON ROUGE                  Evelyn WareJackson
## 2521                  EAST BATON ROUGE                         Jim Gardner
## 2522 225-774-5795     EAST BATON ROUGE                     Doris Alexander
## 2523 225-922-5618     EAST BATON ROUGE                       Craig Freeman
## 2524                  EAST BATON ROUGE                  Ruby Wallette Foil
## 2525 225-922-5618     EAST BATON ROUGE              Barbara Reich Freiberg
## 2526                  EAST BATON ROUGE                     Sharon Browning
## 2527 225-922-5618     EAST BATON ROUGE                      Connie Bernard
## 2528 225-922-5618     EAST BATON ROUGE                        Jerry Arbour
## 2529 225-922-5618     EAST BATON ROUGE                       Jill C Dyason
## 2530 225-922-5618     EAST BATON ROUGE                        Randy Lamana
## 2531                  EAST BATON ROUGE                     Virginia Forbes
## 2532                  EAST BATON ROUGE                         Brooke Peay
## 2533                  EAST BATON ROUGE                    Moses M Evans Jr
## 2534                  EAST BATON ROUGE                          Mark Miley
## 2535                  EAST BATON ROUGE                    Steven E Sanders
## 2536                  EAST BATON ROUGE                                    
## 2537 225-261-9328     EAST BATON ROUGE                    Jimmy Santangelo
## 2538 225-658-4628     EAST BATON ROUGE                         Darin David
## 2539 225-356-9000     EAST BATON ROUGE                     Donald Shelmire
## 2540 225-261-3663     EAST BATON ROUGE                        Don Thompson
## 2541 225-753-1938     EAST BATON ROUGE                       Carey Jenkins
## 2542 225-752-9364     EAST BATON ROUGE                        David L Wade
## 2543 225-778-0300     EAST BATON ROUGE                       Harold Rideau
## 2544 225-261-5988     EAST BATON ROUGE                           Mac Watts
## 2545 225-654-0287     EAST BATON ROUGE                       David Amrhein
## 2546 225-778-0300     EAST BATON ROUGE               Michael Snapper Knaps
## 2547 225-261-0653     EAST BATON ROUGE                       Doug Browning
## 2548 225-654-0287     EAST BATON ROUGE                       David McDavid
## 2549 225-261-0653     EAST BATON ROUGE                     Louis DeJohn Jr
## 2550 225-261-0653     EAST BATON ROUGE                          Tony LoBue
## 2551 225-261-0653     EAST BATON ROUGE                       Wayne Messina
## 2552 225-261-0653     EAST BATON ROUGE                          Aaron Moak
## 2553 225-261-0653     EAST BATON ROUGE                    Ralph Washington
## 2554 225-778-0300     EAST BATON ROUGE                     Charles Vincent
## 2555                  EAST BATON ROUGE                    Francis Nezianya
## 2556 225-778-0300     EAST BATON ROUGE                   Norman Pete Heine
## 2557                  EAST BATON ROUGE                        Brandon Noel
## 2558 225-778-0300     EAST BATON ROUGE                        Joyce Burges
## 2559                  EAST BATON ROUGE                        John Coghlan
## 2560 225-778-0300     EAST BATON ROUGE                        Robert Young
## 2561 225-778-0300     EAST BATON ROUGE                        Robert Young
## 2562                  EAST BATON ROUGE                          Dan Wallis
## 2563 225-778-0300     EAST BATON ROUGE                         John Givens
## 2564                  EAST BATON ROUGE                        Tommy Womack
## 2565                      EAST CARROLL                                    
## 2566                      EAST CARROLL                                    
## 2567                      EAST CARROLL                    Wydette Williams
## 2568                      EAST CARROLL                                    
## 2569                      EAST CARROLL                                    
## 2570                      EAST CARROLL                   Nemia Nate Madere
## 2571                      EAST CARROLL                                    
## 2572                      EAST CARROLL                                    
## 2573                      EAST CARROLL                                    
## 2574                      EAST CARROLL                                    
## 2575                      EAST CARROLL                                    
## 2576                      EAST CARROLL                                    
## 2577                      EAST CARROLL                                    
## 2578                      EAST CARROLL                                    
## 2579                      EAST CARROLL                                    
## 2580                      EAST CARROLL                                    
## 2581                      EAST CARROLL                                    
## 2582                      EAST CARROLL                                    
## 2583                      EAST CARROLL                                    
## 2584                      EAST CARROLL                                    
## 2585 318-559-2800         EAST CARROLL                    Wydette Williams
## 2586 318-559-2399         EAST CARROLL               Beatrice Allen Carter
## 2587 318-559-2850         EAST CARROLL                       Geneva F Odom
## 2588 318-559-2814         EAST CARROLL                      James Jim Holt
## 2589 318-559-2256         EAST CARROLL                       Ralph Coleman
## 2590 318-559-2256         EAST CARROLL                  Kofi DardenHawkins
## 2591 318-559-2256         EAST CARROLL                   Joseph BB Jackson
## 2592 318-559-2256         EAST CARROLL                  Kendall L Thompson
## 2593 318-559-2256         EAST CARROLL                    Sidney Lee Denny
## 2594 318-559-2222         EAST CARROLL                 Shirley F Fairchild
## 2595 318-559-2222         EAST CARROLL                     Harriet Bridges
## 2596 318-559-2222         EAST CARROLL                        Jackie Folks
## 2597 318-559-2222         EAST CARROLL                      Gene Edmondson
## 2598 318-559-2222         EAST CARROLL                  Roger Shoemaker Sr
## 2599 318-559-2222         EAST CARROLL                     Marion Carraway
## 2600 318-559-2222         EAST CARROLL                    Georjean Jackson
## 2601 318-559-2222         EAST CARROLL                      Arlean Hampton
## 2602 318-559-2222         EAST CARROLL                  Carolyn Davis Ward
## 2603 318-559-1744         EAST CARROLL                       Debra Hopkins
## 2604 318-559-9096         EAST CARROLL                       Gregory Jones
## 2605 318-559-2288         EAST CARROLL             Robert Bobby Amacker Jr
## 2606 318-559-2288         EAST CARROLL                  Aaron Rudy Threats
## 2607 318-559-2288         EAST CARROLL                        John Frantom
## 2608 318-559-2288         EAST CARROLL                   Nemia Nate Madere
## 2609 318-559-2288         EAST CARROLL                          Karl Magee
## 2610 318-559-2288         EAST CARROLL                  Barbara A McDaniel
## 2611 318-559-2288         EAST CARROLL                      Donnie Meadows
## 2612                    EAST FELICIANA                         Jimmy McCaa
## 2613                    EAST FELICIANA                                    
## 2614                    EAST FELICIANA                           Ed Parker
## 2615                    EAST FELICIANA                                    
## 2616                    EAST FELICIANA                                    
## 2617                    EAST FELICIANA                     Jim Mack Parker
## 2618                    EAST FELICIANA                                    
## 2619                    EAST FELICIANA                                    
## 2620                    EAST FELICIANA                                    
## 2621                    EAST FELICIANA                                    
## 2622                    EAST FELICIANA                           Ron Smith
## 2623                    EAST FELICIANA                                    
## 2624                    EAST FELICIANA                                    
## 2625                    EAST FELICIANA                                    
## 2626                    EAST FELICIANA                                    
## 2627                    EAST FELICIANA                                    
## 2628                    EAST FELICIANA                                    
## 2629                    EAST FELICIANA                                    
## 2630                    EAST FELICIANA                                    
## 2631                    EAST FELICIANA                                    
## 2632 225-683-8572       EAST FELICIANA                      Talmadge Bunch
## 2633 225-683-5154       EAST FELICIANA                          David Dart
## 2634 225-683-8945       EAST FELICIANA                   Jeffrey D Gardner
## 2635 225-683-3358       EAST FELICIANA                      Michael DeJohn
## 2636 225-683-8577       EAST FELICIANA                     Dennis R Aucoin
## 2637 225-683-8577       EAST FELICIANA                          Chris Hall
## 2638 225-683-8577       EAST FELICIANA                  Edward L Brooks Sr
## 2639 225-683-8577       EAST FELICIANA                      Jason H McCray
## 2640 225-683-8577       EAST FELICIANA                         Keith Mills
## 2641 225-683-8577       EAST FELICIANA                         Dwight Hill
## 2642 225-683-8577       EAST FELICIANA             E L Larry Beauchamp III
## 2643 225-683-8577       EAST FELICIANA                   Karl Bubba Chaney
## 2644 225-683-8577       EAST FELICIANA                          Louis Kent
## 2645 225-683-3040       EAST FELICIANA                 Rufus Coach Nesbitt
## 2646 225-683-3040       EAST FELICIANA                    Melvin L Hollins
## 2647 225-683-3040       EAST FELICIANA               Broderick D Brooks Sr
## 2648 225-683-3040       EAST FELICIANA                       Mitch Harrell
## 2649 225-683-3040       EAST FELICIANA                       Beth L Dawson
## 2650 225-683-3040       EAST FELICIANA                     Rhonda Matthews
## 2651 225-683-3040       EAST FELICIANA                     Ben Coach Cupit
## 2652 225-683-3040       EAST FELICIANA                       Olivia Harris
## 2653 225-683-3040       EAST FELICIANA               Debra Spurlock Haynes
## 2654 225-683-3040       EAST FELICIANA                   Richard W Terrell
## 2655 225-683-3040       EAST FELICIANA                Michael Ray Bradford
## 2656 225-683-3040       EAST FELICIANA                         Paul S Kent
## 2657 225-683-6814       EAST FELICIANA              Raymond D Ray Williams
## 2658 225-634-2281       EAST FELICIANA                                    
## 2659 225-683-8324       EAST FELICIANA                  Marilyn Meeks Goff
## 2660 225-683-5765       EAST FELICIANA                     Nellie A Thomas
## 2661 225-654-4344       EAST FELICIANA                C Bernard Maglone Jr
## 2662 225-634-5578       EAST FELICIANA                      Clifton Morris
## 2663 225-683-8673       EAST FELICIANA                 James Bubba Bradham
## 2664 225-683-3331       EAST FELICIANA                    Marcy T Robinson
## 2665 225-683-5531       EAST FELICIANA                       Lori Ann Bell
## 2666 225-634-7777       EAST FELICIANA                     Charles Coleman
## 2667 225-654-4278       EAST FELICIANA               Robert Robbie Jackson
## 2668 225-629-5347       EAST FELICIANA                Rebecca Becky Bellue
## 2669 225-629-5415       EAST FELICIANA                    Marilyn Broadway
## 2670 225-654-4278       EAST FELICIANA                        Walter Smith
## 2671 225-634-7777       EAST FELICIANA                          Fred Allen
## 2672 225-683-5531       EAST FELICIANA                    Johnny Beauchamp
## 2673 225-683-5531       EAST FELICIANA                    George Kilbourne
## 2674 225-683-5531       EAST FELICIANA                Clovis L Matthews Sr
## 2675 225-683-5531       EAST FELICIANA               Lisa Davis Washington
## 2676 225-683-5531       EAST FELICIANA                    Kim Wilson Young
## 2677 225-654-4278       EAST FELICIANA                 Elizabeth Liz Aaron
## 2678 225-654-4278       EAST FELICIANA                        Aimee Bellue
## 2679 225-654-4278       EAST FELICIANA                       LaTrelle Cart
## 2680 225-654-4278       EAST FELICIANA                      Ashby Schwartz
## 2681 225-654-4278       EAST FELICIANA                     Nick St Germain
## 2682 225-329-5347       EAST FELICIANA                     Willie R Duncan
## 2683 225-329-5347       EAST FELICIANA                Anthony C Andy Jelks
## 2684 225-329-5347       EAST FELICIANA                        Jim Reynolds
## 2685 225-629-5415       EAST FELICIANA                        Yvonne Allen
## 2686 225-629-5415       EAST FELICIANA                      Georgia Honore
## 2687 225-629-5415       EAST FELICIANA                      Georgia Honore
## 2688 225-629-5415       EAST FELICIANA                    Harriett Sensley
## 2689 225-629-5415       EAST FELICIANA                  Harriett T Sensley
## 2690 225-629-5415       EAST FELICIANA                     Eunice N Smiley
## 2691 225-634-7777       EAST FELICIANA                   Michael O Harrell
## 2692 225-634-7777       EAST FELICIANA                          Don Havard
## 2693 225-634-7777       EAST FELICIANA                  John Henry McCrory
## 2694 225-634-7777       EAST FELICIANA                     Jim Mack Parker
## 2695 225-634-7777       EAST FELICIANA                        Rafe Stewart
## 2696                        EVANGELINE               James Henry Berthelot
## 2697                        EVANGELINE                         Marty Fruge
## 2698                        EVANGELINE                     Chasity Vidrine
## 2699                        EVANGELINE                                    
## 2700                        EVANGELINE                                    
## 2701                        EVANGELINE                                    
## 2702                        EVANGELINE                                    
## 2703                        EVANGELINE                                    
## 2704                        EVANGELINE                                    
## 2705                        EVANGELINE                                    
## 2706                        EVANGELINE                                    
## 2707                        EVANGELINE                                    
## 2708                        EVANGELINE                       Larry Lachney
## 2709                        EVANGELINE                       Jimmy LaFleur
## 2710                        EVANGELINE                        Bob McDaniel
## 2711                        EVANGELINE                      Cathy McDaniel
## 2712                        EVANGELINE             Warren James LaFleur Jr
## 2713                        EVANGELINE                                    
## 2714                        EVANGELINE                                    
## 2715                        EVANGELINE                                    
## 2716                        EVANGELINE                                    
## 2717                        EVANGELINE                                    
## 2718                        EVANGELINE                                    
## 2719                        EVANGELINE                                    
## 2720                        EVANGELINE                                    
## 2721 318-363-2161           EVANGELINE                       Eddie Soileau
## 2722 318-363-5671           EVANGELINE            Randall M Randy Deshotel
## 2723 337-363-4325           EVANGELINE                        Dirk Deville
## 2724 337-363-5521           EVANGELINE                  Charles E Fontenot
## 2725 337-363-5651           EVANGELINE                       Rocky B Rider
## 2726 337-363-5651           EVANGELINE                     Kenny A Burgess
## 2727 337-363-5651           EVANGELINE                         Ryan Ardoin
## 2728 337-363-5651           EVANGELINE                 Billy Lamar Johnson
## 2729 337-363-5651           EVANGELINE                       Kevin Veillon
## 2730 337-363-5651           EVANGELINE                      Eric B Soileau
## 2731 337-363-5651           EVANGELINE                     Bryan K Vidrine
## 2732 337-363-5651           EVANGELINE                 Ryan LeDay Williams
## 2733 337-363-5651           EVANGELINE                Richard Blood Thomas
## 2734 337-363-1500           EVANGELINE                  Donald J Launey Jr
## 2735 337-363-5886           EVANGELINE                     Ronald T Doucet
## 2736 337-363-6653           EVANGELINE                      Lonnie Sonnier
## 2737 337-363-6653           EVANGELINE                      Bobby Deshotel
## 2738 337-363-6653           EVANGELINE                    Jerry L Thompson
## 2739 337-363-6653           EVANGELINE                     Wayne N Dardeau
## 2740 337-363-6653           EVANGELINE                      Peggy J Forman
## 2741 337-363-6653           EVANGELINE                    David Landreneau
## 2742 337-363-6653           EVANGELINE                         Buck Dupuis
## 2743 337-363-6653           EVANGELINE              Wanda Anderson Skinner
## 2744 337-363-6653           EVANGELINE                       Scott Limoges
## 2745 337-363-6653           EVANGELINE                        Arthur Savoy
## 2746 337-363-6653           EVANGELINE                      Nancy A Hamlin
## 2747 337-363-6653           EVANGELINE                   Ellis Guillory Sr
## 2748 337-363-6653           EVANGELINE                 Georgianna L Wilson
## 2749 337-432-5721           EVANGELINE                          Dave McGee
## 2750 337-432-5721           EVANGELINE                     Charlotte Smith
## 2751 337-468-3503           EVANGELINE                     Hope Landreneau
## 2752 337-599-2093           EVANGELINE                          Wade Riley
## 2753 337-461-2664           EVANGELINE                 A C Robin Tatman Jr
## 2754 337-432-5574           EVANGELINE                        Earlin Fruge
## 2755 337-432-5574           EVANGELINE              Michael Mike Stockwell
## 2756 337-468-3544           EVANGELINE                     Joe Deshotel Jr
## 2757 337-461-2610           EVANGELINE                          Tim Causey
## 2758 337-461-2759           EVANGELINE               J Michael Mike Causey
## 2759 337-363-2939           EVANGELINE                    Jennifer Vidrine
## 2760 337-468-3272           EVANGELINE                      Ricky Fontenot
## 2761 337-885-2500           EVANGELINE              Jackie Malveaux Thomas
## 2762 318-599-2904           EVANGELINE                        Terry Savant
## 2763 337-461-2212           EVANGELINE                 Heather Miley Cloud
## 2764 337-363-2939           EVANGELINE                       Neal Lartigue
## 2765 337-468-3272           EVANGELINE                         Greg Dupuis
## 2766 337-885-2500           EVANGELINE                       Paul Allen Jr
## 2767 318-599-2904           EVANGELINE                        L C Deshotel
## 2768 337-461-2212           EVANGELINE                         Brad Wilson
## 2769                        EVANGELINE                      Leisa Deshotel
## 2770 337-468-3272           EVANGELINE                     Freddie Matthew
## 2771 337-468-3272           EVANGELINE                Richard Scott Christ
## 2772 337-468-3272           EVANGELINE                      Charles L Reed
## 2773 337-468-3272           EVANGELINE                       Robin L Young
## 2774 337-363-2939           EVANGELINE                         C J Dardeau
## 2775 337-363-2939           EVANGELINE                        Jerry Joseph
## 2776 337-363-2939           EVANGELINE                         Mike Perron
## 2777 337-363-2939           EVANGELINE                    Freddie Rev Jack
## 2778 337-363-2939           EVANGELINE                          Donald Sam
## 2779 337-363-2939           EVANGELINE                     Taranza M Arvie
## 2780 337-885-2500           EVANGELINE                    Lucy Jones Green
## 2781 337-885-2500           EVANGELINE                  Nicholas Papillion
## 2782 337-885-2500           EVANGELINE                     Joseph H Simien
## 2783 318-559-2904           EVANGELINE                     Tammy M Hammond
## 2784 318-559-2904           EVANGELINE                          Debbie Oge
## 2785 318-559-2904           EVANGELINE                          Quint West
## 2786 337-461-2212           EVANGELINE                         Joey Ducote
## 2787 337-461-2212           EVANGELINE                     Kenneth Johnson
## 2788 337-461-2212           EVANGELINE                Louis Dale Marcantel
## 2789                          FRANKLIN                       Christy Allen
## 2790                          FRANKLIN                        Woodrow Bell
## 2791                          FRANKLIN                      David Tolliver
## 2792                          FRANKLIN                                    
## 2793                          FRANKLIN                                    
## 2794                          FRANKLIN                                    
## 2795                          FRANKLIN                                    
## 2796                          FRANKLIN                                    
## 2797                          FRANKLIN                                    
## 2798                          FRANKLIN                                    
## 2799                          FRANKLIN                    John Henry Baker
## 2800                          FRANKLIN                 Alyssa Leann Bonner
## 2801                          FRANKLIN                        Craig G Gill
## 2802                          FRANKLIN                    Henry Herford Jr
## 2803                          FRANKLIN                Samuel Clinton Noble
## 2804                          FRANKLIN                      Sherryll Beach
## 2805                          FRANKLIN                  Kevin Paul Carroll
## 2806                          FRANKLIN                                    
## 2807                          FRANKLIN                        Mike Collins
## 2808                          FRANKLIN                                    
## 2809                          FRANKLIN                Jonathan Aaron Black
## 2810                          FRANKLIN                                    
## 2811 318-435-4505             FRANKLIN                          Kevin Cobb
## 2812 318-435-5133             FRANKLIN                         Ann Johnson
## 2813 318-435-5390             FRANKLIN                           Rod Elrod
## 2814 318-435-7333             FRANKLIN                       Joel Eldridge
## 2815 318-435-9429             FRANKLIN                      Ricky Campbell
## 2816 318-435-9429             FRANKLIN                      KW Buddy Parks
## 2817 318-435-9429             FRANKLIN                      James H Harris
## 2818 318-435-9429             FRANKLIN                         Troy Hendry
## 2819 318-435-9429             FRANKLIN                         Roy L Scott
## 2820 318-435-9429             FRANKLIN                W H Rawhide Robinson
## 2821 318-435-9429             FRANKLIN                        Joe Lewis Jr
## 2822 318-435-4508             FRANKLIN                      Ann B McIntyre
## 2823 318-435-4508             FRANKLIN                      Bruce McCarthy
## 2824 318-435-9046             FRANKLIN                     Edwin Ray Bryan
## 2825 318-435-9046             FRANKLIN                       Ronnie Hatton
## 2826 318-435-9046             FRANKLIN                         Jesse Young
## 2827 318-435-9046             FRANKLIN                       Richard Kelly
## 2828 318-435-9046             FRANKLIN                    Louise J Johnson
## 2829 318-435-9046             FRANKLIN                       Tim W Eubanks
## 2830 318-435-9046             FRANKLIN                     Dorothy W Brown
## 2831 318-878-5436             FRANKLIN                  Errol P Pat Guyton
## 2832 318-435-7723             FRANKLIN                    Carl Williams Jr
## 2833 318-435-9875             FRANKLIN                      Sharon T Boone
## 2834 318-435-6062             FRANKLIN                          R V Arnold
## 2835 318-724-6448             FRANKLIN                        Bill Carroll
## 2836 318-724-7693             FRANKLIN                    Lawrence Roberts
## 2837 318-435-5960             FRANKLIN                  Jimmie R Spears Sr
## 2838 318-722-3752             FRANKLIN                    Johnnie Marshall
## 2839 318-248-3163             FRANKLIN                  Carl Trey Williams
## 2840 318-435-5808             FRANKLIN                         Glynn R Day
## 2841 318-435-5740             FRANKLIN                     Stacy Thomas Jr
## 2842 318-724-7455             FRANKLIN                    Danny Richardson
## 2843 318-723-7693             FRANKLIN                          Dale Mason
## 2844 318-435-9616             FRANKLIN                  Timothy Washington
## 2845 318-435-9087             FRANKLIN                      Jackie Johnson
## 2846 318-724-6568             FRANKLIN                  Allyn Jean Luckett
## 2847 318-248-3700             FRANKLIN                  Jean Simmons Clark
## 2848 318-435-6506             FRANKLIN                       Mike Stephens
## 2849 318-435-9087             FRANKLIN                       Lester Thomas
## 2850 318-274-6568             FRANKLIN                    Billy Cureington
## 2851 318-248-3700             FRANKLIN                        Danny Barber
## 2852 318-435-6506             FRANKLIN                            Ty Britt
## 2853 318-724-6568             FRANKLIN                      Nettie B Brown
## 2854 318-724-6568             FRANKLIN                      Roger Hilliard
## 2855 318-724-6568             FRANKLIN                        Thomas Lemle
## 2856 318-724-6568             FRANKLIN                        Marc McCarty
## 2857 318-724-6568             FRANKLIN                        Thomas Moore
## 2858 318-248-3700             FRANKLIN                        Marie Barber
## 2859 318-248-3700             FRANKLIN                           Joe Chase
## 2860 318-248-3700             FRANKLIN                       Larry Laborde
## 2861 318-435-6506             FRANKLIN                         Kay Dunaway
## 2862 318-435-6506             FRANKLIN                     Christine Ezell
## 2863 318-435-6506             FRANKLIN                 Randell Randy Lloyd
## 2864 318-435-9087             FRANKLIN                            Kay Cupp
## 2865 318-435-9087             FRANKLIN                    John Sonny Dumas
## 2866 318-435-9087             FRANKLIN                       Betty Johnson
## 2867 318-435-9087             FRANKLIN                        Craig G Gill
## 2868 315-435-9087             FRANKLIN                        Rex McCarthy
## 2869                             GRANT                   Brandon Henderson
## 2870                             GRANT                                    
## 2871                             GRANT                                    
## 2872                             GRANT                                    
## 2873                             GRANT                                    
## 2874                             GRANT                                    
## 2875                             GRANT                                    
## 2876                             GRANT                                    
## 2877                             GRANT                                    
## 2878                             GRANT                          Sam Brimer
## 2879                             GRANT                        Trevor S Fry
## 2880                             GRANT                                    
## 2881                             GRANT                                    
## 2882                             GRANT                   Tony L Bo Vets II
## 2883                             GRANT                                    
## 2884                             GRANT                                    
## 2885                             GRANT                                    
## 2886                             GRANT                                    
## 2887                             GRANT                                    
## 2888 318-627-3261                GRANT                       Steven McCain
## 2889 318-627-3246                GRANT                     J ElRay Lemoine
## 2890 318-627-5471                GRANT                       Walker Wright
## 2891 318-627-3114                GRANT                     Roy Dean Nugent
## 2892 318-627-3157                GRANT                    Brandon J DuBois
## 2893 318-627-3157                GRANT                 Robert Bobby Martin
## 2894 318-627-3157                GRANT                        Tom Hamilton
## 2895 318-627-3157                GRANT                    Arnold R Murrell
## 2896 318-627-3157                GRANT                     Britton Carroll
## 2897 318-627-3157                GRANT                   Winston K Roberts
## 2898 318-627-3157                GRANT                Herman Buddy Collins
## 2899 318-627-3157                GRANT                 Donald G Don Arnold
## 2900 318-627-3274                GRANT                  A J Tony Lavespere
## 2901 318-627-3274                GRANT                     Marvin P Delong
## 2902 318-627-3274                GRANT                      Karen Y Layton
## 2903 318-627-3274                GRANT                        Eddie Baxley
## 2904 318-627-3274                GRANT             Randolph Randy Browning
## 2905 318-627-3274                GRANT                         A D Futrell
## 2906 318-627-3274                GRANT                  R L Buddy Pennison
## 2907 318-627-3274                GRANT                      Terry W Oliver
## 2908 318-646-3831                GRANT                          Doug James
## 2909 318-627-3759                GRANT                                    
## 2910 318-640-2210                GRANT               Karen Holston Edwards
## 2911 318-765-3997                GRANT                  Judy Guynes Brimer
## 2912 318-899-3732                GRANT               Charles E Chuck Evans
## 2913 318-646-2224                GRANT            John Timothy Tim Coolman
## 2914 318-627-5990                GRANT                      Willie R Peavy
## 2915 318-641-9031                GRANT                      Dewayne Briggs
## 2916 318-765-3423                GRANT                   R Duran Armstrong
## 2917 318-899-3870                GRANT                     F H Bubba Dykes
## 2918 318-627-3711                GRANT                     Gerald Hamilton
## 2919 318-646-3110                GRANT                   Vera Susie Waters
## 2920 318-765-3796                GRANT                      Jerome F Scott
## 2921 318-641-0430                GRANT                        Kelly Sommer
## 2922 318-899-5341                GRANT                         John Landry
## 2923 318-827-5527                GRANT                         Danny Olden
## 2924 318-765-3796                GRANT                    Christopher Paul
## 2925 318-641-0430                GRANT                       Brian Edwards
## 2926 318-827-5527                GRANT                Billy Ray Prince III
## 2927 318-627-3711                GRANT                      Alan D Futrell
## 2928 318-627-3711                GRANT               Lourain Colson LaCour
## 2929 318-627-3711                GRANT                         Cora L Reed
## 2930 318-627-3711                GRANT                     Lorraine G Sapp
## 2931 318-627-3711                GRANT                   Gayle Sonny Tyler
## 2932 318-641-0430                GRANT                        Alena Aycock
## 2933 318-641-0430                GRANT                       Linda Gammons
## 2934 318-641-0430                GRANT                      Jonathan Ramos
## 2935 318-899-5341                GRANT                        Della Barbee
## 2936 318-899-5341                GRANT                   Sandra Garlington
## 2937 318-899-5341                GRANT                    Belinda Gauthier
## 2938 318-827-5527                GRANT                        Jim Bradford
## 2939 318-827-5527                GRANT                        Dorothy Self
## 2940 318-827-5527                GRANT                      Ray Williamson
## 2941 318-646-3110                GRANT                           Joe Allen
## 2942 318-646-3110                GRANT                        Von Gilrease
## 2943 318-646-3110                GRANT              Lasonya Denise Pearson
## 2944 318-646-3110                GRANT                        Jack Rushing
## 2945 318-646-3110                GRANT                         John Savant
## 2946 318-765-3796                GRANT                 Gregory Greg Decker
## 2947 318-765-3796                GRANT                      June P Johnson
## 2948 318-765-3796                GRANT                Carol Denise Weidner
## 2949 318-765-3796                GRANT                  Ronald Ron Wilkins
## 2950 318-765-3796                GRANT                        Sharon L Zeh
## 2951                            IBERIA                     Zaphany E Banks
## 2952                            IBERIA                         Larry Rader
## 2953                            IBERIA                        Perry Segura
## 2954                            IBERIA                                    
## 2955                            IBERIA                                    
## 2956                            IBERIA                                    
## 2957                            IBERIA                                    
## 2958                            IBERIA                                    
## 2959                            IBERIA                Sanders J Butler III
## 2960                            IBERIA                                    
## 2961                            IBERIA                                    
## 2962                            IBERIA                                    
## 2963                            IBERIA                                    
## 2964                            IBERIA                                    
## 2965                            IBERIA                                    
## 2966                            IBERIA                                    
## 2967                            IBERIA                                    
## 2968                            IBERIA                          Kyla Magar
## 2969                            IBERIA                 JoAnn Hooper Parker
## 2970                            IBERIA                                    
## 2971                            IBERIA                     James Wyche III
## 2972                            IBERIA                                    
## 2973                            IBERIA                     Oneal Jones III
## 2974                            IBERIA                                    
## 2975                            IBERIA            Gerald Beau Beaullieu IV
## 2976                            IBERIA                                    
## 2977                            IBERIA                                    
## 2978                            IBERIA                                    
## 2979                            IBERIA                     Irvin Vaughn Jr
## 2980                            IBERIA                    Simone Champagne
## 2981                            IBERIA                                    
## 2982                            IBERIA                                    
## 2983                            IBERIA                                    
## 2984 318-369-3714               IBERIA                         Louis Ackal
## 2985 337-365-7282               IBERIA                     Mike Thibodeaux
## 2986 337-369-4415               IBERIA                        Rickey Huval
## 2987 337-276-6374               IBERIA                     Carl M MD Ditch
## 2988 337-365-8246               IBERIA                   Errol Romo Romero
## 2989 337-365-8246               IBERIA                    Maggie F Daniels
## 2990 337-365-8246               IBERIA                  Curtis Joe Boudoin
## 2991 337-365-8246               IBERIA                     Thomas J Landry
## 2992 337-365-8246               IBERIA                         Lloyd Brown
## 2993 337-365-8246               IBERIA                        Troy Comeaux
## 2994 337-365-8246               IBERIA                 Bernard E Broussard
## 2995 337-365-8246               IBERIA                       David M Ditch
## 2996 337-365-8246               IBERIA                   Ricky J Gonsoulin
## 2997 337-365-8246               IBERIA                      Glenn P Romero
## 2998 337-365-8246               IBERIA                        Roger Duncan
## 2999 337-365-8246               IBERIA                      Jerome W Fitch
## 3000 337-365-8246               IBERIA              Aquicline Rener Arnold
## 3001 337-365-8246               IBERIA                        Marty Trahan
## 3002 337-365-8246               IBERIA                  David Wayne Romero
## 3003 337-276-5603               IBERIA                   Cameron B Simmons
## 3004 318-369-2334               IBERIA                     Robert L Segura
## 3005 337-276-5603               IBERIA               Fernest Pacman Martin
## 3006 318-369-2332               IBERIA                Victor Vic Delcambre
## 3007 337-365-2341               IBERIA                 Clara Degay Carrier
## 3008 337-365-2341               IBERIA                    Elvin Dee Pradia
## 3009 337-365-2341               IBERIA                        Jay McDonald
## 3010 337-365-2341               IBERIA                     Zebulon A Simon
## 3011 337-365-2341               IBERIA                    Robbie J LeBlanc
## 3012 337-365-2341               IBERIA                  Kenneth Lockett Sr
## 3013 337-365-2341               IBERIA                      Dan LeBlanc Sr
## 3014 337-365-2341               IBERIA                     Edwin Ed Buford
## 3015 337-365-2341               IBERIA                        Dana P Dugas
## 3016 337-365-2341               IBERIA                       Rachel Segura
## 3017 337-365-2341               IBERIA                   Kathleen Rosamond
## 3018 337-365-2341               IBERIA                  Arthur L Alexander
## 3019 337-365-2341               IBERIA                      Danny D Segura
## 3020 337-365-2341               IBERIA                 Kenric Mushy Fremin
## 3021 337-364-4409               IBERIA                John N Johnny Hebert
## 3022 337-364-3662               IBERIA                   Henry Charpentier
## 3023 337-229-4925               IBERIA                    Veronica B Ferry
## 3024 337-367-3515               IBERIA                    Lynn P Guillotte
## 3025 337-365-1019               IBERIA                    Mark Charpentier
## 3026 337-229-4995               IBERIA                Benjamin J Hoffpauir
## 3027 337-276-4587               IBERIA                        Tim Declouet
## 3028 337-369-2300               IBERIA                  Hilda Daigre Curry
## 3029 337-229-8306               IBERIA                 Albert Al Broussard
## 3030 337-276-4587               IBERIA             Aprill Francis Foulcard
## 3031 337-369-2300               IBERIA                          Dan Doerle
## 3032 337-229-8306               IBERIA                        Brad Clifton
## 3033 337-229-8306               IBERIA                         Mark Landry
## 3034 337-229-8306               IBERIA                       Sandy Sonnier
## 3035 337-276-4587               IBERIA                     Zaphany E Banks
## 3036 337-276-4587               IBERIA      Charles Charlie Brown Williams
## 3037 337-276-4587               IBERIA                Sanders Sandy Derise
## 3038 337-276-4587               IBERIA                        Kenneth Kern
## 3039 337-369-2300               IBERIA                 Natalie Lopez Robin
## 3040 337-369-2300               IBERIA                   Peggy Lewis Gerac
## 3041 337-369-2300               IBERIA                        Robert Suire
## 3042 337-369-2300               IBERIA                  David John Merrill
## 3043 337-369-2300               IBERIA                Raymond ShoeDo Lewis
## 3044 337-369-2300               IBERIA                      Calvin Begnaud
## 3045                         IBERVILLE                  Jessel M Ourso III
## 3046                         IBERVILLE             Edward A Lucky Songy Jr
## 3047                         IBERVILLE                                    
## 3048                         IBERVILLE                                    
## 3049                         IBERVILLE                                    
## 3050                         IBERVILLE                                    
## 3051                         IBERVILLE                                    
## 3052                         IBERVILLE                                    
## 3053                         IBERVILLE                                    
## 3054                         IBERVILLE                                    
## 3055                         IBERVILLE                                    
## 3056                         IBERVILLE                                    
## 3057                         IBERVILLE                                    
## 3058                         IBERVILLE                                    
## 3059                         IBERVILLE                                    
## 3060                         IBERVILLE                 Vanessa Banta Moore
## 3061                         IBERVILLE                                    
## 3062                         IBERVILLE                                    
## 3063                         IBERVILLE                                    
## 3064                         IBERVILLE                                    
## 3065                         IBERVILLE                                    
## 3066                         IBERVILLE                                    
## 3067                         IBERVILLE                                    
## 3068                         IBERVILLE                    Karen Fitzgerald
## 3069                         IBERVILLE                                    
## 3070                         IBERVILLE                                    
## 3071                         IBERVILLE                                    
## 3072                         IBERVILLE                                    
## 3073                         IBERVILLE                                    
## 3074 225-687-5100            IBERVILLE                      Brett M Stassi
## 3075 225-687-5160            IBERVILLE                J G Bubbie Dupont Jr
## 3076 225-687-3568            IBERVILLE                        Randy Sexton
## 3077 225-687-8555            IBERVILLE                       James E Grace
## 3078 225-687-3257            IBERVILLE            Jessel Mitchell Ourso Jr
## 3079 225-687-3257            IBERVILLE              Warren TNotchie Taylor
## 3080 225-687-3257            IBERVILLE                     Mitchel J Ourso
## 3081 225-687-3257            IBERVILLE                  Henry Bucket Scott
## 3082 225-687-3257            IBERVILLE                Leonard Buck Jackson
## 3083 225-687-3257            IBERVILLE                Edwin M Ed Reeves Jr
## 3084 225-687-3257            IBERVILLE                  Salaris Sal Butler
## 3085 225-687-3257            IBERVILLE                     Howard Oubre Jr
## 3086 225-687-3257            IBERVILLE                      Hunter Markins
## 3087 225-687-3257            IBERVILLE                    Terry J Bradford
## 3088 225-687-3257            IBERVILLE                   Louis Pete Kelley
## 3089 225-687-3257            IBERVILLE                          Tim Vallet
## 3090 225-687-3257            IBERVILLE                         Matt Jewell
## 3091 225-687-3257            IBERVILLE                         Bart Morgan
## 3092 225-687-7236            IBERVILLE              Michael M Distefano Sr
## 3093 225-687-7236            IBERVILLE                   SJ Bronco Wilbert
## 3094 225-687-4341            IBERVILLE                Donald Ray Patterson
## 3095 225-687-4341            IBERVILLE                       Pamela George
## 3096 225-687-4341            IBERVILLE                      Glyna M Kelley
## 3097 225-687-4341            IBERVILLE                 Michael J Hebert Jr
## 3098 225-687-4341            IBERVILLE              Pauline D Polly Higdon
## 3099 225-687-4341            IBERVILLE                Michael Chief Barbee
## 3100 225-687-4341            IBERVILLE                 Thomas Tom Delahaye
## 3101 225-687-4341            IBERVILLE                   Dorothy R Sansoni
## 3102 225-687-4341            IBERVILLE                 Yolanda Butler Laws
## 3103 225-687-4341            IBERVILLE                      Brian S Willis
## 3104 225-687-4341            IBERVILLE                   Nancy T Broussard
## 3105 225-687-4341            IBERVILLE              Freddie Sam Molden III
## 3106 225-687-4341            IBERVILLE                        Melvin Lodge
## 3107 225-687-4341            IBERVILLE                     John Morris III
## 3108 225-687-4341            IBERVILLE                     Darlene M Ourso
## 3109 225-545-3034            IBERVILLE                 Roland Roach Fremin
## 3110 225-642-9692            IBERVILLE                     Jimmy Green III
## 3111 225-687-1235            IBERVILLE                  Steve C Pine Smith
## 3112 225-776-3053            IBERVILLE                    Darryl J Crowson
## 3113 225-659-2272            IBERVILLE                 Justin Kane Mendoza
## 3114 225-625-2383            IBERVILLE                       Jackie Wesley
## 3115 225-545-8597            IBERVILLE                  Joseph Joe Richard
## 3116 225-642-0031            IBERVILLE               Lloyd Big Red Snowten
## 3117 225-687-9568            IBERVILLE                        Tommy Tucker
## 3118 225-687-5252            IBERVILLE                      John JB Barker
## 3119 225-569-7049            IBERVILLE                Ronald Ronnie Hebert
## 3120 225-648-2766            IBERVILLE                       Larry Johnson
## 3121 225-687-3661            IBERVILLE                   Mark Tony Gulotta
## 3122 225-642-9600            IBERVILLE                   Lionel Johnson Jr
## 3123 225-625-2630            IBERVILLE                      John F Overton
## 3124 225-545-3012            IBERVILLE             Gerald Jermarr Williams
## 3125 225-648-2131            IBERVILLE               Michael  D Chauffe Sr
## 3126 225-648-2333            IBERVILLE        Lawrence Football Badeaux Sr
## 3127 225-687-3661            IBERVILLE                       Orian Gulotta
## 3128 225-642-9600            IBERVILLE             Kevin Butchie Ambeau Sr
## 3129 225-625-2630            IBERVILLE                       John E Simien
## 3130 225-545-3012            IBERVILLE                       Mario D Brown
## 3131 225-648-2131            IBERVILLE                      Tommy Dardenne
## 3132 225-648-2333            IBERVILLE                         Mike Sparks
## 3133 225-648-2333            IBERVILLE                         Kevin Gantt
## 3134 225-648-2333            IBERVILLE                     John Tim Doiron
## 3135 225-648-2333            IBERVILLE                    Dana N Alexander
## 3136 225-625-2630            IBERVILLE                Kirkland Anderson Sr
## 3137 225-625-2630            IBERVILLE                     Edward James Jr
## 3138 225-625-2630            IBERVILLE                         Demi Vorise
## 3139 225-625-2630            IBERVILLE                        Sam W Watson
## 3140 225-625-2630            IBERVILLE                 Clarence DDot Wiley
## 3141 225-545-3012            IBERVILLE                    John Plug Barlow
## 3142 225-545-3012            IBERVILLE             Jonathan JonKris Greene
## 3143 225-545-3012            IBERVILLE                  Dionne Bambi Lewis
## 3144 225-545-3012            IBERVILLE                   Barbara Bo O'Bear
## 3145 225-545-3012            IBERVILLE                       Garnell Young
## 3146 225-648-2131            IBERVILLE                         Kyle Booksh
## 3147 225-648-2131            IBERVILLE                Barbara Jeanie David
## 3148 225-648-2131            IBERVILLE                    Marcus D Hill Sr
## 3149 225-642-9600            IBERVILLE            Deborah Debbie Alexander
## 3150 225-642-9600            IBERVILLE              Flora Jean Danielfield
## 3151 225-642-9600            IBERVILLE             Freddie Carl Frazier Sr
## 3152 225-642-9600            IBERVILLE                    Melvin Hasten Sr
## 3153 225-642-9600            IBERVILLE            Ralph Big Guy Johnson Sr
## 3154 225-687-3661            IBERVILLE                   Lindon A Rivet Jr
## 3155 225-687-3661            IBERVILLE                     Oscar S Mellion
## 3156 225-687-3661            IBERVILLE                        Ralph Stassi
## 3157 225-687-3661            IBERVILLE                Michael Mickey Rivet
## 3158 225-687-3661            IBERVILLE            Timothy L Timmy Martinez
## 3159 225-687-3661            IBERVILLE            Jimmie Fat Boy Randle Jr
## 3160                           JACKSON                     Bobby Culpepper
## 3161                           JACKSON                                    
## 3162                           JACKSON                                    
## 3163                           JACKSON                                    
## 3164                           JACKSON                   Nathaniel Zeno Jr
## 3165                           JACKSON                                    
## 3166                           JACKSON                                    
## 3167                           JACKSON                                    
## 3168                           JACKSON                       Dusty Hampton
## 3169                           JACKSON                                    
## 3170                           JACKSON                                    
## 3171                           JACKSON                                    
## 3172                           JACKSON                                    
## 3173                           JACKSON                                    
## 3174                           JACKSON                                    
## 3175                           JACKSON                                    
## 3176 318-259-9021              JACKSON                          Andy Brown
## 3177 318-259-2424              JACKSON                     Ann B Walsworth
## 3178 318-259-2151              JACKSON                      Eddie G Gatlin
## 3179 318-259-4106              JACKSON                     WW Bill Staples
## 3180 318-259-2361              JACKSON                      Todd Culpepper
## 3181 318-259-2361              JACKSON                 Eddie Mack Langston
## 3182 318-259-2361              JACKSON                     Joshua Peterson
## 3183 318-259-2361              JACKSON                        Billy Bryant
## 3184 318-259-2361              JACKSON                   Maxie Faye Monroe
## 3185 318-259-2361              JACKSON               Charles Chuck Garrett
## 3186 318-259-2361              JACKSON                       Lynn Treadway
## 3187 318-259-4456              JACKSON                       Bart Waggoner
## 3188 318-259-4456              JACKSON                 Melissa Watts Perry
## 3189 318-259-4456              JACKSON                   Mary May Saulters
## 3190 318-259-4456              JACKSON                        Gerry W Mims
## 3191 318-259-4456              JACKSON                Harvey Troy Robinson
## 3192 318-259-4456              JACKSON                        Dennis Clary
## 3193 318-259-4456              JACKSON                        Wade McBride
## 3194 318-259-7492              JACKSON                         David Smith
## 3195 318-259-9442              JACKSON                     Milton S Bryant
## 3196 318-249-2200              JACKSON                    Martha Chambless
## 3197 318-259-8773              JACKSON                         Paula Magee
## 3198 318-259-7772              JACKSON                    Sharon L Satcher
## 3199 318-259-9286              JACKSON                     Claude McMillan
## 3200 318-249-4158              JACKSON                          Emma Jones
## 3201 318-249-2200              JACKSON                        Wayne Mosley
## 3202 318-259-3278              JACKSON                      Wilfred Foster
## 3203 318-259-7867              JACKSON                     John R Williams
## 3204 318-249-2541              JACKSON                       Herman Lenard
## 3205 318-249-2183              JACKSON                        Bill Wheelis
## 3206 318-259-2385              JACKSON                     Leslie Thompson
## 3207 318-259-9127              JACKSON                            Hal Mims
## 3208 318-259-4704              JACKSON                      Quenton Causey
## 3209 318-259-4272              JACKSON                    Geraldine Causey
## 3210 318-259-8014              JACKSON                            Joe Vail
## 3211 318-249-2541              JACKSON                         Mike Wilson
## 3212 318-249-2183              JACKSON                                    
## 3213 318-259-2385              JACKSON                       Wesley Horton
## 3214 318-259-9127              JACKSON                 Simmie T Slim Brown
## 3215 318-259-4704              JACKSON                      Johnny Shively
## 3216 318-259-4272              JACKSON                     Phillip Moffett
## 3217 318-259-8014              JACKSON                        Curtis Greer
## 3218                           JACKSON                  Lastevic Cottonham
## 3219 318-259-2385              JACKSON                          Sam Lamkin
## 3220 318-259-2385              JACKSON                      Renee Stringer
## 3221 318-259-2385              JACKSON               Charla Mason Thompson
## 3222 318-259-2385              JACKSON                       Devin Flowers
## 3223 318-249-2541              JACKSON                 Claudean Cartwright
## 3224 318-249-2541              JACKSON                      Gregory Harris
## 3225 318-249-2541              JACKSON                   Tonja Toni Malone
## 3226 318-249-2541              JACKSON              Sue Richardson Proffer
## 3227 318-249-2541              JACKSON                    Carline Thompson
## 3228 318-249-2183              JACKSON                      Melba J Creech
## 3229 318-249-2183              JACKSON                         Alisha Ford
## 3230 318-249-2183              JACKSON                   John David Howard
## 3231 318-259-9127              JACKSON                    Robert L Bradley
## 3232 318-259-9127              JACKSON                     Dorothy F Jones
## 3233 318-259-9127              JACKSON                 Johnny Will Mathews
## 3234 318-259-4704              JACKSON                           Steve Fox
## 3235 318-259-4704              JACKSON                     Paul F Robinson
## 3236 318-259-4704              JACKSON                      Willard Willis
## 3237 318-259-4272              JACKSON                       Eric D Hinton
## 3238 318-259-4272              JACKSON                          Ann Wigley
## 3239 318-259-4272              JACKSON                       Douglas Woods
## 3240 318-259-8014              JACKSON                        Kristi Greer
## 3241 318-259-8014              JACKSON                      Sylvia J Pagan
## 3242 318-259-8014              JACKSON                         James Trull
## 3243                         JEFFERSON                   Perry L Alexis Jr
## 3244                         JEFFERSON                         Donald Blum
## 3245                         JEFFERSON                       Kyle Green Jr
## 3246                         JEFFERSON                  Remy Voisin Starns
## 3247                         JEFFERSON                        Rudy S Smith
## 3248                         JEFFERSON                                    
## 3249                         JEFFERSON                  Keith M Hutchinson
## 3250                         JEFFERSON                        Paul Johnson
## 3251                         JEFFERSON           Sharlayne Jackson Prevost
## 3252                         JEFFERSON                 Malinda HillsHolmes
## 3253                         JEFFERSON                          Gilda Reed
## 3254                         JEFFERSON                     Michael M Davis
## 3255                         JEFFERSON                     David Gereighty
## 3256                         JEFFERSON                     Dwan S Hilferty
## 3257                         JEFFERSON                                    
## 3258                         JEFFERSON                          Tom Arnold
## 3259                         JEFFERSON                          Ben Bagert
## 3260                         JEFFERSON                        Betty Bonura
## 3261                         JEFFERSON                         Marie Clesi
## 3262                         JEFFERSON                      Allen Al Leone
## 3263                         JEFFERSON                 Joseph P Lopinto Jr
## 3264                         JEFFERSON                          Keith Rush
## 3265                         JEFFERSON                        Polly Thomas
## 3266                         JEFFERSON                        John S Treen
## 3267                         JEFFERSON                  Raymond Waguespack
## 3268                         JEFFERSON                        Billy Arnold
## 3269                         JEFFERSON                  Don Carmardelle Jr
## 3270                         JEFFERSON                        Timothy Hand
## 3271                         JEFFERSON                     Stephen Leonard
## 3272                         JEFFERSON                      Tripp Rabalais
## 3273                         JEFFERSON                      Melinda Doucet
## 3274                         JEFFERSON                     Paul D Johnston
## 3275                         JEFFERSON                   Bert C LeBlanc Jr
## 3276                         JEFFERSON                 Provino Vinny Mosca
## 3277                         JEFFERSON                          Tim Walker
## 3278                         JEFFERSON                          Paul Besse
## 3279                         JEFFERSON                     Charles Gennaro
## 3280                         JEFFERSON                      Nicholas Muniz
## 3281                         JEFFERSON                     Michael O'Brien
## 3282                         JEFFERSON               James H Jimmy Stevens
## 3283                         JEFFERSON                       Vincent Bruno
## 3284                         JEFFERSON              Philip Phil L Capitano
## 3285                         JEFFERSON                Kevin S Delahoussaye
## 3286                         JEFFERSON                  Dominick Impastato
## 3287                         JEFFERSON                        Jack Rizzuto
## 3288                         JEFFERSON                 Frank John LaBruzzo
## 3289                         JEFFERSON                 John Frank LaBruzzo
## 3290                         JEFFERSON                           Ray Muniz
## 3291                         JEFFERSON                       Eric Skrmetta
## 3292                         JEFFERSON       Robert A Coach Bob Stevens Sr
## 3293                         JEFFERSON                                    
## 3294 504-736-8913            JEFFERSON                   Rebecca M Olivier
## 3295 504-736-8977            JEFFERSON                   George W Giacobbe
## 3296 504-364-2800            JEFFERSON                        Roy M Cascio
## 3297 504-364-2800            JEFFERSON                                    
## 3298 504-367-3500            JEFFERSON                    Ann Murry Keller
## 3299 504-367-3500            JEFFERSON                 Andrea Price Janzen
## 3300 504-367-3500            JEFFERSON                  Nancy Amato Konrad
## 3301 504-363-5701            JEFFERSON                      Newell Normand
## 3302 504-364-2900            JEFFERSON                   Jon A Gegenheimer
## 3303 504-362-4100            JEFFERSON                    Thomas J Capella
## 3304 504-365-9100            JEFFERSON                   Gerry Cvitanovich
## 3305 504-364-2626            JEFFERSON                          John Young
## 3306 504-364-2626            JEFFERSON           Christopher Chris Roberts
## 3307 504-364-2626            JEFFERSON                     Elton M Lagasse
## 3308 504-364-2626            JEFFERSON                       Ricky Templet
## 3309 504-364-2626            JEFFERSON                     Paul D Johnston
## 3310 504-364-2626            JEFFERSON                         Mark Spears
## 3311 504-364-2626            JEFFERSON                 Earl B Ben Zahn III
## 3312 504-364-2626            JEFFERSON                    Cynthia LeeSheng
## 3313 504-349-7802            JEFFERSON                       Mark C Morgan
## 3314 504-349-7802            JEFFERSON                    Etta S Licciardi
## 3315 504-349-7802            JEFFERSON               Raymond Ray St Pierre
## 3316 504-349-7802            JEFFERSON                      Patrick Tovrea
## 3317 504-349-7802            JEFFERSON                        Cedric Floyd
## 3318 504-349-7802            JEFFERSON                        Larry N Dale
## 3319 504-349-7802            JEFFERSON                         Mark Jacobs
## 3320 504-349-7802            JEFFERSON         Michael Mike R Delesdernier
## 3321 504-349-7802            JEFFERSON                     Sandy Denapolis
## 3322 504-393-0032            JEFFERSON                  Vernon J Wilty III
## 3323 504-340-7458            JEFFERSON                      Patrick DeJean
## 3324 504-689-4106            JEFFERSON                    Charlie R Kerner
## 3325 985-787-2301            JEFFERSON                 Leon F Bradberry Jr
## 3326 504-838-4295            JEFFERSON         Charles V Chuck Cusimano II
## 3327 504-466-7984            JEFFERSON                    Kevin J Centanni
## 3328 504-436-3133            JEFFERSON                      Eugene Fitchue
## 3329                         JEFFERSON                   Roscoe W Lewis Sr
## 3330 504-367-3491            JEFFERSON                    Jonathan Liberto
## 3331 504-347-1206            JEFFERSON            Antoine J Tony Thomassie
## 3332 504-689-3179            JEFFERSON                 Albert T Creppel Sr
## 3333 504-787-2272            JEFFERSON                 Leon F Bradberry Sr
## 3334 504-833-9290            JEFFERSON                       Dan E Civello
## 3335 504-737-9196            JEFFERSON                    EJ Joe Bourgeois
## 3336 504-436-7494            JEFFERSON                   James D Cooper Sr
## 3337 504-469-6760            JEFFERSON                      Charles Wilson
## 3338 504-363-1500            JEFFERSON                     Ronnie C Harris
## 3339 504-737-6383            JEFFERSON                 Provino Vinny Mosca
## 3340 504-468-7254            JEFFERSON                     Michael S Yenni
## 3341 504-341-3424            JEFFERSON         John I Johnny Shaddinger Jr
## 3342 985-787-3196            JEFFERSON                  David J Camardelle
## 3343 504-689-2208            JEFFERSON                      Timothy Kerner
## 3344 504-363-1500            JEFFERSON                       Arthur Lawson
## 3345 504-363-1500            JEFFERSON                  Arthur S Lawson Jr
## 3346 504-737-6383            JEFFERSON                 Jacob Mac Dickinson
## 3347 504-468-7254            JEFFERSON                       Steve Caraway
## 3348 504-341-3424            JEFFERSON                 Dwayne Poncho Munch
## 3349 504-341-3424            JEFFERSON                 Dwayne Poncho Munch
## 3350 985-787-3196            JEFFERSON                      Euris A Dubois
## 3351 504-468-7254            JEFFERSON             Michele Pietri Branigan
## 3352 504-468-7254            JEFFERSON                     Jeannie M Black
## 3353 504-363-1500            JEFFERSON                    Milton Crosby Sr
## 3354 504-363-1500            JEFFERSON                     Milton L Crosby
## 3355 504-341-3424            JEFFERSON                         Glenn Green
## 3356 504-341-3424            JEFFERSON                         Glenn Green
## 3357 504-363-1500            JEFFERSON             Belinda Cambre Constant
## 3358 504-341-3424            JEFFERSON                         Ted J Munch
## 3359 504-363-1500            JEFFERSON                   Vincent E Cox III
## 3360 504-341-3424            JEFFERSON                          Ivy Rogers
## 3361 504-363-1500            JEFFERSON                      Raylyn Beevers
## 3362 504-363-1500            JEFFERSON                      Raylyn Beevers
## 3363 504-341-3424            JEFFERSON                       Melvin Guidry
## 3364 504-341-3424            JEFFERSON                      Larry J Warino
## 3365 985-787-3196            JEFFERSON                       Ray A Santiny
## 3366 985-787-3196            JEFFERSON                          Jay LaFont
## 3367 985-787-3196            JEFFERSON         Clifford A Dixie Santiny Jr
## 3368 985-787-3196            JEFFERSON            Stephen Scooter Resweber
## 3369 985-787-3196            JEFFERSON                    Leoda Bladsacker
## 3370 504-363-1500            JEFFERSON                         Wayne A Rau
## 3371 504-737-6383            JEFFERSON                 Timothy Tim Baudier
## 3372 504-737-6383            JEFFERSON                    Eric M Chatelain
## 3373 504-737-6383            JEFFERSON                          Dana Huete
## 3374 504-737-6383            JEFFERSON                     Lawrence Landry
## 3375 504-737-6383            JEFFERSON                        Cindy Murray
## 3376 504-468-7254            JEFFERSON                   Gregory W Carroll
## 3377 504-468-7254            JEFFERSON                          Joe Stagni
## 3378 504-468-7254            JEFFERSON                     Keith M Reynaud
## 3379 504-468-7254            JEFFERSON                 Maria C Defrancesch
## 3380 504-468-7254            JEFFERSON                      Kent Denapolis
## 3381 504-689-2208            JEFFERSON                   Barry Bartholomew
## 3382 504-689-2208            JEFFERSON               Christy Nunez Creppel
## 3383 504-689-2208            JEFFERSON                   Shirley M Guillie
## 3384 504-689-2208            JEFFERSON                 Calvin Butch LeBeau
## 3385 504-689-2208            JEFFERSON                    Verna Teta Smith
## 3386                   JEFFERSON DAVIS                                    
## 3387                   JEFFERSON DAVIS                                    
## 3388                   JEFFERSON DAVIS                                    
## 3389                   JEFFERSON DAVIS                        Johnny Adams
## 3390                   JEFFERSON DAVIS                                    
## 3391                   JEFFERSON DAVIS                                    
## 3392                   JEFFERSON DAVIS                                    
## 3393                   JEFFERSON DAVIS                                    
## 3394                   JEFFERSON DAVIS                                    
## 3395                   JEFFERSON DAVIS                                    
## 3396                   JEFFERSON DAVIS                                    
## 3397                   JEFFERSON DAVIS                                    
## 3398                   JEFFERSON DAVIS                                    
## 3399                   JEFFERSON DAVIS                                    
## 3400                   JEFFERSON DAVIS                                    
## 3401                   JEFFERSON DAVIS                                    
## 3402                   JEFFERSON DAVIS                                    
## 3403                   JEFFERSON DAVIS                                    
## 3404                   JEFFERSON DAVIS                                    
## 3405                   JEFFERSON DAVIS                                    
## 3406                   JEFFERSON DAVIS                                    
## 3407                   JEFFERSON DAVIS                                    
## 3408                   JEFFERSON DAVIS                                    
## 3409                   JEFFERSON DAVIS                                    
## 3410                   JEFFERSON DAVIS                                    
## 3411                   JEFFERSON DAVIS                                    
## 3412                   JEFFERSON DAVIS                                    
## 3413                   JEFFERSON DAVIS                                    
## 3414 337-821-2100      JEFFERSON DAVIS                           Ivy Woods
## 3415 337-824-1160      JEFFERSON DAVIS            Richard M Rick Arceneaux
## 3416 377-824-3451      JEFFERSON DAVIS                    Donald G Kratzer
## 3417 337-824-6072      JEFFERSON DAVIS                       Charles Deese
## 3418 337-824-4792      JEFFERSON DAVIS                        Donald Woods
## 3419 337-824-4792      JEFFERSON DAVIS                     John P Marceaux
## 3420 337-824-4792      JEFFERSON DAVIS                   Milford H Reed Jr
## 3421 337-824-4792      JEFFERSON DAVIS                   Bradley W Eastman
## 3422 337-824-4792      JEFFERSON DAVIS                      Tom Kilpatrick
## 3423 337-824-4792      JEFFERSON DAVIS                    Melvin Moe Adams
## 3424 337-824-4792      JEFFERSON DAVIS                Joseph Steve Eastman
## 3425 337-824-4792      JEFFERSON DAVIS                         Wayne Fruge
## 3426 337-824-4792      JEFFERSON DAVIS                Ruffin Curt Guillory
## 3427 337-824-4792      JEFFERSON DAVIS                        Byron Buller
## 3428 337-824-4792      JEFFERSON DAVIS                        Mark Pousson
## 3429 337-824-4792      JEFFERSON DAVIS                 William H Bill Wild
## 3430 337-824-4792      JEFFERSON DAVIS                Leonard Lenny Dupuis
## 3431 337-821-5514      JEFFERSON DAVIS                    Daniel Stretcher
## 3432 337-821-5514      JEFFERSON DAVIS               Clarence L Cormier Jr
## 3433 337-824-1834      JEFFERSON DAVIS                       Greg Bordelon
## 3434 337-824-1834      JEFFERSON DAVIS                        Malon Dobson
## 3435 337-824-1834      JEFFERSON DAVIS                   Phillip Arceneaux
## 3436 337-824-1834      JEFFERSON DAVIS                 Robert W Rob Menard
## 3437 337-824-1834      JEFFERSON DAVIS                         Donn E Dees
## 3438 337-824-1834      JEFFERSON DAVIS              David S Cap Capdeville
## 3439 337-824-1834      JEFFERSON DAVIS                  James Jimmy Segura
## 3440 337-824-1834      JEFFERSON DAVIS                         David Doise
## 3441 337-824-1834      JEFFERSON DAVIS                   Charles Bruchhaus
## 3442 337-824-1834      JEFFERSON DAVIS                      Richard McNabb
## 3443 337-824-1834      JEFFERSON DAVIS                        Bobby Miller
## 3444 337-824-1834      JEFFERSON DAVIS                        Jason Bouley
## 3445 337-824-1834      JEFFERSON DAVIS                Julius Bubba Caraway
## 3446 337-774-5263      JEFFERSON DAVIS                      Debbie Abshire
## 3447 337-584-2811      JEFFERSON DAVIS                     Linda G Langley
## 3448 337-582-1669      JEFFERSON DAVIS                       Tammie Miller
## 3449 337-734-2356      JEFFERSON DAVIS                    Robert B Ramagos
## 3450 337-824-4889      JEFFERSON DAVIS           Jennifer Courville Landry
## 3451                   JEFFERSON DAVIS                     George Gotreaux
## 3452 337-774-3471      JEFFERSON DAVIS                  C H Brandy Hammond
## 3453 337-584-2617      JEFFERSON DAVIS             Cursey Junior Marcantel
## 3454 337-738-5755      JEFFERSON DAVIS                                    
## 3455 337-734-2580      JEFFERSON DAVIS                       Robyn Leblanc
## 3456 337-824-0822      JEFFERSON DAVIS                     Joseph W Guidry
## 3457 337-588-4485      JEFFERSON DAVIS                     Lee Adam Landry
## 3458 337-821-5500      JEFFERSON DAVIS                       Terry W Duhon
## 3459 337-584-2992      JEFFERSON DAVIS                 Cathy Hollingsworth
## 3460 337-774-2211      JEFFERSON DAVIS                     Robbie Bertrand
## 3461 337-734-2231      JEFFERSON DAVIS                    Carolyn Louviere
## 3462 337-756-2321      JEFFERSON DAVIS                   Eddie B Alfred Jr
## 3463 337-584-2992      JEFFERSON DAVIS                       Bruce Lemelle
## 3464 337-774-2211      JEFFERSON DAVIS                      Cheryl Vincent
## 3465 337-734-2231      JEFFERSON DAVIS                      Marcus Crochet
## 3466                   JEFFERSON DAVIS                   Luther Sam Alfred
## 3467 337-734-2231      JEFFERSON DAVIS                        Allen Ardoin
## 3468 337-734-2231      JEFFERSON DAVIS                       Charles Drake
## 3469 337-734-2231      JEFFERSON DAVIS                          Hugh Fruge
## 3470 337-734-2231      JEFFERSON DAVIS                        Becky Hudson
## 3471 337-734-2231      JEFFERSON DAVIS                    Robert Bob Owens
## 3472 337-756-2321      JEFFERSON DAVIS                  Curtis Red Dickens
## 3473 337-756-2321      JEFFERSON DAVIS                          Mary Jones
## 3474 337-756-2321      JEFFERSON DAVIS                Clifford Brian Leday
## 3475 337-584-2992      JEFFERSON DAVIS                       Tony Guillory
## 3476 337-584-2992      JEFFERSON DAVIS             Shirley LaFleur Johnson
## 3477 337-584-2992      JEFFERSON DAVIS                  Margaret G Langley
## 3478 337-584-2992      JEFFERSON DAVIS                      Marcus Lemoine
## 3479 337-584-2992      JEFFERSON DAVIS                        Brenda Moore
## 3480 337-774-2211      JEFFERSON DAVIS                   Dorothy L Charles
## 3481 337-774-2211      JEFFERSON DAVIS                Sherry Hymel Crochet
## 3482 337-774-2211      JEFFERSON DAVIS                     Ellsworth Duhon
## 3483 337-774-2211      JEFFERSON DAVIS                         David Hanks
## 3484 337-774-2211      JEFFERSON DAVIS                         Troy Trahan
## 3485 337-821-5500      JEFFERSON DAVIS                     Rogeous Lawdins
## 3486 337-821-5500      JEFFERSON DAVIS                     Johnny Armentor
## 3487 337-821-5500      JEFFERSON DAVIS                          Trey Myers
## 3488 337-821-5500      JEFFERSON DAVIS           Anthony Philip LeBlanc Jr
## 3489 337-821-5500      JEFFERSON DAVIS                      Stevie VanHook
## 3490                         LAFAYETTE                        Ann L Ardoin
## 3491                         LAFAYETTE           Alfred F Freddie Boustany
## 3492                         LAFAYETTE                     Elroy Broussard
## 3493                         LAFAYETTE                  Earl Nickey Picard
## 3494                         LAFAYETTE                       Michael Stagg
## 3495                         LAFAYETTE                    Stephen Handwerk
## 3496                         LAFAYETTE          Susannah Johnson Malbreaux
## 3497                         LAFAYETTE                   Jolan H Jolivette
## 3498                         LAFAYETTE                      James D Thomas
## 3499                         LAFAYETTE                     Theresa Rohloff
## 3500                         LAFAYETTE                    John D Bernhardt
## 3501                         LAFAYETTE                      Richard Miller
## 3502                         LAFAYETTE                      Glenn Armentor
## 3503                         LAFAYETTE               Denise Tauzin D'Amato
## 3504                         LAFAYETTE                 W Thomas Tom Angers
## 3505                         LAFAYETTE                      Ward F Lafleur
## 3506                         LAFAYETTE                        Brian L Pope
## 3507                         LAFAYETTE                        Tim Reynolds
## 3508                         LAFAYETTE                    J Hunter Simmons
## 3509                         LAFAYETTE                Michael Louis Hebert
## 3510                         LAFAYETTE                Raymond LaLa LaLonde
## 3511                         LAFAYETTE        Merle Elizabeth Betsy Arabie
## 3512                         LAFAYETTE                     Deborah R Young
## 3513                         LAFAYETTE                  Nathan G Broussard
## 3514                         LAFAYETTE                    Denice C Skinner
## 3515                         LAFAYETTE                   William H Goforth
## 3516                         LAFAYETTE            Matthew D Matt McConnell
## 3517                         LAFAYETTE                 Randal Randy Menard
## 3518 337-232-9211            LAFAYETTE               Michael Mike Neustrom
## 3519 337-233-0150            LAFAYETTE                      Louis J Perret
## 3520 337-291-7080            LAFAYETTE                    Conrad T Comeaux
## 3521 337-291-8810            LAFAYETTE              Lester Joseph Durel Jr
## 3522 337-291-8810            LAFAYETTE                        Kevin Naquin
## 3523 337-291-8810            LAFAYETTE              Joseph Jay Castille Jr
## 3524 337-291-8810            LAFAYETTE                     Brandon Shelvin
## 3525 337-291-8810            LAFAYETTE                 Kenneth P Boudreaux
## 3526 337-291-8810            LAFAYETTE                       Jared Bellard
## 3527 337-291-8810            LAFAYETTE                  Andr'e Andy Naquin
## 3528 337-291-8810            LAFAYETTE               Donald L Don Bertrand
## 3529 337-291-8810            LAFAYETTE                       Keith J Patin
## 3530 337-291-8810            LAFAYETTE                     William Theriot
## 3531 337-291-8777            LAFAYETTE                   Francie Bouillion
## 3532 337-291-8761            LAFAYETTE                    Douglas J Saloom
## 3533 337-291-8725            LAFAYETTE                  Earl Nickey Picard
## 3534 337-521-7000            LAFAYETTE                      Mark Babineaux
## 3535 337-521-7000            LAFAYETTE                       Tommy Angelle
## 3536 337-521-7000            LAFAYETTE                      Shelton J Cobb
## 3537 337-521-7000            LAFAYETTE                      Tehmi Chassion
## 3538 337-521-7000            LAFAYETTE                  Kermit J Bouillion
## 3539 337-521-7000            LAFAYETTE                         Greg Awbrey
## 3540 337-521-7000            LAFAYETTE                      Mark Cockerham
## 3541 337-521-7000            LAFAYETTE                      Hunter Beasley
## 3542 337-521-7000            LAFAYETTE                        Rae B Trahan
## 3543 337-873-3646            LAFAYETTE                     Preston J Leger
## 3544 337-873-8413            LAFAYETTE                     Kermit J Guidry
## 3545 337-856-5515            LAFAYETTE                 Lynwood J Broussard
## 3546 337-837-1404            LAFAYETTE                   Barbara Broussard
## 3547 337-896-6605            LAFAYETTE               Michael Chalk Angelle
## 3548 337-896-6605            LAFAYETTE           Kevin C Chee Chee Credeur
## 3549 337-856-4303            LAFAYETTE                   Donald Don Garber
## 3550 337-989-1729            LAFAYETTE            Weston J Bruce Broussard
## 3551                         LAFAYETTE                     Nancy L Poirier
## 3552 337-873-4292            LAFAYETTE                 Judy Lantier Menard
## 3553 337-873-8918            LAFAYETTE                       Aldon L Duhon
## 3554 337-856-4560            LAFAYETTE                          Jay Hebert
## 3555 337-837-6298            LAFAYETTE                        Laura Menard
## 3556 337-896-6512            LAFAYETTE                     Russell Comeaux
## 3557 337-896-6512            LAFAYETTE                           Pat Dugas
## 3558 337-989-9146            LAFAYETTE                      Darrell Menard
## 3559 337-232-2930            LAFAYETTE               Harold Harry Domingue
## 3560 337-856-5643            LAFAYETTE                Sanford Butch Landry
## 3561 337-896-8481            LAFAYETTE                   Glenn L Brasseaux
## 3562 337-233-1130            LAFAYETTE              Purvis Joseph Morrison
## 3563 337-856-4181            LAFAYETTE                  Wilson B Viator Jr
## 3564 337-896-8481            LAFAYETTE                        Carlos Stout
## 3565 337-233-1130            LAFAYETTE                          Chad Leger
## 3566 337-856-4181            LAFAYETTE                         Earl Menard
## 3567                         LAFAYETTE                    JanScott Richard
## 3568 337-896-8481            LAFAYETTE                Antoine Babineaux Jr
## 3569 337-896-8481            LAFAYETTE                       L J Boudreaux
## 3570 337-896-8481            LAFAYETTE                          Kim Guidry
## 3571 337-896-8481            LAFAYETTE                         J L Richard
## 3572 337-896-8481            LAFAYETTE                   Alfred Al Sinegal
## 3573 337-233-1130            LAFAYETTE                          Bill Young
## 3574 337-233-1130            LAFAYETTE                     Terry Montoucet
## 3575 337-233-1130            LAFAYETTE                     Danny T Hollier
## 3576 337-233-1130            LAFAYETTE                         Mark Moreau
## 3577 337-856-4181            LAFAYETTE                          Ken Ritter
## 3578 337-856-4181            LAFAYETTE                     Brenda J Burley
## 3579 337-856-4181            LAFAYETTE                      A J Bernard Jr
## 3580 337-856-4181            LAFAYETTE                         Tim Barbier
## 3581 337-856-4181            LAFAYETTE                 Dianne W McClelland
## 3582                         LAFOURCHE                      Lawrence Autin
## 3583                         LAFOURCHE                         Jerry Jones
## 3584                         LAFOURCHE                   Charles A LeBlanc
## 3585                         LAFOURCHE                        Rita Rivault
## 3586                         LAFOURCHE                    Nelson Taylor Sr
## 3587                         LAFOURCHE                        David Hebert
## 3588                         LAFOURCHE                        Sandy Arabie
## 3589                         LAFOURCHE                     Preston J Roddy
## 3590                         LAFOURCHE                 Marlene M Blanchard
## 3591                         LAFOURCHE                                    
## 3592                         LAFOURCHE                     Carol R Leblanc
## 3593                         LAFOURCHE                                    
## 3594                         LAFOURCHE                     Albert J Guidry
## 3595                         LAFOURCHE                      Kenneth Doucet
## 3596                         LAFOURCHE                        Jane Griffin
## 3597                         LAFOURCHE                                    
## 3598                         LAFOURCHE                                    
## 3599                         LAFOURCHE                                    
## 3600                         LAFOURCHE                                    
## 3601                         LAFOURCHE                                    
## 3602                         LAFOURCHE                                    
## 3603                         LAFOURCHE                                    
## 3604                         LAFOURCHE                                    
## 3605                         LAFOURCHE                      Joseph Orgeron
## 3606 985-449-2255            LAFOURCHE                         Craig Webre
## 3607 985-447-4841            LAFOURCHE                   Vernon H Rodrigue
## 3608 985-447-7242            LAFOURCHE                    Michael H Martin
## 3609 985-537-7055            LAFOURCHE                         John C King
## 3610 985-446-8427            LAFOURCHE                Charlotte A Randolph
## 3611 985-446-8427            LAFOURCHE                         Jerry Jones
## 3612 985-446-8427            LAFOURCHE                     Michael Delatte
## 3613 985-446-8427            LAFOURCHE                     Aaron Caillouet
## 3614 985-446-8427            LAFOURCHE                 Joseph Joe Fertitta
## 3615 985-446-8427            LAFOURCHE                         John Arnold
## 3616 985-446-8427            LAFOURCHE                        Lindel Toups
## 3617 985-446-8427            LAFOURCHE                      Phillip Gouaux
## 3618 985-446-8427            LAFOURCHE                        Jerry LaFont
## 3619 985-446-8427            LAFOURCHE                     Daniel Lorraine
## 3620 985-446-7238            LAFOURCHE                     Mark D Chiasson
## 3621 504-446-7238            LAFOURCHE                       Harley J Gros
## 3622 985-435-4602            LAFOURCHE                     Louis Thibodaux
## 3623 985-435-4602            LAFOURCHE                      Rhoda Caldwell
## 3624 985-435-4602            LAFOURCHE                   Richmond Rev Boyd
## 3625 985-435-4602            LAFOURCHE                   Marian B Fertitta
## 3626 985-435-4602            LAFOURCHE           Stella Chiasson Lasseigne
## 3627 985-435-4602            LAFOURCHE                         Gregg Stall
## 3628 985-435-4602            LAFOURCHE                        Gary J Foret
## 3629 985-435-4602            LAFOURCHE                      Ronald J Pere'
## 3630 985-435-4602            LAFOURCHE                        Julie Breaux
## 3631 985-435-4602            LAFOURCHE                Dennis Jean Chiasson
## 3632 985-435-4602            LAFOURCHE            Clyde Joey Duplantis III
## 3633 985-435-4602            LAFOURCHE                  Ann Bouvier Sanamo
## 3634 985-435-4602            LAFOURCHE                           Al Archer
## 3635 985-435-4602            LAFOURCHE                       Larry P Pitre
## 3636 985-435-4602            LAFOURCHE                     Lawrence Mounic
## 3637 985-632-6701            LAFOURCHE          Harris Chuckie Cheramie Jr
## 3638                         LAFOURCHE                      Perry Gisclair
## 3639                         LAFOURCHE                         Kris Gaudet
## 3640                         LAFOURCHE                     Donald J Vizier
## 3641                         LAFOURCHE                  Wilbert Collins Sr
## 3642                         LAFOURCHE                     Larry J Griffin
## 3643                         LAFOURCHE                       John Melancon
## 3644                         LAFOURCHE                        Jimmy Guidry
## 3645                         LAFOURCHE                     Ervin Vin Bruce
## 3646 985-446-1883            LAFOURCHE                 Jean Denis Rodrigue
## 3647 985-537-6413            LAFOURCHE                        Mary U Foret
## 3648 985-693-3892            LAFOURCHE                   Bennett Arceneaux
## 3649 985-632-3995            LAFOURCHE                    Lois L Gautreaux
## 3650 985-633-2005            LAFOURCHE                      Benny J Percle
## 3651 985-537-5735            LAFOURCHE                       Dwain LeBouef
## 3652 985-532-5287            LAFOURCHE               John Johnny Detillier
## 3653 985-632-6576            LAFOURCHE                       Carl A Doucet
## 3654 985-446-7200            LAFOURCHE                       Tommy Eschete
## 3655 985-475-7942            LAFOURCHE                        Joey Bouziga
## 3656 985-532-3117            LAFOURCHE                      Paul Champagne
## 3657 985-475-7942            LAFOURCHE                        Reggie Pitre
## 3658 985-532-3117            LAFOURCHE                       Warren Vedros
## 3659 985-446-7200            LAFOURCHE                  Lloyd Chip Badeaux
## 3660 985-446-7200            LAFOURCHE                           Chad Mire
## 3661 985-532-3117            LAFOURCHE                      Donovan Barker
## 3662 985-532-3117            LAFOURCHE             Sharon Robichaux Guidry
## 3663 985-532-3117            LAFOURCHE                      Craig M Rogers
## 3664 985-532-3117            LAFOURCHE                      Rodney Hartman
## 3665 985-532-3117            LAFOURCHE                Weldon Chunky Triche
## 3666 985-446-7200            LAFOURCHE                        Eddie Hebert
## 3667 985-446-7200            LAFOURCHE                        Gene Richard
## 3668 985-446-7200            LAFOURCHE          Constance Thompson Johnson
## 3669 985-475-7942            LAFOURCHE                    David Dave Adams
## 3670 985-475-7942            LAFOURCHE                     Jody P Cheramie
## 3671 985-475-7942            LAFOURCHE            Lindberg Bap Lorraine Jr
## 3672 985-475-7942            LAFOURCHE                    Priscilla Mounic
## 3673 985-475-7942            LAFOURCHE                      Willis P Toups
## 3674                           LASALLE                      Margie D Cruse
## 3675                           LASALLE                    Sammy J Franklin
## 3676                           LASALLE                                    
## 3677                           LASALLE                                    
## 3678                           LASALLE                                    
## 3679                           LASALLE                                    
## 3680                           LASALLE                                    
## 3681                           LASALLE                                    
## 3682                           LASALLE                                    
## 3683                           LASALLE                                    
## 3684                           LASALLE                                    
## 3685                           LASALLE                                    
## 3686                           LASALLE                      Blake Phillips
## 3687                           LASALLE                 Catherine W Roberts
## 3688                           LASALLE                   Marsheela Walters
## 3689                           LASALLE                        Reed Walters
## 3690                           LASALLE                                    
## 3691                           LASALLE                                    
## 3692                           LASALLE                   Kevin Coda Salter
## 3693                           LASALLE                                    
## 3694                           LASALLE                       Gladys Denton
## 3695                           LASALLE                         Jaime Brock
## 3696                           LASALLE                                    
## 3697                           LASALLE                                    
## 3698                           LASALLE                      Patricia Dobbs
## 3699                           LASALLE                                    
## 3700 318-992-2151              LASALLE                      Scott Franklin
## 3701 318-992-2158              LASALLE                       Steve Andrews
## 3702 318-992-8256              LASALLE             Thomas Houston Kendrick
## 3703 318-992-2166              LASALLE                      I C Turnley Jr
## 3704 318-992-2101              LASALLE                       Eddie Coolman
## 3705 318-992-2101              LASALLE                 Charles Buddy Poole
## 3706 318-992-2101              LASALLE                      Jerry M Harris
## 3707 318-992-2101              LASALLE                      Larkin Jackson
## 3708 318-992-2101              LASALLE                     Clifton Jackson
## 3709 318-992-2101              LASALLE                        Jack Zeagler
## 3710 318-992-2101              LASALLE                         Mike Crooks
## 3711 318-992-2101              LASALLE                        Bard Lambeth
## 3712 318-992-2101              LASALLE                     Bobby R Francis
## 3713 318-992-2101              LASALLE                      Ben Chuck Reid
## 3714 318-992-2161              LASALLE                        Dawn B Stott
## 3715 318-992-2161              LASALLE                Howard Coach McCarty
## 3716 318-992-2161              LASALLE                        Maple T Book
## 3717 318-992-2161              LASALLE                       Virgie Wilson
## 3718 318-992-2161              LASALLE                   D'Juana McCartney
## 3719 318-992-2161              LASALLE                       Buddy Bethard
## 3720 318-992-2161              LASALLE                      Walter P Creel
## 3721 318-992-2161              LASALLE                     Dolan Pendarvis
## 3722 318-992-2161              LASALLE                    Charlie Anderson
## 3723 318-992-2161              LASALLE              Melvin Roy Worthington
## 3724 318-495-5916              LASALLE            Shana Westbrooks DeVille
## 3725 318-495-5041              LASALLE                    Debbie W Chisolm
## 3726 318-992-6350              LASALLE                    Charles Flaherty
## 3727 318-992-2202              LASALLE                      Don R Smith Sr
## 3728 318-992-5197              LASALLE                         F C Thaxton
## 3729 318-992-6817              LASALLE                    Leroy Westbrooks
## 3730 318-495-5641              LASALLE                       Sammy Chisolm
## 3731 318-992-2081              LASALLE                      J Clyde Crooks
## 3732 318-992-0314              LASALLE                         June Fowler
## 3733 318-992-8574              LASALLE                 L V Pete Breithaupt
## 3734 318-992-2148              LASALLE                   Murphy R McMillin
## 3735 318-495-5151              LASALLE                     Jason D Chisolm
## 3736 318-534-6499              LASALLE                      Charles Newsom
## 3737 318-495-3452              LASALLE                      Terri B Corley
## 3738 318-992-2148              LASALLE                        Paul M Smith
## 3739 318-495-5151              LASALLE                          John Stott
## 3740 318-534-6499              LASALLE                         Leland Guin
## 3741 318-495-3452              LASALLE                        Wayne Corley
## 3742 318-495-5151              LASALLE                          Al Cassels
## 3743 318-495-5151              LASALLE                Rhonda Gough Elliott
## 3744 318-495-5151              LASALLE                     Jeffrey Lasiter
## 3745 318-495-5151              LASALLE                       L J Rachal Jr
## 3746 318-495-5151              LASALLE                     Samantha J Wood
## 3747 318-534-6499              LASALLE                     Lance B Coleman
## 3748 318-534-6499              LASALLE                  Danny Boy Ferguson
## 3749 318-534-6499              LASALLE               Cynthia Renee Langley
## 3750 318-534-6499              LASALLE                   Q F Fritz Sagdahl
## 3751 318-534-6499              LASALLE                      Martha H Smith
## 3752 318-495-3452              LASALLE                           Dawn Book
## 3753 318-495-3452              LASALLE                William P Bill Brown
## 3754 318-495-3452              LASALLE                   Patrick McDougald
## 3755 318-495-3452              LASALLE                     Jesse Powers Jr
## 3756 318-495-3452              LASALLE                     Stacie P Strain
## 3757 318-992-2148              LASALLE                 David Paul Jones Jr
## 3758 318-992-2148              LASALLE                     Donnie Kendrick
## 3759 318-992-2148              LASALLE                        Carl Newburg
## 3760 318-992-2148              LASALLE                    Donny Richardson
## 3761 318-992-2148              LASALLE                    Tommy D Sandifer
## 3762                           LINCOLN                                    
## 3763                           LINCOLN                    Shawn H Robinson
## 3764                           LINCOLN                      Annie H Hamlin
## 3765                           LINCOLN           Felecia Cockerham Johnson
## 3766                           LINCOLN                                    
## 3767                           LINCOLN                                    
## 3768                           LINCOLN                                    
## 3769                           LINCOLN                                    
## 3770                           LINCOLN                                    
## 3771                           LINCOLN                                    
## 3772                           LINCOLN                                    
## 3773                           LINCOLN                                    
## 3774                           LINCOLN                                    
## 3775                           LINCOLN                          John Buske
## 3776                           LINCOLN                        Laura Farrar
## 3777                           LINCOLN                        Wayne Harris
## 3778                           LINCOLN                  William Bill Hogan
## 3779                           LINCOLN                        Celia Napper
## 3780                           LINCOLN                                    
## 3781                           LINCOLN                                    
## 3782                           LINCOLN                                    
## 3783                           LINCOLN                   Mary Jane Stearns
## 3784                           LINCOLN                                    
## 3785                           LINCOLN                                    
## 3786                           LINCOLN                                    
## 3787                           LINCOLN                                    
## 3788                           LINCOLN                                    
## 3789                           LINCOLN                                    
## 3790                           LINCOLN                                    
## 3791                           LINCOLN                      Alice Herrmann
## 3792 318-251-5111              LINCOLN                          Mike Stone
## 3793 318-251-5130              LINCOLN                          Linda Cook
## 3794 318-251-5140              LINCOLN              Sheila Glover Bordelon
## 3795 318-251-3774              LINCOLN            James Michael Mike Belue
## 3796 318-513-6200              LINCOLN                       Theresa Wyatt
## 3797 318-251-5149              LINCOLN                      Hazel D Hunter
## 3798 318-251-5149              LINCOLN                       Bobby Bennett
## 3799 318-251-5149              LINCOLN                    Randy C Roberson
## 3800 318-251-5149              LINCOLN                       David Hammons
## 3801 318-251-5149              LINCOLN                     Walter D Pullen
## 3802 318-251-5149              LINCOLN                         Jody Backus
## 3803 318-251-5149              LINCOLN                        Skip Russell
## 3804 318-251-5149              LINCOLN                       Joe Henderson
## 3805 318-251-5149              LINCOLN                        Nancy Wilson
## 3806 318-251-5149              LINCOLN                    Sharyon Mayfield
## 3807 318-251-5149              LINCOLN                        Ronny Walker
## 3808 318-251-8614              LINCOLN                       Danny W Tatum
## 3809 318-255-7788              LINCOLN                      Michael Hilton
## 3810 318-255-1430              LINCOLN               Mattie Perry Harrison
## 3811 318-255-1430              LINCOLN                         Eddie Jones
## 3812 318-255-1430              LINCOLN                      Curtis Dowling
## 3813 318-255-1430              LINCOLN                   Michael J Barmore
## 3814 318-255-1430              LINCOLN                       Danny Hancock
## 3815 318-255-1430              LINCOLN                    Joe E Mitcham Jr
## 3816 318-255-1430              LINCOLN                          Trott Hunt
## 3817 318-255-1430              LINCOLN                           Lisa Best
## 3818 318-255-1430              LINCOLN                     Lynda Henderson
## 3819 318-255-1430              LINCOLN                         Otha Anders
## 3820 318-255-1430              LINCOLN                      George Mack Jr
## 3821 318-255-1430              LINCOLN                       Debbie Abrahm
## 3822 318-247-6446              LINCOLN                    Richard J Gallot
## 3823 318-247-8250              LINCOLN                      Heath Hattaway
## 3824 318-777-8314              LINCOLN                      Barbra Barmore
## 3825 318-768-2692              LINCOLN                         Steve Moore
## 3826 318-247-8387              LINCOLN            Ta'Darren Smokey Jackson
## 3827 318-247-3602              LINCOLN                          David Kent
## 3828 318-777-8314              LINCOLN                     Prentis Barmore
## 3829 318-768-2591              LINCOLN                        Jack C Pipes
## 3830 318-247-6120              LINCOLN                      Edward R Jones
## 3831 318-251-8621              LINCOLN                   Dan Hollingsworth
## 3832 318-777-3321              LINCOLN                 Robert W Bob Jensen
## 3833 318-251-2913              LINCOLN                    Walter Carpenter
## 3834 318-768-4111              LINCOLN                      Bill Sanderson
## 3835 318-247-6248              LINCOLN                    Willie Hendricks
## 3836                           LINCOLN                     Russell Croxton
## 3837 318-768-4111              LINCOLN                        Bobby Milner
## 3838 318-247-6350              LINCOLN                        Billy Foster
## 3839 318-768-4111              LINCOLN                        Joe R Aswell
## 3840 318-768-4111              LINCOLN                         Ricky Maier
## 3841 318-768-4111              LINCOLN                    Brandon Williams
## 3842 318-247-6350              LINCOLN                        Tiffany Cole
## 3843 318-247-6350              LINCOLN                        Doug Durrett
## 3844 318-247-6350              LINCOLN                         Pam Durrett
## 3845 318-251-8621              LINCOLN                Glenda Braggs Howard
## 3846 318-251-8621              LINCOLN                     Elmore Mayfield
## 3847 318-251-8621              LINCOLN                          Jedd Lewis
## 3848 318-251-8621              LINCOLN                          Jim Pearce
## 3849 318-251-8621              LINCOLN                       Marie S Riggs
## 3850 318-247-6120              LINCOLN                  Birdex Copeland Jr
## 3851 318-247-6120              LINCOLN                       Yanise N Days
## 3852 318-247-6120              LINCOLN                        Cathy Holmes
## 3853 318-247-6120              LINCOLN                      Cullen Jackson
## 3854 318-247-6120              LINCOLN                       Roy L Jackson
## 3855 318-777-3321              LINCOLN                    Vallie C Carrico
## 3856 318-777-3321              LINCOLN              Primadonna Donna Lewis
## 3857 318-777-3321              LINCOLN               Robert Skeeter Colvin
## 3858 318-777-3321              LINCOLN                      Davie H Powell
## 3859 318-777-3321              LINCOLN                       Hattie Graham
## 3860 318-251-2913              LINCOLN                      Keith Brasuell
## 3861 318-251-2913              LINCOLN                        Linda Graham
## 3862 318-251-2913              LINCOLN                        Billy Talton
## 3863                        LIVINGSTON                 Randall Randy Albin
## 3864                        LIVINGSTON                 Sonya Bankston Hull
## 3865                        LIVINGSTON                      Malcolm Sibley
## 3866                        LIVINGSTON                       Gene Williams
## 3867                        LIVINGSTON                                    
## 3868                        LIVINGSTON                     Daniel H Landry
## 3869                        LIVINGSTON                                    
## 3870                        LIVINGSTON                                    
## 3871                        LIVINGSTON                                    
## 3872                        LIVINGSTON                       Aaron Varnado
## 3873                        LIVINGSTON                    Cassandra Butler
## 3874                        LIVINGSTON                        Jerry Denton
## 3875                        LIVINGSTON                Donna Carlisle Erdey
## 3876                        LIVINGSTON                   Timothy Tim Grant
## 3877                        LIVINGSTON                     Mickey McMorris
## 3878                        LIVINGSTON                       James Tullier
## 3879                        LIVINGSTON                       Jeffery S Ard
## 3880                        LIVINGSTON                          Gene Baker
## 3881                        LIVINGSTON              Julie LaLonde Robinson
## 3882                        LIVINGSTON                 Robert W Bob Morgan
## 3883                        LIVINGSTON                   Gary E Varnado Sr
## 3884                        LIVINGSTON                       Derek Babcock
## 3885                        LIVINGSTON                  Claire Peak Coburn
## 3886                        LIVINGSTON                Robert Bob Scivicque
## 3887                        LIVINGSTON                       George Slaght
## 3888 225-686-2241           LIVINGSTON                    Jason Gerald Ard
## 3889 225-686-2216           LIVINGSTON              Thomas Tom Sullivan Jr
## 3890 225-686-7278           LIVINGSTON                 Jeffrey Jeff Taylor
## 3891 225-791-1152           LIVINGSTON                             Ron Coe
## 3892 225-686-3027           LIVINGSTON                        Layton Ricks
## 3893 225-686-3027           LIVINGSTON                       Chance Parent
## 3894 225-686-3027           LIVINGSTON                 James Jim Norred Jr
## 3895 225-686-3027           LIVINGSTON                          Cindy Wale
## 3896 225-686-3027           LIVINGSTON                     Marshall Harris
## 3897 225-686-3027           LIVINGSTON                         Joan Landry
## 3898 225-686-3027           LIVINGSTON                 Sonya Ohmer Collins
## 3899 225-686-3027           LIVINGSTON                          Ricky Goff
## 3900 225-686-3027           LIVINGSTON                      Ronald L Sharp
## 3901 225-686-3027           LIVINGSTON                     Delos Blackwell
## 3902 225-665-5505           LIVINGSTON            Charles W Chuck Borde Jr
## 3903 225-665-8568           LIVINGSTON                   Jerry L Denton Jr
## 3904 225-686-7044           LIVINGSTON                      Malcolm Sibley
## 3905 225-686-4221           LIVINGSTON           Kellee Hennessy Dickerson
## 3906 225-686-4221           LIVINGSTON                     Milton D Hughes
## 3907 225-686-4221           LIVINGSTON                   Karen Wax Schmitt
## 3908 225-686-4221           LIVINGSTON                     Buddy Mincey Jr
## 3909 225-686-4221           LIVINGSTON                            Jeff Cox
## 3910 225-686-4221           LIVINGSTON                James V Jimmy Watson
## 3911 225-686-4221           LIVINGSTON                        Keith Martin
## 3912 225-686-4221           LIVINGSTON                         Sid Kinchen
## 3913 225-667-1500           LIVINGSTON                         Jeff Sachse
## 3914                        LIVINGSTON                   Rhonda Dale Wheat
## 3915 225-567-3822           LIVINGSTON                         Max C Owens
## 3916 225-695-3666           LIVINGSTON                 Lena Bitsy Balfantz
## 3917 225-294-2864           LIVINGSTON               Mary Vicknair Bennett
## 3918 225-664-9151           LIVINGSTON                 Sandra Allen Causey
## 3919 225-686-3890           LIVINGSTON                        Lance Radley
## 3920 225-686-7920           LIVINGSTON                        Rita Stewart
## 3921 225-695-3217           LIVINGSTON                   Judith Judy White
## 3922 225-664-2893           LIVINGSTON                 Cindy Strange Small
## 3923 225-664-7695           LIVINGSTON              Richard Ricky Chandler
## 3924 225-698-6276           LIVINGSTON                      M Warren Watts
## 3925 225-567-3167           LIVINGSTON                       Bruce Bennett
## 3926 225-695-3127           LIVINGSTON                 Carroll Wayne Bates
## 3927 225-294-5571           LIVINGSTON                        Glenn Hoover
## 3928 225-665-5550           LIVINGSTON                       Ronnie Causey
## 3929 225-686-0229           LIVINGSTON                  James Jimmy Alford
## 3930 225-686-0229           LIVINGSTON                         Leroy Owens
## 3931 225-695-3741           LIVINGSTON                      Barry White Sr
## 3932 225-665-2823           LIVINGSTON                       Bobby R Smith
## 3933 225-665-8121           LIVINGSTON                James E Jimmy Durbin
## 3934 225-664-3123           LIVINGSTON                         Rick Ramsey
## 3935 225-567-1101           LIVINGSTON              Thomas Dillard Stewart
## 3936 225-695-6785           LIVINGSTON                      Gillis Windham
## 3937 225-686-7153           LIVINGSTON                        Derral Jones
## 3938 225-294-3150           LIVINGSTON                      Charles Martin
## 3939 225-294-3150           LIVINGSTON            Charles E Charlie Martin
## 3940 225-698-6100           LIVINGSTON                        Toni Guitrau
## 3941 225-698-9891           LIVINGSTON                        David Carter
## 3942 225-664-3123           LIVINGSTON                         Marliam Lee
## 3943 225-567-1101           LIVINGSTON                Russell D Hutchinson
## 3944 225-686-7153           LIVINGSTON                  Randy M Dufrene Sr
## 3945 225-698-6100           LIVINGSTON                       Harry Brignac
## 3946 225-664-3123           LIVINGSTON                      Jonathan Davis
## 3947 225-664-3123           LIVINGSTON                Tracy J Girlinghouse
## 3948 225-664-3123           LIVINGSTON                           Jim Goins
## 3949 225-664-3123           LIVINGSTON                        Gary Griffin
## 3950 225-664-3123           LIVINGSTON               Scarlett Milton Major
## 3951 225-664-3123           LIVINGSTON                     Paul Roberts Jr
## 3952 225-695-6785           LIVINGSTON                  Jerry JJ Barnum Jr
## 3953 225-695-6785           LIVINGSTON                  Jerry JJ Barnum Jr
## 3954 225-695-6785           LIVINGSTON                        Peter W Bock
## 3955 225-695-6785           LIVINGSTON                        J Paul Canik
## 3956 225-695-6785           LIVINGSTON                        J Paul Canik
## 3957 225-695-6785           LIVINGSTON                  Vince Deliberto Jr
## 3958 225-695-6785           LIVINGSTON               Vince  T Deliberto Jr
## 3959 225-695-6785           LIVINGSTON                       Craig McGehee
## 3960 225-695-6785           LIVINGSTON                      Gillis Windham
## 3961 225-695-6785           LIVINGSTON                      Roy Winston Jr
## 3962 225-686-7153           LIVINGSTON                      David McCreary
## 3963 225-686-7153           LIVINGSTON                Randall Randy Morgan
## 3964 225-686-7153           LIVINGSTON                James H  Jimmy Nesom
## 3965 225-686-7153           LIVINGSTON                       Joey H Sibley
## 3966 225-686-7153           LIVINGSTON                         Wade Wilson
## 3967 225-294-3150           LIVINGSTON                      Thomas R Abels
## 3968 225-294-3150           LIVINGSTON                     Mary Ann Bissel
## 3969 225-294-3150           LIVINGSTON             Mildred Ratcliff Cowsar
## 3970 225-294-3150           LIVINGSTON           Marsha Threeton Sherburne
## 3971 225-294-3150           LIVINGSTON                     Johnny Vicknair
## 3972 225-698-6100           LIVINGSTON                      Danette Aydell
## 3973 225-698-6100           LIVINGSTON                       Teresa Miller
## 3974 225-698-6100           LIVINGSTON                       Glen G Newell
## 3975 225-698-9897           LIVINGSTON                   Milton Gary Brady
## 3976 225-698-9897           LIVINGSTON              Jeffrey Scotty Martone
## 3977 225-698-9897           LIVINGSTON                     Johnnie JJ Page
## 3978 225-665-8121           LIVINGSTON                         Chris Davis
## 3979 225-665-8121           LIVINGSTON                  Ann M Annie Fugler
## 3980 225-665-8121           LIVINGSTON                   Lori LammWilliams
## 3981 225-665-8121           LIVINGSTON                 Arthur L Perkins Sr
## 3982 225-665-8121           LIVINGSTON                         John Wascom
## 3983 225-567-1101           LIVINGSTON                       Gene Glascock
## 3984 225-567-1101           LIVINGSTON                     Edmond C Harris
## 3985 225-567-1101           LIVINGSTON                    Lloyd Bee Martin
## 3986                           MADISON                         Janet Clark
## 3987                           MADISON                   Eddie Fountain Sr
## 3988                           MADISON                     Linda Shoemaker
## 3989                           MADISON                       Debra Whitney
## 3990                           MADISON                                    
## 3991                           MADISON                           Billy Dew
## 3992                           MADISON                        Tommy Watson
## 3993                           MADISON                      Oscar Hamilton
## 3994                           MADISON                       Gloria Hayden
## 3995                           MADISON                         Fred B Wyly
## 3996                           MADISON                                    
## 3997                           MADISON                                    
## 3998                           MADISON                                    
## 3999                           MADISON                                    
## 4000                           MADISON                                    
## 4001 318-574-1831              MADISON                         Larry G Cox
## 4002 318-574-0655              MADISON                      Marion Hopkins
## 4003 318-574-0117              MADISON                        Jim D Sevier
## 4004 318-574-3575              MADISON                    Thomas A Neumann
## 4005 318-574-3451              MADISON           Robert Dalton Fortenberry
## 4006 318-574-3451              MADISON                       Stanley Ogden
## 4007 318-574-3451              MADISON               Patricia Pat Buchanan
## 4008 318-574-3451              MADISON                            C J Oney
## 4009 318-574-3451              MADISON                 Jane Gladys Sanders
## 4010 318-574-3616              MADISON                  Jerry S Richardson
## 4011 318-574-3616              MADISON                      Randy J Morgan
## 4012 318-574-3616              MADISON                      Eddie Fountain
## 4013 318-574-3616              MADISON               Jann WilliamsBuchanan
## 4014 318-574-3616              MADISON                    Paula E Hamilton
## 4015 318-574-3616              MADISON                    Oscar W Hamilton
## 4016 318-574-3616              MADISON                        Vera L Davis
## 4017 318-574-3616              MADISON                       Rita Hargrave
## 4018 318-574-2499              MADISON                         Beth Thomas
## 4019 318-574-8729              MADISON                       Kathy C Grady
## 4020 318-574-1242              MADISON                    Andrew W Claxton
## 4021 318-574-6911              MADISON                   Afriena Stevenson
## 4022 318-574-4128              MADISON                     Tilford M Watts
## 4023 318-574-2248              MADISON                    Charles Roberson
## 4024 318-574-1595              MADISON                  Charlie Trimble Jr
## 4025 318-574-4427              MADISON                          Gene M Cox
## 4026 318-574-0964              MADISON                   Eddie Beckwith Jr
## 4027 318-633-9566              MADISON                          Robert Ott
## 4028 318-574-0927              MADISON                     Margaret Yerger
## 4029 318-574-2913              MADISON                    Robert Kivett Sr
## 4030 318-574-0964              MADISON                James Earl Vaughn Jr
## 4031 318-574-0927              MADISON                       Mark Federick
## 4032 318-574-2913              MADISON                         Jimmy Lopez
## 4033 318-633-9566              MADISON                       Marvin Ashley
## 4034 318-633-9566              MADISON                     Katherine Davis
## 4035 318-633-9566              MADISON                      Donald L Frith
## 4036 318-574-0927              MADISON                    Margaret F Crews
## 4037 318-574-0927              MADISON                   Walter S Crews Jr
## 4038 318-574-0927              MADISON                     Andrew Federick
## 4039 318-574-2913              MADISON                         Olga Butler
## 4040 318-574-2913              MADISON                   Donnie Ray Remore
## 4041 318-574-2913              MADISON                        Tommy Wixson
## 4042 318-574-0964              MADISON           Charles Michael Finlayson
## 4043 318-574-0964              MADISON                      Lisa D Houston
## 4044 318-574-0964              MADISON                        Tommy Watson
## 4045 318-574-0964              MADISON                        Marjorie Day
## 4046 318-574-0964              MADISON                 Gloria Owens Hayden
## 4047                         MOREHOUSE                       Roy Armstrong
## 4048                         MOREHOUSE              Joann Kennedy Bradford
## 4049                         MOREHOUSE                      Donald Britton
## 4050                         MOREHOUSE                        Marvin Moore
## 4051                         MOREHOUSE                       Rose Thompson
## 4052                         MOREHOUSE                                    
## 4053                         MOREHOUSE                    Charles Bradford
## 4054                         MOREHOUSE                                    
## 4055                         MOREHOUSE                      Michael Atkins
## 4056                         MOREHOUSE                Roosevelt Doug Payne
## 4057                         MOREHOUSE                      Terry Matthews
## 4058                         MOREHOUSE                          Issac Gray
## 4059                         MOREHOUSE                  Cloyd Boots Farrar
## 4060                         MOREHOUSE                                    
## 4061                         MOREHOUSE                                    
## 4062                         MOREHOUSE                                    
## 4063                         MOREHOUSE                                    
## 4064                         MOREHOUSE                                    
## 4065                         MOREHOUSE                                    
## 4066                         MOREHOUSE                                    
## 4067 318-281-4141            MOREHOUSE                         'Mike Tubbs
## 4068 318-281-3343            MOREHOUSE                         Carol Jones
## 4069 318-281-1802            MOREHOUSE                           John Hill
## 4070 318-281-4141            MOREHOUSE                     Edward Chorette
## 4071 318-281-1329            MOREHOUSE                       Floyd Tomboli
## 4072 318-281-4132            MOREHOUSE                         Harry Reese
## 4073 318-281-4132            MOREHOUSE                       Mark Sistrunk
## 4074 318-281-4132            MOREHOUSE                       Jack Cockrell
## 4075 318-281-4132            MOREHOUSE                      Jason Crockett
## 4076 318-281-4132            MOREHOUSE                      Terry Matthews
## 4077 318-281-4132            MOREHOUSE                          Issac Gray
## 4078 318-283-0257            MOREHOUSE                    Phillip M Lester
## 4079 318-283-3310            MOREHOUSE                       Lisa Chafford
## 4080 318-281-5784            MOREHOUSE                   Karen Travis Diel
## 4081 318-281-5784            MOREHOUSE                  Louis E Ike Melton
## 4082 318-281-5784            MOREHOUSE                    Ronald R Vollmar
## 4083 318-281-5784            MOREHOUSE                     Jeff Churchwell
## 4084 318-281-5784            MOREHOUSE                       Mike Stephens
## 4085 318-281-5784            MOREHOUSE                  Tamika GrayFarrell
## 4086 318-281-5784            MOREHOUSE             Robert Squeeze Fenceroy
## 4087 318-283-2299            MOREHOUSE                   Robert P Deblieux
## 4088 318-281-0337            MOREHOUSE                       Glennis Lewis
## 4089 318-244-6160            MOREHOUSE                          Joel Fitch
## 4090 318-647-5325            MOREHOUSE                       Mary C Hayden
## 4091 318-281-5789            MOREHOUSE                         Ben L White
## 4092 318-283-3075            MOREHOUSE                         John Sawyer
## 4093 318-281-4916            MOREHOUSE                           ZZ Wilson
## 4094 318-823-2668            MOREHOUSE                     Kitty R Johnson
## 4095 318-281-0148            MOREHOUSE                Vernon Butch Bostick
## 4096 318-281-2973            MOREHOUSE                       Jackie Swartz
## 4097 318-244-5650            MOREHOUSE                   Ben E Sonny Baker
## 4098 318-647-3783            MOREHOUSE                      David G Thomas
## 4099 318-281-2695            MOREHOUSE                        Ruthie Moore
## 4100                         MOREHOUSE                   Brandon Gilbreath
## 4101 318-281-4916            MOREHOUSE                      Donna J Atkins
## 4102 318-823-2704            MOREHOUSE                      Derl R Johnson
## 4103 318-283-0250            MOREHOUSE                   Betty AlfordOlive
## 4104 318-823-2128            MOREHOUSE                         Floyd Baker
## 4105 318-874-2631            MOREHOUSE                Mitchell MJ Jeselink
## 4106 318-647-3622            MOREHOUSE                      Johnny McAdams
## 4107 318-244-5033            MOREHOUSE                         Andy Barham
## 4108 318-283-0250            MOREHOUSE                        Marvin Moore
## 4109 318-283-0250            MOREHOUSE                        Marvin Moore
## 4110 318-283-0250            MOREHOUSE                       Obbie Johnson
## 4111 318-283-0250            MOREHOUSE                 William Sonny Nason
## 4112 318-283-0250            MOREHOUSE                         Robert Shaw
## 4113 318-283-0250            MOREHOUSE                       Roy Armstrong
## 4114 318-283-0250            MOREHOUSE                       Roy Armstrong
## 4115 318-283-0250            MOREHOUSE                        Howard Loche
## 4116 318-283-0250            MOREHOUSE                      Howard D Loche
## 4117 318-823-2128            MOREHOUSE                 Ezekiel Anderson Jr
## 4118 318-823-2128            MOREHOUSE             Margarite Sampson Brown
## 4119 318-823-2128            MOREHOUSE                 Richard D Rick Polk
## 4120                         MOREHOUSE                                    
## 4121 318-874-2631            MOREHOUSE                      Dawn Gilbreath
## 4122 318-874-2631            MOREHOUSE                       Betty H Jones
## 4123 318-874-2631            MOREHOUSE                        Frank Miller
## 4124 318-647-3622            MOREHOUSE                   Richard Blackwell
## 4125 318-647-3622            MOREHOUSE                Timothy Tim Mitchell
## 4126 318-647-3622            MOREHOUSE                     Allen Spires Jr
## 4127 318-244-5033            MOREHOUSE                      Eugene H Allen
## 4128 318-244-5033            MOREHOUSE                       Neil Mott III
## 4129 318-244-5033            MOREHOUSE                       Clint Shepard
## 4130                      NATCHITOCHES         Cynthia Niecy Carter French
## 4131                      NATCHITOCHES                     Lamarr McGaskey
## 4132                      NATCHITOCHES                         Larry Paige
## 4133                      NATCHITOCHES                                    
## 4134                      NATCHITOCHES                                    
## 4135                      NATCHITOCHES                                    
## 4136                      NATCHITOCHES                                    
## 4137                      NATCHITOCHES                                    
## 4138                      NATCHITOCHES                                    
## 4139                      NATCHITOCHES                                    
## 4140                      NATCHITOCHES                        Mozella Bell
## 4141                      NATCHITOCHES                                    
## 4142                      NATCHITOCHES                                    
## 4143                      NATCHITOCHES                       Rickey LaCour
## 4144                      NATCHITOCHES                                    
## 4145                      NATCHITOCHES                                    
## 4146                      NATCHITOCHES                                    
## 4147                      NATCHITOCHES                                    
## 4148                      NATCHITOCHES                                    
## 4149                      NATCHITOCHES                                    
## 4150                      NATCHITOCHES                                    
## 4151                      NATCHITOCHES                                    
## 4152                      NATCHITOCHES                                    
## 4153                      NATCHITOCHES                                    
## 4154                      NATCHITOCHES                                    
## 4155                      NATCHITOCHES                                    
## 4156 318-357-7802         NATCHITOCHES                        Victor Jones
## 4157 318-352-8152         NATCHITOCHES                       Louie Bernard
## 4158 318-352-2377         NATCHITOCHES              Dollie Charles Mahoney
## 4159 318-357-2260         NATCHITOCHES                        Roy L Ceaser
## 4160                      NATCHITOCHES                         Rick Nowlin
## 4161                      NATCHITOCHES                         Chris Paige
## 4162                      NATCHITOCHES                        Ricky LaCour
## 4163                      NATCHITOCHES                    Aaron AJ Johnson
## 4164                      NATCHITOCHES                    Rodney L Bedgood
## 4165                      NATCHITOCHES                       John D Salter
## 4166 318-352-2069         NATCHITOCHES                      Fred S Gahagan
## 4167 318-357-1129         NATCHITOCHES                        Alton Rachal
## 4168 318-352-2358         NATCHITOCHES                     George C Rhymes
## 4169 318-352-2358         NATCHITOCHES                      Harry D Graham
## 4170 318-352-2358         NATCHITOCHES                        Ralph Wilson
## 4171 318-352-2358         NATCHITOCHES                 Michael Mike Hilton
## 4172 318-352-2358         NATCHITOCHES                       Joella Wilson
## 4173 318-352-2358         NATCHITOCHES                 Thomas Tommy Melder
## 4174 318-352-2358         NATCHITOCHES                        Cecil Walker
## 4175 318-352-2358         NATCHITOCHES                       Carl Means Sr
## 4176 318-352-2358         NATCHITOCHES                   Carroll E Daniels
## 4177 318-352-2358         NATCHITOCHES                          Russ Danzy
## 4178 318-352-2358         NATCHITOCHES                      Donna M Masson
## 4179 318-476-3311         NATCHITOCHES                    Patrice T Harper
## 4180 318-472-8739         NATCHITOCHES               Shelia Pleasant Cagle
## 4181 318-379-2273         NATCHITOCHES                      Rhonda Sanders
## 4182 318-875-2261         NATCHITOCHES                       Monty Trichel
## 4183 318-472-6860         NATCHITOCHES                      Kenneth Dowden
## 4184 318-379-2731         NATCHITOCHES                        Bobby Carter
## 4185 318-352-2772         NATCHITOCHES                           Lee Posey
## 4186 318-476-3321         NATCHITOCHES                Oneary Thompson Bobb
## 4187 318-544-0044         NATCHITOCHES                       W Gahagan Lee
## 4188 318-357-0440         NATCHITOCHES                       Bobby Braxton
## 4189 318-727-8548         NATCHITOCHES                Verna Martin Bedgood
## 4190 318-352-1414         NATCHITOCHES                          Edna Jones
## 4191 318-352-8549         NATCHITOCHES                      Johnnie Taylor
## 4192 318-472-8767         NATCHITOCHES                        Randy Dupree
## 4193 318-472-6121         NATCHITOCHES                         Tommy O'Con
## 4194 318-476-3321         NATCHITOCHES                    Gregory Eldridge
## 4195 318-544-0044         NATCHITOCHES                        Fred Holland
## 4196 318-357-0440         NATCHITOCHES                     Darrell Fredieu
## 4197 318-727-8548         NATCHITOCHES                       Johnny Rowell
## 4198 318-352-1414         NATCHITOCHES                 McKindley Hoover Sr
## 4199 318-352-8594         NATCHITOCHES                       Alida D Blake
## 4200 318-472-8767         NATCHITOCHES                 Harry Max Voight Jr
## 4201 318-472-6121         NATCHITOCHES                         Mike Marbut
## 4202 318-352-2772         NATCHITOCHES                         Don Mims Jr
## 4203 318-357-0440         NATCHITOCHES               Jamie Ragan Alexander
## 4204 318-357-0440         NATCHITOCHES                   Frank Mitchell Jr
## 4205 318-357-0440         NATCHITOCHES               Natonya Grayson Pikes
## 4206 318-727-8548         NATCHITOCHES                          Ben Dupree
## 4207 318-727-8548         NATCHITOCHES                          Dan Dupree
## 4208 318-727-8548         NATCHITOCHES                       Reed Franklin
## 4209 318-352-1414         NATCHITOCHES                    Shelia F Braxton
## 4210 318-352-1414         NATCHITOCHES                      Henrietta Byrd
## 4211 318-352-1414         NATCHITOCHES                       Joe Walker Jr
## 4212 318-352-8549         NATCHITOCHES                      Jessie Redford
## 4213 318-352-8549         NATCHITOCHES                     Hardrick Rivers
## 4214 318-352-8549         NATCHITOCHES                       Patrick Sweet
## 4215 318-472-8767         NATCHITOCHES                     Fred Ballard Jr
## 4216 318-472-8767         NATCHITOCHES               Cecil E Buddy Boswell
## 4217 318-472-8767         NATCHITOCHES                       Richard Luman
## 4218 318-472-6121         NATCHITOCHES                       Bobby A Behan
## 4219 318-472-6121         NATCHITOCHES                       Ronnie French
## 4220 318-472-6121         NATCHITOCHES                           Ann Moran
## 4221    318544004         NATCHITOCHES                        Vincent Bown
## 4222    318544004         NATCHITOCHES                   Juanita R Calhoun
## 4223    318544004         NATCHITOCHES                         Carol Doyle
## 4224 318-352-2772         NATCHITOCHES                        David Stamey
## 4225 318-352-2772         NATCHITOCHES                        Dale Nielsen
## 4226 318-352-2772         NATCHITOCHES                       Sylvia Morrow
## 4227 318-352-2772         NATCHITOCHES                       Larry D Payne
## 4228 318-476-3231         NATCHITOCHES                Mary Donaway Collins
## 4229 318-476-3231         NATCHITOCHES            Triventies Trent Johnson
## 4230 318-476-3231         NATCHITOCHES                         Cliff Jones
## 4231 318-476-3231         NATCHITOCHES                  Edwin E Kirkendoll
## 4232 318-476-3231         NATCHITOCHES                      Bence Nicholas
## 4233                           ORLEANS                      H Jamon Barrow
## 4234                           ORLEANS                  Elizabeth Brusseau
## 4235                           ORLEANS                 Desiree Cook Calvin
## 4236                           ORLEANS                       Jason Coleman
## 4237                           ORLEANS                      Sylvia M Crier
## 4238                           ORLEANS                Lisa Gagliano Dawson
## 4239                           ORLEANS               Maple Richmond Gaines
## 4240                           ORLEANS                   George M Gates IV
## 4241                           ORLEANS                     Alan J Langhoff
## 4242                           ORLEANS                    Deborah Langhoff
## 4243                           ORLEANS                      Megan Langhoff
## 4244                           ORLEANS                      Nolan Marshall
## 4245                           ORLEANS                        Tania Tetlow
## 4246                           ORLEANS                       Lynda Woolard
## 4247                           ORLEANS               Samson Skip Alexander
## 4248                           ORLEANS                      Diana E Bajoie
## 4249                           ORLEANS                 Olander P Bajoie Jr
## 4250                           ORLEANS                  Charmaine BakerFox
## 4251                           ORLEANS                         Jay H Banks
## 4252                           ORLEANS                          Avis Brock
## 4253                           ORLEANS             Margaret Maggie Carroll
## 4254                           ORLEANS                      Ronald Coleman
## 4255                           ORLEANS                       Julius Feltus
## 4256                           ORLEANS                        Felicia Kahn
## 4257                           ORLEANS                      Walt Leger III
## 4258                           ORLEANS                       Helena Moreno
## 4259                           ORLEANS                       Dana Peterson
## 4260                           ORLEANS                    Jeffrey J Thomas
## 4261                           ORLEANS                 Joseph Broussard Jr
## 4262                           ORLEANS                       Troy C Carter
## 4263                           ORLEANS                  Germaine Davillier
## 4264                           ORLEANS                      John Davillier
## 4265                           ORLEANS                      Lisa Ray Diggs
## 4266                           ORLEANS                 Ericka EdwardsJones
## 4267                           ORLEANS             Kenneth Paul Garrett Sr
## 4268                           ORLEANS                       Ron Guidry Sr
## 4269                           ORLEANS            Angela Theresa Henderson
## 4270                           ORLEANS                    Steven M Jupiter
## 4271                           ORLEANS                      Darren Lombard
## 4272                           ORLEANS                      Morris Reed Jr
## 4273                           ORLEANS                     Edward Robinson
## 4274                           ORLEANS                      Marie Williams
## 4275                           ORLEANS                     Wesley T Bishop
## 4276                           ORLEANS                   Elaine BoutteYost
## 4277                           ORLEANS                    Sidney H Cates V
## 4278                           ORLEANS                     Royce Duplessis
## 4279                           ORLEANS                Letitia Clark George
## 4280                           ORLEANS                      Louella Givens
## 4281                           ORLEANS                     Randy D Greenup
## 4282                           ORLEANS                Cynthia HedgeMorrell
## 4283                           ORLEANS                Charlene LarcheMason
## 4284                           ORLEANS                        Mike McKenna
## 4285                           ORLEANS                    Arthur A Morrell
## 4286                           ORLEANS                          JP Morrell
## 4287                           ORLEANS                         James Perry
## 4288                           ORLEANS                       Angele Wilson
## 4289                           ORLEANS                     Cynthia G Banks
## 4290                           ORLEANS                    Frederick M Bell
## 4291                           ORLEANS                      Ronald Carrere
## 4292                           ORLEANS               Carolyn CollinsDebose
## 4293                           ORLEANS            Shelia CollinsStallworth
## 4294                           ORLEANS                      Michon Copelin
## 4295                           ORLEANS                   Lena CraigStewart
## 4296                           ORLEANS              Yolanda Gullette Evans
## 4297                           ORLEANS                        James A Gray
## 4298                           ORLEANS                     Terrie C Guerin
## 4299                           ORLEANS                       Carl A Haydel
## 4300                           ORLEANS                        Willie Jones
## 4301                           ORLEANS                    Barbara R Keller
## 4302                           ORLEANS                 Sabrina MaysMontana
## 4303                           ORLEANS                    John Jay Batt Jr
## 4304                           ORLEANS                    Virginia Blanque
## 4305                           ORLEANS                       Brett A Bonin
## 4306                           ORLEANS                      Adrian Bruneau
## 4307                           ORLEANS           Christine Chrissy Bruneau
## 4308                           ORLEANS                         Jeb Bruneau
## 4309                           ORLEANS                    Robert Bob Ellis
## 4310                           ORLEANS                    John Fenn French
## 4311                           ORLEANS                      Michele Gaudin
## 4312                           ORLEANS                    Louis Gurvich Jr
## 4313                           ORLEANS                       Murray Nelson
## 4314                           ORLEANS          Salvador Sal Palmisano III
## 4315                           ORLEANS                Nathaniel M Phillips
## 4316                           ORLEANS                         Cecile Tebo
## 4317                           ORLEANS                          Marc Behar
## 4318                           ORLEANS                     Randy Boudreaux
## 4319                           ORLEANS                          Tony Clesi
## 4320                           ORLEANS                      Beau  L Crouch
## 4321                           ORLEANS                  Monica Sanusi Gele
## 4322                           ORLEANS                      Stephen M Gele
## 4323                           ORLEANS               Medlock M Harbison Jr
## 4324                           ORLEANS                         Sarah E Roy
## 4325                           ORLEANS                    Kenneth Steudler
## 4326                           ORLEANS                      J Bryan Wagner
## 4327                           ORLEANS                     George White Jr
## 4328                           ORLEANS                  David R M Williams
## 4329                           ORLEANS                      Andre Guichard
## 4330                           ORLEANS                           Ed Markle
## 4331                           ORLEANS                      James Pfeiffer
## 4332                           ORLEANS                 Patrick T Phillpott
## 4333                           ORLEANS                Darrell Doc Richards
## 4334                           ORLEANS                     Stephen M Swain
## 4335                           ORLEANS             Damiano Zach Tamburrino
## 4336                           ORLEANS                   Alexander Gerhold
## 4337                           ORLEANS                 Eustis Guillemet Jr
## 4338                           ORLEANS                      Lloyd A Harsch
## 4339                           ORLEANS                         Steve Lemke
## 4340                           ORLEANS                     Andre J Menzies
## 4341                           ORLEANS                    Gary P Sarrat Jr
## 4342                           ORLEANS                 Claire DiRosa Simno
## 4343                           ORLEANS              Elizabeth Betsy Stoner
## 4344                           ORLEANS                          Joseph Cao
## 4345                           ORLEANS                       Max R Johnson
## 4346 504-565-7324              ORLEANS                    Ernestine S Gray
## 4347 504-565-7315              ORLEANS                       Tammy Stewart
##                        CandidateAddr1           CandidateAddr2
## 1                          P O Box 32                         
## 2                                                             
## 3                       935 Linden St                         
## 4                     2213 Queens Hwy                         
## 5                      3821 Morrow St                         
## 6                   610 Sugarleaf Trl                         
## 7                     3761 Bobbitt Pl                         
## 8                      3436 Galaxy Ln                         
## 9                       P O Box 52691                         
## 10                 119 Waters Edge Dr                         
## 11                 448 Gladstone Blvd                         
## 12                   400 Columbia Cir                         
## 13                         PO Box 417                         
## 14                 361 Linwood Avenue                         
## 15                2303 Belle Grove Dr                         
## 16                   4512 Palmetto Rd                         
## 17                    110 Rosemont Pl                         
## 18                                                            
## 19                        1004 Elm St                         
## 20                       811 Cline St                         
## 21                      141 Adkins Pl                         
## 22                      141 Adkins Pl                         
## 23                                                            
## 24                                                            
## 25                                                            
## 26                     4500 Walker Rd                         
## 27                  2605 Crestmont St                         
## 28                  2100 Pargoud Blvd                         
## 29                      149 Barnes Rd                         
## 30                      149 Barnes Rd                         
## 31                     12 Live Oak Dr                         
## 32                      209 N 18th St                         
## 33                     219 Jackson St                         
## 34                     900 St John St                         
## 35                                                            
## 36                    4134 Oakland Rd                         
## 37                  1704 Blankston Rd                         
## 38                     236 Cochran Rd                         
## 39                     176 Central St                         
## 40                        P O Box 550                         
## 41                  103 Washington St                         
## 42                                                            
## 43                242 Carroll Camp Rd                         
## 44                    1113 Caliope St                         
## 45                       3365 Hwy 480                         
## 46                       4923 Hwy 494                         
## 47                        P O Box 534                         
## 48                       3177 Hwy 489                         
## 49                       4119 Earl Dr                         
## 50                    1920 Jackson St                         
## 51                    3223 Redwood Dr                         
## 52                        2701 3rd St                         
## 53                  2301 Military Hwy                         
## 54                     157 Adams Path                         
## 55       2750 Millerville Rd Apt 1201                         
## 56                         PO Box 720                         
## 57                   6512 Vineyard Dr                         
## 58                         PO Box 917                         
## 59                        PO Box 1363                         
## 60                      147 Powell Dr                         
## 61            303 Blackwater River Dr                         
## 62                                                            
## 63                        121 Thom St                         
## 64                  131 Hwy 165 South                         
## 65                     127 Roberta Dr                         
## 66                     127 Roberta Dr                         
## 67                        P O Box 470                         
## 68                    1130 Eighth Ave                         
## 69                   2258 Belfield Rd                         
## 70                       175 Tahoe Dr                         
## 71                  4220 Maidstone Dr                         
## 72                 1818 Plantation Dr                         
## 73              615 N Lake arthur Ave                         
## 74                        310 Levi St                         
## 75                        P O Box 795                         
## 76                        P O Box 927                         
## 77                    303 Veterans Dr                         
## 78                   128 St Marie Cir                         
## 79                     229 Francis Rd                         
## 80                       652 Patty St                         
## 81                                                            
## 82               410 Kyries Hebert St                         
## 83                        P O Box 778                         
## 84                     305 W Ninth St                         
## 85                  204 Oak Hollow St                         
## 86                  103 River Oak Cir                         
## 87                300 E Glenhill Blvd                         
## 88                 804 E Alexander St                         
## 89                  153 Shady Oaks Dr                         
## 90                      P O Box 52309                         
## 91                        P O Box 248                         
## 92                1010 Basin Stone Dr                         
## 93             306 S Hollingsworth Dr                         
## 94                     1617 Maude Ave                         
## 95                                                            
## 96                      P O Box 13410                         
## 97                  1428 Gonsoulin St                         
## 98                  1227 E Villien St                         
## 99                 1111 Irish Bend Rd                         
## 100                   611 B Second St                         
## 101                     3013 Helen Dr                         
## 102                       P O Box 990                         
## 103                      114 Riley Dr                         
## 104                      P O Box 4091                         
## 105                       343 Polk St                         
## 106                   208 Glenhill Ln                         
## 107           13074 E Main St Hwy 308                         
## 108           13074 E Main St Hwy 308                         
## 109                   292 St Peter St                         
## 110            1300 Cardinal Dr Apt G                         
## 111                      8 Windsor St                         
## 112                    13880 River Rd                         
## 113                    805 Mallard St                         
## 114                    7 Turnberry Dr                         
## 115                                                           
## 116                   1409 Millien Rd                         
## 117                                                           
## 118                   12413 Deck Blvd                         
## 119                       3413 Hwy 70                         
## 120                        PO Box 148                         
## 121                    1589 N 37th St                         
## 122                   1006 Waverly Dr                         
## 123                                                           
## 124                    1617 Wilson St                         
## 125                     4312 Azie Ave                         
## 126                     3280 Adams St                         
## 127        12747 Pride Port Hudson Rd                         
## 128        12747 Pride Port Hudson Rd                         
## 129                18316 Keystone Ave                         
## 130               17503 Lake Vista Dr                         
## 131                 7516 Chairman Ave                         
## 132                3256 Northlake Ave                         
## 133               5515 Riverbend Blvd                         
## 134                      P O Box 4016                         
## 135                      11011 Cal Rd                         
## 136                 8041 B Pennth Ave                         
## 137                   1010 Carter Ave                         
## 138              13612 Shortridge Ave                         
## 139                     305 Maxine Dr                         
## 140                1165 Sharynwood Dr                         
## 141             10290 Indian Creek Dr                         
## 142            9838 Loblolly Pines Ln                         
## 143              192 Linda Carol Lane                         
## 144                       P O Box 601                         
## 145                                                           
## 146                15262 Maplewood Dr                         
## 147                     74355 Hwy 437                         
## 148                       P O Box 609                         
## 149                      25255 Hwy 62                         
## 150                      1049 Main St                         
## 151                    724 Stanley St                         
## 152                       P O Box 939                         
## 153                                                           
## 154                    305 E 14th Ave                         
## 155                1108 N Starrett Rd                         
## 156                                                           
## 157                                                           
## 158                                                           
## 159                   1030 Oaklawn Dr                         
## 160                  2932 Ridgeway Dr                         
## 161                                                           
## 162                      P O Box 2587                         
## 163                                                           
## 164                    1512 Colony Rd                         
## 165                   2053 Maharry Dr                         
## 166                 1621 Lancaster Dr                         
## 167                     1310 Avenue F                         
## 168                 2625 Crestwood Rd                         
## 169                                                           
## 170                     1009 Solon St                         
## 171                                                           
## 172                  208 Alexander Dr                         
## 173               1064 Candlelight Dr                         
## 174                4057 S Windmere St                         
## 175                1324 S Shirley Ave                         
## 176                       P O Box 311                         
## 177                     795 Kleber St                         
## 178                                                           
## 179                 38248 N Fifth Ave                         
## 180               62390 John Smith Rd                         
## 181                     P O Box 15168                         
## 182                  1827 Pensiton St                         
## 183                    P O Box 640211                         
## 184                 927 S Starrett Rd                         
## 185           521 Baronne St Unit 408                         
## 186                    1507 N Miro St                         
## 187                     4234 Canal St                         
## 188                121 N Murat Street                         
## 189              29433 LA Hwy 40 West                         
## 190                    35893 Weiss Rd                         
## 191               309 Emery Lewis Ave                         
## 192                    734 Lombard St                         
## 193                  4925 Moore Drive                         
## 194                  4925 Moore Drive                         
## 195                  8210 Neron Place                         
## 196                     926 Joliet St                         
## 197                      P O Box 3822                         
## 198                   7001 Cove Drive                         
## 199               7328 Beaconfield Dr                         
## 200                     PO Box 870661                         
## 201              3351 Fort Meyers Ave                         
## 202                       246 Ship Dr                         
## 203                     52 Eugenie Ct                         
## 204               209 Brunswick Court                         
## 205                  5581 Maple Ridge                         
## 206                  2229 Bobolink Dr                         
## 207                      P O Box 1132                         
## 208                      2818 Mesa Ct                         
## 209                   3659 Inwood Ave                         
## 210                   3501 Inwood Ave                         
## 211                                                           
## 212                  6772 Bolinger Dr                         
## 213                 759 Rutherford St                         
## 214                                                           
## 215          8046 Dixie Shreveport Rd                         
## 216                     3112 Pines Rd                         
## 217                    9402 Baird Cir                         
## 218                   9967 Trailridge                         
## 219                   594 Demery Blvd                         
## 220              9727 Norris Ferry Rd                         
## 221                 7333 Camelback Dr                         
## 222                 529 Stephenson St                         
## 223                   2247 Urban Dale                         
## 224                    6117 Lovers Ln                         
## 225                 2406 Helmsdale Ct                         
## 226                  180 Norwood Road                         
## 227                     1830 Venus Dr                         
## 228                  104 Cambridge Cr                         
## 229                 1835 Glen Cove Dr                         
## 230                                                           
## 231                  1189 Bellevue Rd                         
## 232               3411 Pine Haven Cir                         
## 233                 105 Janice Dr Ext                         
## 234                515 Garrison Trail                         
## 235                    2247 Dawson Dr                         
## 236                      812 Sandy Ln                         
## 237                        PO Box 372                         
## 238                     501 Garris Rd                         
## 239                       770 Hwy 146                         
## 240                         116 Ave B                         
## 241                        PO Box 116                         
## 242                 595 Springhill Rd                         
## 243                    111 Archaic Dr                         
## 244                   1207 Tulane Ave                         
## 245              614 Cheniere Drew Rd                         
## 246           570 Mouth of Cypress Rd                         
## 247                1310 N 19th Street                         
## 248                  2905 Lamy Circle                         
## 249              3907 Jefferson Davis                         
## 250                                                           
## 251                                                           
## 252               13039 Patin Dyke Rd                         
## 253                   28 Town East St                         
## 254                       491 Hwy 622                         
## 255                       P O Box 117                         
## 256                       2604 Hwy 17                         
## 257                      112 Canal St                         
## 258                       P O Box 238                         
## 259               811 Springhill Loop                         
## 260                      P O Box 1891                         
## 261                      269 Chris St                         
## 262                 1005 Williams Ave                         
## 263                       277 Hwy 118                         
## 264                     1751 Robby St                         
## 265              4202 Wellington Blvd                         
## 266                  6205 Bradford Dr                         
## 267                                                           
## 268                       810 18th St                         
## 269                      8940 Hwy 71N                         
## 270         119 Rockpoint Circle East                         
## 271                        PO Box 219                         
## 272                       P O Box 203                         
## 273                                                           
## 274                   502 Magnolia St                         
## 275                       PO Box 1311                         
## 276                       100 Harwell                         
## 277                     P O Box 52592                         
## 278                    114 Donovan Dr                         
## 279              416 Thundervalley Rd                         
## 280                       P O Box 543                         
## 281                 4700 Maplewood Dr                         
## 282                     1404 Horridge                         
## 283                 2899 Sugarloaf Dr                         
## 284                   1001 Lafitte St                         
## 285                  1480 Goodeaux Rd                         
## 286                    4323 Hearth St                         
## 287               728 S Lake Court Dr                         
## 288            737 Inwood Forest Blvd                         
## 289                 511 E Frontage Rd                         
## 290                      811 State St                         
## 291                        PO Box 436                         
## 292                      682 Shuff Rd                         
## 293                 203 Kilbourne Cir                         
## 294                   109 Broadway Dr                         
## 295                    410 S Court St                         
## 296                         PO Box 23                         
## 297                    330 S Ninth St                         
## 298                       P O Box 168                         
## 299                  226 West 12th St                         
## 300                     310 Austin Rd                         
## 301                     P O Box 81025                         
## 302                     309 Digby Ave                         
## 303                   210 Lakeside Dr                         
## 304                      P O Box 5232                         
## 305                      116 Teche Dr                         
## 306                                                           
## 307                1525 N Bertrand Dr                         
## 308            113A Cypress Island Rd                         
## 309                     525 Clause Dr                         
## 310                      1080 Hwy 384                         
## 311                  9016 Rachelle Dr                         
## 312                 408 Little Guy Ln                         
## 313                 101 E Thompson St                         
## 314                   206 Virginia St                         
## 315                     3321 Quail Dr                         
## 316                       P O Box 157                         
## 317                   108 Eastwood Dr                         
## 318                    913 Hickory St                         
## 319                                                           
## 320                      200 Rhett Pl                         
## 321                    30 Amarillo Dr                         
## 322                        239 Hwy 55                         
## 323                    300 Wilson Ave                         
## 324                       PO Box 1154                         
## 325                   1503 St Mary St                         
## 326                     1922 Bayou Rd                         
## 327              306 Lac Iberville Dr                         
## 328                  18 Landsdowne Ln                         
## 329                   109 S Church St                         
## 330                   500 Welham Loop                         
## 331                      815 River Rd                         
## 332                 42291 Clouatre Rd                         
## 333                   40097 Ronda Ave                         
## 334                      13323 Hwy 73                         
## 335                       P O Box 206                         
## 336                   725 Parlange Dr                         
## 337                       P O Box 434                         
## 338              5923 Afton Villa Way                         
## 339                      PO Box 74005                         
## 340              35635 Woodland Ridge                         
## 341               33885 Cypress Bluff                         
## 342             12327 Patridgewood Dr                         
## 343       14423 Old Hammond Hwy Ste A                         
## 344               6320 Oak Cluster Dr                         
## 345                  9410 Overwood Dr                         
## 346            4420 Lake Limestone Dr                         
## 347                     1632 Tudor Dr                         
## 348                9575 Goodwood Blvd                         
## 349                    1055 Laurel St                         
## 350                      2479 July St                         
## 351                      4642 Palm St                         
## 352                  930 High Lake Dr                         
## 353                  8451 Scarlett Dr                         
## 354                5015 Parkhollow Dr                         
## 355       12901 Jefferson Hwy Apt 212                         
## 356              16042 Shenandoah Ave                         
## 357                  740 Carriage Way                         
## 358                     10371 Dunn Dr                         
## 359                  818 Woodleigh Dr                         
## 360              9832 Ginger Place Dr                         
## 361             422 Centerville St NE                         
## 362                 11000 Buddy Ellis                         
## 363                    19875 McLin Rd                         
## 364                       P O Box 577                         
## 365                        P O Box 73                         
## 366                    390 S Sixth St                         
## 367                     44260 Easy St                         
## 368                                                           
## 369                        P O Box 38                         
## 370                     P O  Box 1405                         
## 371                 19208 Sam Varnado                         
## 372                  1318 Colorado St                         
## 373               20864 Deer Track Rd                         
## 374                    106 Johanna Ct                         
## 375            126 Golden Pheasant Dr                         
## 376                    109 Oakleaf Dr                         
## 377              210 Crowe Landing Rd                         
## 378                       16 Ellen Dr                         
## 379                    70280 First St                         
## 380                49366 Ravenwood Dr                         
## 381                 71565 Rousseau Rd                         
## 382              1612 Mississippi Ave                         
## 383                     1801 David Dr                         
## 384                     10125 Gail Ct                         
## 385                    812 Gordon Ave                         
## 386                     4041 Teche Dr                         
## 387      1009 Chateau Lafitte Dr West                         
## 388                      5321 Toby Ln                         
## 389              5501 W Esplanade Ave                         
## 390           4416 West Esplanade Ave                         
## 391               3207 Belmont Pl 210                         
## 392                    1608 Green Ave                         
## 393                 4612 Richland Ave                         
## 394                    838 Aurora Ave                         
## 395                      PO Box 55896                         
## 396                       411 Betz Pl                         
## 397                     4109 James Dr                         
## 398                         7 Pats Pl                         
## 399                3922 Audubon Trace                         
## 400               233 Modern Farms Rd                         
## 401                     5009 David Dr                         
## 402                1705 Winchester Pl                         
## 403                2621 Ridgecrest Rd                         
## 404                       8 Willow Dr                         
## 405               2283 S Von Braun Ct                         
## 406                2505 Park Place Dr                         
## 407                                                           
## 408                                                           
## 409             24480 Walker South Rd                         
## 410              14112 Forest Glen Ln                         
## 411                                                           
## 412                                                           
## 413                        P O Box 96                         
## 414                 227 Evangeline Dr                         
## 415                  1314 Woodmere Dr                         
## 416                 59232 Pine Bay Ln                         
## 417                  636 Sweet Bay Dr                         
## 418                   117 Columbia Pl                         
## 419                    1190 S Pine St                         
## 420                     207 Quail Run                         
## 421                   134 Kingston Dr                         
## 422                1205 Jefferson Ave                         
## 423                   3209 Kansas Ave                         
## 424                    2811 Tupelo St                         
## 425             625 St Charles Ave 6C                         
## 426                 230 Carondelet St                         
## 427                 3135 De Saix Blvd                         
## 428                                                           
## 429                   15 Audubon Blvd                         
## 430                   1129 Bourbon St                         
## 431               4337 Seminary Place                         
## 432                  1532 Eleonore St                         
## 433                   2715 Calhoun St                         
## 434                    7170 Deanne St                         
## 435                                                           
## 436                                                           
## 437                     511 Seguin St                         
## 438                    4371 Murano Rd                         
## 439                    11 Brittany Pl                         
## 440                                                           
## 441                      P O Box 1866                         
## 442                   232 Bergeron Dr                         
## 443            3930 Jean Lafitte Blvd                         
## 444            1001 Capitol Access Rd                         
## 445                 8855 Brookwood Dr                         
## 446                 7211 Brookwood Dr                         
## 447                       96 Marianna                         
## 448                        26 Deloaks                         
## 449                      19607 Hwy 36                         
## 450                     4724 Folse Dr                         
## 451             500 Poydras St Rm 105                         
## 452                    238 Helios Ave                         
## 453                     P O Box 23219                         
## 454       1631 Elysian Fields Box 150                         
## 455                     P O Box 80126                         
## 456                      P O Box 1236                         
## 457                  806 N Trenton St                         
## 458                     P O Box 80505                         
## 459                   300 Normandy Dr                         
## 460                  244 Wedgewood Dr                         
## 461                   148 Tarleton St                         
## 462                    360 Harrell Rd                         
## 463                       P O Box 907                         
## 464                    621 Canal Blvd                         
## 465                 6 Park Timbers Dr                         
## 466               658 Spanish Town Rd                         
## 467                  8742 Trinity Ave                         
## 468                   412 Rue Douceur                         
## 469                5722 Congress Blvd                         
## 470                    115 McAllen Dr                         
## 471                   298 Lakeview Dr                         
## 472                       PO Box 5177                         
## 473                       4313 Hwy 24                         
## 474                   253 West Oak St                         
## 475                 807 Shadow Oak Ln                         
## 476                       P O Box 188                         
## 477                103 Bayou Perez Dr                         
## 478                       P O Box 111                         
## 479                 2409 Pargoud Blvd                         
## 480            130 DeSiard St Ste 608                         
## 481                      121 Dover Ct                         
## 482                  1002 Broadway St                         
## 483                   2606 Village Ln                         
## 484                     430 Fannin St                         
## 485             8509 E Wilderness Way                         
## 486                 2020 Waterview Ln                         
## 487             7717 Creswell Rd No 4                         
## 488                         PO Box 70                         
## 489                       PO Box 1380                         
## 490               4721 Collinsburg Dr                         
## 491                     3910 Marie Ct                         
## 492                       1001 9th St                         
## 493          4948 W Saint Charles Ave                         
## 494                        PO Box 566                         
## 495                      P O Box 3841                         
## 496            4606 Old Jeanerette Rd                         
## 497                 1007 W St Mary St                         
## 498                  620 Woodvale Ave                         
## 499                      145 Aspen Ln                         
## 500                    734 Crystal St                         
## 501                       1317 Jay St                         
## 502                      410 Royal St                         
## 503                     4224 Canal St                         
## 504                 4415 Franklin Ave                         
## 505                      PO Box 51509                         
## 506                   5809 Canal Blvd                         
## 507                22 Versailles Blvd                         
## 508                   4431 Dryades St                         
## 509              701 Poydras Ste 4100                         
## 510                  105 Cambridge Dr                         
## 511                  3512 Corinne Ave                         
## 512        2214 Rev Richard Wilson Dr                         
## 513                 2600 Labarre Lane                         
## 514                     318 Citrus Rd                         
## 515          101 Derbigny St Ste 4600                         
## 516                    71 Metairie Ct                         
## 517                  450 Woodvine Ave                         
## 518             21220 Judge Becnel Ln                         
## 519                       P O Box 222                         
## 520                     P O Box 55896                         
## 521                     4349 Main Hwy                         
## 522               2910 Castiglione St                         
## 523               11528 Hwy 165 South                         
## 524             1800 Jimmie Davis Hwy                         
## 525                  4800 Beau Lac Ln                         
## 526                    4011 Laurel St                         
## 527                     525 Clause Dr                         
## 528                2007 Urban Dale St                         
## 529               1200 Brookhaven Ave                         
## 530                   6837 Rue Bocage                         
## 531                  115 Triangle Cir                         
## 532                      P O Box 1863                         
## 533              201 Crowe Landing Rd                         
## 534                       P O Box 198                         
## 535                     4645 Music St                         
## 536               1200 Park Island Dr                         
## 537           521 Baronne St Unit 408                         
## 538               13841 Blackwater Rd                         
## 539                   32 Kings Canyon                         
## 540                       469 Vine Dr                         
## 541                     P O Box 55909                         
## 542                  622 Carmenere Dr                         
## 543               123 Maple Ridge Way                         
## 544  61596 Little Southern Village Rd                         
## 545                    19875 McLin Rd                         
## 546                       3105 Pen St                         
## 547                    3591 Aletha Dr                         
## 548                 1302 Applewood Rd                         
## 549                   79005 Musson Ln                         
## 550                 42418 Clouatre Rd                         
## 551                 280 North Bend Ln                         
## 552                    405 Gouaux Ave                         
## 553               5250 Chitimacha Trl                         
## 554                    4711A Main Hwy                         
## 555                  111 Southwark Dr                         
## 556                   633 E Landry St                         
## 557                   7735 McCindy St                         
## 558                    312 Abshire Dr                         
## 559                    1032 Laura Cir                         
## 560                210 High School Dr                         
## 561                      P O Box 1117                         
## 562                        6 Live Oak                         
## 563                     322 Monroe Dr                         
## 564               297 Hearn Island Dr                         
## 565             4007 White's Ferry Rd                         
## 566                  456 Robinhood Ln                         
## 567                   2111 Maywood St                         
## 568               611 Jessie Jones Dr                         
## 569                   412 Sherwood Rd                         
## 570                     2109 Chase Cv                         
## 571                   1024 Pierre Ave                         
## 572                       225 Gray St                         
## 573                   2613 Lakeway Dr                         
## 574                    3821 Morrow St                         
## 575              5636 S Lakeshore 632                         
## 576              9727 Norris Ferry Rd                         
## 577                    440 Albert Ave                         
## 578                 4537 Red Bluff Rd                         
## 579                     1708 Wales Ln                         
## 580                    134 Chimney Ln                         
## 581                  1000 Coussons Rd                         
## 582                   3056 Johnson St                         
## 583                       P O Box 782                         
## 584                     568 Taylor Rd                         
## 585                       2705 Oak Dr                         
## 586                   139 Comanche Tr                         
## 587                    1051 Kansas Ln                         
## 588                    900 St John St                         
## 589               6075 False River Rd                         
## 590                       73 Pecan Dr                         
## 591                   292 Southern Rd                         
## 592            1499 Indian Village Rd                         
## 593                      277 Meade Rd                         
## 594                        PO Box 324                         
## 595                     225 Howard Rd                         
## 596                4824 Porter Circle                         
## 597                       2701 3rd St                         
## 598                    5930 Adrian Dr                         
## 599                      133 J J Lane                         
## 600                  6512 Vineyard Dr                         
## 601               181 Country Club Ln                         
## 602                  208 Cambridge Dr                         
## 603                     529 Tramel Rd                         
## 604                   23 Poinsetta Rd                         
## 605                    2406 Elaine St                         
## 606                  2615 Bushnell Rd                         
## 607                  4836 Portrush Dr                         
## 608                       515 13th St                         
## 609               1240 Chicot Park Rd                         
## 610                       P O Box 488                         
## 611                         484 Ave A                         
## 612                      516 Rozas Rd                         
## 613                    123 Credeur Rd                         
## 614                    103 Giverny Pl                         
## 615                      100 Marsh Dr                         
## 616                       101 Ruth Dr                         
## 617                    1018 Lucien St                         
## 618                  305 Wilkinson St                         
## 619                  705 Oak Manor Dr                         
## 620                   206 Virginia St                         
## 621                  1501 Sterling Rd                         
## 622                      3239 Hwy 308                         
## 623                    5 Glen Oaks Dr                         
## 624                    300 Wilson Ave                         
## 625           157 Bayou Portuguese Dr                         
## 626                   107 New Hope Dr                         
## 627             3784 San Francisco Dr                         
## 628                    7 Turnberry Dr                         
## 629                 2034 S Robert Ave                         
## 630              18436 Greenbriar Ave                         
## 631                       3413 Hwy 70                         
## 632             701 S Acadian Thruway                         
## 633                       PO Box 1232                         
## 634                 385 Lakecrest Ave                         
## 635               33885 Cypress Bluff                         
## 636                      PO Box 78286                         
## 637         12203 Lake Sherwood Ave N                         
## 638               5515 Riverbend Blvd                         
## 639                 2788 Windrush Way                         
## 640                    9557 Wesson St                         
## 641                 426 W Woodgate Ct                         
## 642                7290 Enterprise Dr                         
## 643               12389 Louisiana Ave                         
## 644                     1690 Hwy 51 N                         
## 645               74299 Peg Keller Rd                         
## 646                      25255 Hwy 62                         
## 647                   416 Starling Dr                         
## 648                    819 W 13th Ave                         
## 649                    9265 Evelyn Pl                         
## 650          13 Chateau Rue de Jardin                         
## 651                2016 Persimmon Ave                         
## 652                        PO Box 593                         
## 653                   400 Central Ave                         
## 654                         341 Ave C                         
## 655                       720 Fos Ave                         
## 656                2449 Park Place Dr                         
## 657                      906 W Dakota                         
## 658                  2313 Bellaire Ln                         
## 659            1939 South Tiffani Ave                         
## 660                   1501 Madison St                         
## 661                     308 Margon Ct                         
## 662                    2320 Laurel St                         
## 663                   3209 Kansas Ave                         
## 664            547 Baronne St Ste 202                         
## 665            1133 Robert E Lee Blvd                         
## 666              29270 Henry White Rd                         
## 667                  135 Northern Ave                         
## 668                     4422 Music St                         
## 669           601 Poydras St Ste 1635                         
## 670                      7001 Cove Dr                         
## 671          5555 Bullard Ave Ste 101                         
## 672               3433 East Forest Dr                         
## 673                   2415 Danbury Dr                         
## 674                   2304 Etienne Dr                         
## 675             108 Grand Maison Blvd                         
## 676                         PO Box 40                         
## 677                  6204 Sonhaven Dr                         
## 678                       PO Box 3588                         
## 679                    2512 Parham Dr                         
## 680                    4322 Rosary Ln                         
## 681                 424 Evangeline Pl                         
## 682                                                           
## 683                   450 Monrovia St                         
## 684             3252 Green Terrace Rd                         
## 685                         Ste 300 D                         
## 686               11260 Heritage Oaks                         
## 687               501 Texas St Rm 404                         
## 688                        PO Box 786                         
## 689                        PO Box 100                         
## 690                       212 Hwy 519                         
## 691             2110 North Trenton St                         
## 692                    1604 Ravine Dr                         
## 693                        PO Box 138                         
## 694                      1247 Hwy 594                         
## 695                 169 Turtledove Dr                         
## 696                      P O Box 3251                         
## 697                  241 Oregon Trail                         
## 698                   4100 Chauvin Ln                         
## 699                 2606 Pargoud Blvd                         
## 700                   124 Western Ave                         
## 701                      160 Napoleon                         
## 702                   3309 Stowers Dr                         
## 703                  394 Joe White Rd                         
## 704                        PO Box 604                         
## 705             945 Overland Stage Rd                         
## 706               310 A J Stephens Rd                         
## 707            6566 Main St Second Fl                         
## 708                  311 Cleveland St                         
## 709                        PO Box 708                         
## 710                  501 Highway 3037                         
## 711                       P O Box 310                         
## 712                        PO Box 908                         
## 713           2116 Coulee Crossing Rd                         
## 714                    PO Drawer 1431                         
## 715                  1037 Edgewood Dr                         
## 716              5716 Courtland Place                         
## 717                      475 Downs Ln                         
## 718               4406 Willowick Blvd                         
## 719                       PO Box 1431                         
## 720                        5923 Hwy 6                         
## 721                      2498 Hwy 119                         
## 722                         PO Box 56                         
## 723                        PO Box 301                         
## 724                         PO Box 84                         
## 725                  2087 Faubourg Rd                         
## 726                  1300 Fuselier Rd                         
## 727                       PO Box 1150                         
## 728                     509 N 1st Ave                         
## 729                     647 Stella Dr                         
## 730                   918 Toulouse Dr                         
## 731                      1508 Bank St                         
## 732                     5567 Chuck Dr                         
## 733          2859 Henderson Forest Ln                         
## 734                   1302 Spanish Dr                         
## 735                    2610 Chiara Dr                         
## 736                     215 Failla Rd                         
## 737                     101 Jyro Lane                         
## 738                    517 Trappey Rd                         
## 739                       PO Box 3407                         
## 740                    222 Antigua Dr                         
## 741               904 Bayou Tortue Rd                         
## 742                  406 Montrose Ave                         
## 743                 1304 Lafayette St                         
## 744                      1718 N Ave D                         
## 745                        PO Box 503                         
## 746                    1534 Connie Rd                         
## 747                          PO Box 7                         
## 748                    14121 Towne Ln                         
## 749               1014 Loreauville Rd                         
## 750                       PO Box 9067                         
## 751                      PO Box 13446                         
## 752                 2206 Catherine Dr                         
## 753                  111 Upperline St                         
## 754                        PO Box 268                         
## 755                 109 Plantation Dr                         
## 756                        716 1st St                         
## 757                        PO Box 231                         
## 758                    312 Ashland Dr                         
## 759                        1082 Hwy 1                         
## 760                         PO Box 67                         
## 761                       102 Palm Pl                         
## 762              20725 Charles Ory Dr                         
## 763                 24010 Sherwood Dr                         
## 764                        PO Box 274                         
## 765              14433 Waterloo Drive                         
## 766                3124 Jefferson Ave                         
## 767           222 St Louis St Ste 816                         
## 768                      PO Box 66514                         
## 769                   1235 Chariot Dr                         
## 770                2147 Government St                         
## 771              3684 Spanish Trail E                         
## 772                 12888 Triple B Rd                         
## 773                   1024 E Lakeview                         
## 774           222 St Louis St Ste 776                         
## 775                  4965 East Mae St                         
## 776                 8925 Brookwood Dr                         
## 777           222 St Louis St Ste 880                         
## 778                       PO Box 3261                         
## 779        16654 S Fulwar Skipwith Rd                         
## 780                4518 Whitehaven St                         
## 781                         PO Box 38                         
## 782                        PO Box 803                         
## 783                     990 Calmes Rd                         
## 784                        PO Box 401                         
## 785                        PO Box 800                         
## 786                 1101 Cockerham Rd                         
## 787                        PO Box 280                         
## 788                         PO Box 36                         
## 789                                                           
## 790                  30047 Corbin Ave                         
## 791       1303 North General Pershing                         
## 792                 83366 Shepherd Ln                         
## 793               1016 1/2 W 21st Ave                         
## 794                       PO Box 4099                         
## 795            220 S Massachusetts St                         
## 796                      24447 Hwy 25                         
## 797                 72569 Military Rd                         
## 798                1306 Military Road                         
## 799                 701 N Columbia St                         
## 800                     107 E 7th Ave                         
## 801                      20106 Hwy 25                         
## 802                 2145 Hampshire Dr                         
## 803                   534 E Boston St                         
## 804                  2222 S Edward St                         
## 805                     11117 Hwy 431                         
## 806                    2768 La Hwy 44                         
## 807                   2019 S Woodlawn                         
## 808               41447 Pertuis Acres                         
## 809                     5214 Pitre Dr                         
## 810              2516 Cypress Lawn Dr                         
## 811                   4801 Chateau Dr                         
## 812                       P O Box 489                         
## 813                      4416 Toby Ln                         
## 814                  4921 Bissonet Dr                         
## 815                   2612 Labarre Ln                         
## 816                       PO Box 1034                         
## 817                       25 Emile St                         
## 818               4708 Green Acres Ct                         
## 819                   6005 Boutall St                         
## 820                        PO Box 185                         
## 821                      29 Derbes Dr                         
## 822                      15 Derbes Dr                         
## 823                  127 Arlington Dr                         
## 824                 420 Timberlane Dr                         
## 825                    122 Clausen Rd                         
## 826                   110 Lavender Ct                         
## 827             1000 Mallard Bend Cir                         
## 828                        PO Box 276                         
## 829                 345 Crosscreek Dr                         
## 830                   512 Weavers Way                         
## 831                201 Hilton Head Dr                         
## 832                 200 Claremore Cir                         
## 833                      4573 Hwy 743                         
## 834                        PO Box 777                         
## 835                   117 E Smiley St                         
## 836                       PO Box 1686                         
## 837                       PO Box 2387                         
## 838                135 Ormond Oaks Dr                         
## 839                       117 Wade St                         
## 840                 206 St Anthony St                         
## 841                     116 Bray Lane                         
## 842               1461 Fords Dairy Rd                         
## 843                729 Alexandria Hwy                         
## 844                2200 E Academy Ave                         
## 845                       PO Box 3109                         
## 846                       PO Box 3564                         
## 847                        PO Box 308                         
## 848                       PO Box 3780                         
## 849                      7856 Main St Courthouse Annex Ste 236
## 850                   202 Hospital Dr                         
## 851                        PO Box 584                         
## 852                 10 Pecan Grove Ln                         
## 853         2032 Fort Beauregard Blvd                         
## 854                    2113 Serpas Ln                         
## 855                 3613 Dauterive Dr                         
## 856          1101 West St Bernard Hwy                         
## 857                     125 Durham Rd                         
## 858                       703 Park Rd                         
## 859                       PO Box 1025                         
## 860                      2071 Hwy 850                         
## 861              4924 West Creole Hwy                         
## 862                        PO Box 383                         
## 863                 400 West Fifth St                         
## 864                        PO Box 189                         
## 865                        PO Box 308                         
## 866                       PO Box 1581                         
## 867                    1172 Smyrna Rd                         
## 868                             Div A                         
## 869                  5618 Bancroft Dr                         
## 870                     8 DuckHook Dr                         
## 871                      PO Box 51597                         
## 872                 2832 Serantine St                         
## 873                  170 Audubon Blvd                         
## 874                3557 Inwood Avenue                         
## 875                      PO Box 56775                         
## 876                      PO Box 51886                         
## 877                  3724 Clermont Dr                         
## 878                                                           
## 879                  4824 Bancroft Dr                         
## 880                  4819 Bancroft Dr                         
## 881     3200 Louisiana Avenue Parkway                         
## 882                   14 Newcomb Blvd                         
## 883                      PO Box 30087                         
## 884                  3624 Pin Oak Ave                         
## 885                      1670 Sere St                         
## 886                     7904 Birch St                         
## 887                      PO Box 58333                         
## 888                   2700 Tulane Ave                         
## 889                   2700 Tulane Ave                         
## 890                       417 18th St                         
## 891                      PO Box 15646                         
## 892         2700 Tulane Ave Section J                         
## 893                      PO Box 53404                         
## 894           2700 Tulane Ave Ste 200       Attn: Robert Kazik
## 895      4007 St Charles Ave Unit 208                         
## 896                  9304 Melissa Way                         
## 897                      2013 Hwy 794                         
## 898                 One Ridgecrest Dr                         
## 899                         PO Box 52                         
## 900                      2250 Cook Rd                         
## 901                        P O Box 97                         
## 902              4001 Carter St Ste 9                         
## 903                     407 W Main St                         
## 904                        PO Box 269                         
## 905                 1946 Williams Ave                         
## 906               540 N Courthouse St                         
## 907                        PO Box 315                         
## 908               1726 Chicot Park Rd                         
## 909                      3600 Lake St                         
## 910                      100 Demas Dr                         
## 911                   2103 Warwick St                         
## 912                        PO Box 431                         
## 913                        PO Box 309                         
## 914         222 St Louis St 5th Floor                         
## 915                       P O Box 429                         
## 916               17120 Natures Trace                         
## 917                 701 N Columbia St                         
## 918                  12420 Fernand Rd                         
## 919                    113 Beverly Dr                         
## 920                 1 Park Riverwoods                         
## 921                       700 Gladney                         
## 922                   P O Drawer 1968                         
## 923                       PO Box 1066                         
## 924                        PO Box 680                         
## 925                  124 Fullerton Dr                         
## 926                       603 Lucy St                         
## 927                 11 Summerfield Dr                         
## 928                       P O Box 839                         
## 929          4625 East St Bernard Hwy                         
## 930                    144 Red Oak Ln                         
## 931                 1324 Woodbrook Dr                         
## 932                      4719 Hwy 559                         
## 933             190 Raymond Sanner Ln                         
## 934                         PO Box 54                         
## 935                  2037 Colonial Dr                         
## 936                     373 Ginger St                         
## 937                      7223 Ring St                         
## 938                    430 S Fifth St                         
## 939                     6144 River Rd                         
## 940                     4618 Fern Ave                         
## 941                107 Waters Edge Dr                         
## 942                     430 Topeka St                         
## 943                  1250 Phillip Ave                         
## 944                   9209 Midvale Dr                         
## 945                     612 W Main St                         
## 946                 1916 Dr Beckom Dr                         
## 947                   181 Veterans Dr                         
## 948              6409 Long Timbers Dr                         
## 949                     322 Market St                         
## 950                1205 S Mildred Ave                         
## 951              312 East LeBlanc  St                         
## 952                    301 Ontario St                         
## 953                      4651 Hwy 151                         
## 954                 240 John Kelly Rd                         
## 955              1010 N Larriviere Rd                         
## 956                  1360 Phillip Ave                         
## 957                   284 Fuselier St                         
## 958                  2484 Guillory St                         
## 959                       P O Box 192                         
## 960          889 Arthur McDaniel Road                         
## 961                  108 South Elm St                         
## 962                     1350 Duck Ave                         
## 963                    3126 Stagg Ave                         
## 964                405 E Fairfield Rd                         
## 965               1316 Blankenship Dr                         
## 966                    202 S Helen St                         
## 967                 1637 Duplechin St                         
## 968                 512 N Railroad St                         
## 969                    3126 Stagg Ave                         
## 970                   709 Francois St                         
## 971                  2708 Railroad St                         
## 972                       P O Box 196                         
## 973                  2405 Guillory St                         
## 974                  217 S Pelloat St                         
## 975                308 S President St                         
## 976                    226 E Pound St                         
## 977                   238 Fuselier St                         
## 978                  236 St Landry St                         
## 979                     415 Market St                         
## 980                 206 Washington St                         
## 981                      111 Third St                         
## 982                     506 Fourth St                         
## 983                   606 S Richfield                         
## 984                      607 Fifth St                         
## 985                    105 W First St                         
## 986                      9391 Hwy 145                         
## 987                  4698 Highway 151                         
## 988                  9530 highway 145                         
## 989                 200 John Kelly Rd                         
## 990               110 east 7th Street                         
## 991                   410 West 3rd St                         
## 992                     1220 Faris St                         
## 993                   180 Jennifer St                         
## 994              112 University Place                         
## 995                   531 W Park Blvd                         
## 996                      2509 Kemp Ln                         
## 997                 1053 Boulevard St                         
## 998                   4603 Gilbert Dr                         
## 999                  510 Red Baron Dr                         
## 1000                2406 Helmsdale Ct                         
## 1001                       4532 Alton                         
## 1002                   120 Carondelet                         
## 1003                  304 E Fourth St                         
## 1004                    326 Branch St                         
## 1005               300 S St Pierre St                         
## 1006        918 Martin Luther King Dr                         
## 1007                1510 S Morgan Ave                         
## 1008                817 Chinquapin Dr                         
## 1009                      219 Alley 2                         
## 1010                  710 N Frusha Dr                         
## 1011                 120 Beau Clos Ln                         
## 1012                1100 Christina Dr                         
## 1013              710 Heart D Farm Rd                         
## 1014                  262 Thompson Rd                         
## 1015                                                          
## 1016                                                          
## 1017                                                          
## 1018                                                          
## 1019                                                          
## 1020                                                          
## 1021                                                          
## 1022                                                          
## 1023               451 Pointe Noir Rd                         
## 1024                     501 Peggy St                         
## 1025                     204 Carol Dr                         
## 1026                     105 Janet Dr                         
## 1027                                                          
## 1028                                                          
## 1029                       PO Box 310                         
## 1030                     310 Wiltz St                         
## 1031                  310 S Arenas St                         
## 1032                 504 Deer Park Dr                         
## 1033                1265 Atteberry Rd                         
## 1034                 886 McMillan Ave                         
## 1035                     348 Teddy St                         
## 1036                      P O Box 922                         
## 1037                  404 N Parkerson                         
## 1038                    610 E Bernard                         
## 1039                    718 W 11th St                         
## 1040                    526 Atwood Dr                         
## 1041                   212 Morris Ave                         
## 1042                    1109 Wades Rd                         
## 1043                    863 Nation Rd                         
## 1044           8520 Grand Prairie Hwy                         
## 1045               153 Levin Savoy Ln                         
## 1046                     129 Nolan Rd                         
## 1047                     1718 N Ave D                         
## 1048               402 N Parkerson St                         
## 1049              312 Stewartville Rd                         
## 1050                     122 W Thayer                         
## 1051                      820 N Ave B                         
## 1052                    2323 Egan Hwy                         
## 1053                  1229 Airport Rd                         
## 1054                    1370 Leger Rd                         
## 1055                    701 East E St                         
## 1056                   511 S David St                         
## 1057                      210 St Edna                         
## 1058                      P O Box 578                         
## 1059                     122 Oneal Ln                         
## 1060                  666 N Beaugh St                         
## 1061                  1114 Schultz Rd                         
## 1062                4265 S LeBlanc Rd                         
## 1063                    139 Miguel Rd                         
## 1064                       PO Box 432                         
## 1065                    544 Brasseaux                         
## 1066                   210 Cypress St                         
## 1067                       PO Box 118                         
## 1068               2524 Alfa Romeo Rd                         
## 1069           12 Governor Edwards Dr                         
## 1070                       701 E E St                         
## 1071                  646 N Beaugh St                         
## 1072                      P O Box 555                         
## 1073                   212 Morris Ave                         
## 1074                   203 Seventh St                         
## 1075               614 S Eucharist St                         
## 1076                     106 Clark Ct                         
## 1077                  308 S Parkerson                         
## 1078                334 N Franques St                         
## 1079                 222 W Kennedy St                         
## 1080                    221 First Ave                         
## 1081                       PO Box 352                         
## 1082                 505 Kruttschnitt                         
## 1083                   170 W Hoyt Ave                         
## 1084              705 S Cunningham St                         
## 1085                 110 St Peter Ave                         
## 1086                  624 S Second St                         
## 1087                 407 W Kennedy St                         
## 1088                      117 Mary St                         
## 1089                       PO Box 528                         
## 1090                   313 Acadia Ave                         
## 1091                105 Plaquemine St                         
## 1092                    168 Sylvia Ln                         
## 1093                      106 12th St                         
## 1094                   1205 Church St                         
## 1095                      102 12th St                         
## 1096            1094 S Jackson Avenue                         
## 1097               315 W Mauboules St                         
## 1098                      P O Box 183                         
## 1099                 606 Chappuis Ave                         
## 1100                    705 W 14th St                         
## 1101                     14 Rue Aline                         
## 1102        614 Martin Luther King St                         
## 1103                     509 Third St                         
## 1104                      720 N Ave J                         
## 1105               503 East Second St                         
## 1106                360 Saint Jude St                         
## 1107                     609 E Butler                         
## 1108                      213 N Ave A                         
## 1109                   720 W Third St                         
## 1110                  406 W Harmon St                         
## 1111                       813 E F St                         
## 1112                  8 Bayou Oaks Dr                         
## 1113                528 E Jeanette St                         
## 1114                  247 S Daigle St                         
## 1115                  731 W Keller St                         
## 1116                    812 Pawnee Rd                         
## 1117                                                          
## 1118                                                          
## 1119                       PO Box 567                         
## 1120                                                          
## 1121                                                          
## 1122                                                          
## 1123                                                          
## 1124                      P O Box 665                         
## 1125                                                          
## 1126                                                          
## 1127                                                          
## 1128                                                          
## 1129                                                          
## 1130                                                          
## 1131                                                          
## 1132                 275 B Lambert Rd                         
## 1133                       PO Box 248                         
## 1134                     113 North St                         
## 1135                     104 Mowad Dr                         
## 1136                   307 Melbert St                         
## 1137                      P O Box 381                         
## 1138                    2745 Hwy 1153                         
## 1139                       P O Box 88                         
## 1140               126 Roy Sonnier Rd                         
## 1141                      210 Joan St                         
## 1142                   3800 Walker Rd                         
## 1143                   PO Drawer 1114                         
## 1144                      P O Box 635                         
## 1145                     623 Lewis St                         
## 1146           2550 Highway 165 South                         
## 1147               1115 E Seventh Ave                         
## 1148                   2033 Turner Rd                         
## 1149             204 North Seventh St                         
## 1150                      132 Vera St                         
## 1151                      PO Box 1911                         
## 1152                      PO Box 1637                         
## 1153                      PO Box 1637                         
## 1154                        PO Box 41                         
## 1155              PO Box 5 Briscoe Rd                         
## 1156                      PO Drawer G                         
## 1157                 388 Ray Shuff Rd                         
## 1158                        PO Box 21                         
## 1159                    248 Dowies Rd                         
## 1160                306 E Seventh Ave                         
## 1161                  618 Sycamore St                         
## 1162                  1515 Lurton Ave                         
## 1163               802 East Ninth Ave                         
## 1164                        PO Box 73                         
## 1165                    1503 Hwy 1153                         
## 1166                  629 Sycamore St                         
## 1167                    PO Drawer A H                         
## 1168                515 Third Ave  D4                         
## 1169               702 North Lyles St                         
## 1170                      P O Box 443                         
## 1171                      P O Box 104                         
## 1172                      PO Box 1126                         
## 1173               405 South First St                         
## 1174               322 North Sixth St                         
## 1175                      P O Box 117                         
## 1176                       607 9th St                         
## 1177                1142 Horseshoe Dr                         
## 1178                    707 Willow St                         
## 1179                  407 Live Oak St                         
## 1180                      P O Box 501                         
## 1181                   1009 Tupelo St                         
## 1182                       PO Box 165                         
## 1183               605 North Lyles St                         
## 1184                       301 Poe St                         
## 1185                   912 Holiday St                         
## 1186                        PO Box 58                         
## 1187                     P O Box 1055                         
## 1188                     413 N 5th St                         
## 1189                  1509 Hwy 1153 N                         
## 1190                       PO Box 548                         
## 1191                    1120 Scott Dr                         
## 1192                      PO Box 1826                         
## 1193                       PO Box 353                         
## 1194                    41271 Hwy 933                         
## 1195                  1409 Millien Rd                         
## 1196                                                          
## 1197                     39034 Hwy 22                         
## 1198                                                          
## 1199             16153 Joe Severio Rd                         
## 1200                                                          
## 1201                15442 Airline Hwy                         
## 1202                                                          
## 1203                                                          
## 1204                  41291 Cannon Rd                         
## 1205                                                          
## 1206                  13103 Hanson Rd                         
## 1207                42291 Clouatre Rd                         
## 1208                  40487 Cannon Rd                         
## 1209           42133 Shadow Creek Ave                         
## 1210                      5405 Hwy 44                         
## 1211                       PO Box 217                         
## 1212                6090 Brewerton Rd                         
## 1213               1030 N Coolidge St                         
## 1214                 17156 W Swamp Rd                         
## 1215                43510 N Pinecrest                         
## 1216                                                          
## 1217         18061 Cully Broussard Rd                         
## 1218                       PO Box 217                         
## 1219                14114 Rosehill Ln                         
## 1220                 1137 E Fabian St                         
## 1221         41432 W Marthas Vineyard                         
## 1222             18435 Greenbriar Ave                         
## 1223               40336 Loosemore Rd                         
## 1224                 815 E Worthey St                         
## 1225                14464 L Keller Rd                         
## 1226                15151 Highland Rd                         
## 1227                    13367 Hwy 431                         
## 1228                  1409 Millien Rd                         
## 1229                7140 Donaldson Dr                         
## 1230                     11239 Hwy 73                         
## 1231             18394 Greenbriar Ave                         
## 1232                    42105 Hwy 933                         
## 1233         12038 Arthur Clouatre Rd                         
## 1234           18462 Van Broussard Rd                         
## 1235                 36324 C Braud Rd                         
## 1236                   12202 Roddy Rd                         
## 1237                   1222 E Rome St                         
## 1238         40211 William Ficklin Rd                         
## 1239                     612 W 7th St                         
## 1240                      406 Lee Ave                         
## 1241               38487 Arrowhead Dr                         
## 1242               12043 Cotton Patch                         
## 1243                       PO Box 353                         
## 1244             16153 Joe Severio Rd                         
## 1245       38138 Willow Lake East Ave                         
## 1246                10454 Airline Hwy                         
## 1247                   11133 Savoy Rd                         
## 1248                   40337 Lelia Rd                         
## 1249              42270 Weber City Rd                         
## 1250                  1004 Madison St                         
## 1251         18507 Andrew Jackson Ave                         
## 1252              44073 Gold Place Rd                         
## 1253                 2411 St Simon Pl                         
## 1254                       P O Box 85                         
## 1255             12487 Agnes Marie Rd                         
## 1256                  2219 E Bayou Rd                         
## 1257                 1745 E Nelson St                         
## 1258                     7284 Main St                         
## 1259               1324 S Shirley Ave                         
## 1260                      7502 Eva St                         
## 1261                      7502 Eva St                         
## 1262                      P O Box 383                         
## 1263                  2200 E Bayou Rd                         
## 1264                     P O Box 1582                         
## 1265                      106 Anna St                         
## 1266                 916 Iberville St                         
## 1267                      P O Box 426                         
## 1268                 1804 E Bocage St                         
## 1269                     333 Verna St                         
## 1270               2414 S Edwards Ave                         
## 1271                       PO Box 725                         
## 1272                44315 Bertrand St                         
## 1273                 8168 Everette St                         
## 1274                       P O Box 71                         
## 1275               8235 Villeneuve St                         
## 1276                     8251 Main St                         
## 1277                                                          
## 1278                     139 Ideal St                         
## 1279                      P O Box 832                         
## 1280                                                          
## 1281                                                          
## 1282                       4113 Hwy 1                         
## 1283                       P O Box 88                         
## 1284                                                          
## 1285                      3413 Hwy 70                         
## 1286                                                          
## 1287                                                          
## 1288                                                          
## 1289                                                          
## 1290                                                          
## 1291                                                          
## 1292                      P O Box 750                         
## 1293                                                          
## 1294                                                          
## 1295                                                          
## 1296                                                          
## 1297                     4404 Hwy 308                         
## 1298                    PO Drawer 249                         
## 1299                     3623 Hwy 308                         
## 1300                     4980 Hwy 308                         
## 1301                     139 Ideal St                         
## 1302                   319 Brule Road                         
## 1303                   159 Pond Drive                         
## 1304                       3555 Hwy 1                         
## 1305                       4554 Hwy 1                         
## 1306                    128 Jacobs St                         
## 1307                       7215 Hwy 1                         
## 1308                      2631 Lee Dr                         
## 1309                   129 Timothy St                         
## 1310                     219 Daggs St                         
## 1311                  111 Elmfield St                         
## 1312                  240 Flamingo Rd                         
## 1313                       3242 Hwy 1                         
## 1314                       4547 Hwy 1                         
## 1315                  179 Virginia St                         
## 1316                        PO Box 14                         
## 1317                 102A N Curtis St                         
## 1318                      239 Mike St                         
## 1319             239 Rue de Beauville                         
## 1320                     2425 Hwy 308                         
## 1321                2646 Hwy 70 South                         
## 1322                       PO Box 168                         
## 1323                       3615 Hwy 1                         
## 1324                2919 Hwy 70 South                         
## 1325                      P O Box 921                         
## 1326                 406 Telegraph St                         
## 1327                      PO Box 1224                         
## 1328                      PO Box 1475                         
## 1329                                                          
## 1330                                                          
## 1331                                                          
## 1332                                                          
## 1333                                                          
## 1334                                                          
## 1335                                                          
## 1336                                                          
## 1337                                                          
## 1338                                                          
## 1339                                                          
## 1340                                                          
## 1341                                                          
## 1342                                                          
## 1343                                                          
## 1344                                                          
## 1345                                                          
## 1346                                                          
## 1347                                                          
## 1348                                                          
## 1349                 527 Highway 1183                         
## 1350                       PO Box 219                         
## 1351                    259 Coco Road                         
## 1352               1444 South Main St                         
## 1353                      P O Box 116                         
## 1354             581 Little Corner Rd                         
## 1355              532 N Washington St                         
## 1356                      P O Box 472                         
## 1357                   126 Lemoine St                         
## 1358                      P O Box 841                         
## 1359                      P O Box 114                         
## 1360                    3464 Hwy 29 S                         
## 1361               143 Pecan Grove Rd                         
## 1362                        PO Box 83                         
## 1363                       PO Box 429                         
## 1364                     P O Box 1045                         
## 1365                    2951 Hwy 1192                         
## 1366                     538 Lewis St                         
## 1367                     5126 Hwy 454                         
## 1368                    15320 Hwy 451                         
## 1369              4270 East School St                         
## 1370                   2260 Valley St                         
## 1371          203 North Cottonwood St                         
## 1372                    112 Tooney St                         
## 1373                  1337 Shirley Rd                         
## 1374              185 Bordelon St Ext                         
## 1375                  902 Highway 107                         
## 1376                  2326 LeGlise St                         
## 1377                       PO Box 185                         
## 1378                     552 Hwy 1194                         
## 1379                  791 Big Bend Rd                         
## 1380                   206 English Rd                         
## 1381                 206 English Road                         
## 1382                 778 Choupique Ln                         
## 1383             897 S Bayou DeGlaise                         
## 1384                     1771 Hwy 107                         
## 1385                   2118 Regard St                         
## 1386                     369 Jacks Rd                         
## 1387                     795 Hwy 1194                         
## 1388                  761 Big Bend Rd                         
## 1389                       PO Box 373                         
## 1390                    1121 Hwy 1181                         
## 1391                  146 Bergeron Ln                         
## 1392      907 South Bayou Des Glaises                         
## 1393              402 N Sweetbriar Dr                         
## 1394                  930 E Tunica Dr                         
## 1395                      P O Box 216                         
## 1396                    123 Barron Ln                         
## 1397                  6439 Merrick St                         
## 1398                       P O Box 21                         
## 1399                       P O Box 56                         
## 1400                804 Couvillion St                         
## 1401                       P O Box 88                         
## 1402               207 N Briarwood Dr                         
## 1403                      P O Box 612                         
## 1404                  2228 Leglise St                         
## 1405                       PO Box 145                         
## 1406                      P O Box 396                         
## 1407                 408 S Gayle Blvd                         
## 1408                 120 Briarwood Dr                         
## 1409                      P O Box 934                         
## 1410                      P O Box 951                         
## 1411                   104 S Sycamore                         
## 1412                 641 N Preston St                         
## 1413                      P O Box 353                         
## 1414                     108 N Elm St                         
## 1415                    154 Bernes St                         
## 1416                      P O Box 438                         
## 1417                 515 Pershing Ave                         
## 1418                     440 Green St                         
## 1419                      P O Box 761                         
## 1420              109 S Sweetbriar Dr                         
## 1421               613 Richelieu Pkwy                         
## 1422                       P O Box 43                         
## 1423                      1011 S Main                         
## 1424                   383 College St                         
## 1425                   1046 Cotton St                         
## 1426                   383 College St                         
## 1427                   1070 Cotton St                         
## 1428                      193 Hill St                         
## 1429                  2129 St Jean St                         
## 1430                   2283 Valley St                         
## 1431                 6718 Porterie St                         
## 1432                  6612 Eugenia St                         
## 1433                 2228 Blackman St                         
## 1434                      P O Box 353                         
## 1435                      P O Box 331                         
## 1436                      P O Box 469                         
## 1437                   275 Lemoine St                         
## 1438                      P O Box 271                         
## 1439                612 Couvillion St                         
## 1440                       P O Box 38                         
## 1441                      P O Box 153                         
## 1442                       P O Box 52                         
## 1443                       P O Box 40                         
## 1444                     P O Box 1216                         
## 1445                    127 Pierre Dr                         
## 1446                     P O Box 1166                         
## 1447                      PO Box 1363                         
## 1448                706 WW Batties Dr                         
## 1449                 806 Lakecourt Dr                         
## 1450                     405 Mango Dr                         
## 1451                    326 Branch St                         
## 1452                                                          
## 1453                                                          
## 1454                 513 Parkview Ave                         
## 1455                                                          
## 1456                   195 Vallery Rd                         
## 1457                                                          
## 1458                                                          
## 1459                                                          
## 1460                                                          
## 1461                                                          
## 1462                        PO Box 93                         
## 1463                     180 Kerry St                         
## 1464                                                          
## 1465                                                          
## 1466                                                          
## 1467                                                          
## 1468                                                          
## 1469                                                          
## 1470                                                          
## 1471                                                          
## 1472                                                          
## 1473                                                          
## 1474             351 Chester Davis Rd                         
## 1475                       PO Box 100                         
## 1476                      306 Long St                         
## 1477              1332 Blankenship Dr                         
## 1478                 2914 Bearhead Rd                         
## 1479                     445 Eaves Lp                         
## 1480                   1139 Lucius Dr                         
## 1481               210 Teddy Welch Rd                         
## 1482          534 Longville Church Rd                         
## 1483                    429 Gladys St                         
## 1484                   225 S Texas St                         
## 1485                1205 SA Cooley Rd                         
## 1486             416 Thundervalley Rd                         
## 1487           1037 Charles Libick Rd                         
## 1488                      190 Lane Rd                         
## 1489                   7138 Hwy 110 W                         
## 1490                 513 Parkview Ave                         
## 1491             192 Jimmy Barrett Rd                         
## 1492                     160 Kerry St                         
## 1493                   1132 Godair Dr                         
## 1494               202 Cecil Doyle Dr                         
## 1495                      P O Box 205                         
## 1496             139 Chester Davis Rd                         
## 1497                  310 Don Gray Rd                         
## 1498                 290 Ray Brown Rd                         
## 1499                       PO Box 501                         
## 1500               961 Newt Hodges Rd                         
## 1501                    1477 Hwy 1147                         
## 1502                       PO Box 104                         
## 1503                       PO Box 310                         
## 1504                   306 Burnett Lp                         
## 1505                     4239 Hwy 113                         
## 1506                    445 Cooper St                         
## 1507                      P O Box 100                         
## 1508                637 S Railroad St                         
## 1509                      P O Box 514                         
## 1510                 495 N Johnson St                         
## 1511                    325 Cooper St                         
## 1512                      P O Box 790                         
## 1513                      P O Box 730                         
## 1514                                                          
## 1515                                                          
## 1516                                                          
## 1517                                                          
## 1518                                                          
## 1519                                                          
## 1520                                                          
## 1521                 210 Pinecrest Dr                         
## 1522                                                          
## 1523                                                          
## 1524                                                          
## 1525                                                          
## 1526                                                          
## 1527                                                          
## 1528                                                          
## 1529                   190 Grammys Rd                         
## 1530         100 Courthouse Dr Rm 100                         
## 1531                   1501 Myrtle St                         
## 1532                    1969 Hazel St                         
## 1533                 210 Pinecrest Dr                         
## 1534                       PO Box 116                         
## 1535                     1694 Hwy 794                         
## 1536                  1419 Pietsch Rd                         
## 1537                     3046 Hwy 154                         
## 1538           133 Gerald McCarthy Rd                         
## 1539              1702 Shady Grove Rd                         
## 1540                      1596 1st St                         
## 1541                    129 Graham Rd                         
## 1542                  2243 Coleman St                         
## 1543                    1408 Wyatt St                         
## 1544                    582 Dallas Rd                         
## 1545                    10376 Hwy 155                         
## 1546                     129 Brice Rd                         
## 1547                    1844 Maple St                         
## 1548                       PO Box 268                         
## 1549                     4281 Hwy 507                         
## 1550                      PO Box 5068                         
## 1551                1355 Sand Hill Rd                         
## 1552                  3120 Johnson St                         
## 1553                      P O Box 300                         
## 1554                      117 Page Rd                         
## 1555                       PO Box 445                         
## 1556                      27624 Hwy 9                         
## 1557                    3252 Lyons St                         
## 1558               1218 Shady Lane St                         
## 1559                     2409 Hwy 517                         
## 1560                 1975 Military Rd                         
## 1561                      P O Box 109                         
## 1562                181 Blue Ridge Rd                         
## 1563                     2093 Hwy 507                         
## 1564                     P O Box 5022                         
## 1565                      13415 Hwy 4                         
## 1566                     867 Bruce Dr                         
## 1567                  1395 Talbert St                         
## 1568                      448 10th St                         
## 1569                       PO Box 314                         
## 1570                  538 Six Mile Rd                         
## 1571                    1347 Davis Rd                         
## 1572                    1651 Pearl St                         
## 1573                    1381 Beech St                         
## 1574                 338 Oak Grove Rd                         
## 1575                    2125 Pearl St                         
## 1576                    13003 Hwy 153                         
## 1577                    12760 Hwy 154                         
## 1578                    12689 Hwy 154                         
## 1579               175 Huckleberry Ln                         
## 1580                     2398 Hwy 517                         
## 1581                      513 Main St                         
## 1582                 381 Coiffield St                         
## 1583                     973 Laura St                         
## 1584           498 Shiloh Cemetery Rd                         
## 1585                  201 Taylor Road                         
## 1586           110 Shiloh Cemetery Rd                         
## 1587                       8968 Hwy 4                         
## 1588                     6720 Hwy 792                         
## 1589                      P O Box 223                         
## 1590                 146 Bare Hill Rd                         
## 1591                      PO Box 5022                         
## 1592                     P O Box 5001                         
## 1593                      P O Box 171                         
## 1594                    220 Brooks Lp                         
## 1595                      141 Lard St                         
## 1596                    1347 Davis Rd                         
## 1597                    1347 Davis Rd                         
## 1598                       PO Box 105                         
## 1599                    1571 Fifth St                         
## 1600                     872 Bruce Dr                         
## 1601                    697 Smith Ave                         
## 1602                   2676 Carver St                         
## 1603                    3240 Hazel St                         
## 1604                692 Evangeline St                         
## 1605                      2133 3rd St                         
## 1606                      P O Box 654                         
## 1607                    4035 Susan St                         
## 1608                       PO Box 733                         
## 1609                       PO Box 867                         
## 1610                     1156 Mill St                         
## 1611                 400 Columbia Cir                         
## 1612                                                          
## 1613                                                          
## 1614                                                          
## 1615                                                          
## 1616                                                          
## 1617                                                          
## 1618                                                          
## 1619                                                          
## 1620                                                          
## 1621                                                          
## 1622                                                          
## 1623                                                          
## 1624              3411 Pine Haven Cir                         
## 1625                1001 Bay Ridge Dr                         
## 1626                1835 Glen Cove Dr                         
## 1627                4425 Parkridge Dr                         
## 1628                    1708 Wales Ln                         
## 1629                                                          
## 1630                                                          
## 1631                   521 Merritt Rd                         
## 1632                                                          
## 1633                     214 Teche Dr                         
## 1634                 104 Cambridge Cr                         
## 1635                                                          
## 1636                 5624 Lakeside Dr                         
## 1637                                                          
## 1638                                                          
## 1639                 1818 Neptune Cir                         
## 1640                                                          
## 1641                 226 Ward Line Rd                         
## 1642                       PO Box 430                         
## 1643                1001 Bay Ridge Dr                         
## 1644                    561 Linton Rd                         
## 1645            662 Fairview Point Rd                         
## 1646                    314 Murray Ln                         
## 1647                    309 Jacobs Pt                         
## 1648                      856 Wise Rd                         
## 1649                  492 Brompton Ln                         
## 1650                 524 Wedgewood Dr                         
## 1651                  2420 Douglas Dr                         
## 1652                2412 Churchill Dr                         
## 1653                  2610 Village Ln                         
## 1654                   1212 Gibson Cr                         
## 1655                   4008 Wayne Ave                         
## 1656                   123 Oaklawn Dr                         
## 1657                   2215 Landau Ln                         
## 1658                     2108 Hope St                         
## 1659                 449 Shadywood Ln                         
## 1660                 113 Woodcrest Dr                         
## 1661                       511 Lee St                         
## 1662               183 Willow Bend Rd                         
## 1663                    6014 Jason St                         
## 1664                1501 Lexington Dr                         
## 1665                  2424 Douglas Dr                         
## 1666               3201 Cloverdale Pl                         
## 1667                      1816 Lee St                         
## 1668                  1212 Gibson Cir                         
## 1669                     2100 Ray Ave                         
## 1670                  229 Radbrook Dr                         
## 1671              1416 Magnolia Ridge                         
## 1672                  171 Buckshot Rd                         
## 1673                   617 Hickory Dr                         
## 1674            153 Salem Cemetery Rd                         
## 1675                   101 Mildred St                         
## 1676                      P O Box 308                         
## 1677                       P O Box 11                         
## 1678                 1507 Nottoway Pl                         
## 1679                      P O Box 465                         
## 1680                      P O Box 106                         
## 1681              300 Dixon Cutoff Rd                         
## 1682                702 Palmetto Road                         
## 1683                      P O Box 191                         
## 1684                      6730 Hwy 80                         
## 1685                 613 Enchanted Ln                         
## 1686                 613 Enchanted Ln                         
## 1687                    317 Larkin St                         
## 1688               415 W McKinley Ave                         
## 1689                      P O Box 785                         
## 1690                      111 Pine St                         
## 1691                      P O Box 432                         
## 1692                  409 N Perrin St                         
## 1693              221 Evangeline Walk                         
## 1694              221 Evangeline Walk                         
## 1695             130 Stonebridge Blvd                         
## 1696             130 Stonebridge Blvd                         
## 1697                616 E Carolina St                         
## 1698                      209 Pine St                         
## 1699               610 W Palmetto Ave                         
## 1700                    805 Louis Ave                         
## 1701                      P O Box 162                         
## 1702                      P O Box 302                         
## 1703                 318 Breitling Rd                         
## 1704                      P O Box 462                         
## 1705                   307 Galilee St                         
## 1706                       P O Box 90                         
## 1707                   617 Hickory Dr                         
## 1708            113 Savannah Place Cr                         
## 1709                3322 Kingsford Pl                         
## 1710                3322 Kingsford Pl                         
## 1711               1026 Princeton Ave                         
## 1712               1026 Princeton Ave                         
## 1713                  507 Hunters Run                         
## 1714                    2506 Abbey Ct                         
## 1715                   452 Mayfair Dr                         
## 1716                     3658 Elon St                         
## 1717               119 Waters Edge Dr                         
## 1718                   3513 Huston St                         
## 1719                   3436 Galaxy Ln                         
## 1720                   4921 Daniel Pl                         
## 1721            509 Market St Ste 100                         
## 1722              3722 Mallard Bay Cr                         
## 1723                  3761 Bobbitt Pl                         
## 1724                    935 Linden St                         
## 1725                   2613 Parham Dr                         
## 1726                610 Sugarleaf Trl                         
## 1727                     P O Box 1928                         
## 1728                      252 Leo Ave                         
## 1729                10038 Toulouse Dr                         
## 1730                                                          
## 1731                 3232 Bluebird Ln                         
## 1732                    8322 Tanya Dr                         
## 1733                   6117 Lovers Ln                         
## 1734               9482 Poinsettia Dr                         
## 1735               7718 Chesapeake Dr                         
## 1736                 3801 Greenway Pl                         
## 1737               523 Rock Hollow Dr                         
## 1738          8046 DixieShreveport Rd                         
## 1739                      5000 Hwy 71                         
## 1740                                                          
## 1741                529 Stephenson St                         
## 1742                                                          
## 1743                                                          
## 1744                                                          
## 1745                     P O Box 5072                         
## 1746                7333 Camelback Dr                         
## 1747                   9402 Baird Cir                         
## 1748                                                          
## 1749          5721 Jefferson Paige Rd                         
## 1750                     P O Box 5294                         
## 1751                9907 Oak Haven Dr                         
## 1752             420 Pennsylvania Ave                         
## 1753          6365 DixieShreveport Rd                         
## 1754   501 Texas St Rm 103 Courthouse                         
## 1755                  1716 Audubon Pl                         
## 1756                    124 Baltic Dr                         
## 1757                 712 S Cypress St                         
## 1758             3722 Mallard Bay Cir                         
## 1759                   2101 Carver Pl                         
## 1760                615 Rutherford St                         
## 1761                   3623 Milton St                         
## 1762                    451 E 78th St                         
## 1763                   5037 Waters Pl                         
## 1764                   303 Glen Erica                         
## 1765               7712 Millicent Way                         
## 1766                    2633 Lyles Ln                         
## 1767                2039 Evergreen Dr                         
## 1768                    3822 Treat Dr                         
## 1769         8033 Old Mooringsport Rd                         
## 1770                 1433 Audrey Lane                         
## 1771                 2106 Wyoming Cir                         
## 1772               4741 Thornhill Ave                         
## 1773            3309 Sun Valley Court                         
## 1774                    229 E 75th St                         
## 1775                   2613 Parham Dr                         
## 1776                   295 Patton Ave                         
## 1777               523 Rock Hollow Dr                         
## 1778                   9006 Marlow Dr                         
## 1779                   9800 Chase Way                         
## 1780          7881 Jefferson Paige Rd                         
## 1781                    146 Church St                         
## 1782                      9369 Gay Ln                         
## 1783             14626 Old Atlanta Rd                         
## 1784                   7344 S Noel Dr                         
## 1785                    8353 Tanya Dr                         
## 1786                  3811 Christy Dr                         
## 1787            3221 Green Terrace Rd                         
## 1788             5057 Dixie Garden Dr                         
## 1789        17665 Munnerlyn Chapel Rd                         
## 1790             6049 Cherry Hill Ave                         
## 1791                      P O Box 143                         
## 1792                      9369 Gay Ln                         
## 1793                      P O Box 812                         
## 1794                 6916 N Colony Dr                         
## 1795                      P O Box 475                         
## 1796                   9125 Church St                         
## 1797            11795 Sparks Davis Rd                         
## 1798                    917 Barron Rd                         
## 1799                    P O Box 65054                         
## 1800                      P O Box 312                         
## 1801                   320 Phelps Ave                         
## 1802                      P O Box 541                         
## 1803                      P O Box 145                         
## 1804                      548 Lake Dr                         
## 1805                   1001 N Pine St                         
## 1806                    345 Butler St                         
## 1807                   13088 Adger Rd                         
## 1808                 14696 Parkway Dr                         
## 1809               18687 Carolina Ave                         
## 1810             9939 Standard Oil Rd                         
## 1811                      276 W Birch                         
## 1812                   410 E Croom St                         
## 1813                      P O Box 505                         
## 1814                    345 Butler St                         
## 1815                   13133 Adger Rd                         
## 1816                 14696 Parkway Dr                         
## 1817                      P O Box 178                         
## 1818                      8381 Bea Ln                         
## 1819                    933 N Pine St                         
## 1820                        P O Box 2                         
## 1821                 312 Greenwood St                         
## 1822                      12598 Hwy 1                         
## 1823                      P O Box 664                         
## 1824                      P O Box 302                         
## 1825                       PO Box 584                         
## 1826                      P O Box 451                         
## 1827                    4908 Scott Dr                         
## 1828                  7063 Winburn Dr                         
## 1829                    8452 Tanya Dr                         
## 1830                7425 Waterwood Dr                         
## 1831              328 W Daugherty Ave                         
## 1832              8339 Brookington Dr                         
## 1833                6555 Northwood Ln                         
## 1834           4774 Fairway Hills Ave                         
## 1835          4974 Beechwood Hills Dr                         
## 1836                    344 Butler St                         
## 1837                    325 Butler St                         
## 1838                      409 Self Rd                         
## 1839                    5607 First St                         
## 1840                   13144 Adger Rd                         
## 1841                   13133 Adger Rd                         
## 1842                      P O Box 215                         
## 1843                    6830 Terri St                         
## 1844                      P O Box 223                         
## 1845                      P O Box 183                         
## 1846             19597 S Louisiana St                         
## 1847                      P O Box 128                         
## 1848               9806 E Williams St                         
## 1849                   17657 Pitts Rd                         
## 1850                      P O Box 366                         
## 1851                  305 Mary Ann St                         
## 1852         9840 Upper State Line Rd                         
## 1853           122 General Beauregard                         
## 1854                     506 S Pardue                         
## 1855                      P O Box 506                         
## 1856                     402 Agurs St                         
## 1857                      P O Box 213                         
## 1858                     175 Tahoe Dr                         
## 1859                4220 Maidstone Dr                         
## 1860                      P O Box 228                         
## 1861             4444 W Prien Lake Rd                         
## 1862             1907 West McNeese St                         
## 1863                    P O  Box 1018                         
## 1864                     175 Tahoe Dr                         
## 1865                  2345 See Street                         
## 1866                  1909 4th Street                         
## 1867                                                          
## 1868                     959 Terry Ln                         
## 1869                                                          
## 1870              2536 Carlo Henry Rd                         
## 1871               1818 Plantation Dr                         
## 1872                   2821 Walden Dr                         
## 1873                                                          
## 1874                                                          
## 1875                                                          
## 1876                                                          
## 1877                                                          
## 1878                                                          
## 1879                     P O Box 6662                         
## 1880                401 University Dr                         
## 1881                     26 Poinsetta                         
## 1882                  48 East End Ave                         
## 1883                141 Park Manor Dr                         
## 1884                                                          
## 1885              1125 Bilbo St No 28                         
## 1886                                                          
## 1887                  1500 Watkins St                         
## 1888                                                          
## 1889                                                          
## 1890               4875 Kingspoint Dr                         
## 1891                                                          
## 1892                                                          
## 1893                                                          
## 1894                                                          
## 1895                                                          
## 1896                                                          
## 1897                 5010 Hawthorn Dr                         
## 1898        2806 St Francis Forest Dr                         
## 1899                      PO Box 1030                         
## 1900                    1030 Holly St                         
## 1901                   2715 Bocage St                         
## 1902                    2296 Pinon Dr                         
## 1903                 1800 N Goos Blvd                         
## 1904                    903 N Jake St                         
## 1905                     128 Kingsley                         
## 1906                     810 Holly St                         
## 1907                   5733 Bennie Ln                         
## 1908                  4336 Oaklawn Dr                         
## 1909                   1908 Linden Ln                         
## 1910               4045 Briarfield St                         
## 1911                987 S Thompson Rd                         
## 1912             920 North Overton St                         
## 1913                   2300 Currie Dr                         
## 1914                      1302 Fatima                         
## 1915                    1423 Beech St                         
## 1916                    312 Oakley Dr                         
## 1917                  420 Tamarack St                         
## 1918                 6917 Windmill Ln                         
## 1919               3006 Bayou Bend Rd                         
## 1920                       6 River Ln                         
## 1921                   1110 Taylor St                         
## 1922               6751 Joe Spears Rd                         
## 1923                 2824 Donateil St                         
## 1924                      614 Oleo St                         
## 1925                  2460 Talouse Ln                         
## 1926                1028 Iberville St                         
## 1927                    2505 Karen Ln                         
## 1928                     1917 19th St                         
## 1929                   444 Ashland St                         
## 1930                   1711 Hollis Rd                         
## 1931                  1041 Nursery St                         
## 1932                 975 Ms Daisys Dr                         
## 1933               1317 Bernadette Dr                         
## 1934                1305 Peachtree Rd                         
## 1935               4033 Briarfield Ln                         
## 1936              1814 Hollow Cove Ln                         
## 1937                1135 W Bristol Dr                         
## 1938                        P O Box 4                         
## 1939         4954 B Alligator Park Rd                         
## 1940                     P O Box 1348                         
## 1941                   2259 Custer Dr                         
## 1942                   4267 Hecker Rd                         
## 1943                 1207 Cheyenne Dr                         
## 1944                       P O Box 89                         
## 1945              1184 Green Moore Rd                         
## 1946                     P O Box 1125                         
## 1947                     1517 Eddy St                         
## 1948             6606 Jerry Hebert Rd                         
## 1949                    116 Chavis Sq                         
## 1950                161 E Greenway St                         
## 1951                161 E Greenway St                         
## 1952                  1509 Melanie Dr                         
## 1953                  916 Live Oak St                         
## 1954                   901 Granger St                         
## 1955                 1403 Horridge St                         
## 1956                 1403 Horridge St                         
## 1957                    1405 Beech St                         
## 1958              310 South Philbrick                         
## 1959                 1903 Fontenot St                         
## 1960                     115 Boise St                         
## 1961                 100 N Kinney Ave                         
## 1962                    100 Harper St                         
## 1963                  400 S Bowers St                         
## 1964                      200 Ruby St                         
## 1965                      P O Box 259                         
## 1966            1308 E Holly Hill Cir                         
## 1967                  413 McKinley St                         
## 1968            1316 W Holly Hill Cir                         
## 1969                    1324 Hilma St                         
## 1970                    2115 Linda Dr                         
## 1971                      606 Page St                         
## 1972                1100 E Carlton St                         
## 1973                 805 N Perkins St                         
## 1974                   403 Navarre St                         
## 1975                    209 Coffee St                         
## 1976                       912 Elm St                         
## 1977                 222 Jefferson St                         
## 1978                    2011 Marge Ln                         
## 1979                  11 Mayflower St                         
## 1980             2131 Fitzenreiter Rd                         
## 1981                   2010 E Mill St                         
## 1982                     1531 6th Ave                         
## 1983                   1531 Sixth Ave                         
## 1984                 2018 Charvais Dr                         
## 1985                 2018 Charvais Dr                         
## 1986                   1508 W Sale Rd                         
## 1987                   1508 W Sale St                         
## 1988                 1705 Illinois St                         
## 1989                 1705 Illinois St                         
## 1990               4502 Autumnwood Ln                         
## 1991                 1414 Horridge St                         
## 1992                   1423 Grace Ave                         
## 1993                 1708 Horridge St                         
## 1994                1709 Stevenson St                         
## 1995                       PO Box 238                         
## 1996                      P O Box 780                         
## 1997                     P O Box 1265                         
## 1998                                                          
## 1999                                                          
## 2000                                                          
## 2001                                                          
## 2002                                                          
## 2003                                                          
## 2004                     P O Box 1435                         
## 2005                                                          
## 2006                                                          
## 2007                                                          
## 2008                                                          
## 2009                                                          
## 2010                                                          
## 2011                                                          
## 2012                     662 Judge Rd                         
## 2013                      PO Box 1327                         
## 2014                 311 Lakeside Ave                         
## 2015                     613 Pearl St                         
## 2016                      293 Mott Rd                         
## 2017                     1232 Hwy 559                         
## 2018                      P O Box 665                         
## 2019                   138 Wendell Dr                         
## 2020                     195 Eglin St                         
## 2021                      P O Box 222                         
## 2022          472 Liberty Cemetery Rd                         
## 2023                     308 Agnew Rd                         
## 2024                     5838 Hwy 133                         
## 2025                   951 McClary Rd                         
## 2026                       PO Box 992                         
## 2027                     421 Ester Rd                         
## 2028                    176 Fourth St                         
## 2029                 842 Volentine Rd                         
## 2030                    406 Howard Rd                         
## 2031                      P O Box 195                         
## 2032                     1930 Hwy 133                         
## 2033                   275 Lavelle Ln                         
## 2034                203 Boardwalk Ave                         
## 2035                     P O Box 1555                         
## 2036                     201 Cruse Rd                         
## 2037                     P O Box 1412                         
## 2038                   5212 Hwy 126 E                         
## 2039                   121 E Fifth St                         
## 2040                    132 Eighth St                         
## 2041                203 Boardwalk Ave                         
## 2042                   117 E Fifth St                         
## 2043                  323 Seminole St                         
## 2044                     1367 Hwy 850                         
## 2045                     223 Cruse Rd                         
## 2046                     1142 Hwy 850                         
## 2047                     P O Box 1351                         
## 2048                      P O Box 655                         
## 2049                       P O Box 76                         
## 2050                     P O Box 1984                         
## 2051                      P O Box 780                         
## 2052                  101 Elaine Lane                         
## 2053              4318 Crossington St                         
## 2054                     1572 Hwy 384                         
## 2055                                                          
## 2056                                                          
## 2057                                                          
## 2058                                                          
## 2059                                                          
## 2060                                                          
## 2061                                                          
## 2062                                                          
## 2063                                                          
## 2064                                                          
## 2065                                                          
## 2066                                                          
## 2067                                                          
## 2068                                                          
## 2069                                                          
## 2070                    148 Edna Road                         
## 2071                       PO Box 549                         
## 2072              126 Highland Street                         
## 2073                     PO Box 12803                         
## 2074                 354 Meyers  Road                         
## 2075                   215 Hicks Road                         
## 2076                   180 Quinn Lane                         
## 2077                     581 Cox Road                         
## 2078                       PO Box 576                         
## 2079                 225 Dupont Drive                         
## 2080           10690 Hwy 384 Big Lake                         
## 2081              6598 Gulf Beach Hwy                         
## 2082                   1095 Poncho Ln                         
## 2083            519 Sweetlake Camp Rd                         
## 2084                     152 Helen St                         
## 2085                813 Oak Grove Hwy                         
## 2086                     194 Dewey St                         
## 2087                      343 Hwy 384                         
## 2088                     629 Lowry Rd                         
## 2089                     122 Jones St                         
## 2090                                                          
## 2091               155 Hebert Camp Rd                         
## 2092              6482 Gulf Beach Hwy                         
## 2093                    225 Meyers Rd                         
## 2094                      P O Box 531                         
## 2095                     152 Helen St                         
## 2096                      P O Box 150                         
## 2097                    10871 Hwy 384                         
## 2098                     140 Alvin Ln                         
## 2099              195 JB Constance Ln                         
## 2100                      P O Box 595                         
## 2101                      P O Box 219                         
## 2102                      P O Box 179                         
## 2103                                                          
## 2104                                                          
## 2105                                                          
## 2106                                                          
## 2107                                                          
## 2108                                                          
## 2109                                                          
## 2110                                                          
## 2111                                                          
## 2112                      P O Box 595                         
## 2113                                                          
## 2114                                                          
## 2115                                                          
## 2116                                                          
## 2117                                                          
## 2118                                                          
## 2119                                                          
## 2120                                                          
## 2121                                                          
## 2122                    234 Brooks Rd                         
## 2123                       PO Box 654                         
## 2124                      926 Hwy 923                         
## 2125                   2805 Fourth St                         
## 2126                     3725 Hwy 921                         
## 2127                     4372 Hwy 913                         
## 2128             3984 Old Columbia Rd                         
## 2129                       872 Jug Rd                         
## 2130              871 Taunton Loop Rd                         
## 2131              200 Uncle Johnie Rd                         
## 2132                507 Tom Cotton St                         
## 2133                   507 Jasmine St                         
## 2134                    29630 Hwy 124                         
## 2135                     951 Ditto Rd                         
## 2136                       2185 Hwy 8                         
## 2137                            Hwy 8                         
## 2138                 312 Catahoula St                         
## 2139                  230 Edgewood Rd                         
## 2140                     637 Young Rd                         
## 2141                       801 6th St                         
## 2142                   708 Red Oak St                         
## 2143                 538 Blue Cane Rd                         
## 2144                      P O Box 217                         
## 2145                      12398 Hwy 8                         
## 2146                      1483 Hwy 28                         
## 2147                      P O Box 397                         
## 2148                     363 Wince Rd                         
## 2149               908 Willow Lake Rd                         
## 2150                  903 Westland Dr                         
## 2151                   757 Bushley St                         
## 2152                   200 Falcon Ave                         
## 2153                    223 Monroe St                         
## 2154                   506 Jasmine St                         
## 2155                 1105 Chestnut St                         
## 2156                  503 Pollard Ave                         
## 2157                       706 6th St                         
## 2158                     704 Mound St                         
## 2159                     124 Adams St                         
## 2160                 316 Catahoula St                         
## 2161                 321 Catahoula St                         
## 2162                      105 Pine St                         
## 2163                    725 Sicily St                         
## 2164               253 White Berry Rd                         
## 2165                    141 Adkins Pl                         
## 2166                309 North Main St                         
## 2167                                                          
## 2168                                                          
## 2169                                                          
## 2170                                                          
## 2171                                                          
## 2172                                                          
## 2173                                                          
## 2174                                                          
## 2175                                                          
## 2176                                                          
## 2177             125 Beavers Creek Rd                         
## 2178                                                          
## 2179                                                          
## 2180                                                          
## 2181                                                          
## 2182                                                          
## 2183                                                          
## 2184                                                          
## 2185                                                          
## 2186                                                          
## 2187                                                          
## 2188                     106 Holly St                         
## 2189                       PO Box 330                         
## 2190              261 Bob Robinson Rd                         
## 2191               1201 North Main St                         
## 2192                  14189 Hwy 2 Alt                         
## 2193                   127 Acklin Ave                         
## 2194                  281 McDaniel Rd                         
## 2195                   601 Sturges Ln                         
## 2196                      14407 Hwy 9                         
## 2197                     2199 Hwy 519                         
## 2198                  419 West 6th St                         
## 2199              314 Forest Grove Rd                         
## 2200                     155 Magee Rd                         
## 2201                     715 Lodge St                         
## 2202                1370 Flatwoods Rd                         
## 2203                   1846 Maddox Rd                         
## 2204                   2190 Hwy 2 Alt                         
## 2205                  2112 Dogwood Dr                         
## 2206                      1212 WPA Rd                         
## 2207                     2210 Hwy 519                         
## 2208       1303 Martin Luther King Dr                         
## 2209                119 Forest Grv Rd                         
## 2210                 793 Airport Loop                         
## 2211                   899 Coleman St                         
## 2212                   4149 Hwy 2 Alt                         
## 2213                     103 Holly St                         
## 2214                  153 Reynolds Rd                         
## 2215                135 Billy Shaw Rd                         
## 2216                  429 Robinson Ln                         
## 2217                      21011 Hwy 2                         
## 2218                    798 Harris St                         
## 2219                227 North Main St                         
## 2220                      148 Carr Dr                         
## 2221                      P O Box 235                         
## 2222                       PO Box 254                         
## 2223                      15175 Hwy 9                         
## 2224                 705 South 2nd St                         
## 2225                  5284 Athens Ave                         
## 2226                     5408 Hwy 518                         
## 2227                       244 WPA Rd                         
## 2228                      21230 Hwy 2                         
## 2229                      P O Box 246                         
## 2230                      19973 Hwy 2                         
## 2231                      206 Zion Dr                         
## 2232                    108 Cowboy Dr                         
## 2233               1495 Washington Dr                         
## 2234                       PO Box 202                         
## 2235                  700 Marietta Dr                         
## 2236                    910 Howard St                         
## 2237                     259 Scott St                         
## 2238                  934 Edgewood Dr                         
## 2239                  623 Edgewood Dr                         
## 2240                  501 East 5th St                         
## 2241                      P O Box 951                         
## 2242                                                          
## 2243                      P O Box 285                         
## 2244                                                          
## 2245                                                          
## 2246                                                          
## 2247                                                          
## 2248                                                          
## 2249                                                          
## 2250                      P O Box 371                         
## 2251                                                          
## 2252                                                          
## 2253                      P O Box 824                         
## 2254                                                          
## 2255                                                          
## 2256                      107 Lee Ave                         
## 2257                111 Huntington Dr                         
## 2258                                                          
## 2259                                                          
## 2260                                                          
## 2261                      966 Doty Rd                         
## 2262                       PO Box 790                         
## 2263                      161 Lee Ave                         
## 2264                 233 Crestview Dr                         
## 2265                      P O Box 585                         
## 2266                      P O Box 113                         
## 2267            108 Concordia Park Dr                         
## 2268                 1008 Guillory St                         
## 2269                      156 Lee Ave                         
## 2270               266 Black Bayou Rd                         
## 2271                     410 Cowan St                         
## 2272                     1217 Loop Rd                         
## 2273                      679 Hwy 907                         
## 2274               1206 Concordia Ave                         
## 2275                    1208 Apple St                         
## 2276           220 Martin Luther King                         
## 2277                   110 Miranda Dr                         
## 2278                      205 Pine St                         
## 2279                       400 Elm St                         
## 2280                    104 Stuart Dr                         
## 2281               258 Doty Garden Cr                         
## 2282                    319 Crestview                         
## 2283                  182 Enterkin Rd                         
## 2284                      311 Coop Rd                         
## 2285                     5603 Hwy 568                         
## 2286                     10 Wilson St                         
## 2287                      565 Hwy 131                         
## 2288                1198 Fisherman Dr                         
## 2289                5448 Dunbarton Rd                         
## 2290                    11988 Hwy 129                         
## 2291                 263 Concordia Dr                         
## 2292                     200 S Oak St                         
## 2293                      107 Lee Ave                         
## 2294                   902 Vidalia Dr                         
## 2295                3211 Dunbarton Rd                         
## 2296                    10085 Hwy 129                         
## 2297                      P O Box 163                         
## 2298                      P O Box 684                         
## 2299                  209 Ferriday Dr                         
## 2300                       603 Elm St                         
## 2301                      P O Box 203                         
## 2302                120 Cottonwood Dr                         
## 2303             2078 Bill Johnson Dr                         
## 2304                    108 Wilson St                         
## 2305                 602 North Oak St                         
## 2306                  2022 Charles St                         
## 2307                 1006 Guillory St                         
## 2308                      P O Box 424                         
## 2309                  110 Crescent Dr                         
## 2310                727 Tennessee Ave                         
## 2311           309 Morning Star Alley                         
## 2312                     405 Sixth St                         
## 2313                     P O Box 1244                         
## 2314                      P O Box 152                         
## 2315                      P O Box 646                         
## 2316                      P O Box 202                         
## 2317                      P O Box 141                         
## 2318                      P O Box 535                         
## 2319                   506 Vidalia Dr                         
## 2320                     107 Grape St                         
## 2321                114 Cottonwood Dr                         
## 2322                     116 Pecan St                         
## 2323                    114 Willow Dr                         
## 2324                      P O Box 819                         
## 2325                      PO Box 1017                         
## 2326                                                          
## 2327                                                          
## 2328                                                          
## 2329                                                          
## 2330                                                          
## 2331                 230 White Oak Dr                         
## 2332                      PO Box 1024                         
## 2333                                                          
## 2334                       PO BOX 417                         
## 2335                                                          
## 2336                                                          
## 2337                                                          
## 2338                                                          
## 2339                                                          
## 2340                                                          
## 2341                                                          
## 2342                                                          
## 2343                                                          
## 2344                                                          
## 2345                                                          
## 2346                 180 Norwood Road                         
## 2347                                                          
## 2348                                                          
## 2349                    429 Rambin Rd                         
## 2350                      PO Box 1206                         
## 2351                     152 Omega Ln                         
## 2352                    314 Kings Hwy                         
## 2353                      P O Box 147                         
## 2354             871 Cash Blackmon Rd                         
## 2355                      109 Hwy 763                         
## 2356                    185 Cathey Rd                         
## 2357                1611 Red Bluff Rd                         
## 2358                 230 White Oak Dr                         
## 2359                      PO Box 1053                         
## 2360                    15029 Hwy 175                         
## 2361                    144 Murphy St                         
## 2362                877 Friendship Rd                         
## 2363                  356 Commerce St                         
## 2364                    341 Duncan Rd                         
## 2365                    214 Tanner St                         
## 2366                     208 Doris Dr                         
## 2367               138 North Hills Dr                         
## 2368                     664 Haire Lp                         
## 2369                     2608 Hwy 191                         
## 2370                      P O Box 354                         
## 2371                4294 Red Bluff Rd                         
## 2372                    106 Clista St                         
## 2373                 1507 McArthur Dr                         
## 2374                155 Pine Hill Cir                         
## 2375                     182 Helen Ln                         
## 2376                     1801 Hwy 171                         
## 2377                      562 Hwy 763                         
## 2378                       P O Box 66                         
## 2379                                                          
## 2380                     2207 Main St                         
## 2381               379 Belle Bower Rd                         
## 2382                3310 Red Bluff Rd                         
## 2383                     1001 Hwy 763                         
## 2384                     904 Susan St                         
## 2385                  191 Davidson Rd                         
## 2386                      678 Horn Rd                         
## 2387                      415 Gibb St                         
## 2388                        PO Box 66                         
## 2389                      P O Box 819                         
## 2390                   428 Burford Rd                         
## 2391                    1225 First St                         
## 2392                 120 Pine Tree Ln                         
## 2393                 675 Railroad Ave                         
## 2394                       PO Box 772                         
## 2395                     13520 Hwy 84                         
## 2396                     171 Julie Ln                         
## 2397                      205 Hwy 763                         
## 2398                      205 Hwy 763                         
## 2399                    310 Marcia St                         
## 2400               308 N Jefferson St                         
## 2401                    604 Oxford Rd                         
## 2402                     319 Gibbs St                         
## 2403                       PO Box 773                         
## 2404                    501 Shelby St                         
## 2405                     229 Pecan St                         
## 2406                    1335 First St                         
## 2407                 874 Railroad Ave                         
## 2408                    131 Hudson Ln                         
## 2409                   137 Vanzant St                         
## 2410                      644 Hwy 763                         
## 2411                      644 Hwy 763                         
## 2412                     13669 Hwy 84                         
## 2413                     13669 Hwy 84                         
## 2414                      501 Hwy 763                         
## 2415                      501 Hwy 763                         
## 2416                      P O Box 425                         
## 2417                    P O Drawer 69                         
## 2418                      P O Box 756                         
## 2419                     108 Frank Dr                         
## 2420                      P O Box 504                         
## 2421                    4662 Hwy 3276                         
## 2422                      432 Hall Rd                         
## 2423             1758 Missile Base Rd                         
## 2424                      444 Hall Rd                         
## 2425                 234 Sandpiper Ln                         
## 2426              556 Wood Springs Rd                         
## 2427              534 Wood Springs Rd                         
## 2428                165 Charlies Lane                         
## 2429                       PO Box 185                         
## 2430                 1066 Keatchie Rd                         
## 2431                    358 McCann Rd                         
## 2432                       9502 Hwy 5                         
## 2433                     204 Lucky Ln                         
## 2434                 224 Ocean Dr 202                         
## 2435                    305 Maxine Dr                         
## 2436                   705 Myrtle Ave                         
## 2437            7666 Gov Blanchard Dr                         
## 2438                      1240 N 29th                         
## 2439                      P O Box 833                         
## 2440                   13308 Ector Dr                         
## 2441               3256 Northlake Ave                         
## 2442              3351 Fort Myers Ave                         
## 2443                  8120 Mickens Rd                         
## 2444               1122 Wooddale Blvd                         
## 2445                    5760 Beech St                         
## 2446          12074 Newcastle Ave 406                         
## 2447            5334 Hunters Park Ave                         
## 2448                       806 E Blvd                         
## 2449                  1010 Carter Ave                         
## 2450               1165 Sharynwood Dr                         
## 2451                   1055 Laurel St                         
## 2452               5015 Parkhollow Dr                         
## 2453              910 North Foster Dr                         
## 2454                 818 Woodleigh Dr                         
## 2455                    815 Louray Dr                         
## 2456            1625 Glen Eagles Bend                         
## 2457                13819 Oak Bend Dr                         
## 2458                 3111 Longleaf Ct                         
## 2459                7437 Conestoga Dr                         
## 2460                     PO Box 80727                         
## 2461                  725 Parlange Dr                         
## 2462                3121 Kleinert Ave                         
## 2463                 4178 Stumberg Ln                         
## 2464              5522 Summer Lake Dr                         
## 2465               2272 Hollydale Ave                         
## 2466                     701 North St                         
## 2467                 930 High Lake Dr                         
## 2468                    P O Box 66976                         
## 2469                1755 Nicholson Dr                         
## 2470                1130 N Cicero Ave                         
## 2471              10316 Shoe Creek Dr                         
## 2472                 8345 Kelwood Ave                         
## 2473           222 St Louis St Rm 978                         
## 2474               23524 Sunnyside Ln                         
## 2475       10500 Coursey Blvd Ste 200                         
## 2476      18349 Bellingrath Lakes Ave                         
## 2477           12047 Lake Estates Ave                         
## 2478               234 Rivercrest Ave                         
## 2479                     5734 Main St                         
## 2480                    P O Box 75141                         
## 2481             734 Plantation Ridge                         
## 2482       23835 Greenwell Springs Rd                         
## 2483                    P O Box 73018                         
## 2484                     P O Box 4095                         
## 2485         1822 N Acadian Thruway W                         
## 2486          5627 Superior Dr Ste A5                         
## 2487                    P O Box 77274                         
## 2488                    355 N 25th St                         
## 2489                   7438 Rue Henri                         
## 2490              2589 E Lakeshore Dr                         
## 2491                       PO Box 826                         
## 2492                   1444 Church St                         
## 2493                      P O Box 708                         
## 2494            701 S Acadian Thruway                         
## 2495                     P O Box 3438                         
## 2496                     P O Box 1471                         
## 2497                     P O Box 3438                         
## 2498                      P O Box 881                         
## 2499               129 W Flonacher Rd                         
## 2500                    325 Grove Ave                         
## 2501                  1344 Rollins Rd                         
## 2502    20051 Old Scenic Hwy Apt 1609                         
## 2503                      PO Box 1190                         
## 2504                  4836 Rollins Rd                         
## 2505                   3565 Cherry St                         
## 2506                      4219 Lee St                         
## 2507                   20660 Plank Rd                         
## 2508             16710 Gingerwood Ave                         
## 2509                 6713 Frontier Dr                         
## 2510                    4312 Azie Ave                         
## 2511                7746  Capistra Dr                         
## 2512        18245 Frenchtown Acres Dr                         
## 2513             3245 Chamberlain Ave                         
## 2514                 990 Bayberry Ave                         
## 2515                  13025 Lovett Rd                         
## 2516                     P O Box 1022                         
## 2517                   2115 N Vega Dr                         
## 2518                  13044 Denham Rd                         
## 2519                       PO Box 826                         
## 2520                 5441 Asphodel Dr                         
## 2521                    11522 Core Ln                         
## 2522                 3809 Epperson St                         
## 2523                  2205 Myrtle Ave                         
## 2524              16432 Quiet Oak Ave                         
## 2525                  224 Amherst Ave                         
## 2526                    9531 Watts Rd                         
## 2527                 930 High Lake Dr                         
## 2528          4333 French Village Ave                         
## 2529            22768 Hoo Shoo Too Rd                         
## 2530            15234 Hidden Creek Dr                         
## 2531                  23845 Reames Rd                         
## 2532                 20529 Machost Rd                         
## 2533                   13470 Clark Dr                         
## 2534              18652 Loch Bend Ave                         
## 2535                 5621 Kennesaw Dr                         
## 2536                                                          
## 2537                 16935 Liberty Rd                         
## 2538                  7970 Machost Rd                         
## 2539                    P O Box 75431                         
## 2540              14786 Bon Dickey Dr                         
## 2541             6052 Grand Coteau Dr                         
## 2542           16612 Autumn Ridge Ave                         
## 2543                13821 Brantley Dr                         
## 2544                    13445 Joor Rd                         
## 2545                  2565 Rollins Rd                         
## 2546                    2209 Debra Dr                         
## 2547               6487 Thelmadale Dr                         
## 2548                    2857 March St                         
## 2549                7334 Conestoga Dr                         
## 2550               16103 Chaumont Ave                         
## 2551                 7256 Woodlett Dr                         
## 2552                  5140 Fryers Ave                         
## 2553                7201 Conestoga Dr                         
## 2554                    13312 Alba Dr                         
## 2555                 1227 Mills Pt Dr                         
## 2556                   1721 Texas Ave                         
## 2557                   5131 Newell St                         
## 2558                   2707 McHugh Rd                         
## 2559             1625 Gleneagles Bend                         
## 2560                  3600 Harding St                         
## 2561                       PO Box 707                         
## 2562                   4985 McHugh Dr                         
## 2563                   4503 Fausse Dr                         
## 2564                  21900 McHost Rd                         
## 2565                                                          
## 2566                                                          
## 2567                 1306 Bell Street                         
## 2568                                                          
## 2569                                                          
## 2570                 505 Schneider Ln                         
## 2571                                                          
## 2572                                                          
## 2573                                                          
## 2574                                                          
## 2575                                                          
## 2576                                                          
## 2577                                                          
## 2578                                                          
## 2579                                                          
## 2580                                                          
## 2581                                                          
## 2582                                                          
## 2583                                                          
## 2584                                                          
## 2585                     1306 Bell St                         
## 2586    400 First St Ste 3 Courthouse                         
## 2587                     365 Pecan Rd                         
## 2588                    718 Peanut Rd                         
## 2589                 2884 Highway 579                         
## 2590               1202 Fourth Street                         
## 2591                   706 Sparrow St                         
## 2592                 218 Madden Drive                         
## 2593                1090 Schneider Ln                         
## 2594                  552 Stamboul Rd                         
## 2595              1991 Cotton Club Rd                         
## 2596              105 Floyd Foster St                         
## 2597                    924 Riddle Ln                         
## 2598            504 Star Arlington St                         
## 2599                     406 Davis St                         
## 2600                    614 Eighth St                         
## 2601                 1465 Griffin Ave                         
## 2602                     37 Artaud St                         
## 2603               15200 Hwy 65 South                         
## 2604                    59 Artuard St                         
## 2605             1086 Island Point Dr                         
## 2606                     508 Brown St                         
## 2607                     4926 Hwy 596                         
## 2608        503 Charles D Jones Dr 16                         
## 2609                     310 Davis St                         
## 2610                     269 Keene St                         
## 2611                     1604 Lake St                         
## 2612                        P O Box 5                         
## 2613                                                          
## 2614                4305 Felix Lee Rd                         
## 2615                                                          
## 2616                                                          
## 2617                   1617 Wilson St                         
## 2618                                                          
## 2619                                                          
## 2620                                                          
## 2621                                                          
## 2622                8299 Lakeshore Dr                         
## 2623                                                          
## 2624                                                          
## 2625                                                          
## 2626                                                          
## 2627                                                          
## 2628                                                          
## 2629                                                          
## 2630                                                          
## 2631                                                          
## 2632                      P O Box 643                         
## 2633                    PO Drawer 599                         
## 2634                 10610 Plank Road                         
## 2635                   2416 Dawson Rd                         
## 2636                     P O Box 8815                         
## 2637                   8311 Hwy 955 E                         
## 2638             7105 Richardson Loop                         
## 2639                     P O Box 1332                         
## 2640                     P O Box 1672                         
## 2641                      P O Box 161                         
## 2642                 9820 Bank St Ext                         
## 2643                     P O Box 8655                         
## 2644                     P O Box 7996                         
## 2645                     6698 Hwy 952                         
## 2646      1915 Sticks School House Ln                         
## 2647             7105 Richardson Loop                         
## 2648                      5888 Hwy 68                         
## 2649                  4657 Highway 68                         
## 2650                  3239 Lillian Dr                         
## 2651                   3756 Church St                         
## 2652             4455 McCoy Byrnes Rd                         
## 2653                   13235 Hwy 67 N                         
## 2654                     14981 Hwy 67                         
## 2655                      PO Box 8803                         
## 2656                     6988 Mack Ln                         
## 2657                   7361 Battle Rd                         
## 2658                                                          
## 2659               11699 Old South Dr                         
## 2660                     P O Box 8681                         
## 2661                  2053 Maglone Ln                         
## 2662                       PO Box 427                         
## 2663                       P O Box 69                         
## 2664                     P O Box 8681                         
## 2665                11616 Railroad St                         
## 2666                  1168 Charter St                         
## 2667                      P O Box 171                         
## 2668                       P O Box 35                         
## 2669                      6536 Oak St                         
## 2670                      P O Box 165                         
## 2671                  3960 Cottage St                         
## 2672                      P O Box 714                         
## 2673                      P O Box 588                         
## 2674               10641 Roosevelt St                         
## 2675                     P O Box 7999                         
## 2676                      P O Box 716                         
## 2677                       P O Box 42                         
## 2678                      2617 Tom Dr                         
## 2679                      P O Box 181                         
## 2680                      P O Box 441                         
## 2681                    1257 Holly Dr                         
## 2682                       P O Box 55                         
## 2683                    14236 Main St                         
## 2684                      P O Box 129                         
## 2685                      P O Box 146                         
## 2686                     10627 Hwy 19                         
## 2687                      P O Box 335                         
## 2688                      P O Box 182                         
## 2689                      P O Box 182                         
## 2690                       PO Box 162                         
## 2691                     P O Box 1248                         
## 2692                     P O Box 1086                         
## 2693                   2838 Joann Ave                         
## 2694                   1617 Wilson St                         
## 2695                      P O Box 966                         
## 2696                112 Saint Paul St                         
## 2697             1773 Belaire Cove Rd                         
## 2698                  3026 Kenneth St                         
## 2699                                                          
## 2700                                                          
## 2701                                                          
## 2702                                                          
## 2703                                                          
## 2704                                                          
## 2705                                                          
## 2706                                                          
## 2707                                                          
## 2708              2082 Chicot Park Rd                         
## 2709                     682 Shuff Rd                         
## 2710                 1155 Old Park Rd                         
## 2711                 1155 Old Park Rd                         
## 2712                     668 Shuff Rd                         
## 2713                                                          
## 2714                                                          
## 2715                                                          
## 2716                                                          
## 2717                                                          
## 2718                                                          
## 2719                                                          
## 2720                                                          
## 2721                1858 Gabrielle Rd                         
## 2722                    PO Drawer 347                         
## 2723                900 W Magnolia St                         
## 2724                    19405 Hwy 182                         
## 2725              697 Belaire Cove Rd                         
## 2726                   1076 Heinen Rd                         
## 2727              1925 L D Verette Rd                         
## 2728          3308 Crooked Creek Pkwy                         
## 2729                   1047 Family Dr                         
## 2730                        PO Box 38                         
## 2731              2194 Stage Coach Rd                         
## 2732                  1049 Racheal Dr                         
## 2733       1530 Martin Luther King Dr                         
## 2734                    596 Scenic Dr                         
## 2735               116 E Jefferson St                         
## 2736             1439 Belaire Cove Rd                         
## 2737                 1431 Fuselier St                         
## 2738                  5541 Vidrine Rd                         
## 2739                      P O Box 266                         
## 2740                   1067 Ceeway Ln                         
## 2741          1441 Wilba Vizinat Loop                         
## 2742                   613 Seventh St                         
## 2743                     717 Rozas St                         
## 2744                    225 Rickey St                         
## 2745                      P O Box 328                         
## 2746                    112 Ardoin St                         
## 2747                 626 W Lincoln Rd                         
## 2748                  1824 Clement St                         
## 2749                     2192 Navy Rd                         
## 2750                      P O Box 729                         
## 2751                   1027 Ferdie Rd                         
## 2752                       PO Box 698                         
## 2753                   1042 Robken Rd                         
## 2754                     1066 Easy Rd                         
## 2755                   1816 Hunter Rd                         
## 2756                  1214 Oberlin Rd                         
## 2757                  1197 Pioneer Rd                         
## 2758                  1220 Melissa Ln                         
## 2759                     717 Owens St                         
## 2760                   300 Cypress St                         
## 2761                       PO Box 292                         
## 2762                      P O Box 735                         
## 2763                     1140 Pine St                         
## 2764             801 N Chataignier St                         
## 2765                  608 Mulberry St                         
## 2766                      P O Box 265                         
## 2767                      P O Box 261                         
## 2768                      P O Box 157                         
## 2769                     1217 East St                         
## 2770                    1308 Third St                         
## 2771                   1100 Cherry St                         
## 2772                      212 Main St                         
## 2773                 617 Railroad Ave                         
## 2774                511 N Thompson St                         
## 2775              101 E Beauregard St                         
## 2776              1107 Belle Terre Dr                         
## 2777                1314 W Cypress St                         
## 2778                     508 Allen St                         
## 2779                     512 Laran St                         
## 2780                   217 N First St                         
## 2781                       P O Box 91                         
## 2782                       PO Box 282                         
## 2783                      P O Box 185                         
## 2784                      P O Box 231                         
## 2785                      P O Box 424                         
## 2786                    1056 Cedar Ln                         
## 2787                      P O Box 172                         
## 2788                     1307 Pine St                         
## 2789                      1511 Gum St                         
## 2790                   1105 Harris St                         
## 2791                      1210 Gum St                         
## 2792                                                          
## 2793                                                          
## 2794                                                          
## 2795                                                          
## 2796                                                          
## 2797                                                          
## 2798                                                          
## 2799                      2123 Hwy 17                         
## 2800              134 Faith Valley Ln                         
## 2801                     6637 Main St                         
## 2802                      2604 Hwy 17                         
## 2803                      825 Faul Rd                         
## 2804                     2187 Hwy 875                         
## 2805                      543 Moss Rd                         
## 2806                                                          
## 2807                      971 Hwy 860                         
## 2808                                                          
## 2809             170 Marvest Folds Rd                         
## 2810                                                          
## 2811                     2615 Hwy 865                         
## 2812                      PO Box 1564                         
## 2813                   293 Russell Ln                         
## 2814                      425 Hwy 577                         
## 2815                1140 Dummyline Rd                         
## 2816                      746 Hwy 618                         
## 2817                       145 Elm St                         
## 2818              151 Artie Carter Rd                         
## 2819                   2105 Caston St                         
## 2820                     4250 Hwy 577                         
## 2821                   150 Maurice St                         
## 2822                      337 Hwy 868                         
## 2823                    820 Rogers Dr                         
## 2824                      795 Ross Rd                         
## 2825                     2327 Hwy 135                         
## 2826                      394 Hope St                         
## 2827                    168 Lawson Rd                         
## 2828                    212 Willow St                         
## 2829                     1259 Hwy 857                         
## 2830                    1207 Maple St                         
## 2831                        PO Box 24                         
## 2832              171 Arvel Linder Rd                         
## 2833                   775 Lishman Rd                         
## 2834                       PO Box 724                         
## 2835                        PO Box 36                         
## 2836                   235 Roberts Rd                         
## 2837                      992 Hwy 135                         
## 2838                        PO Box 22                         
## 2839              230 Arvel Linder Rd                         
## 2840                 131 Glynn Day Rd                         
## 2841                      P O Box 657                         
## 2842                       PO Box 661                         
## 2843              404 Blue Roberts Rd                         
## 2844                     1052 Hwy 135                         
## 2845                    1514 Maple St                         
## 2846                    268 Kansas St                         
## 2847                 113 Big Creek Rd                         
## 2848                   330 Gaither St                         
## 2849                  2608 Baldwin Dr                         
## 2850                    117 Morgan St                         
## 2851                   182 Seymour Rd                         
## 2852                    231 Second St                         
## 2853                     194 Texas St                         
## 2854                     117 Brown St                         
## 2855                    214 Kansas St                         
## 2856                      324 Hope St                         
## 2857                      152 Hope St                         
## 2858                   182 Seymore Rd                         
## 2859                      1391 Hwy 15                         
## 2860              245 Dobber Glass Rd                         
## 2861                   419 Old Hwy 15                         
## 2862                      P O Box 648                         
## 2863                   279 Burnett St                         
## 2864               2416 Lone Cedar Rd                         
## 2865                    1509 Maple St                         
## 2866                    3106 Earle Dr                         
## 2867                     6637 Main St                         
## 2868                   2016 Roland St                         
## 2869                     208 Birch St                         
## 2870                                                          
## 2871                                                          
## 2872                                                          
## 2873                                                          
## 2874                                                          
## 2875                                                          
## 2876                                                          
## 2877                                                          
## 2878              811 Springhill Loop                         
## 2879                   136 Red Oak Ln                         
## 2880                                                          
## 2881                                                          
## 2882                    116 Second St                         
## 2883                                                          
## 2884                                                          
## 2885                                                          
## 2886                                                          
## 2887                                                          
## 2888                      932 Hwy 158                         
## 2889                       PO Box 263                         
## 2890                   1115 Walker Dr                         
## 2891                      8555 Hwy 71                         
## 2892                     253 Dyson Rd                         
## 2893                    283 Brooks Rd                         
## 2894                      452 Lake St                         
## 2895               161 Bob Johnson Rd                         
## 2896                     501 Hwy 1241                         
## 2897                     8361 Hwy 165                         
## 2898                      P O Box 156                         
## 2899                   908 Hughart Rd                         
## 2900             106 Nantachie Dam Rd                         
## 2901               138 Fred Delong Rd                         
## 2902                      415 Lake St                         
## 2903                   152 Red Oak Ln                         
## 2904                     142 Roger Dr                         
## 2905                      133 Holt Rd                         
## 2906                  1645 Brunson Rd                         
## 2907                      323 Hwy 502                         
## 2908                     170 James Rd                         
## 2909                                                          
## 2910                    21139 Hwy 167                         
## 2911              811 Springhill Loop                         
## 2912                     3540 Hwy 472                         
## 2913                      P O Box 356                         
## 2914                  P O Box 638                             
## 2915                     154 A J Road                         
## 2916                  183 T B Ball Rd                         
## 2917                  1177 Willett Rd                         
## 2918                      449 Lake St                         
## 2919                    520 Rowena St                         
## 2920                     3953 Hwy 8 W                         
## 2921             21459 Hwy 167 Lot 37                         
## 2922                       P O Box 10                         
## 2923                      297 Hwy 502                         
## 2924                    2160 North St                         
## 2925                 237 S Dogwood Ln                         
## 2926                       P O Box 96                         
## 2927                       506 7th St                         
## 2928                      1204 Ash St                         
## 2929                     101 Hud Loop                         
## 2930                   416 Eleanor St                         
## 2931                     507 Foulk St                         
## 2932             21459 Hwy 167 Lot 12                         
## 2933                    21430 Hwy 167                         
## 2934             21459 Hwy 167 Lot 24                         
## 2935              3295 Dyson Creek Rd                         
## 2936                 310 Kisatchie Dr                         
## 2937                      P O Box 136                         
## 2938                      P O Box 192                         
## 2939                      313 Hwy 502                         
## 2940                      P O Box 132                         
## 2941            520 Old Jefferson Hwy                         
## 2942               1011 Hall Addition                         
## 2943                      630 Grow St                         
## 2944                    700 Kimble St                         
## 2945             1050 Hall Addition 2                         
## 2946                       3951 Hwy 8                         
## 2947                        PO Box 28                         
## 2948                       PO Box 189                         
## 2949                    132 Durham Rd                         
## 2950                  1911 Hickory St                         
## 2951                    420 Joseph St                         
## 2952                214 Candleglow Dr                         
## 2953                    P O Box 13410                         
## 2954                                                          
## 2955                                                          
## 2956                                                          
## 2957                                                          
## 2958                                                          
## 2959               2505 Palmland Blvd                         
## 2960                                                          
## 2961                                                          
## 2962                                                          
## 2963                                                          
## 2964                                                          
## 2965                                                          
## 2966                                                          
## 2967                                                          
## 2968                408 Little Guy Ln                         
## 2969               600 Astor Place Dr                         
## 2970                                                          
## 2971                101 E Thompson St                         
## 2972                                                          
## 2973                     603 Park Ave                         
## 2974                                                          
## 2975                   4109 Walnut Dr                         
## 2976                                                          
## 2977                                                          
## 2978                                                          
## 2979             7113 Weeks Island Rd                         
## 2980                  206 Virginia St                         
## 2981                                                          
## 2982                                                          
## 2983                                                          
## 2984                  102 Michelle Ln                         
## 2985                  PO Drawer 12010                         
## 2986               2013 Alligator Ave                         
## 2987                     17 Oak Place                         
## 2988                   901 Lucerne Dr                         
## 2989              309 Emery Lewis Ave                         
## 2990                     1511 Eden St                         
## 2991      3304 West Old Spanish Trail                         
## 2992                   813 Francis St                         
## 2993                1609 Southwood Dr                         
## 2994       703 Jefferson Terrace Blvd                         
## 2995                      317 Boas St                         
## 2996                   407 Terrell Ct                         
## 2997              5919 Loreauville Rd                         
## 2998              4016 Coco Miquel Dr                         
## 2999           9305 Old Jeanerette Rd                         
## 3000                1428 Gonsoulin St                         
## 3001                5107 Creighton Dr                         
## 3002                 6517 Freetown Rd                         
## 3003                       PO Box 232                         
## 3004                135 Plantation Dr                         
## 3005       1505 Martin Luther King Dr                         
## 3006                149 Plantation Dr                         
## 3007                 717 Elizabeth St                         
## 3008                  1717 S Gibbs Ln                         
## 3009                 107 W Tampico St                         
## 3010                     835 Bank Ave                         
## 3011                    912 Sydney St                         
## 3012                 1611 Montagne St                         
## 3013                  203 Everette St                         
## 3014                   700 Terrell Ct                         
## 3015                6217 Sugar Oak Rd                         
## 3016               5519 Willamette St                         
## 3017                 1413 Tarleton St                         
## 3018         11308 E Admiral Doyle Dr                         
## 3019                  5810 Derouen Rd                         
## 3020                   5711 Fremin Rd                         
## 3021                     PO Box 12024                         
## 3022                   4918 Freyou Rd                         
## 3023                    1000 Cajun Dr                         
## 3024                   7708 Coteau Rd                         
## 3025                   5018 Freyou Rd                         
## 3026              7119 Loreauville Rd                         
## 3027             116 Nolan Duchane Dr                         
## 3028               370 Hilltop Circle                         
## 3029                       P O Box 52                         
## 3030                    700 Hebert St                         
## 3031                    101 Joliet St                         
## 3032                      P O Box 486                         
## 3033                      P O Box 564                         
## 3034                      P O Box 230                         
## 3035                    420 Joseph St                         
## 3036               809 Morris Charles                         
## 3037                      220 Main St                         
## 3038                 515 Louisiana St                         
## 3039                  201 Santiago Dr                         
## 3040                    624 Hebert St                         
## 3041               1703 Providence St                         
## 3042                  301 Caroline St                         
## 3043                    1230 Angie St                         
## 3044               605 Astor Place Dr                         
## 3045                 24070 Kirtley Dr                         
## 3046                       PO Box 148                         
## 3047                                                          
## 3048                                                          
## 3049                                                          
## 3050                                                          
## 3051                                                          
## 3052                                                          
## 3053                                                          
## 3054                                                          
## 3055                                                          
## 3056                                                          
## 3057                                                          
## 3058                                                          
## 3059                                                          
## 3060                  22560 Talbot Dr                         
## 3061                                                          
## 3062                                                          
## 3063                                                          
## 3064                                                          
## 3065                                                          
## 3066                                                          
## 3067                                                          
## 3068                  21960 Talbot Dr                         
## 3069                                                          
## 3070                                                          
## 3071                                                          
## 3072                                                          
## 3073                                                          
## 3074                   62675 Bayou Rd                         
## 3075                       PO Box 423                         
## 3076                  76650 Sexton Ln                         
## 3077                24455 WL Grace Rd                         
## 3078                 24070 Kirtley Dr                         
## 3079                   32250 Bowie St                         
## 3080                   56950 Ourso Rd                         
## 3081                       PO Box 151                         
## 3082   4677 Martin Luther King Jr Pky                         
## 3083             58680 St Clement Ave                         
## 3084                      24710 Hwy 1                         
## 3085                   58886 Allen St                         
## 3086                  57825 Guidry St                         
## 3087                 24520 Kirtley Dr                         
## 3088                      65785 JR Dr                         
## 3089                   77290 McBay Dr                         
## 3090                    10465 Hwy 411                         
## 3091                     925 River Rd                         
## 3092                       PO Box 361                         
## 3093                      PO Box 1029                         
## 3094                   77665 Jacob St                         
## 3095                   18030 Bayou Rd                         
## 3096                     65785 J R Dr                         
## 3097                  24850 Stassi Rd                         
## 3098               59395 Stonewall Dr                         
## 3099                58110 Labauve Ave                         
## 3100             58425 St Clement Ave                         
## 3101                 23730 Cypress St                         
## 3102                    58225 Pear St                         
## 3103              59590B Belleview Rd                         
## 3104                     610 Pecan Dr                         
## 3105                       PO Box 266                         
## 3106                  3665 Grenada Dr                         
## 3107                   32830 Adams Dr                         
## 3108                   57030 Ourso Rd                         
## 3109                   34000 Bowie St                         
## 3110                       PO Box 451                         
## 3111               24100 Sebastian St                         
## 3112                 63570 Old Hwy 77                         
## 3113                   61660 Bayou Rd                         
## 3114                       PO Box 185                         
## 3115                  32590 Graham St                         
## 3116                       PO Box 573                         
## 3117                 57935 Desobry St                         
## 3118                    23462 Eden St                         
## 3119                    66285 Spur 75                         
## 3120                    13615 Hwy 411                         
## 3121                    24020 Eden St                         
## 3122                505 Bayou Paul Ln                         
## 3123                77283 Jackson Ave                         
## 3124                   32750 Bowie St                         
## 3125                      P O Box 151                         
## 3126                      P O Box 276                         
## 3127                    58040 Main St                         
## 3128                      5380 Morris                         
## 3129                10735 Railroad Dr                         
## 3130     32540 Mayor Maurice Brown St                         
## 3131                   18070 Bayou Rd                         
## 3132                  15610 Laurel St                         
## 3133                  16345 Sidney Rd                         
## 3134                  16055 Sidney Rd                         
## 3135              16195 Deer Buck Run                         
## 3136               77300 Iberville Dr                         
## 3137                     10660 3rd St                         
## 3138                  77378 Landry Dr                         
## 3139                  10500 Lions Ave                         
## 3140                     10755 2nd St                         
## 3141                  32565 Willow St                         
## 3142                     32345 Ray St                         
## 3143            55195 Joseph St Apt A                         
## 3144                       P O Box 16                         
## 3145                      P O Box 353                         
## 3146                     18365 Hwy 77                         
## 3147                  18005 Sidney Rd                         
## 3148                  17960 Willow St                         
## 3149                   4925 Landry St                         
## 3150 4880a Martin Luther King Jr Pkwy                         
## 3151   4820 Martin Luther King Jr Pky                         
## 3152                   5435 Morris St                         
## 3153                   4907 Landry St                         
## 3154                   23160 Short St                         
## 3155                  58546 Meriam St                         
## 3156                     58330 Elm St                         
## 3157                   58455 Canal St                         
## 3158                59115 Laurstin Ln                         
## 3159                 23920 Baytown St                         
## 3160                   4500 Walker Rd                         
## 3161                                                          
## 3162                                                          
## 3163                                                          
## 3164                     1407 Leon Dr                         
## 3165                                                          
## 3166                                                          
## 3167                                                          
## 3168                        116 Ave B                         
## 3169                                                          
## 3170                                                          
## 3171                                                          
## 3172                                                          
## 3173                                                          
## 3174                                                          
## 3175                                                          
## 3176                       2062 Hwy 4                         
## 3177                       PO Box 730                         
## 3178                       PO Box 225                         
## 3179                      236 Hwy 505                         
## 3180                      P O Box 323                         
## 3181                    770 Taylor Rd                         
## 3182                   1426 Walker Rd                         
## 3183       1207 Martin Luther King Dr                         
## 3184                      802 Leon Dr                         
## 3185                1006 Gansville Rd                         
## 3186                       505 5th St                         
## 3187                     2274 Hwy 548                         
## 3188                    699 Taylor Rd                         
## 3189              8837 ClayAnsley Hwy                         
## 3190                      PO Box 1008                         
## 3191                   321 Morocco St                         
## 3192                 156 Pine Hill Rd                         
## 3193                   213 Jan Circle                         
## 3194             884 North Antioch Rd                         
## 3195                   1138 Roscoe Rd                         
## 3196                      6665 Hwy 34                         
## 3197                      P O Box 880                         
## 3198                      P O Box 585                         
## 3199            6126 Beech Springs Rd                         
## 3200               2037 VernonEros Rd                         
## 3201                      P O Box 244                         
## 3202                     210 Jans Cir                         
## 3203                    1200 Maple St                         
## 3204                      1911 Oak St                         
## 3205                      P O Box 190                         
## 3206                    101 Holley Dr                         
## 3207                      6006 3rd St                         
## 3208                1104 South 5th St                         
## 3209                     159 Line Ave                         
## 3210                  132 Mt Olive Rd                         
## 3211                      P O Box 435                         
## 3212                                                          
## 3213                    937 Walker Rd                         
## 3214                     7013 Main St                         
## 3215                1235 South 3rd St                         
## 3216                      138 Ohio St                         
## 3217                    223 Church Rd                         
## 3218                      204 Polk St                         
## 3219                    104 Myrtle St                         
## 3220                       824 6th St                         
## 3221                   807 Johnson St                         
## 3222                 415 Northeast St                         
## 3223                      12398 Hwy 4                         
## 3224                      P O Box 315                         
## 3225                       P O Box 86                         
## 3226                      P O Box 394                         
## 3227                 1104 Chatham Ave                         
## 3228                      1107 3rd St                         
## 3229                      9880 Hwy 34                         
## 3230                   209 Waldrup Rd                         
## 3231                  327 Lockhart Dr                         
## 3232                 6009 Meredith St                         
## 3233                     4019 Main St                         
## 3234                2014 E Central St                         
## 3235                       850 Ash St                         
## 3236                    1234 S 2nd St                         
## 3237                  179 West 3rd St                         
## 3238                  129 West 3rd St                         
## 3239                      P O Box 632                         
## 3240                    223 Church Rd                         
## 3241                 8235 Quitman Hwy                         
## 3242                    246 Church Rd                         
## 3243                  949 Kingsway Dr                         
## 3244                   1512 Colony Rd                         
## 3245                1621 Lancaster Dr                         
## 3246               2001 Jefferson Hwy                         
## 3247                    1009 Solon St                         
## 3248                                                          
## 3249                927 S Starrett Rd                         
## 3250               4057 S Windmere St                         
## 3251                  2053 Maharry Dr                         
## 3252                   P O Box 640211                         
## 3253               1108 N Starrett Rd                         
## 3254                     P O Box 6764                         
## 3255                 2932 Ridgeway Dr                         
## 3256                  1030 Oaklawn Dr                         
## 3257                                                          
## 3258              2254 S Von Braun Ct                         
## 3259                   338 Hector Ave                         
## 3260     1009 Chateau Lafitte Dr West                         
## 3261                  1100 Vintage Dr                         
## 3262               4524 Beau Lac Lane                         
## 3263                   1608 Green Ave                         
## 3264              1004 Green Acres Rd                         
## 3265         3230 Metairie Court Pkwy                         
## 3266                112 Charleston Pk                         
## 3267                 1908 Division St                         
## 3268              2283 S Von Braun Ct                         
## 3269                5086 Carmelite St                         
## 3270                     22 Willow DR                         
## 3271                  1916 Carrol Sue                         
## 3272                328 Fairfield Ave                         
## 3273            116 Imperial Woods Dr                         
## 3274                   525 Kenmore Dr                         
## 3275                   1200 Orchid Dr                         
## 3276               7212 Stoneleigh Dr                         
## 3277                 30 W Imperial Dr                         
## 3278                      48 Duffy St                         
## 3279                    6535 River Rd                         
## 3280                3720 Burntwood Dr                         
## 3281               2621 Ridgecrest Rd                         
## 3282                   100 Stevens Pl                         
## 3283                729 Champaigne Dr                         
## 3284                    4041 Teche Dr                         
## 3285                       7 Traminer                         
## 3286                       9 Platt Dr                         
## 3287                4525 Rebecca Blvd                         
## 3288                 3904 Ridgeway Dr                         
## 3289                 1427 Choctaw Ave                         
## 3290                 4212 Caldwell St                         
## 3291                    P O Box 55896                         
## 3292                  3716 N Woodlawn                         
## 3293                                                          
## 3294                  7920 Ferrara Dr                         
## 3295                    5513 David Dr                         
## 3296                      73 Marie Dr                         
## 3297                                                          
## 3298                      PO Box 1900                         
## 3299                  302 Southern Rd                         
## 3300                   333 Rue St Ann                         
## 3301                321 Homestead Ave                         
## 3302                        PO Box 10                         
## 3303                   4928 Jasper St                         
## 3304              3715 Rue Chardonnay                         
## 3305         200 Derbigny St Ste 6100                         
## 3306             2149 Hyde Park Ave E                         
## 3307                10128 Florence Ct                         
## 3308                     150 Linda Ct                         
## 3309                   525 Kenmore Dr                         
## 3310                     7413 Hess Dr                         
## 3311                4328 Colorado Ave                         
## 3312                  1405 Hesper Ave                         
## 3313                    147 Willow Dr                         
## 3314          3251 Wall Blvd Apt 2001                         
## 3315                    2816 Villa Dr                         
## 3316                    829 Dodge Ave                         
## 3317               3045 Huntsville St                         
## 3318                 504 Mayflower Dr                         
## 3319                   208 Phyllis Ct                         
## 3320                3632 N Labarre Rd                         
## 3321             4007 Saint Blaise Dr                         
## 3322                   941 Marlene Dr                         
## 3323                   1637 Gulizo Dr                         
## 3324                       PO Box 444                         
## 3325                       PO Box 121                         
## 3326                3705 N Labarre Rd                         
## 3327                   3016 Texas Ave                         
## 3328                    405 George St                         
## 3329                 9014 Rousseau St                         
## 3330                  300D Terry Pkwy                         
## 3331              4116 Barataria Blvd                         
## 3332              2884 Privateer Blvd                         
## 3333                       PO Box 356                         
## 3334                  212 Atherton Dr                         
## 3335                    312 Sophia St                         
## 3336               105 Prairieview Ct                         
## 3337                     3033 Ohio St                         
## 3338                 210 Lafayette St                         
## 3339               7212 Stoneleigh Dr                         
## 3340                  15 Rue St Louis                         
## 3341                     312 Avenue B                         
## 3342                      P O Box 215                         
## 3343           1156 Jean Lafitte Blvd                         
## 3344                     20 Derbes Dr                         
## 3345                     20 Derbes Dr                         
## 3346                  7920 Ferrera Dr                         
## 3347                 705 Carmenere Dr                         
## 3348                    1257 Barbe Dr                         
## 3349                    1257 Barbe Dr                         
## 3350                       1036 Hwy 1                         
## 3351              126 W Esplanade Ave                         
## 3352               3624 Lake Trail Dr                         
## 3353                  1414 Hancock St                         
## 3354                  1414 Hancock St                         
## 3355                        218 Ave A                         
## 3356                     218 Avenue A                         
## 3357              720 Huey P Long Ave                         
## 3358                   611 Chipley St                         
## 3359                     82 Mason Ave                         
## 3360                    1101 Barbe Dr                         
## 3361                     155 Linda Ct                         
## 3362                     155 Linda Ct                         
## 3363                    1161 Avenue C                         
## 3364                     808 Avenue H                         
## 3365                      P O Box 325                         
## 3366                       P O Box 27                         
## 3367                      P O Box 148                         
## 3368                      P O Box 665                         
## 3369                      P O Box 881                         
## 3370                 936 Lafayette St                         
## 3371                  184 Oakland Ave                         
## 3372             700 Colonial Club Dr                         
## 3373                 743 Woodward Ave                         
## 3374              11 Colonial Club Dr                         
## 3375                 125 Glenwood Ave                         
## 3376                    1915 Short St                         
## 3377                   1700 Taylor St                         
## 3378                     42 Emile Ave                         
## 3379                20 Monte Carlo Dr                         
## 3380                     40 Acadia St                         
## 3381           1940 Jean Lafitte Blvd                         
## 3382                 4850 Matherne St                         
## 3383            618 Jean Lafitte Blvd                         
## 3384                  2072 Camille Ct                         
## 3385                  2761 Couevas St                         
## 3386                                                          
## 3387                                                          
## 3388                                                          
## 3389      1707 Wilbert D Rochelle Ave                         
## 3390                                                          
## 3391                                                          
## 3392                                                          
## 3393                                                          
## 3394                                                          
## 3395                                                          
## 3396                                                          
## 3397                                                          
## 3398                                                          
## 3399                                                          
## 3400                                                          
## 3401                                                          
## 3402                                                          
## 3403                                                          
## 3404                                                          
## 3405                                                          
## 3406                                                          
## 3407                                                          
## 3408                                                          
## 3409                                                          
## 3410                                                          
## 3411                                                          
## 3412                                                          
## 3413                                                          
## 3414                      6101 Hwy 26                         
## 3415                       PO Box 799                         
## 3416                1402 N Sherman St                         
## 3417             1110 E Gallaugher Rd                         
## 3418                      5008 Hwy 14                         
## 3419                       828 Hwy 26                         
## 3420                      503 King St                         
## 3421               1205 W Division St                         
## 3422                   827 Comfort Ln                         
## 3423                  210 E Sumner St                         
## 3424                430 E Nezpique St                         
## 3425               18115 DA Ledoux Rd                         
## 3426                  27129 Picket Rd                         
## 3427                  25009 Barker Rd                         
## 3428           11308 Pecan Orchard Rd                         
## 3429                 9256 Artemond Rd                         
## 3430                 13506 Pousson Rd                         
## 3431                       703 May St                         
## 3432                818 N Cutting Ave                         
## 3433            6173 Morgan Shores Rd                         
## 3434                      P O Box 261                         
## 3435                   323 E Racca Rd                         
## 3436                818 W Academy Ave                         
## 3437                   1719 N Main St                         
## 3438                   302 Mulkern St                         
## 3439                     315 Crail St                         
## 3440              18100 D A Ledoux Rd                         
## 3441               4535 Dan Buller Rd                         
## 3442                    24590 Reed Rd                         
## 3443                     15036 Hwy 90                         
## 3444                     314 Maple St                         
## 3445                 13168 Hornsby Rd                         
## 3446                    413 Kellog St                         
## 3447                   309 Johnson St                         
## 3448                  4351 Luthers Rd                         
## 3449                  609 Beaufort St                         
## 3450             4406 Pine Island Hwy                         
## 3451       21503 Pinehill Cemetary Rd                         
## 3452                      P O Box 455                         
## 3453                      P O Box 547                         
## 3454                                                          
## 3455                   202 Rowland St                         
## 3456                    6326 Bryan Rd                         
## 3457                    319 Romero St                         
## 3458                  1106 Granger St                         
## 3459                   312 Langley St                         
## 3460                     710 First St                         
## 3461                      P O Box 824                         
## 3462                      P O Box 106                         
## 3463                    502 Buller St                         
## 3464                    136 Grand Ave                         
## 3465                   1206 E Derouen                         
## 3466                       P O Box 72                         
## 3467                      P O Box 511                         
## 3468                     316 Davis St                         
## 3469                510 W Hudspeth St                         
## 3470                   109 W South St                         
## 3471                   303 Goodwin St                         
## 3472                      P O Box 202                         
## 3473                      P O Box 425                         
## 3474                      P O Box 189                         
## 3475                 702 St Joseph St                         
## 3476                 712 St Joseph St                         
## 3477                    1403 First St                         
## 3478                     2112 Main St                         
## 3479                      815 Cole Ln                         
## 3480              635 New Orleans Ave                         
## 3481                   712 Kellogg St                         
## 3482                       222 Hwy 14                         
## 3483                    1311 State St                         
## 3484                   504 Nemento St                         
## 3485                   1626 S Main St                         
## 3486               1405 W Division St                         
## 3487                       418 May St                         
## 3488                  214 E Sumner St                         
## 3489               2140 E Academy Ave                         
## 3490                    112 D Hess Rd                         
## 3491                     P O Box 4626                         
## 3492                   114 Fairway Dr                         
## 3493               117 Martin Oaks Dr                         
## 3494                153 Shady Oaks Dr                         
## 3495                     205 Pinto St                         
## 3496                    305 Nashua Dr                         
## 3497               110 Rex St Apt 321                         
## 3498                    109 Saturn Dr                         
## 3499                  101 Nickland Dr                         
## 3500                    P O Box 52309                         
## 3501                400 Robinhood Cir                         
## 3502                   300 Stewart St                         
## 3503          303 Blackwater River Dr                         
## 3504                     116 Teche Dr                         
## 3505                   218 Farmington                         
## 3506               200 Pendleton Blvd                         
## 3507                    309 Digby Ave                         
## 3508                 1007 Rosedown Ln                         
## 3509                  109 Broadway Dr                         
## 3510                    114 Froeba Dr                         
## 3511                 202 Seville Blvd                         
## 3512                     P O Box 5232                         
## 3513                   114 Donovan Dr                         
## 3514                  110 Primrose Ln                         
## 3515                    160 Acacia Dr                         
## 3516                  111 Barronne St                         
## 3517                    1701 Savoy Rd                         
## 3518                   105 Clement St                         
## 3519                      PO Box 2009                         
## 3520                103 Glynnwood Ave                         
## 3521                   316 Steiner Rd                         
## 3522                  220 Symphony Pl                         
## 3523                  206 St Louis St                         
## 3524                   301 Monarch Dr                         
## 3525               207 E Alexander St                         
## 3526                 116 Creswell Ave                         
## 3527                 213 Arnould Blvd                         
## 3528      1019 Kaliste Saloom Rd 1114                         
## 3529                       636 Alonda                         
## 3530             4949 Verot School Rd                         
## 3531                   PO Drawer 3344                         
## 3532                      PO Box 3344                         
## 3533               117 Martin Oaks Dr                         
## 3534            528 Rue Des Babineaux                         
## 3535                      P O Box 183                         
## 3536                    204 Almeda St                         
## 3537                    109 Saturn Dr                         
## 3538                    210 Margot Ln                         
## 3539                     110 Alpha Dr                         
## 3540           300 Lozes Ave Apt 1203                         
## 3541                  106 Phillip Ave                         
## 3542                114 E Parkwood Dr                         
## 3543               310 D Arceneaux Rd                         
## 3544                 2306 S Fieldspan                         
## 3545             4256 Verot School Rd                         
## 3546                     120 Hulin Rd                         
## 3547              1019 Hector Conolly                         
## 3548                    248 Froeba Dr                         
## 3549              1427P LaNeuville Rd                         
## 3550               516 East Broussard                         
## 3551              120 La Hwy 89 South                         
## 3552                   255 Lormand Rd                         
## 3553                  1410 Sellers Rd                         
## 3554                      701 Espasie                         
## 3555                     122 Hulin Rd                         
## 3556                  145 Wagon Trail                         
## 3557                        101 Lynda                         
## 3558               1204 LaNeuville Rd                         
## 3559                   801 Provost St                         
## 3560                  129 Nezpique Rd                         
## 3561                5005 N University                         
## 3562                    125 Andres Rd                         
## 3563                  106 Guilliot Rd                         
## 3564                  311 Rue Colombe                         
## 3565                   109 Donovan Dr                         
## 3566                600 Almonaster Rd                         
## 3567                     311 Riner Dr                         
## 3568                  405 Guilbeau Rd                         
## 3569               101 St Pierre Blvd                         
## 3570                 111 S St John St                         
## 3571                    100 Auburn Dr                         
## 3572                 514 N Michaud St                         
## 3573                       823 Oak St                         
## 3574                    217 Heidi Cir                         
## 3575                    121 Offord St                         
## 3576                 209 Cheyenne Cir                         
## 3577              100 Copper Ridge Dr                         
## 3578                    306 Burley Rd                         
## 3579                 402 Lafayette St                         
## 3580              201 Copperfield Way                         
## 3581                 525 N Larriviere                         
## 3582                       PO Box 144                         
## 3583                   1132 Louise St                         
## 3584                  292 St Peter St                         
## 3585                     626 Parkside                         
## 3586                928 St Charles St                         
## 3587                729 St Charles St                         
## 3588                     2031 St Mary                         
## 3589                      321 Park Dr                         
## 3590                       3575 Hwy 1                         
## 3591                                                          
## 3592                  292 St Peter St                         
## 3593                                                          
## 3594                    13074 Hwy 308                         
## 3595                       PO Box 234                         
## 3596                     157 Heidi Ln                         
## 3597                                                          
## 3598                                                          
## 3599                                                          
## 3600                                                          
## 3601                                                          
## 3602                                                          
## 3603                                                          
## 3604                                                          
## 3605                  18903 E Main St                         
## 3606                      887 Hwy 308                         
## 3607                       PO Box 818                         
## 3608                   174 W 214th St                         
## 3609                  1545 La Hwy 654                         
## 3610                       PO Box 594                         
## 3611                   1132 Louise St                         
## 3612                  2999 Choctaw Rd                         
## 3613                    401 Menard St                         
## 3614                  202 Parkside Dr                         
## 3615                 122 Fallcreek Dr                         
## 3616                     1936 Hwy 654                         
## 3617                   1421 Hyland Dr                         
## 3618                 202 East 28th St                         
## 3619                       PO Box 183                         
## 3620                     213 Davis Dr                         
## 3621                 409 E Seventh St                         
## 3622                    411 Cherry Dr                         
## 3623                   605 Canal Blvd                         
## 3624                   1215 Narrow St                         
## 3625                  202 Parkside Dr                         
## 3626                 306 Hermitage Dr                         
## 3627               134 Belle Terre Dr                         
## 3628                    108 Pierre St                         
## 3629                    285 Church St                         
## 3630                  160 St James St                         
## 3631                      302 Romy Dr                         
## 3632                300 Mary Beth Ave                         
## 3633                    295 Genimi St                         
## 3634                      PO Box 1212                         
## 3635                 117 East 93rd St                         
## 3636                  112 Martinez Ln                         
## 3637                     P O Box 1358                         
## 3638                141 West 139th St                         
## 3639                 236 West 41st St                         
## 3640                      P O Box 580                         
## 3641                    1013 Harry St                         
## 3642                       P O Box 27                         
## 3643                      25300 Hwy 1                         
## 3644                   3202 W 32nd St                         
## 3645                       204 ABC Ln                         
## 3646                     820 Oak Lane                         
## 3647                    115 Uzee Lane                         
## 3648                   117 WillowD St                         
## 3649                       PO Box 331                         
## 3650                      540 Hwy 304                         
## 3651                     2514 Hwy 182                         
## 3652                     386 Adams St                         
## 3653                108 East 128th St                         
## 3654                  178 Cinclare Dr                         
## 3655                      P O Box 384                         
## 3656                     626 Ethel St                         
## 3657                    125 Legion Ln                         
## 3658                      P O Box 265                         
## 3659                   917 Jackson St                         
## 3660                       202 Elm St                         
## 3661                  514 Vacherie St                         
## 3662                       P O Box 23                         
## 3663                   108 Comeaux Dr                         
## 3664                   202 Comeaux Dr                         
## 3665                     321 Canal St                         
## 3666                  727 Rosedown Dr                         
## 3667                     516 Foret St                         
## 3668                722 St Charles St                         
## 3669                      177 Fred St                         
## 3670               210 South Henry St                         
## 3671                    171 Verret St                         
## 3672                  112 Martinez Ln                         
## 3673                  2013 N Bayou Dr                         
## 3674                      P O Box 447                         
## 3675                     P O Box 3050                         
## 3676                                                          
## 3677                                                          
## 3678                                                          
## 3679                                                          
## 3680                                                          
## 3681                                                          
## 3682                                                          
## 3683                                                          
## 3684                                                          
## 3685                                                          
## 3686                    135 Bailey Rd                         
## 3687                     P O Box 1120                         
## 3688                     P O Box 1406                         
## 3689                     P O Box 1066                         
## 3690                                                          
## 3691                                                          
## 3692                8462 Beechwood Lp                         
## 3693                                                          
## 3694                      P O Box 433                         
## 3695                    1450 N 2nd St                         
## 3696                                                          
## 3697                                                          
## 3698                  200 Double D Dr                         
## 3699                                                          
## 3700                    200 Dr Guy Dr                         
## 3701                      PO Box 1316                         
## 3702                      PO Box 1381                         
## 3703                 289 Mill Pond Rd                         
## 3704                      P O Box 333                         
## 3705                 4618 Central Ave                         
## 3706                   1589 Tupelo St                         
## 3707                     3186 Hwy 459                         
## 3708                   908 Beverly St                         
## 3709                   215 Vercher Rd                         
## 3710                  150 Circle C Rd                         
## 3711                   150 Rawlins Rd                         
## 3712                 281 Old River Lp                         
## 3713                     P O Box 1787                         
## 3714                     160 Stott Dr                         
## 3715                5322 Rosefield Rd                         
## 3716                   1080 Martin St                         
## 3717                       PO Box 448                         
## 3718                  1670 Dogwood Dr                         
## 3719                    3398 Hwy 3104                         
## 3720                   1164 Hanger Rd                         
## 3721                  115 Nebo Cutoff                         
## 3722                  125 Anderson Rd                         
## 3723               655 Yearby Hill Lp                         
## 3724                    1004 Hwy 3071                         
## 3725                      P O Box 196                         
## 3726                      P O Box 490                         
## 3727                     P O Box 1415                         
## 3728                      9632 Hwy 84                         
## 3729                    1067 Hwy 3071                         
## 3730                      P O Box 196                         
## 3731                  620 Benelbie Rd                         
## 3732                      P O Box 112                         
## 3733                 405 Old River Lp                         
## 3734                 2170 Hemphill Dr                         
## 3735                   2829 Church St                         
## 3736              1229 East Hebert St                         
## 3737                    1245 Holly Ln                         
## 3738                   1084 Holmes St                         
## 3739                   1607 Taylor St                         
## 3740                  9290 North Main                         
## 3741                    1245 Holly Ln                         
## 3742                     1469 Plum St                         
## 3743                   1564 Greene St                         
## 3744                      2035 Ash St                         
## 3745                    1753 Short St                         
## 3746                       964 Gum St                         
## 3747                    1284 Doyle St                         
## 3748                      P O Box 103                         
## 3749                       PO Box 749                         
## 3750                    1128 Carraway                         
## 3751                1179 East Mill St                         
## 3752                 1083 Woodlawn Dr                         
## 3753                 1045 Woodlawn Dr                         
## 3754                    1151 Woodlawn                         
## 3755            2957 East Hardtner Dr                         
## 3756                5346 Tannehill Dr                         
## 3757                   1595 Pepper St                         
## 3758            1180 West Sharbono St                         
## 3759                     774 Acorn St                         
## 3760                 2190 Hemphill Dr                         
## 3761                 949 Nicholson St                         
## 3762                                                          
## 3763      1219 Martin Luther King Ave                         
## 3764                  147 Webster Ave                         
## 3765                     221 Davis Rd                         
## 3766                                                          
## 3767                                                          
## 3768                                                          
## 3769                                                          
## 3770                                                          
## 3771                                                          
## 3772                                                          
## 3773                                                          
## 3774                                                          
## 3775               342 Stowe Creek Rd                         
## 3776                1600 Bistineau St                         
## 3777                113 Deer Creek Rd                         
## 3778                  2317 Soyars Cir                         
## 3779                    435 Herren Rd                         
## 3780                                                          
## 3781                                                          
## 3782                                                          
## 3783                1540 Pea Ridge Rd                         
## 3784                                                          
## 3785                                                          
## 3786                                                          
## 3787                                                          
## 3788                                                          
## 3789                                                          
## 3790                                                          
## 3791                 1402 St John Ave                         
## 3792               1124 Wedgewood Ave                         
## 3793                       PO Box 924                         
## 3794                    222 Glover Rd                         
## 3795               944 Rock Corner Rd                         
## 3796                   273 Houston Rd                         
## 3797                  218 Webster Ave                         
## 3798                    10169 Hwy 146                         
## 3799                     6010 Hwy 151                         
## 3800                      362 Hwy 556                         
## 3801            136 Jefferson Oaks Dr                         
## 3802                   432 Forest Cir                         
## 3803             105 East Reynolds Dr                         
## 3804               204 W Colorado Ave                         
## 3805                 309 Watertank Rd                         
## 3806                     620 Adams St                         
## 3807                     1502 St John                         
## 3808                 3721 Moreland St                         
## 3809                    912 Robert St                         
## 3810   1468 Martin Luther King Jr Ave                         
## 3811                   114 Jackson St                         
## 3812                     10601 Hwy 80                         
## 3813               204 New Propect Rd                         
## 3814                     1683 HWY 821                         
## 3815                     949 Woods Rd                         
## 3816                   2200 Llangeler                         
## 3817                   1997 Atkins Rd                         
## 3818            204 West Colorado Ave                         
## 3819                    511 Grant Ave                         
## 3820                   1206 Taylor St                         
## 3821                 2901 Lakeview Dr                         
## 3822                       PO Box 148                         
## 3823                  759 Sunshine Rd                         
## 3824                      441 Hwy 545                         
## 3825                        PO Box 29                         
## 3826                      PO Box 1031                         
## 3827                      297 Weir Rd                         
## 3828                      441 Hwy 545                         
## 3829                        PO Box 81                         
## 3830          150 Woodland Springs Dr                         
## 3831                  109 Llanfair Dr                         
## 3832                7774 Annie Lee St                         
## 3833                   153 Deer Trail                         
## 3834                     144 Pipes Rd                         
## 3835                      9611 Hwy 80                         
## 3836                 2037 McMullen St                         
## 3837                      212 Pine St                         
## 3838                   2402 Martha St                         
## 3839                    194 Aswell St                         
## 3840                 1720 Highway 820                         
## 3841                141 North Pine St                         
## 3842                  130 Cranford St                         
## 3843                   116 Durrett Dr                         
## 3844               2419 Martha Street                         
## 3845                    1504 Allen St                         
## 3846                  1400 Oriole Ave                         
## 3847                  305 Arkansas St                         
## 3848                 130 Woodstone Dr                         
## 3849                 905 Robinette Dr                         
## 3850               279 Mockingbird Ln                         
## 3851 1573 E Martin Luther King Jr Ave                         
## 3852                   2072 Adams Ave                         
## 3853                     220 Sims Ave                         
## 3854                   112 Wayside Dr                         
## 3855                  163 Westlake Rd                         
## 3856                     7962 Hico St                         
## 3857                      P O Box 453                         
## 3858                      158 Voss St                         
## 3859                    150 Graham St                         
## 3860                   212 Deer Trail                         
## 3861                224 Deer Trail Rd                         
## 3862                  164 Rockshop Rd                         
## 3863                   35893 Weiss Rd                         
## 3864                  20469 LA Hwy 16                         
## 3865                   33176 Weiss Rd                         
## 3866                       PO Box 306                         
## 3867                                                          
## 3868                      428 East St                         
## 3869                                                          
## 3870                                                          
## 3871                                                          
## 3872         31514 Carter Cemetary Rd                         
## 3873             29433 La Hwy 40 West                         
## 3874                    930 Benton Ln                         
## 3875                   19875 McLin Rd                         
## 3876               30872 Carriage Way                         
## 3877                 33273 Beverly Dr                         
## 3878                 27300 Tullier Ln                         
## 3879                   34403 Weiss Rd                         
## 3880                 35399 Perkins Rd                         
## 3881                10768 Cardinal Rd                         
## 3882               422 Centerville NE                         
## 3883              2500 Florida Ave SW                         
## 3884                  13600 Quail Run                         
## 3885                12156 Burgess Ave                         
## 3886                 31416 Barbara Dr                         
## 3887                  25920 Oak Alley                         
## 3888                 35021 Perkins Rd                         
## 3889                      PO Box 1150                         
## 3890                8082 Evergreen Dr                         
## 3891              25153 Arlington Ave                         
## 3892                    451 Brenda Dr                         
## 3893          35649 Woodland Ridge Dr                         
## 3894                   9900 Meadow Ln                         
## 3895              9417 Prince Charles                         
## 3896                       704 Tom Dr                         
## 3897                  24076 Canyon Rd                         
## 3898                  17315 La Hwy 16                         
## 3899               32774 Kirbywood Dr                         
## 3900                 29946 La Hwy 444                         
## 3901                      P O Box 418                         
## 3902                       PO Box 728                         
## 3903                    930 Benton Ln                         
## 3904                   33176 Weiss Rd                         
## 3905                 35104 Perkins Rd                         
## 3906                1151 Cockerham Rd                         
## 3907            412 N College St East                         
## 3908                10983 LA Hwy 1033                         
## 3909             24121 Cane Market Rd                         
## 3910                  13561 Graham Ln                         
## 3911                 20255 Fairway Dr                         
## 3912               29303 M Kinchen Rd                         
## 3913                  34674 LA Hwy 16                         
## 3914            20800 Adam Averett Rd                         
## 3915                        PO Box 53                         
## 3916             14724 Bear Island Rd                         
## 3917                       PO Box 643                         
## 3918                10964 La Hwy 1033                         
## 3919           32447 Mangum Chapel Rd                         
## 3920                       PO Box 657                         
## 3921                       PO Box 921                         
## 3922                30930 Walker N Rd                         
## 3923                     37354 Hwy 16                         
## 3924                    20150 Hwy 444                         
## 3925                     31868 Hwy 43                         
## 3926                     23272 Hwy 22                         
## 3927             24601 Blood River Rd                         
## 3928                10964 La Hwy 1033                         
## 3929                31734 LA Hwy 1036                         
## 3930                      P O Box 222                         
## 3931                       PO Box 921                         
## 3932                  27270 Watson Ln                         
## 3933               417 Centerville St                         
## 3934               12689 Pendarvis Ln                         
## 3935                 29886 Bartich St                         
## 3936                     28543 Hwy 22                         
## 3937                  20177 Circle Dr                         
## 3938                      P O Box 421                         
## 3939                       PO Box 421                         
## 3940                  16619 LA Hwy 16                         
## 3941                 19334 Gourdon Ln                         
## 3942                   29608 Aster St                         
## 3943                29980 Mulberry St                         
## 3944                      P O Box 811                         
## 3945                     15440 Hwy 16                         
## 3946            12562 N Lake Shore Dr                         
## 3947                28300 Magnolia Dr                         
## 3948                    29801 Park St                         
## 3949                      P O Box 951                         
## 3950                  13699 Aydell Ln                         
## 3951                      P O Box 713                         
## 3952                   28490 Ridge Ln                         
## 3953                   28490 Ridge Ln                         
## 3954                  31533 Judith Dr                         
## 3955                 31424 Barbara Dr                         
## 3956                 31424 Barbara Dr                         
## 3957               20580 Riverside Rd                         
## 3958               20580 Riverside Rd                         
## 3959                   31384 Lanta Ln                         
## 3960                     28543 Hwy 22                         
## 3961                 20452 Camille Dr                         
## 3962                      P O Box 383                         
## 3963                      P O Box 182                         
## 3964                      P O Box 758                         
## 3965                      P O Box 643                         
## 3966                      P O Box 154                         
## 3967                       PO Box 436                         
## 3968                  32690 Cullom Rd                         
## 3969                     31466 Hyw 22                         
## 3970               25564 McCarroll Rd                         
## 3971                 33290 Pitcher Rd                         
## 3972                  18143 Aydell Ln                         
## 3973                   14360 Mecca Rd                         
## 3974              14580 Rue Deschenes                         
## 3975                     18475 Hwy 16                         
## 3976                 19338 Gourdon Ln                         
## 3977                  19450 LA Hwy 16                         
## 3978                   215 N River Rd                         
## 3979                   510 Rushing Rd                         
## 3980                    717 Poplar St                         
## 3981                  906 Hatchell Ln                         
## 3982               522 Centerville St                         
## 3983                   30188 Julia St                         
## 3984                     29601 Oak St                         
## 3985              29563 Stephanie Ann                         
## 3986                      PO Box 1674                         
## 3987                   215 Chester Dr                         
## 3988                   614 Griffin St                         
## 3989                     201 Hwy 80 W                         
## 3990                                                          
## 3991                  267 Verhagan Rd                         
## 3992                     608 Ethel St                         
## 3993              402 E Washington St                         
## 3994                     411 Gayle St                         
## 3995         210 Neely Planation Road                         
## 3996                                                          
## 3997                                                          
## 3998                                                          
## 3999                                                          
## 4000                                                          
## 4001                    100 Eureka St                         
## 4002                      PO Box 1710                         
## 4003                      285 Hwy 603                         
## 4004                   108 Neumann Dr                         
## 4005                     1496 Hwy 603                         
## 4006               2365 Hwy 577 South                         
## 4007                      PO Box 1883                         
## 4008                      PO Box 1101                         
## 4009                1027 Kimbrough St                         
## 4010                127 Hoss Smith Rd                         
## 4011            317 Fred Morgan Sr Rd                         
## 4012                   215 Chester Dr                         
## 4013                     704 Jerry St                         
## 4014                   619 Griffin St                         
## 4015              402 E Washington St                         
## 4016                     115 Johns St                         
## 4017                   95 Marianna St                         
## 4018             656 Charles Brown Rd                         
## 4019               414 E Bear Lake Rd                         
## 4020           1301 West Craig Street                         
## 4021                       PO Box 863                         
## 4022                     3572 Hwy 603                         
## 4023                      224 Hwy 602                         
## 4024                      926 Holt St                         
## 4025                  100 Magnolia St                         
## 4026                     706 Wyche St                         
## 4027                       P O Box 60                         
## 4028                     2927 Hwy 602                         
## 4029                    111 Leslie St                         
## 4030                       216 Ann St                         
## 4031                 107 Mary Beth Ln                         
## 4032                    107 Ruthie St                         
## 4033                      P O Box 214                         
## 4034                   402 Janice Ave                         
## 4035                       P O Box 21                         
## 4036                     2945 Hwy 602                         
## 4037                     2945 Hwy 602                         
## 4038                     2930 Hwy 602                         
## 4039                    100 Leslie St                         
## 4040                    104 Ruthie St                         
## 4041                  111 Burnside Dr                         
## 4042                   304 LaSalle St                         
## 4043                  211 Garfield St                         
## 4044                     608 Ethel St                         
## 4045                       505 4th St                         
## 4046                     411 Gayle St                         
## 4047    1216 Martin Luther King South                         
## 4048                1320 S Washington                         
## 4049                  904 Charles Ave                         
## 4050                  1006 Orchid Ave                         
## 4051                    120 Parkhurst                         
## 4052                                                          
## 4053     1320 South Washington Street                         
## 4054                                                          
## 4055             4229 Perryville Road                         
## 4056                10605 Parkwood Dr                         
## 4057                    1003 Commerce                         
## 4058                 439 West Madison                         
## 4059               6205 Winchester Dr                         
## 4060                                                          
## 4061                                                          
## 4062                                                          
## 4063                                                          
## 4064                                                          
## 4065                                                          
## 4066                                                          
## 4067               10841 Whitestar Dr                         
## 4068                      PO Box 1543                         
## 4069                     4542 Dowd Rd                         
## 4070           1509 Frenchman Bend Rd                         
## 4071                   7244 Gracie Ln                         
## 4072                 10250 Grabult Rd                         
## 4073                     5733 Candice                         
## 4074                    5105 Oakly Ln                         
## 4075                  6036 Jen Lee Ln                         
## 4076                    1003 Commerce                         
## 4077                439 W Madison Ave                         
## 4078                 1302 Leavell Ave                         
## 4079                    503 South Cox                         
## 4080                    17122 Cain Rd                         
## 4081                   9223 Tupelo Dr                         
## 4082                    301 N 22nd St                         
## 4083                11105 Crossett Rd                         
## 4084                   1014 Tulip Ave                         
## 4085                  1704 Hoover Ave                         
## 4086                 129 Shady Oak St                         
## 4087              3407 Bayou Acres Dr                         
## 4088           17613 Viola Carroll Rd                         
## 4089                       PO Box 155                         
## 4090                       PO Box 192                         
## 4091               12005 Yeldell Road                         
## 4092                10650 Pleasant Dr                         
## 4093               15800 Brewer Creek                         
## 4094           14848 Holly Ridge Road                         
## 4095                 3373 Bayou Acres                         
## 4096                 15094 Lum Day Rd                         
## 4097                       PO Box 232                         
## 4098                    7781 Bayou Dr                         
## 4099              15786 Old Bonita Rd                         
## 4100                       PO Box 276                         
## 4101              16162 Old Berlin Rd                         
## 4102             14848 Holly Ridge Rd                         
## 4103                   1402 Bowman St                         
## 4104                  14789 Rosenwald                         
## 4105                     4805 Main St                         
## 4106                      205 28th St                         
## 4107                  400 Magnolia Dr                         
## 4108                      1006 Orchid                         
## 4109                  1006 Orchid Ave                         
## 4110                 419 Sunflower St                         
## 4111                  2108 Gemini Cir                         
## 4112                      520 Neptune                         
## 4113    1216 Martin Luther King South                         
## 4114                 814 Washburn Ave                         
## 4115                  302 Sentelle St                         
## 4116                  302 Sentelle St                         
## 4117              19594 Old Bonita Rd                         
## 4118                 15610 Bonita Ave                         
## 4119               15265 Lakeshore Dr                         
## 4120                                                          
## 4121                   4437 Keller Dr                         
## 4122                     4847 Page Ln                         
## 4123               6405 Frank Bell Rd                         
## 4124                402 South 22nd St                         
## 4125                 209 West 19th St                         
## 4126                       P O Box 34                         
## 4127                      P O Box 132                         
## 4128                      P O Box 278                         
## 4129                       P O Box 88                         
## 4130                     P O Box 2082                         
## 4131                     7446 Hwy 478                         
## 4132                     4923 Hwy 494                         
## 4133                                                          
## 4134                                                          
## 4135                                                          
## 4136                                                          
## 4137                                                          
## 4138                                                          
## 4139                                                          
## 4140                     3365 Hwy 480                         
## 4141                                                          
## 4142                                                          
## 4143                 176 Riverside Ln                         
## 4144                                                          
## 4145                                                          
## 4146                                                          
## 4147                                                          
## 4148                                                          
## 4149                                                          
## 4150                                                          
## 4151                                                          
## 4152                                                          
## 4153                                                          
## 4154                                                          
## 4155                                                          
## 4156                     3698 Hwy 484                         
## 4157                       PO Box 476                         
## 4158               685 Shady Grove Rd                         
## 4159                     201 Paula Ln                         
## 4160                      P O Box 799                         
## 4161                     345 Pavie St                         
## 4162                 176 Riverside Ln                         
## 4163                   401 Parkway Dr                         
## 4164                      P O Box 263                         
## 4165                      P O Box 578                         
## 4166                  1029 Parkway Dr                         
## 4167                      P O Box 272                         
## 4168           244 Starlight Point Rd                         
## 4169                     842 Pavie St                         
## 4170                   1003 Amulet St                         
## 4171                     436 Mr Ed Ln                         
## 4172                        621 Genti                         
## 4173           108 South Williams Ave                         
## 4174                     115 Clark Rd                         
## 4175                  212 Michelle Dr                         
## 4176           161 Cassidy Springs Rd                         
## 4177               262 Jack Crosby Rd                         
## 4178                     1700 Hwy 491                         
## 4179                     1135 Hart Rd                         
## 4180                    10363 Hwy 120                         
## 4181                         PO Box 5                         
## 4182             121 Ray Grillette Rd                         
## 4183                     296 Olive Rd                         
## 4184                      366 Hwy 495                         
## 4185                    504 Marion Pl                         
## 4186                    133 Vaughn St                         
## 4187            1809 Robert Coffey Rd                         
## 4188                      P O Box 214                         
## 4189                    128 Talley St                         
## 4190            236 Morning Star Loop                         
## 4191                      P O Box 151                         
## 4192                       191 Lee St                         
## 4193                  114 Hennigan St                         
## 4194                      125 Kemp St                         
## 4195                     2058 Hwy 155                         
## 4196                       P O Box 32                         
## 4197                  268 Goldonna Rd                         
## 4198                 123 Sam Clark Rd                         
## 4199                305 N Railroad St                         
## 4200                     1578 Hwy 117                         
## 4201                      156 Pine St                         
## 4202               516 Lindsey Circle                         
## 4203                      P O Box 207                         
## 4204                132 Greenville Dr                         
## 4205                       P O Box 24                         
## 4206                     2686 Hwy 479                         
## 4207                     2670 Hwy 479                         
## 4208                       302 Ash St                         
## 4209                 131 Sam Clark Rd                         
## 4210                 216 Johnson Loop                         
## 4211            192 Morning Star Loop                         
## 4212                      P O Box 117                         
## 4213                      P O Box 101                         
## 4214                       1606 Hwy 1                         
## 4215                   2457 DeSoto St                         
## 4216                      P O Box 372                         
## 4217                   2357 DeSoto St                         
## 4218                    8995 Texas St                         
## 4219                    9153 Texas St                         
## 4220                      7717 Oak St                         
## 4221                      808 Hwy 153                         
## 4222                 464 Rushing Loop                         
## 4223                     1982 Hwy 155                         
## 4224              528 Saint Clair Ave                         
## 4225                      125 Lodi St                         
## 4226                     1112 Lake St                         
## 4227              1406 W Lakeshore Dr                         
## 4228                     153 Allen St                         
## 4229                      3041 Hwy 71                         
## 4230                    206 Barnum St                         
## 4231                    229 Barnum St                         
## 4232                    156 Vaughn St                         
## 4233                 8516 Palmetto St                         
## 4234                    2624 Short St                         
## 4235                9012 Olive Street                         
## 4236                    8634 Birch St                         
## 4237                   P O Box 850143                         
## 4238               4154 Cleveland Ave                         
## 4239          2817 Castiglione Street                         
## 4240                9427 Stroelitz St                         
## 4241                    4234 Canal St                         
## 4242                    4234 Canal St                         
## 4243                    4234 Canal St                         
## 4244               121 N Murat Street                         
## 4245                 1524 Broadway St                         
## 4246                     1233 Fern St                         
## 4247                  2719 Marengo St                         
## 4248                    P O Box 15168                         
## 4249                     PO Box 15465                         
## 4250              2138 Terpsichore St                         
## 4251                 1827 Peniston St                         
## 4252               2131 Carondelet St                         
## 4253                4308 Walmsley Ave                         
## 4254                     PO Box 50203                         
## 4255               2311 Seminole Lane                         
## 4256               4908 Carondelet St                         
## 4257      600 Carondelet St 9th Floor                         
## 4258               547 Baronne St 202                         
## 4259           521 Baronne St Apt 408                         
## 4260               917 Washington Ave                         
## 4261              209 Brunswick Court                         
## 4262               92 English Turn Dr                         
## 4263            3721 Red Cyress Drive                         
## 4264                 3624 Pin Oak Ave                         
## 4265                  3659 Inwood Ave                         
## 4266                    52 Eugenie Ct                         
## 4267              2152 L B Landry Ave                         
## 4268                 3321 Florence St                         
## 4269          2255 Gen Collins Avenue                         
## 4270                     9 Olympic Ct                         
## 4271                      PO Box 6006                         
## 4272                  3501 Inwood Ave                         
## 4273                    6328 Dover Pl                         
## 4274               64 Grand Canyon Dr                         
## 4275                  7001 Cove Drive                         
## 4276                         P O 3822                         
## 4277                    4955 Venus St                         
## 4278                 4727 Press Drive                         
## 4279                1826 Mirabeau Ave                         
## 4280                 5352 Bancroft Dr                         
## 4281                   1509 Mithra St                         
## 4282                 4925 Moore Drive                         
## 4283                    P O Box850331                         
## 4284                 5223 Pratt Drive                         
## 4285                 4925 Moore Drive                         
## 4286     6305 Elysian Fields Ave 404B                         
## 4287                   1507 N Miro St                         
## 4288        810 Bienville St Unit 505                         
## 4289              7220 Renaissance Ct                         
## 4290                  7551 Horizon Dr                         
## 4291          11131 Lake Forrest Blvd                         
## 4292      11121 Lake Forest Boulevard                         
## 4293              5801 Waterford Blvd                         
## 4294                 7163 Parkside Ct                         
## 4295                     4800 Good Dr                         
## 4296          5931 Winchester Park Dr                         
## 4297                   1010 Common St                         
## 4298               101 Eastview Drive                         
## 4299          11021 Lake Forrest Blvd                         
## 4300                    PO Box 870661                         
## 4301              5581 Maple Ridge Dr                         
## 4302              11101 N Idlewood Ct                         
## 4303                230 Carondelet St                         
## 4304              210 S Pierce Street                         
## 4305             6628 General Diaz St                         
## 4306    145 Robert E Lee Blvd Ste 206                         
## 4307  145 Robert E Lee Blvd Suite 206                         
## 4308                    7038 Gen Haig                         
## 4309                   8006 Nelson St                         
## 4310                230 Carondelet St                         
## 4311                866 City Park Ave                         
## 4312                 1532 Eleonore St                         
## 4313                  1104 Webster St                         
## 4314                3135 De Saix Blvd                         
## 4315                      427 33rd St                         
## 4316                3528 Vincennes Pl                         
## 4317                 1422 Jackson Ave                         
## 4318               2533 Jefferson Ave                         
## 4319                  926 Leontine St                         
## 4320               932 Washington Ave                         
## 4321             1711 Gen Pershing St                         
## 4322             1711 Gen Pershing St                         
## 4323                     2348 Camp St                         
## 4324                     2348 Camp St                         
## 4325                 1415 Polymnia St                         
## 4326           625  St Charles Ave 6C                         
## 4327               1205 Jefferson Ave                         
## 4328              2721 St Charles Ave                         
## 4329           2071 West Bend Pkwy284                         
## 4330          126 Lakewood Estates Dr                         
## 4331                   3640 Mimosa Ct                         
## 4332                  305 Main Street                         
## 4333               2668 Mercedes Blvd                         
## 4334              1129 Bourbon Street                         
## 4335                  834 Chartres St                         
## 4336              7431 Spring Lake Dr                         
## 4337        2033 Constance St Apt 208                         
## 4338              4337 Seminary Place                         
## 4339                 4201 Seminary Pl                         
## 4340               3661 Gentilly Blvd                         
## 4341              5610 Chamberlain Dr                         
## 4342                   1728 Oriole St                         
## 4343                8 Charlotte Drive                         
## 4344                   4371 Murano Rd                         
## 4345                5050 Vanchu Drive                         
## 4346                   421 Loyola Ave                         
## 4347       1631 Elysian Fields Ave298                         
##            CityColumn2 StateColumn2 ZipcodeColumn2        Phone Ethnicity
## 1              Gilliam           LA          71029 318-296-4404         B
## 2                                                                        
## 3           Shreveport           LA     71104-4209 318-869-0355         W
## 4           Shreveport           LA     71103-4048 318-470-0403         B
## 5           Shreveport           LA     71109-7647 318-635-2923          
## 6           Shreveport           LA     71106-6332 318-347-5421         B
## 7           Shreveport           LA     71107-3801 318-221-5957         B
## 8           Shreveport           LA     71119-5002 318-636-1555         B
## 9           Shreveport           LA          71135 318-797-5604         B
## 10          Shreveport           LA     71106-7775 318-798-3124         B
## 11          Shreveport           LA     71104-4414 318-426-7009         W
## 12        Bossier City           LA     71112-4268 318-230-5478         B
## 13           Mansfield           LA          71052 318-567-2995         W
## 14           Stonewall           LA     71078-9170 318-686-2291         W
## 15        Bossier City           LA     71111-2410 318-469-3630         W
## 16              Benton           LA     71006-9710 318-965-4797         W
## 17        Bossier City           LA     71112-8796 318-752-0554         W
## 18                                                                       
## 19              Minden           LA          71055                       
## 20              Minden           LA          71055                       
## 21         Haynesville           LA     71038-7585 318-433-1058         W
## 22         Haynesville           LA     71038-7585 318-433-1059         W
## 23                                                                       
## 24                                                                       
## 25                                                                       
## 26           Jonesboro           LA     71251-5588 318-259-4184         W
## 27              Monroe           LA     71201-2345 318-387-9118         W
## 28              Monroe           LA     71201-2539 318-387-1785         W
## 29         West Monroe           LA          71291                       
## 30         West Monroe           LA     71291-8512 318-396-8848         W
## 31              Monroe           LA     71203-2740 318-388-0883         B
## 32              Monroe           LA          71201 318-791-3427         B
## 33         West Monroe           LA     71291-2519 318-323-5210         B
## 34              Monroe           LA          71202 318-388-0883         B
## 35                                                                       
## 36          Erwinville           LA     70729-3431 225-627-9993         B
## 37              Monroe           LA     71202-9681 318-325-6617         B
## 38            Rayville           LA     71269-7414 318-728-3084         W
## 39            Columbia           LA          71418 318-649-5444         B
## 40            Columbia           LA          71418 318-649-0340         W
## 41           St Joseph           LA     71366-6652 318-766-0306         W
## 42                                                                       
## 43             Creston           LA     71070-2739 318-875-2426         B
## 44           Coushatta           LA          71019 318-932-7091         B
## 45              Campti           LA     71411-4801 318-652-2895         B
## 46             Natchez           LA     71456-3570 318-352-6433         W
## 47                Many           LA          71449 318-256-3135         B
## 48              Lacamp           LA          71438                       
## 49          Alexandria           LA     71303-3410 318-442-7458         W
## 50          Alexandria           LA          71301 318-767-1114         W
## 51          Alexandria           LA     71301-3528 318-448-4036         B
## 52          Alexandria           LA     71302-6002 318-709-0635         B
## 53           Pineville           LA          71360 318-640-8029         W
## 54           Pineville           LA          71360                       
## 55         Baton Rouge           LA          70816 337-418-0535         O
## 56              Bunkie           LA          71322                       
## 57         Baton Rouge           LA     70812-2057 225-359-9586         B
## 58          Port Allen           LA          70767 225-749-3504         W
## 59            DeRidder           LA          70634 337-842-0330         B
## 60           Leesville           LA     71446-3074 337-238-2936         B
## 61           Lafayette           LA     70508-1726 337-298-5835         W
## 62                                                                       
## 63             Oakdale           LA     71463-3311 318-306-0714         W
## 64             Oakdale           LA     71463-3163 318-335-1333         W
## 65             Sulphur           LA          70663                       
## 66             Sulphur           LA          70663                       
## 67        Lake Charles           LA          70602 337-540-5403         B
## 68        Lake Charles           LA     70601-4836 337-377-5110         B
## 69        Lake Charles           LA          70611                       
## 70        Lake Charles           LA     70611-5109 337-217-3663         B
## 71        Lake Charles           LA     70605-4032 337-474-8259         B
## 72        Lake Charles           LA     70605-5264 337-405-8859         B
## 73            Jennings           LA          70546                       
## 74            Jennings           LA          70546                       
## 75        Ville Platte           LA          70586 337-831-0831         B
## 76        Ville Platte           LA          70586 337-363-4310         W
## 77            Carencro           LA     70520-3518 337-288-9098         O
## 78             Cankton           LA          70584 337-668-4097         H
## 79              Sunset           LA     70584-5611 337-668-4696         B
## 80           Opelousas           LA     70570-2481 337-351-0125         W
## 81                                                                       
## 82              Eunice           LA          70535 337-457-4513         B
## 83               Rayne           LA          70578 337-334-4799         B
## 84             Crowley           LA          70526 337-783-8094         B
## 85           Lafayette           LA     70508-5195 337-837-2160         W
## 86           Lafayette           LA     70508-6741 337-257-2515         W
## 87           Lafayette           LA     70501-1396 337-255-5151         B
## 88           Lafayette           LA     70501-2308 337-232-4268         B
## 89           Lafayette           LA     70506-5534 337-288-4396         W
## 90           Lafayette           LA          70505 337-266-2344         W
## 91             Cecilia           LA          70521 225-933-6373         W
## 92       Breaux Bridge           LA     70517-7764 337-442-1372         W
## 93           Abbeville           LA     70510-3644 337-893-0762         W
## 94           Abbeville           LA     70510-7063 337-893-5145         B
## 95                                                                       
## 96          New Iberia           LA     70562-3410 337-367-7785         W
## 97       Jeanerette La           LA     70544-5104 337-241-9052         B
## 98           Abbeville           LA     70510-3009 337-893-2766         B
## 99            Franklin           LA     70538-3305 337-578-3137         B
## 100           Franklin           LA          70538 337-907-6644         B
## 101        Morgan City           LA     70380-1511 985-384-1443         W
## 102               Gray           LA     70359-3711 985-872-3237         B
## 103              Houma           LA     70363-7719 985-876-5328         B
## 104              Houma           LA     70361-4091 504-329-6835         B
## 105              Houma           LA     70360-4147 985-853-2079         B
## 106              Houma           LA     70363-3813 985-637-3401         W
## 107             Larose           LA          70373                       
## 108             Larose           LA          70373                       
## 109           Raceland           LA     70394-2711 985-537-6818         W
## 110          Thibodaux           LA     70301-4858 985-492-0090         W
## 111            LaPlace           LA     70068-5216 985-652-9840         W
## 112          Destrehan           LA     70047-5067 985-764-7275         W
## 113            LaPlace           LA     70068-4923 225-892-2828         B
## 114            LaPlace           LA     70068-1617 504-487-9904         B
## 115                                                                      
## 116     Donaldsonville           LA          70346                       
## 117                                                                      
## 118            Geismar           LA          70734                       
## 119        Pierre Part           LA     70339-4524 985-513-0990         W
## 120         Plaquemine           LA          70765 225-687-2644         W
## 121        Baton Rouge           LA     70802-1931 225-356-5252         B
## 122        Baton Rouge           LA     70806-1913 225-388-9122         B
## 123                                                                      
## 124            Jackson           LA     70748-5106 225-301-7752         W
## 125              Baker           LA     70714-4630 225-774-1558         B
## 126              Baker           LA     70714-2804 225-803-3010         B
## 127            Zachary           LA     70791-6512 225-654-8040         B
## 128            Zachary           LA     70791-6512 225-654-8040         B
## 129  Greenwell Springs           LA     70739-4420 225-261-9363         B
## 130            Central           LA     70739-4754 225-281-2857         B
## 131        Baton Rouge           LA     70817-5354 225-344-9381         W
## 132        Baton Rouge           LA          70810 225-610-9976         W
## 133        Baton Rouge           LA     70820-4402 225-766-8452         B
## 134        Baton Rouge           LA          70821 225-346-5400         B
## 135        Baton Rouge           LA     70809-2875 225-771-8376         B
## 136        Baton Rouge           LA     70809-7412 225-205-3448         W
## 137        Baton Rouge           LA     70806-7703 225-928-9135         W
## 138        Baton Rouge           LA     70817-2851 225-993-1802         W
## 139        Baton Rouge           LA     70808-6834 225-389-6711         W
## 140        Baton Rouge           LA     70808-6070 225-346-8716         B
## 141     Denham Springs           LA     70726-9101 225-243-6653         W
## 142     Denham Springs           LA     70726-5836 225-791-6657         W
## 143         Greensburg           LA          70441                       
## 144       Independence           LA          70443 985-878-6129         B
## 145                                                                      
## 146        Ponchatoula           LA     70454-6470 985-386-6676         W
## 147          Covington           LA     70435-6116 985-809-1006         W
## 148      Abita Springs           LA     70420-0609 985-893-9980         W
## 149        Franklinton           LA     70438-8026 985-848-5558         W
## 150        Franklinton           LA          70438 985-839-2788         W
## 151            Slidell           LA     70458-4138 985-643-9822         B
## 152            Slidell           LA          70459 985-641-4452         B
## 153                                                                      
## 154          Covington           LA     70433-3707 985-882-8025         W
## 155           Metairie           LA     70003-5854 504-232-6409         W
## 156                                                                      
## 157                                                                      
## 158                                                                      
## 159           Metairie           LA     70005-1650 504-430-2891         W
## 160           Metairie           LA     70002-5052 504-831-9576         W
## 161                                                                      
## 162            LaPlace           LA          70069 504-237-3532         W
## 163                                                                      
## 164           Metairie           LA     70003-2346 504-885-8610         W
## 165            Marrero           LA     70072-4511 504-341-4029         B
## 166            Marrero           LA     70072-4404 504-348-8954         B
## 167            Marrero           LA     70072-3744 504-329-4641         W
## 168            Marrero           LA     70072-5817 504-799-8411         W
## 169                                                                      
## 170             Gretna           LA     70053-3346 504-367-0465         B
## 171                                                                      
## 172            Hammond           LA     70401-2230 985-542-1436         W
## 173            Marrero           LA     70072-2504 504-875-8017         W
## 174             Harvey           LA     70058-2237 504-341-6423         B
## 175           Gonzales           LA          70737                       
## 176           Gonzales           LA          70707 225-647-7000         W
## 177         Mandeville           LA     70448-4829 985-789-2707         W
## 178                                                                      
## 179            Slidell           LA     70460-4524 985-863-5089         B
## 180        Pearl River           LA     70452-3334 985-863-3212         B
## 181        New Orleans           LA          70175 504-899-2193         B
## 182        New Orleans           LA     70115-5353 504-416-5499         B
## 183             Kenner           LA     70064-0211 504-343-1488         B
## 184           Metairie           LA     70003-6751 504-712-1632         B
## 185        New Orleans           LA     70113-1094 504-309-3538         B
## 186        New Orleans           LA     70119-2630 504-343-5009         B
## 187        New Orleans           LA     70119-5943 504-259-4525         W
## 188        New Orleans           LA     70119-4527 504-338-3823         B
## 189       Independence           LA     70443-3211 985-878-8099         B
## 190             Walker           LA     70785-2603 225-937-2826         W
## 191         New Iberia           LA     70560-4285 337-380-9039         B
## 192         New Iberia           LA     70560-4281 337-577-3448         B
## 193        New Orleans           LA     70122-2515 504-282-7812         B
## 194        New Orleans           LA     70122-2515 504-282-7812         B
## 195        New Orleans           LA     70118-2965 504-460-4720         B
## 196        New Orleans           LA     70118-1130 504-296-5291         W
## 197        New Orleans           LA          70177 504-945-1917         B
## 198        New Orleans           LA     70126-3032 504-240-4004         B
## 199        New Orleans           LA     70128-2306 504-508-5844         B
## 200        New Orleans           LA          70187 504-453-6036         B
## 201        Baton Rouge           LA     70814-7021 225-312-3238         B
## 202        Baton Rouge           LA     70806-4626 225-445-4240         B
## 203        New Orleans           LA     70131-8601 504-715-8447         B
## 204     New Orleans LA           LA     70131-5523 504-391-9641         B
## 205        New Orleans           LA     70129-2901 504-253-1364         B
## 206         St Bernard           LA          70085 504-451-4946         W
## 207            Lacombe           LA     70445-1132 985-290-0109         B
## 208         Mandeville           LA     70448-8479 985-626-7578         H
## 209        New Orleans           LA     70131-8403 504-239-0932         B
## 210        New Orleans           LA     70131-8610 504-296-3691         B
## 211                                                                      
## 212         Shreveport           LA     71107-9619 318-349-9794         W
## 213         Shreveport           LA     71104-4335 318-221-3221         W
## 214                                                                      
## 215         Shreveport           LA     71107-8417 318-227-2719         W
## 216         Shreveport           LA     71119-3504 318-458-1410         W
## 217         Shreveport           LA     71118-3910 318-688-0742         W
## 218         Shreveport           LA     71106-7678 318-426-0223         W
## 219         Shreveport           LA     71115-3647 318-524-0054         W
## 220         Shreveport           LA     71106-7721 318-797-5889         W
## 221         Shreveport           LA     71105-5007 318-797-4761         W
## 222         Shreveport           LA     71104-4429 318-868-0225         W
## 223         Shreveport           LA          71118 318-423-3668         W
## 224         Shreveport           LA     71105-4829 318-868-1212         W
## 225         Shreveport           LA     71118-4546 318-688-6800         W
## 226          Mansfield           LA     71052-5339 318-872-4707         W
## 227       Bossier City           LA     71112-4359 318-746-0672         W
## 228       Bossier City           LA     71111-2278 318-741-1572         W
## 229             Benton           LA          71006 318-965-4500         W
## 230                                                                      
## 231           Haughton           LA     71037-8002 318-669-0166         W
## 232           Haughton           LA     71037-9394 318-949-4517         W
## 233         Springhill           LA     71075-2025 318-539-4116         W
## 234             Minden           LA     71055-8987 318-371-1802         W
## 235        Haynesville           LA     71038-5225 318-624-0122         W
## 236             Ruston           LA     71270-3424 318-255-1259         W
## 237             Dubach           LA          71235 318-245-2117         W
## 238        Farmerville           LA          71241                       
## 239            Chatham           LA          71226                       
## 240          Jonesboro           LA     71251-3512 318-259-6677         W
## 241          Kilbourne           LA          71253 318-428-7055         W
## 242             Monroe           LA     71203-9624 318-343-4883         W
## 243             Monroe           LA     71203-8941 318-387-9577         W
## 244        West Monroe           LA     71291-5250 318-324-8328         W
## 245        West Monroe           LA     71291-8540 318-322-8442         W
## 246        West Monroe           LA     71292-2645 318-398-0919         W
## 247             Monroe           LA          71201 318-388-2020         W
## 248             Monroe           LA     71201-3111 318-387-7728         W
## 249             Monroe           LA     71201-1941 318-323-3838         W
## 250                                                                      
## 251                                                                      
## 252           Ventress           LA     70783-3704 225-618-0670         W
## 253             Monroe           LA          71203 318-791-5018          
## 254            Mangham           LA     71259-5510 318-248-2272         W
## 255           Columbia           LA          71418 318-649-2457         W
## 256              Delhi           LA          71232 318-488-0857         W
## 257           Ferriday           LA     71334-2042 318-757-3606         W
## 258          Newellton           LA          71357 318-331-1738         W
## 259            Pollock           LA     71467-3823 318-640-9791         W
## 260               Jena           LA          71342 318-992-2033         W
## 261       Natchitoches           LA     71457-6313 318-352-6421         W
## 262       Natchitoches           LA     71457-5235 318-357-1183         W
## 263            Florien           LA          71429 318-315-1642         W
## 264               Many           LA          71449 318-256-5101         W
## 265         Alexandria           LA     71303-2828 318-442-1016         W
## 266         Alexandria           LA     71303-2382 318-443-2423         W
## 267                                                                      
## 268         Alexandria           LA          71301 318-542-3336         W
## 269          Dry Prong           LA     71423-8723 318-640-3811         W
## 270          Pineville           LA          71360 318-443-3823         W
## 271        Forest Hill           LA          71430 318-748-6990         W
## 272             Bunkie           LA          71322 318-346-7004         W
## 273                                                                      
## 274           DeRidder           LA     70634-3428 337-463-9558         W
## 275          Leesville           LA     71496-1311 337-238-0361         W
## 276          Lafayette           LA     70503-4746 337-981-1749         W
## 277          Lafayette           LA          70503 337-232-1438         W
## 278              Scott           LA     70583-5666 337-278-0761         W
## 279           DeRidder           LA          70634 337-375-3382         W
## 280            Oakdale           LA     71463-0543 318-335-3121         W
## 281            Sulphur           LA     70663-6524 337-625-7567         W
## 282             Vinton           LA          70668                       
## 283       Lake Charles           LA     70607-7544 337-263-0860         W
## 284       Lake Charles           LA     70601-8331 337-526-4728         W
## 285          Longville           LA          70652 337-725-3545         W
## 286       Lake Charles           AK          70605                       
## 287       Lake Charles           LA     70605-6540 337-377-8776         W
## 288            Sulphur           LA     70665-8716 337-558-5895          
## 289               Iowa           LA          70647 337-582-2025         W
## 290           Jennings           LA     70546-4739 337-824-6129         W
## 291       Ville Platte           LA          70586 337-363-6878         W
## 292       Ville Platte           LA     70586-6728 337-363-5317         W
## 293           Carencro           LA     70520-5375 337-349-0466         W
## 294              Scott           LA     70583-4622 337-235-0377         W
## 295          Opelousas           LA     70570-5110 337-948-4222         W
## 296              Rayne           LA          70578 337-788-0160         W
## 297             Eunice           LA     70535-4410 337-546-0494         W
## 298              Duson           LA          70529 337-873-6243         W
## 299            Crowley           LA          70526 337-783-3586         W
## 300        Youngsville           LA     70592-6309 337-856-8059         W
## 301          Lafayette           LA     70598-1025 337-254-1635         W
## 302          Lafayette           LA     70508-6427 337-988-1031         W
## 303          Lafayette           LA     70508-7046 337-984-6171         W
## 304          Lafayette           LA          70502 337-315-0366         B
## 305          Lafayette           LA     70503-2538 337-233-3268         W
## 306                                                                      
## 307          Lafayette           LA     70506-2109 337-224-7884         W
## 308     St Martinville           LA     70582-3617 337-394-4218         W
## 309      Breaux Bridge           LA     70517-4708 337-849-8440         W
## 310       Lake Charles           LA          70607 337-598-3107         W
## 311          Abbeville           LA     70510-2119 337-893-2702         W
## 312         New Iberia           LA          70563 985-465-0646         W
## 313         New Iberia           LA          70560 337-365-4202         W
## 314         Jeanerette           LA     70544-3440 337-579-4568         W
## 315              Erath           LA          70533                       
## 316          Patterson           LA          70392 985-397-1822         W
## 317           Franklin           LA     70538-6307 337-828-0557         W
## 318        Morgan City           LA     70380-1119 985-519-6110         W
## 319                                                                      
## 320               Gray           LA     70359-3114 985-876-2141         W
## 321              Houma           LA     70360-7286 985-223-4725         W
## 322              Bourg           LA     70343-5203 985-594-7806         W
## 323              Houma           LA     70364-3142 985-851-0132         W
## 324            Cut Off           LA          70345 985-258-7975         W
## 325          Thibodaux           LA     70301-6440 985-227-1383         W
## 326          Thibodaux           LA     70301-6038 985-446-5364         W
## 327             Luling           LA     70070-4293 504-908-5432         W
## 328          Destrehan           LA     70047-2013 985-764-1607         W
## 329          Garyville           LA          70051 985-652-6261         W
## 330            LaPlace           LA     70068-3518 225-772-2047         W
## 331           Sunshine           LA     70780-3100 225-642-3344         W
## 332           Gonzales           LA     70737-8435 225-675-8002         W
## 333       Prairieville           LA     70769-5355 225-622-6261         W
## 334            Geismar           LA     70734-3000 225-673-6973         W
## 335       White Castle           LA          70788 225-545-2715         W
## 336        Baton Rouge           LA     70806-1844 225-926-7534         W
## 337          Slaughter           LA          70777 225-658-2987         W
## 338    St Francisville           LA          70748 225-634-1440         W
## 339        Baton Rouge           LA          70874 225-355-8856         B
## 340     Denham Springs           LA     70706-0870 225-664-5066         W
## 341     Denham Springs           LA     70706-1935 225-791-2199         W
## 342              Baker           LA     70714-6140 225-933-2568         W
## 343        Baton Rouge           LA          70816 225-752-1071         W
## 344  Greenwell Springs           LA     70739-4145 225-448-3622         W
## 345  Greenwell Springs           LA     70739-4974 225-773-6371         W
## 346        Baton Rouge           LA     70816-6411 225-292-5943         W
## 347        Baton Rouge           LA     70815-4878 225-924-4098         W
## 348        Baton Rouge           LA     70815-4342 225-926-2373         W
## 349        Baton Rouge           LA          70802 225-344-2374          
## 350        Baton Rouge           LA     70808-2047 225-336-9942         W
## 351        Baton Rouge           LA     70808-3843 225-341-1776         W
## 352        Baton Rouge           LA     70810-4343 225-763-9749         W
## 353        Baton Rouge           LA     70806-8522 225-921-6331         W
## 354        Baton Rouge           LA     70816-4610 225-229-9693         W
## 355        Baton Rouge           LA     70816-6314 225-803-2062         W
## 356        Baton Rouge           LA     70817-3651 225-810-3689         W
## 357        Baton Rouge           LA     70808-4833 225-571-9800         W
## 358        Baton Rouge           LA     70810-4754 225-753-3548         W
## 359        Baton Rouge           LA          70810 225-978-1455         W
## 360        Baton Rouge           LA     70817-7620 225-276-5514         W
## 361     Denham Springs           LA     70726-3508 225-271-8818         W
## 362     Denham Springs           LA          70726 225-978-4823         W
## 363         Livingston           LA     70754-1900 225-686-7405         W
## 364              Amite           LA          70422 985-748-3016         W
## 365            Norwood           LA          70761 225-629-8887         B
## 366        Ponchatoula           LA     70454-3406 985-386-0188         W
## 367            Hammond           LA     70403-5222 985-340-1478         W
## 368                                                                      
## 369      Abita Springs           LA          70420 985-893-2238         W
## 370          Covington           LA          70434 985-898-0031         W
## 371        Franklinton           LA     70438-3402 985-839-3508         W
## 372           Bogalusa           LA     70427-2138 985-732-2366         W
## 373        Franklinton           LA     70438-8395 985-848-2705         W
## 374            Slidell           LA     70458-6013 504-421-0955         W
## 375            Slidell           LA     70461-3007 225-933-3392         W
## 376            Slidell           LA     70461-5007 985-290-0709         W
## 377        Pearl River           LA     70452-3712 985-788-9772         W
## 378          Covington           LA     70433-1106 985-809-7356         W
## 379          Covington           LA     70433-5405 985-327-5343         W
## 380           Loranger           LA     70446-1742 985-345-4562         W
## 381          Covington           LA     70433-7136 985-893-9930         W
## 382             Kenner           LA          70062                       
## 383           Metairie           LA     70003-5025 504-432-7067         W
## 384        River Ridge           LA     70123-1929 504-737-2732         W
## 385            Harahan           LA     70123-3004 504-957-6225         W
## 386             Kenner           LA     70065-6614 504-287-4322         W
## 387             Kenner           LA     70065-1999 504-467-7402         W
## 388             Kenner           LA     70065-2345 504-450-5452         W
## 389           Metairie           LA     70003-1225 504-455-9864         W
## 390           Metairie           LA     70006-2854 504-885-6382         W
## 391           Metairie           LA     70002-5752 504-780-1788         W
## 392           Metairie           LA     70001-3441 504-454-6178         W
## 393           Metairie           LA     70002-1340 504-887-8992         W
## 394           Metairie           LA     70005-2002 504-830-4505         W
## 395            Metarie           LA     70055-5896 504-341-5631         W
## 396           Metairie           LA     70005-4401 504-832-0608         W
## 397           Metairie           LA          70003 504-460-7241         W
## 398           Metairie           LA     70001-5601 504-975-4601         W
## 399          Jefferson           LA     70121-1570 504-453-1598         W
## 400           Waggaman           LA     70094-2339 504-431-4271         W
## 401             Kenner           LA     70065-3223 504-889-0794         W
## 402             Harvey           LA     70058-2444 504-615-0373         W
## 403            Marrero           LA     70072-5376 504-460-6660         W
## 404             Gretna           LA     70053-4838 504-366-2632         W
## 405             Harvey           LA     70058-3018 504-368-4292         W
## 406          Terrytown           LA     70056-3025 504-251-9888         B
## 407                                                                      
## 408                                                                      
## 409     Denham Springs           LA     70726-7224 225-664-9109         W
## 410             Walker           LA     70785-6414 225-664-4169         W
## 411                                                                      
## 412                                                                      
## 413         Mandeville           LA          70470 985-727-1107         W
## 414         Mandeville           LA     70471-1856 985-845-4975         W
## 415         Mandeville           LA     70471-7456 985-727-4536         W
## 416            Lacombe           LA     70445-3668 985-882-6861         W
## 417         Mandeville           LA     70448-6273 985-674-9498         W
## 418            Slidell           LA          70458                       
## 419            Slidell           LA     70460-2449 225-505-5111         W
## 420        Pearl River           LA     70452-5435 985-788-7783         W
## 421            Slidell           LA     70458-1738 985-264-2046         W
## 422        New Orleans           LA     70115-3013 504-895-0488         W
## 423             Kenner           LA     70065-4626 504-884-6918         W
## 424             Kenner           LA     70062-5157 504-469-5111         W
## 425        New Orleans           LA     70130-3400 504-616-6318         W
## 426        New Orleans           LA          70130 504-915-2807         W
## 427        New Orleans           LA          70119 504-858-3137         W
## 428                                                                      
## 429        New Orleans           LA     70118-5537 504-621-3283         W
## 430        New Orleans           LA     70116-2709 504-523-7047         W
## 431        New Orleans           LA     70126-4622 504-343-3144         W
## 432        New Orleans           LA     70115-4243 504-908-7130         W
## 433        New Orleans           LA     70118-6307 504-582-4632         W
## 434        New Orleans           LA     70126-2540 504-243-9741         W
## 435                                                                      
## 436                                                                      
## 437        New Orleans           LA     70114-2359 504-729-8445         W
## 438        New Orleans           LA     70129-2646 504-367-5001         A
## 439              Arabi           LA          70032 504-259-4946         W
## 440                                                                      
## 441          Chalmette           LA          70044 504-258-4467         W
## 442       Belle Chasse           LA     70037-4314 504-656-0686         W
## 443            Lafitte           LA     70067-5312 504-583-3313         W
## 444        Baton Rouge           LA     70802-4436 225-389-1180         A
## 445        Baton Rouge           LA     70809-1348 225-663-8933         W
## 446         Mandeville           LA     70471-7443 985-626-9038         W
## 447           Tallulah           LA     71282-5500 318-574-4771         W
## 448       Madisonville           LA     70447-9788 985-930-9033         W
## 449          Covington           LA     70433-8734 225-922-1234         W
## 450           Metairie           LA     70006-1162 504-455-6503         W
## 451        New Orleans           LA          70130 504-589-2427         W
## 452           Metairie           LA     70005-3755 504-835-6993         W
## 453          Jefferson           LA          70183 504-831-3105         W
## 454        New Orleans           LA          70117 504-908-9403         B
## 455          Lafayette           LA          70598 337-261-0041         W
## 456             Minden           LA          71058 318-779-1261         W
## 457             Ruston           LA          71270 318-259-4587         W
## 458        Baton Rouge           LA          70898 225-387-2455         W
## 459    Nine Mile Point           LA          70094 504-436-3711         W
## 460         Shreveport           LA          71105 318-227-3710         W
## 461         Marksville           LA          71351 318-253-9735         W
## 462        West Monroe           LA          71291 318-361-2296         W
## 463             Walker           LA          70785 225-665-7238         W
## 464          Thibodaux           LA          70301 000-000-0000          
## 465        New Orleans           LA     70131-8616 504-393-0902         B
## 466        Baton Rouge           LA     70802-5349 225-383-4489         W
## 467        Baton Rouge           LA     70806-7932 225-202-1206          
## 468              Baker           LA          70714 225-774-1649         W
## 469        Baton Rouge           LA     70808-3317 225-439-4669         B
## 470              Houma           LA          70360 985-972-3522         W
## 471           Raceland           LA     70394-2044 985-532-2389         W
## 472          Thibodaux           LA          70302 985-447-2185         W
## 473              Bourg           LA     70343-5446 000-000-0000         W
## 474        Ponchatoula           LA          70454 985-386-6082         W
## 475         Mandeville           LA     70471-1249 985-624-3310         W
## 476        Ponchatoula           LA          70454 985-386-9713         W
## 477       Madisonville           LA     70447-9700 985-845-4442         W
## 478           Tallulah           LA     71284-0111 318-574-3994         B
## 479             Monroe           LA     71201-2326 318-325-0291         W
## 480             Monroe           LA          71201 318-322-2147         W
## 481       Bossier City           LA          71111 318-746-6649         W
## 482             Minden           LA     71055-3313 318-377-6289         W
## 483       Bossier City           LA     71112-2318 318-746-6382         W
## 484         Shreveport           LA          71101 318-227-3740         B
## 485         Shreveport           LA     71106-6140 318-226-6819         W
## 486         Shreveport           LA          71105                       
## 487         Shreveport           LA     71106-6031 318-868-0588         W
## 488               Many           LA          71449 318-256-4180         W
## 489               Jena           LA          71342 318-992-2663         W
## 490         Alexandria           LA          71303 318-487-8672         W
## 491       Lake Charles           LA     70607-3701 337-474-5123         B
## 492       Lake Charles           LA          70601 337-433-8861         W
## 493       Lake Charles           LA     70605-6756 337-564-0599         W
## 494       Ville Platte           LA          70586 337-363-5629         W
## 495          Lafayette           LA          70502 337-235-2196         B
## 496         New Iberia           LA     70563-8235 337-369-6938         W
## 497          Abbeville           LA          70510 337-893-0270          
## 498          Lafayette           LA     70503-3537 337-988-6202         W
## 499          Opelousas           LA          70570 337-942-4240         W
## 500        New Orleans           LA     70124-3608 504-256-3100         W
## 501        New Orleans           LA     70122-2231 504-412-6050         W
## 502        New Orleans           LA          70130 504-394-3876         B
## 503        New Orleans           LA          70119 504-915-5377         W
## 504        New Orleans           LA          70122 504-412-6000         B
## 505        New Orleans           LA          70151 504-412-6074         W
## 506        New Orleans           LA          70124 504-412-6068         B
## 507        New Orleans           LA     70125-4114 504-592-9213         W
## 508        New Orleans           LA     70115-5525 504-896-9909         B
## 509        New Orleans           LA          70139 504-525-4361         B
## 510       Belle Chasse           LA     70037-1601 504-393-8946         W
## 511          Chalmette           LA     70043-2600 504-271-2450         W
## 512             Kenner           LA          70062 504-464-0803         B
## 513           Metairie           LA     70001-5461 504-831-9070         W
## 514        River Ridge           LA     70123-2043 504-738-0857         W
## 515             Gretna           LA          70053 504-364-3916         W
## 516           Metairie           LA     70001-3072 504-415-5316         W
## 517           Metairie           LA     70005-4442 504-491-0508         W
## 518           Vacherie           LA     70090-4128 225-265-2734         W
## 519          Destrehan           LA          70047 985-764-6054         W
## 520           Metairie           LA          70055 504-650-0642         W
## 521      Breaux Bridge           LA     70517-7511 337-332-5236         W
## 522        New Orleans           LA     70119-2126 504-680-9693         B
## 523        Forest Hill           LA     71430-8707 318-748-6832         W
## 524       Bossier City           LA          71112 318-746-2078         W
## 525           Metairie           LA     70002-1456 504-304-7755         W
## 526        New Orleans           LA     70115-1417 347-578-4072         B
## 527      Breaux Bridge           LA     70517-4708 337-442-6650         W
## 528         Shreveport           LA     71118-3324 318-872-3993         W
## 529             Ruston           LA     71270-8507 318-255-2532          
## 530        Baton Rouge           LA     70809-1044 225-925-0451         W
## 531          Lafayette           LA     70508-9620 337-354-3697         W
## 532        Baton Rouge           LA          70821 225-993-7424         B
## 533        Pearl River           LA     70452-3712 985-788-7551         W
## 534       Plattenville           LA          70393 225-803-6302         B
## 535        New Orleans           LA     70122-5024 504-908-9403         B
## 536        New Orleans           LA     70122-1254 504-945-0042         B
## 537        New Orleans           LA     70113-1094 504-568-8346         B
## 538            Central           LA          70714 225-261-3903         W
## 539        New Orleans           LA     70131-8658 504-394-0131         W
## 540           Westwego           LA     70094-4541 504-347-3556         W
## 541           Metairie           LA     70055-5909 504-834-2900         W
## 542             Kenner           LA     70065-1108 504-464-9045         W
## 543          Covington           LA     70433-8501 985-727-7949         W
## 544           Bogalusa           LA     70427-7162 985-732-4062         W
## 545         Livingston           LA     70754-1900 225-686-7405         W
## 546        Baton Rouge           LA     70802-8167 225-342-9700         B
## 547        Baton Rouge           LA     70814-4604 225-275-7995         B
## 548        Baton Rouge           LA     70808-5903 225-757-0159         W
## 549         Maringouin           LA     70757-3906 225-776-2263         W
## 550           Gonzales           LA     70737-8438 225-647-1300         W
## 551              Montz           LA     70068-8970 985-287-0006         W
## 552              Houma           LA     70364-3128 985-232-9882         W
## 553         Jeanerette           LA     70544-8202 337-828-9107         W
## 554     St Martinville           LA     70582-6002 337-332-3475         W
## 555          Lafayette           LA     70508-7495 337-993-0603         W
## 556          Opelousas           LA     70570-7320 337-942-6328         B
## 557       Lake Charles           LA     70607-0734 337-477-7754         W
## 558             Kaplan           LA     70548-2448 337-643-2057         W
## 559            Sulphur           LA     70663-3701 337-625-4431         W
## 560       Ville Platte           LA     70586-4552 337-363-6211         W
## 561             Ruston           LA     71273-1117 318-251-5019         B
## 562          Leesville           LA          71446 337-397-7222         W
## 563       Natchitoches           LA     71457-2604 318-354-2879         W
## 564           Columbia           LA          71418 318-649-0977         W
## 565        West Monroe           LA     71291-4722 318-614-0336         W
## 566              Delhi           LA     71232-3503 318-878-5612         W
## 567             Monroe           LA     71201-4550 318-323-7591         W
## 568             Benton           LA     71006-4247 318-965-9513         W
## 569         Shreveport           LA     71106-2336 318-518-0812         W
## 570         Shreveport           LA     71118-4610 318-687-4820         W
## 571         Shreveport           LA          71103 318-227-1499         B
## 572            Belcher           LA          71004 318-995-6852         W
## 573         Shreveport           LA     71109-3008 318-635-4967         B
## 574         Shreveport           LA     71109-7647 318-635-2923         B
## 575         Shreveport           LA     71119-4015 318-518-7535         B
## 576         Shreveport           LA     71106-7721 318-221-3221         W
## 577         Shreveport           LA     71105-2908 318-865-5471         W
## 578            Gloster           LA     71030-3270 318-925-0949         W
## 579       Bossier City           LA     71111-5142 318-747-7466         W
## 580           Haughton           LA     71037-9207 318-949-9115         W
## 581           Dubberly           LA     71024-3916 318-377-7750         W
## 582            Arcadia           LA     71001-4441 318-263-8723         B
## 583             Ruston           LA     71273-0782 318-255-8368         W
## 584          Jonesboro           LA          71251 318-259-4535         W
## 585             Monroe           LA     71201-2432 318-237-3215         W
## 586        West Monroe           LA     71291-8105 318-396-2930         W
## 587             Monroe           LA     71203-2740 318-388-0883         B
## 588             Monroe           LA          71201 318-388-0883         B
## 589              Oscar           LA     70762-6510 225-718-1348         W
## 590           Rayville           LA     71269-5549 318-728-3421         W
## 591              Delhi           LA          71232 318-722-6408         W
## 592            Clayton           LA     71326-4018 318-757-6684         W
## 593             Colfax           LA     71417-5165 318-627-5256         W
## 594          Mansfield           LA          71052 318-871-5749         B
## 595           Hornbeck           LA          71439 318-565-4433         W
## 596         Alexandria           LA     71303-3780 318-229-5351         W
## 597         Alexandria           LA     71302-6002 318-709-0635         B
## 598               Ball           LA     71405-3370 318-229-1660         W
## 599         Marksville           LA     71351-2608 318-240-1949         W
## 600        Baton Rouge           LA     70812-2057 225-359-9586         B
## 601          Leesville           LA     71446-2992 337-239-7437         W
## 602          Lafayette           LA     70503-4248 337-235-0304         W
## 603          Dry Creek           LA     70637-5018 337-639-2341         W
## 604            Sulphur           LA     70663-6529 337-625-9046         W
## 605       Lake Charles           LA     70601-3748 337-439-2897         B
## 606       Lake Charles           LA     70611-3525 337-491-2315         W
## 607       Lake Charles           LA     70605-5973 337-474-5248         W
## 608           Jennings           LA     70546-3827 337-824-7210         W
## 609       Ville Platte           LA          70586 337-363-3149         W
## 610           Carencro           LA          70520 337-962-1076         W
## 611          Opelousas           LA     70570-3536 225-202-0424         B
## 612             Eunice           LA     70535-7930 337-457-4054         W
## 613              Scott           LA     70583-4115 337-873-3569         W
## 614          Lafayette           LA     70508-7017 337-319-3162         W
## 615          Lafayette           LA     70507-4950 337-298-1192         B
## 616          Lafayette           LA     70506-5438 337-989-2984         W
## 617     St Martinville           LA          70582 337-845-5126         W
## 618            Gueydan           LA     70542-3223 337-536-9984         W
## 619         New Iberia           LA     70563-2221 337-369-3995         W
## 620         Jeanerette           LA     70544-3440 337-579-4568         W
## 621           Franklin           LA     70538-3836 337-828-1530         W
## 622      Napoleonville           LA     70390-2507 985-526-8434         W
## 623              Houma           LA     70360-6078 985-873-3154         W
## 624              Houma           LA     70364-3142 985-851-0132         W
## 625             Larose           LA     70373-5484 985-693-3826         W
## 626          Thibodaux           LA     70301-8085 985-258-6333         W
## 627          Destrehan           LA     70047-5049 985-764-9991         W
## 628            LaPlace           LA     70068-1617 504-487-9904         B
## 629           Gonzales           LA     70737-3715 225-647-4705         B
## 630       Prairieville           LA     70769-3255 225-715-4974         W
## 631        Pierre Part           LA     70339-4524 985-513-0990         W
## 632        Baton Rouge           LA          70806 225-388-9122         B
## 633    St Francisville           LA          70775 225-721-7949         W
## 634        Baton Rouge           LA     70807-2542 225-337-9943         B
## 635     Denham Springs           LA     70706-1935 225-791-2199         W
## 636        Baton Rouge           LA          70837 225-262-9350         W
## 637        Baton Rouge           LA     70816-4346 225-927-9455         W
## 638        Baton Rouge           LA     70820-4402 225-766-8452         B
## 639        Baton Rouge           LA     70809-1126 225-924-0735         W
## 640        Baton Rouge           LA     70809-1939 225-445-7798         W
## 641        Baton Rouge           LA     70808-5417 225-382-3264         W
## 642     Denham Springs           LA     70726-5600 225-664-4068         W
## 643           Roseland           LA          70456 985-747-0333         W
## 644        Ponchatoula           LA     70454-6375 985-386-3973         W
## 645      Abita Springs           LA     70420-0038 985-893-2238         W
## 646        Franklinton           LA     70438-8026 985-848-5558         W
## 647            Slidell           LA     70461-3003 985-649-1841         W
## 648          Covington           LA     70433-2405 985-373-4873         W
## 649        River Ridge           LA     70123-2018 504-737-9598         W
## 650             Kenner           LA     70065-2014 504-250-8113         W
## 651           Metairie           LA     70001-2347 504-887-1811         W
## 652           Sorrento           LA          70778 225-675-3600         W
## 653          Jefferson           LA     70121-3408 504-342-2358         W
## 654           Westwego           LA     70094-3611 504-340-3154         W
## 655             Harvey           LA     70058-2623 504-347-6157         W
## 656          Terrytown           LA     70056-3047 504-884-0555         W
## 657            Hammond           LA     70401-2418 985-542-8688         W
## 658             Harvey           LA     70058-2206 504-382-4435         B
## 659           Gonzales           LA     70737-5437 225-266-1883         W
## 660         Mandeville           LA     70448-6008 985-373-3939         W
## 661            Slidell           LA     70458-1321 985-641-8208         W
## 662        New Orleans           LA          70130 504-884-8444         W
## 663             Kenner           LA     70065-4626 504-443-6182         W
## 664        New Orleans           LA     70113-3901 504-251-8487         W
## 665        New Orleans           LA          70124 504-355-0348         W
## 666             Albany           LA          70711 225-567-9060         W
## 667          Lafayette           LA     70501-4637 337-235-5440         B
## 668        New Orleans           LA     70122-4916 504-286-1033         B
## 669        New Orleans           LA          70130 504-897-5449         W
## 670        New Orleans           LA     70126-3032 504-242-4198         B
## 671        New Orleans           LA          70128 504-243-7783         B
## 672        Baton Rouge           LA     70814-4626 225-445-4240         B
## 673        New Orleans           LA     70131-3841 504-361-6600         W
## 674             Meraux           LA     70075-2585 504-279-1124         W
## 675         Mandeville           LA     70471-8507 985-626-0502         W
## 676       Port Sulphur           LA          70083 504-564-0100         W
## 677         Shreveport           LA     71119-6219 318-631-6038         B
## 678         Shreveport           LA          71133 318-226-6812         B
## 679         Shreveport           LA     71109-3014 318-636-1700         B
## 680         Shreveport           LA     71108-3020 318-226-0826         B
## 681         Shreveport           LA          71106 318-868-0818         W
## 682                                                                      
## 683         Shreveport           LA     71106-1608 318-464-7773         W
## 684         Shreveport           LA     71118-2922 318-686-3086         W
## 685         Shreveport           LA          71101 318-226-6810         W
## 686         Shreveport           LA     71106-8385 318-212-0626         W
## 687         Shreveport           LA          71101 318-677-5340         W
## 688              Homer           LA          71040 318-927-2161         W
## 689          Jonesboro           LA          71251 318-259-3442         W
## 690            Arcadia           LA          71001 318-263-9408         W
## 691             Ruston           LA          71270 318-255-4691         W
## 692             Ruston           LA          71270 318-255-4763         W
## 693        Farmerville           LA          71241 318-368-2027         W
## 694             Monroe           LA          71203 318-361-2253         B
## 695             Monroe           LA          71203 318-345-1104         B
## 696             Monroe           LA          71210 318-361-2298         B
## 697             Monroe           LA          71202 318-361-0341         B
## 698             Monroe           LA          71201 318-388-2103         W
## 699             Monroe           LA          71201 318-323-5308         W
## 700        West Monroe           LA          71291 318-361-2286         W
## 701        West Monroe           LA          71291 318-397-2403         W
## 702             Monroe           LA     71201-1947 318-325-4878         W
## 703             Monroe           LA          71203 318-343-9252         W
## 704          Mer Rouge           LA          71261 318-647-9909         W
## 705           Rayville           LA          71269 318-728-2395         W
## 706             Baskin           LA          71219 318-248-2795         W
## 707          Winnsboro           LA          71295 318-435-7111         W
## 708           Tallulah           LA          71282 318-574-2577         W
## 709          St Joseph           LA          71366 318-766-3360         W
## 710         Jonesville           LA          71343 318-339-6481         W
## 711       Harrisonburg           LA          71340 318-744-5414         W
## 712          Winnfield           LA          71483 318-628-4079         W
## 713          Woodworth           LA          71485 318-473-8616         B
## 714         Alexandria           LA          71309 318-443-6893         B
## 715          Pineville           LA          71360 318-640-9762         W
## 716         Alexandria           LA          71301 318-443-8425         W
## 717         Alexandria           LA          71303 318-442-1341          
## 718         Alexandria           LA          71303 318-442-3912         W
## 719         Alexandria           LA          71309 318-443-6893         W
## 720       Natchitoches           LA          71457 318-357-8698         W
## 721            Melrose           LA          71452 318-379-0178         W
## 722               Many           LA          71449 318-256-0966         W
## 723            Hessmer           LA          71341 318-253-9418         W
## 724         Marksville           LA          71351 318-253-8953         W
## 725       Ville Platte           LA          70586 337-363-5516         W
## 726              Mamou           LA          70554 337-363-5608         W
## 727       Lake Charles           LA          70602 337-480-1331         W
## 728       Lake Charles           LA          70601 337-436-6227         B
## 729       Lake Charles           LA          70611 337-855-3633         B
## 730       Lake Charles           LA          70605 337-479-2215         W
## 731       Lake Charles           LA          70601 337-437-3363         W
## 732       Lake Charles           LA          70605 337-477-3349         W
## 733       Lake Charles           LA          70605 337-474-4972         W
## 734       Lake Charles           LA          70665 337-583-4118         W
## 735            Sulphur           LA          70663 337-625-4504         W
## 736          Lafayette           LA          70508 337-412-6009         B
## 737           Carencro           LA          70520 337-896-6083         B
## 738           Carencro           LA          70520 337-896-8872         W
## 739          Lafayette           LA          70502 337-269-5729         W
## 740          Lafayette           LA          70503 337-269-5722         W
## 741          Broussard           LA          70518 337-837-8943         W
## 742          Lafayette           LA          70503 337-981-4048         W
## 743          Lafayette           LA          70501 337-264-9000         W
## 744            Crowley           LA          70526 337-788-2435         W
## 745            Crowley           LA          70526 337-788-8814         W
## 746               Iota           LA          70543 337-250-0550         W
## 747          Abbeville           LA          70510 337-893-3423         W
## 748          Abbeville           LA          70510 337-893-1781          
## 749         New Iberia           LA          70563 337-365-4966         B
## 750         New Iberia           LA          70562 337-365-7323         B
## 751         New Iberia           LA          70562 337-364-7376         W
## 752     St Martinville           LA          70582 337-394-4523         W
## 753           Franklin           LA     70538-6205 337-828-5723         W
## 754           Franklin           LA          70538 337-828-0574         W
## 755         New Iberia           LA          70563 337-367-8923         W
## 756        Morgan City           LA          70380 985-385-3412         W
## 757          Thibodaux           LA          70302 985-447-3780         W
## 758          Thibodaux           LA          70301 985-447-4843         W
## 759          Thibodaux           LA          70301 985-448-0897         W
## 760           Lockport           LA          70374 985-532-2233         W
## 761          Thibodaux           LA          70301 985-446-1694         W
## 762         Plaquemine           LA          70764 225-687-5230         B
## 763         Plaquemine           LA          70764 225-687-7070         W
## 764         Port Allen           LA          70767 225-627-3918         W
## 765           Ventress           LA          70783 225-638-5630         W
## 766        Baton Rouge           LA          70802 225-278-5972         B
## 767        Baton Rouge           LA          70801 225-389-5012         B
## 768        Baton Rouge           LA          70896 225-389-3025         B
## 769        Baton Rouge           LA          70816 225-389-4755         B
## 770        Baton Rouge           LA          70802 225-343-5377         B
## 771            Zachary           LA          70791 225-389-4706         W
## 772  Greenwell Springs           LA          70739 225-262-0970         W
## 773        Baton Rouge           LA          70810 225-769-0213         W
## 774        Baton Rouge           LA          70802 225-389-4787         W
## 775            Zachary           LA          70791 225-658-4888         W
## 776        Baton Rouge           LA          70809 225-926-1553         W
## 777        Baton Rouge           LA          70801 225-389-4714         W
## 778        Baton Rouge           LA          70821 225-389-4728         W
## 779        Baton Rouge           LA          70810 225-754-1068         W
## 780        Baton Rouge           LA          70808 225-389-4734         W
## 781             Wilson           LA          70789 225-629-4724         W
## 782            Clinton           LA          70722                      W
## 783     Denham Springs           LA          70706 225-665-6039         W
## 784         Livingston           LA          70754 225-791-3753         W
## 785             Watson           LA          70786 225-665-1562         W
## 786     Denham Springs           LA          70726 225-667-4870         W
## 787              Amite           LA          70422 985-748-8439         W
## 788             Albany           LA          70711 225-567-1037         W
## 789                                                                      
## 790             Walker           LA          70785 225-665-8265         W
## 791            Hammond           LA          70401 985-542-6621         W
## 792             Folsom           LA          70437 985-796-9081         W
## 793          Covington           LA          70433 985-892-7211         W
## 794            Slidell           LA          70459 985-641-4688         W
## 795          Covington           LA          70433 985-809-5324         W
## 796        Franklinton           LA          70438 985-839-2145         W
## 797          Covington           LA          70435 985-809-5330         W
## 798           Bogalusa           LA          70427                       
## 799          Covington           LA          70433 985-809-5340         W
## 800          Covington           LA          70433 985-893-5003          
## 801        Franklinton           LA          70438 985-839-3493         W
## 802            Slidell           LA          70461 985-893-7550         W
## 803          Covington           LA          70433 985-249-6008         W
## 804           Gonzales           LA          70737 225-621-8500         B
## 805           St Amant           LA          70774 225-621-8514         W
## 806            Paulina           LA          70763 225-869-4064         W
## 807           Gonzales           LA          70737 225-621-8500         W
## 808           Gonzales           LA     70737-3004 225-647-8063         W
## 809        Crown Point           LA          70072 504-689-2114         W
## 810            Marrero           LA          70072 504-347-4993         W
## 811           Metairie           LA     70002-1515 504-362-3692         W
## 812             Gretna           LA          70054                       
## 813           Metairie           LA     70003-7628 504-836-6500         W
## 814           Metairie           LA     70003-1137 504-421-1369         W
## 815           Metairie           LA          70001 504-831-0890         W
## 816           Metairie           LA          70404 504-834-5444         W
## 817             Kenner           LA          70065 504-466-1331         W
## 818           Metairie           LA          70003 504-237-3903         W
## 819           Metairie           LA          70003 504-456-6485         B
## 820             Gretna           LA          70054 504-361-8596         B
## 821             Gretna           LA     70053-4941 504-304-6648         W
## 822             Gretna           LA          70053                      W
## 823           Metairie           LA          70001 504-835-3933         W
## 824             Gretna           LA          70056 504-362-0772         W
## 825       Belle Chasse           LA          70037 504-656-2495         W
## 826       Belle Chasse           LA     70037-1659 504-684-6059         W
## 827       Bossier City           LA          71111 318-752-5770         W
## 828             Benton           LA          71006 318-965-9659         W
## 829       Bossier City           LA          71111 318-752-4470         W
## 830       Bossier City           LA          71111 318-965-2217         W
## 831             Benton           LA     71006-8442 318-469-0215         W
## 832       Bossier City           LA          71111 318-747-1946         W
## 833         Washington           LA          70589 337-826-7104         B
## 834          Opelousas           LA          70571 337-948-0588         W
## 835          Opelousas           LA          70570 337-942-8647         W
## 836             Eunice           LA          70535 337-948-0586         W
## 837               Jena           LA          71342 318-992-1950         W
## 838          Destrehan           LA          70047 985-764-8031         W
## 839             Luling           LA          70070 985-783-6789         W
## 840             Luling           LA     70070-5106 985-785-6468         W
## 841          Leesville           LA          71446 337-239-4485         W
## 842          New Llano           LA          71461 337-239-0103         W
## 843          Leesville           LA          71446 337-239-6709         W
## 844           Jennings           LA          70546 337-824-8552         W
## 845              Houma           LA          70361 985-873-6540         W
## 846              Houma           LA          70361 985-873-6550         W
## 847              Houma           LA     70361-0308 985-873-6560         W
## 848              Houma           LA     70361-3780 985-873-6570         W
## 849              Houma           LA          70360 985-873-6580         W
## 850            Oakdale           LA          71463 318-335-1521         W
## 851            Oberlin           LA          70655 337-639-2762         W
## 852             Meraux           LA          70075 504-277-6171         W
## 853         St Bernard           LA          70085 504-267-0014         W
## 854         St Bernard           LA     70085-5822 504-267-3936         W
## 855          Chalmette           LA          70043 504-301-0328         W
## 856          Chalmette           LA          70043 504-481-8135         W
## 857            Pollock           LA          71467 318-765-0821         W
## 858           DeRidder           LA          70634 337-462-6051         W
## 859           DeRidder           LA          70634 337-463-2100         W
## 860            Grayson           LA          71435 318-649-2793         W
## 861            Cameron           LA          70631 337-542-4310         W
## 862          Coushatta           LA          71019 318-932-6241         W
## 863            LaPlace           LA          70068 985-652-6747         W
## 864             Edgard           LA          70049 985-497-8247         B
## 865             Edgard           LA          70049 985-652-8939         W
## 866          Mansfield           LA          71052 318-872-5160         W
## 867           Keatchie           LA     71046-3006 318-933-8740         W
## 868        New Orleans           LA          70112 504-581-9059         B
## 869        New Orleans           LA     70122-1306 504-710-0682         B
## 870        New Orleans           LA          70118 504-373-5645         B
## 871        New Orleans           LA          70151 504-491-6075         B
## 872        New Orleans           LA     70119-2138 504-237-4241         B
## 873        New Orleans           LA          70118 504-862-0108         W
## 874        New Orleans           LA          70131 504-433-9974         W
## 875        New Orleans           LA          70156 504-289-6564         B
## 876        New Orleans           LA          70151 504-451-6515         B
## 877        New Orleans           LA     70122-4737 504-473-4366         B
## 878                                                                      
## 879        New Orleans           LA          70122 504-473-3253         B
## 880        New Orleans           LA          70122 504-237-6010         B
## 881        New Orleans           LA          70125 504-821-7015         B
## 882        New Orleans           LA     70118-5528 504-866-6601         O
## 883        New Orleans           LA          70190 504-289-7371         W
## 884        New Orleans           LA     70131-8444 504-658-9532         B
## 885        New Orleans           LA          70122 504-658-9150         B
## 886        New Orleans           LA          70118 504-861-0993         W
## 887        New Orleans           LA          70158 504-554-9777         B
## 888        New Orleans           LA          70119 504-913-6581         B
## 889        New Orleans           LA          70119 504-658-9190         B
## 890        New Orleans           LA          70124 504-884-5832         W
## 891        New Orleans           LA          70175 504-452-1147         W
## 892        New Orleans           LA          70119 504-658-9320         B
## 893        New Orleans           LA          70153 504-919-2868         B
## 894        New Orleans           LA     70119-3233 504-508-6868         W
## 895                              LA          70115 504-874-1596         W
## 896         Shreveport           LA     71115-2527 318-797-1245         W
## 897           Gibsland           LA          71028 318-263-2031         W
## 898             Vienna           LA          71235 318-251-5100         W
## 899          Mer Rouge           LA          71261 318-647-3364         W
## 900          Oak Grove           LA     71263-3704 318-428-3219         W
## 901          St Joseph           LA          71366 318-766-4892         W
## 902            Vidalia           LA          71373 318-336-5526         W
## 903          Winnfield           LA          71483 318-628-2141         W
## 904         Alexandria           LA          71309 318-448-3439         W
## 905       Natchitoches           LA          71457 318-352-6585         W
## 906               Many           LA          71449 318-471-7101         W
## 907         Marksville           LA          71351 318-253-4551         W
## 908       Ville Platte           LA          70586 337-363-0492         W
## 909       Lake Charles           LA          70605 337-477-3599         W
## 910          Lafayette           LA          70506 337-984-9794         W
## 911         New Iberia           LA          70563 337-229-8222         W
## 912          Thibodaux           LA          70302 985-446-6291         W
## 913         Maringouin           LA          70757 225-687-5210         W
## 914        Baton Rouge           LA          70802 225-757-0100         W
## 915            Jackson           LA          70748 225-634-2535         W
## 916            Hammond           LA          70403 985-542-6985         W
## 917          Covington           LA          70433 985-809-8383         W
## 918           Gonzales           LA          70737 225-677-8490         W
## 919           Metairie           LA          70001 504-835-0754         W
## 920       Belle Chasse           LA          70037 504-394-2690         W
## 921             Minden           LA          71055 318-377-3593         W
## 922          Opelousas           LA     70571-1968 337-948-3007         W
## 923               Jena           LA          71342 318-992-8282         W
## 924          Hahnville           LA          70057 985-764-9596         W
## 925          Leesville           LA          71446 337-238-1951         W
## 926           Jennings           LA          70546 337-824-0315         W
## 927              Houma           LA     70360-7243 985-868-0704         W
## 928            Oberlin           LA          70655 318-639-2641         W
## 929             Meraux           LA          70075 504-271-0111         W
## 930          Dry Prong           LA          71423 318-627-3205         W
## 931           DeRidder           LA          70634 337-463-4601         W
## 932           Columbia           LA          71418 318-649-2005         W
## 933          Hackberry           LA          70645 337-775-5713         W
## 934          Coushatta           LA          71019 318-932-9323         W
## 935            Laplace           LA          70068 985-652-8779          
## 936          Mansfield           LA          71052 318-872-1830         B
## 937        New Orleans           LA          70124 504-282-0175         W
## 938             Eunice           LA          70535 337-457-6535         W
## 939         Shreveport           LA          71105 318-673-5870         W
## 940         Shreveport           LA     71105-3118 318-861-1185         W
## 941         Shreveport           LA     71106-7775 318-798-4045         B
## 942         Shreveport           LA     71101-4830 318-424-9424         B
## 943             Eunice           LA          70535 337-305-0353         W
## 944         Shreveport           LA          71118 318-560-2347         B
## 945          Broussard           LA          70518 337-837-5811         W
## 946           DeRidder           LA     70634-5313 337-462-2613         W
## 947             Eunice           LA     70535-6701 337-457-7254         W
## 948         Shreveport           LA     71119-3511 318-262-8458         B
## 949        Arnaudville           LA          70512 337-754-5137         W
## 950             Basile           LA          70515 337-658-2651         W
## 951          Delcambre           LA     70528-2206 337-685-2899         W
## 952              Duson           LA          70529 337-873-4386         W
## 953         Downsville           LA          71234 318-982-5341         W
## 954             Lillie           LA          71256 318-986-5331         W
## 955        Youngsville           LA     70592-5514 337-278-0155         W
## 956             Eunice           LA     70535-5946 337-546-0720         W
## 957        Arnaudville           LA          70512 337-754-9188         W
## 958             Basile           LA          70515 337-432-5379         B
## 959          Delcambre           LA     70528-0192 337-685-1899         W
## 960         Downsville           LA     71234-3109 318-982-5838         W
## 961      Junction City           LA          71256 318-986-4990         W
## 962             Eunice           LA     70535-5008 337-457-3186         W
## 963             Basile           LA          70515 337-789-7336         W
## 964          Broussard           LA          70518 337-837-6342         W
## 965           DeRidder           LA     70634-4724 337-463-6800         W
## 966           DeRidder           LA     70634-7007 337-463-4655         B
## 967             Basile           LA     70515-5512 337-432-6878         W
## 968          Delcambre           LA     70528-2518 337-685-2485         W
## 969             Basile           LA          70515 337-789-7525         W
## 970          Delcambre           LA     70528-2303 337-380-3156         B
## 971             Basile           LA     70515-5403 337-432-5548         W
## 972          Delcambre           LA          70528 337-577-2690         W
## 973             Basile           LA          70515 337-432-5507         B
## 974          Delcambre           LA     70528-4010 337-685-2790         W
## 975          Delcambre           LA     70528-4614 337-685-2247         W
## 976        Arnaudville           LA     70512-6235 337-207-2030         W
## 977        Arnaudville           LA     70512-6107 337-754-7190         W
## 978        Arnaudville           LA     70512-6203 337-754-5078         W
## 979        Arnaudville           LA     70512-6240 337-754-9865         W
## 980        Arnaudville           LA     70512-6103 337-754-5936         W
## 981              Duson           LA          70529 337-873-8487         W
## 982              Duson           LA          70529 337-873-8486         W
## 983              Duson           LA          70529 337-873-3411         W
## 984              Duson           LA          70529 337-873-6049         B
## 985              Duson           LA          70529 337-873-0386         W
## 986         Downsville           LA          71234 318-982-7399         W
## 987         Downsville           LA          71234 318-982-7547         W
## 988         Downsville           LA          71234 318-982-7257         W
## 989             Lillie           LA          71256 318-986-5607         W
## 990      Junction City           LA          71256 318-986-4982         W
## 991      Junction City           LA          71256 318-986-5177         W
## 992             Eunice           LA     70535-5010 337-457-3181         W
## 993             Eunice           LA     70535-6433 337-457-3583         B
## 994             Eunice           LA     70535-6810 337-457-4063         W
## 995             Eunice           LA     70535-4533 337-305-3159         W
## 996         Shreveport           LA     71107-6020 318-227-0803         B
## 997         Shreveport           LA          71104 318-347-2554         W
## 998         Shreveport           LA     71106-1815 318-294-7277          
## 999         Shreveport           LA     71115-3051 318-455-7584         W
## 1000        Shreveport           LA     71118-4546 318-688-6800         W
## 1001        Shreveport           LA     71109-6808 318-426-2292         B
## 1002        Shreveport           LA     71109-3917 318-631-4333         B
## 1003         Broussard           LA     70518-4024 337-277-9222         W
## 1004          DeRidder           LA     70634-4102 337-462-0316         B
## 1005         Broussard           LA          70518 337-207-8871         W
## 1006          DeRidder           LA     70634-5142 337-463-0160         B
## 1007         Broussard           LA          70518 337-501-9781         W
## 1008          DeRidder           LA     70634-5322 337-463-9977         W
## 1009         Broussard           LA          70518 337-837-6664         B
## 1010          DeRidder           LA     70634-3222 337-460-9161         W
## 1011         Broussard           LA          70518 337-837-1723         W
## 1012          DeRidder           LA     70634-2940 337-462-6965         W
## 1013       Youngsville           LA          70592 337-837-4866         W
## 1014           Crowley           LA          70526 337-783-6434         W
## 1015                                                                     
## 1016                                                                     
## 1017                                                                     
## 1018                                                                     
## 1019                                                                     
## 1020                                                                     
## 1021                                                                     
## 1022                                                                     
## 1023            Branch           LA     70516-3506 337-684-2787         W
## 1024             Rayne           LA     70578-6931 337-305-3846         W
## 1025             Rayne           LA          70578 337-334-2087         W
## 1026             Rayne           LA     70578-7612 337-334-6945         W
## 1027                                                                     
## 1028                                                                     
## 1029        Estherwood           LA          70534 337-783-0330         W
## 1030             Rayne           LA     70578-5830 337-334-7676         W
## 1031             Rayne           LA     70578-6404 337-393-2166         W
## 1032             Rayne           LA     70578-8433 337-334-3044         W
## 1033            Eunice           LA     70535-7553 337-546-6270         W
## 1034              Iota           LA     70543-4707 337-779-2456         W
## 1035           Crowley           LA          70526 337-783-8198         W
## 1036           Crowley           LA     70527-0922 337-788-8881         W
## 1037             Rayne           LA          70578 337-334-9554         W
## 1038             Rayne           LA     70578-6910 337-334-7115         W
## 1039           Crowley           LA     70526-3563 337-581-2276         B
## 1040           Crowley           LA     70526-0968 337-783-1607         W
## 1041        Estherwood           LA          70534 337-788-0865         W
## 1042           Crowley           LA     70526-7634 337-783-9074         W
## 1043             Rayne           LA     70578-7808 337-334-4711         W
## 1044      Church Point           LA     70525-4927 337-873-6339         W
## 1045      Church Point           LA     70525-5710 337-684-6727         W
## 1046              Iota           LA     70543-3500 337-207-1352         W
## 1047           Crowley           LA          70526 337-788-2435         W
## 1048             Rayne           LA          70578 337-334-5156         W
## 1049           Crowley           LA          70526 337-783-9122         W
## 1050             Rayne           LA          70578 337-334-5566         W
## 1051           Crowley           LA     70526-3536 337-783-6483         B
## 1052              Egan           LA     70531-3310 337-788-2432         W
## 1053        Estherwood           LA          70534 337-247-4728         W
## 1054           Crowley           LA     70526-7905 337-783-4082         W
## 1055             Rayne           KS          70578 337-334-2466          
## 1056      Church Point           LA     70525-4007 337-684-5284         W
## 1057      Church Point           LA     70525-5212 337-962-4512         W
## 1058              Iota           LA          70543 337-779-2289         W
## 1059            Branch           LA          70516 337-334-4584         W
## 1060      Church Point           LA          70525 337-684-2331         W
## 1061              Iota           LA          70543 337-779-2571         W
## 1062             Morse           LA     70559-2523 337-783-4277         W
## 1063            Basile           LA          70515 337-432-6804         W
## 1064            Branch           LA          70516 337-334-5004         W
## 1065      Church Point           LA          70525 337-684-2818         W
## 1066              Iota           LA     70543-6069 337-779-3651         W
## 1067        Estherwood           LA          70534 337-788-2207         W
## 1068            Basile           LA          70515 337-432-5480         W
## 1069           Crowley           LA     70526-2302 337-783-8972         W
## 1070             Rayne           LA     70578-7314 337-334-2466         W
## 1071      Church Point           LA     70525-2109 337-684-6334         W
## 1072              Iota           LA     70543-6007 337-779-3321         W
## 1073        Estherwood           LA          70534 337-788-0865         W
## 1074         Mermentau           LA          70556 337-824-0629         W
## 1075             Morse           LA          70559 337-783-6273         W
## 1076           Crowley           LA     70526-2225 337-788-1888         W
## 1077             Rayne           LA     70578-6416 337-334-4286         W
## 1078      Church Point           LA     70525-2220 337-684-6460         W
## 1079              Iota           LA          70543 337-779-2393         W
## 1080        Estherwood           LA          70534 337-458-1318         W
## 1081         Mermentau           LA          70556                       
## 1082             Morse           LA          70559 337-783-3616         W
## 1083           Crowley           LA     70526-6713 337-783-8597         W
## 1084             Rayne           LA     70578-6335 337-334-7304         W
## 1085              Iota           LA     70543-6037 337-280-7984         W
## 1086              Iota           LA     70543-6023 337-779-2696         W
## 1087              Iota           LA     70543-6021 337-779-2545         W
## 1088              Iota           LA          70543 337-779-2868         W
## 1089              Iota           LA          70543 337-779-2259         W
## 1090        Estherwood           LA          70534 337-783-0102         W
## 1091        Estherwood           LA          70534 337-783-9946         W
## 1092        Estherwood           LA          70534 337-783-5333         W
## 1093         Mermentau           LA          70556 337-824-9327         W
## 1094         Mermentau           LA          70556 337-824-0332         W
## 1095         Mermentau           LA          70556 337-824-4259         W
## 1096             Morse           LA     70559-2500 337-788-1039         W
## 1097             Morse           LA          70559 337-783-3175         W
## 1098             Morse           LA          70559 337-788-1681         W
## 1099             Rayne           LA     70578-5311 337-334-5020         B
## 1100           Crowley           LA     70526-2707 337-783-0173         W
## 1101           Crowley           LA     70526-2308 337-783-3619         W
## 1102      Church Point           LA          70525 337-580-5226         B
## 1103             Rayne           LA          70578 337-334-7861         W
## 1104           Crowley           LA     70526-3841 337-581-2721         W
## 1105           Crowley           LA     70526-5213 337-788-2203         W
## 1106      Church Point           LA     70525-2233 337-684-6603         W
## 1107             Rayne           LA     70578-6915 337-334-1829         W
## 1108           Crowley           LA     70526-4933 337-783-6128         B
## 1109           Crowley           LA     70526-4922 337-783-3422         B
## 1110      Church Point           LA     70525-2925 337-684-6932         W
## 1111             Rayne           LA     70578-8303 337-334-3392         W
## 1112           Crowley           LA     70526-6700 337-783-6148         W
## 1113           Crowley           LA     70526-6339 337-783-3449         W
## 1114      Church Point           LA     70525-3142 337-257-4999         W
## 1115      Church Point           LA     70525-3437 337-684-3470         W
## 1116          Glenmora           LA     71433-4800 318-335-3750         W
## 1117                                                                     
## 1118                                                                     
## 1119           Oakdale           LA          71463 318-335-2305         W
## 1120                                                                     
## 1121                                                                     
## 1122                                                                     
## 1123                                                                     
## 1124           Oakdale           LA     71463-0665 318-335-1215         W
## 1125                                                                     
## 1126                                                                     
## 1127                                                                     
## 1128                                                                     
## 1129                                                                     
## 1130                                                                     
## 1131                                                                     
## 1132            Kinder           LA     70648-5715 337-738-3010         W
## 1133           Oberlin           LA          70655 337-639-4351         W
## 1134            Pitkin           LA     70656-5806 318-634-7387         W
## 1135           Oakdale           LA     71463-4049 318-335-3870         W
## 1136           Oakdale           LA     71463-3057 318-350-5977         B
## 1137         Elizabeth           LA          70638 318-634-5981         W
## 1138           Oakdale           LA          71463 318-335-1114         W
## 1139            Mittie           LA          70654 337-639-4072         W
## 1140           Oberlin           LA     70655-3324 337-639-2817         W
## 1141            Kinder           LA     70648-5344 337-738-2303         W
## 1142            Reeves           LA     70658-5813 337-884-6674         W
## 1143           Oakdale           LA          71463 318-335-3492         W
## 1144         Elizabeth           LA          70638 318-634-9913         W
## 1145           Oakdale           LA     71463-3481 318-335-2459         B
## 1146           Oakdale           LA     71463-4902 318-335-0118         W
## 1147           Oakdale           LA          71463 318-335-1177         B
## 1148            Pitkin           LA     70656-5717 318-634-3420         W
## 1149           Oberlin           LA          70655 337-639-2598         W
## 1150            Kinder           LA     70648-5308 337-738-2166         W
## 1151            Kinder           LA          70648 337-738-3253         W
## 1152            Kinder           LA          70648                       
## 1153            Kinder           LA          70648 337-738-5843         W
## 1154            Reeves           LA          70658 337-526-2426         W
## 1155            Mittie           LA          70654 337-639-4725         W
## 1156           Oberlin           LA          70655 337-639-7396          
## 1157             Elton           LA          70532 337-485-5583         W
## 1158            Reeves           LA          70658 337-666-2278         W
## 1159            Pitkin           LA          70656 318-634-7895         W
## 1160           Oakdale           LA     71463-2622 318-335-3450         W
## 1161         Elizabeth           LA          70638 318-634-7349         W
## 1162            Kinder           LA     70648-3845 337-738-2452         W
## 1163           Oberlin           LA          70655 337-718-1751         W
## 1164            Reeves           LA          70658 337-749-2438         W
## 1165           Oakdale           LA     71463-2436 318-491-1941         W
## 1166         Elizabeth           LA          70638 318-634-5964         W
## 1167            Kinder           LA          70648 337-738-2090         W
## 1168           Oberlin           LA          70655 337-389-9228         B
## 1169            Reeves           LA     70658-5951 337-749-2770         W
## 1170           Oberlin           LA     70655-0443 337-639-2116         W
## 1171           Oakdale           LA     71463-0104 318-335-2659         W
## 1172            Kinder           LA          70648 337-738-2866         W
## 1173           Oberlin           LA          70655 337-639-2296         W
## 1174           Oberlin           LA          70655 337-639-2701         W
## 1175           Oberlin           LA          70655 337-660-5079         B
## 1176           Oberlin           LA          70655 337-639-2317         B
## 1177         Elizabeth           LA          70638 318-634-7826         W
## 1178         Elizabeth           LA          70638 318-634-5268         W
## 1179         Elizabeth           LA          70638 318-634-7839         W
## 1180         Elizabeth           LA     70638-0501 318-634-5986         W
## 1181         Elizabeth           LA          70638 318-634-5136         B
## 1182            Reeves           LA          70658 337-977-1011         W
## 1183            Reeves           LA          70658 337-322-0315         W
## 1184            Reeves           LA          70658 337-749-2500         W
## 1185           Oakdale           LA     71463-3461 318-335-1721         B
## 1186            Kinder           LA          70648 337-370-1451         B
## 1187           Oakdale           LA     71463-1055 318-335-8328         W
## 1188            Kinder           LA     70648-3238 337-738-2152         W
## 1189           Oakdale           LA     71463-4523 318-335-4357         W
## 1190            Kinder           LA          70648 337-738-2068         W
## 1191           Oakdale           LA     71463-3318 318-335-0604         W
## 1192            Kinder           LA          70648 337-738-4441         W
## 1193            Darrow           LA          70725 225-473-9261         B
## 1194      Prairieville           LA     70769-5821 225-622-1435         W
## 1195    Donaldsonville           LA     70346-9360 225-473-9637         B
## 1196                                                                     
## 1197            Darrow           LA     70725-2201 225-473-4583         B
## 1198                                                                     
## 1199      Prairieville           LA     70769-5935 225-622-2458         W
## 1200                                                                     
## 1201      Prairieville           LA     70769-4208 225-673-6627         B
## 1202                                                                     
## 1203                                                                     
## 1204          Gonzales           LA          70737 225-647-3004         W
## 1205                                                                     
## 1206          Gonzales           LA          70737 225-644-6882         W
## 1207          Gonzales           LA     70737-8435 225-675-8002         W
## 1208          Gonzales           LA     70737-2260 225-647-2227         W
## 1209          Gonzales           LA     70737-7241 225-622-4328         W
## 1210          Gonzales           LA          70737 225-647-6112         W
## 1211          Brittany           LA          70718                       
## 1212          Gonzales           LA          70737 225-647-4560         W
## 1213          Gonzales           LA     70737-2517 225-647-3396         W
## 1214      Prairieville           LA          70769 225-673-6499         W
## 1215          Gonzales           LA          70737 225-622-2086         W
## 1216                                                                     
## 1217      Prairieville           LA     70769-5238 225-622-4116         W
## 1218          Brittany           LA          70718                       
## 1219          Gonzales           LA          70737 225-644-5401         W
## 1220          Gonzales           LA          70737 225-445-2797         W
## 1221          Gonzales           LA          70737 225-620-6884         W
## 1222      Prairieville           LA     70769-3255 225-673-8426         W
## 1223          Gonzales           LA     70737-8130 225-644-5654         W
## 1224          Gonzales           LA          70737 225-621-8400         W
## 1225          St Amant           LA     70774-3048 225-622-1300         W
## 1226       Baton Rouge           LA          70810 225-644-4743         W
## 1227          St Amant           LA     70774-3212 225-644-4473         W
## 1228    Donaldsonville           LA     70346-9360 225-348-0254         B
## 1229          Gonzales           LA     70737-8132 225-647-0455         W
## 1230           Geismar           LA          70734 225-673-6623         B
## 1231      Prairieville           LA     70769-3255 225-673-2512         W
## 1232      Prairieville           LA     70769-6109 225-622-2703         W
## 1233          St Amant           LA     70774-3701 225-647-4925         W
## 1234      Prairieville           LA     70769-4568 225-677-5179         W
## 1235      Prairieville           LA          70769 225-673-3335         W
## 1236          Gonzales           LA     70737-1901 225-644-6660         W
## 1237          Gonzales           LA     70737-4322 225-650-8200         W
## 1238          Gonzales           LA          70737 225-644-4107         W
## 1239    Donaldsonville           LA          70346 225-473-3133         B
## 1240    Donaldsonville           LA          70346 225-473-6131         W
## 1241          Gonzales           LA     70737-6239 225-647-4163         B
## 1242          Gonzales           LA     70737-6178 225-673-6822         W
## 1243      Prairieville           LA     70769-0000 225-673-2602         W
## 1244      Prairieville           LA     70769-5935 225-622-2458         W
## 1245      Prairieville           LA     70769-4176 225-673-4040         W
## 1246          Gonzales           LA     70737-7909 225-644-6452         W
## 1247          St Amant           LA     70774-4004 225-675-8346         W
## 1248          Gonzales           LA     70737-6834 225-644-1928         W
## 1249          Gonzales           LA     70737-7752 225-647-6625         W
## 1250    Donaldsonville           LA          70346 225-473-4407         W
## 1251      Prairieville           LA          70769 225-744-8800         W
## 1252          St Amant           LA          70774 225-647-7002         W
## 1253    Donaldsonville           LA          70346 225-473-3526         W
## 1254      Prairieville           LA          70769 225-673-8015         W
## 1255          St Amant           LA          70774 225-644-3815         W
## 1256    Donaldsonville           LA     70346-4373 225-473-6695         B
## 1257          Gonzales           LA     70737-4996 225-647-5969         W
## 1258          Sorrento           LA     70778-3128 225-715-7665         W
## 1259          Gonzales           LA     70737-3912 225-229-2951         B
## 1260          Sorrento           LA     70778-0000 225-675-5772         W
## 1261          Sorrento           LA          70778 225-675-5772         W
## 1262    Donaldsonville           LA          70346 225-473-6635         B
## 1263    Donaldsonville           LA     70346-4372 225-473-1818         W
## 1264    Donaldsonville           LA          70346 225-473-7220         B
## 1265    Donaldsonville           LA     70346-4350 225-473-2198         B
## 1266    Donaldsonville           LA     70346-2708 225-473-4959         W
## 1267          Gonzales           LA          70707 225-715-1291         W
## 1268          Gonzales           LA     70737-4986 225-644-3969         W
## 1269          Gonzales           LA     70737-4621 225-644-1231         B
## 1270          Gonzales           LA     70737-3762 225-647-7441         B
## 1271          Gonzales           LA          70707 225-644-5495         W
## 1272          Sorrento           LA     70778-3517 225-253-1030         W
## 1273          Sorrento           LA          70778 225-675-8399         B
## 1274          Sorrento           LA          70778 225-675-2699         B
## 1275          Sorrento           LA          70778 225-675-8538         W
## 1276          Sorrento           LA          70778 225-675-8742         B
## 1277                                                                     
## 1278        Belle Rose           LA          70341 985-369-2074         B
## 1279     Napoleonville           LA          70390 985-369-2603         W
## 1280                                                                     
## 1281                                                                     
## 1282     Napoleonville           LA     70390-8627 985-513-2577         B
## 1283    Paincourtville           LA          70391 985-513-1901         B
## 1284                                                                     
## 1285       Pierre Part           LA     70339-4524 985-513-0990         W
## 1286                                                                     
## 1287                                                                     
## 1288                                                                     
## 1289                                                                     
## 1290                                                                     
## 1291                                                                     
## 1292     Napoleonville           LA          70390 985-227-2524         W
## 1293                                                                     
## 1294                                                                     
## 1295                                                                     
## 1296                                                                     
## 1297     Napoleonville           LA     70390-8620 985-369-7281         W
## 1298     Napoleonville           LA          70390 985-369-6653         W
## 1299     Napoleonville           LA     70390-8831 985-369-6672         W
## 1300     Napoleonville           LA     70390-2104 985-369-6070         W
## 1301        Belle Rose           LA          70341 985-369-2074         B
## 1302      Labadieville           LA     70372-2038 985-526-8139         W
## 1303       Morgan City           LA     70380-7812 985-631-2443         W
## 1304     Napoleonville           LA     70390-8923 985-369-7550         B
## 1305     Napoleonville           LA     70390-8508 985-369-7320         W
## 1306     Napoleonville           LA     70390-2429 985-369-2843         B
## 1307        Belle Rose           LA          70341 225-474-0254         W
## 1308       Pierre Part           LA     70339-4930 985-252-6769         W
## 1309       Pierre Part           LA     70339-4203 985-252-9504         W
## 1310        Belle Rose           LA          70346 985-369-6286         B
## 1311     Napoleonville           LA     70390-8616 985-369-2672         W
## 1312       Morgan City           LA     70380-8014 985-631-2042         W
## 1313     Napoleonville           LA          70390 985-526-8335         B
## 1314     Napoleonville           LA     70390-8515 985-369-6758         W
## 1315    Paincourtville           LA          70391 985-369-1670         B
## 1316    Donaldsonville           LA          70346 225-473-7328         W
## 1317       Pierre Part           LA     70339-4818 985-252-6775         W
## 1318       Pierre Part           LA     70339-4417 985-252-9371         W
## 1319     Napoleonville           LA          70390 985-369-2509         W
## 1320         Thibodaux           LA          70301 985-526-6588         W
## 1321       Pierre Part           LA          70339 985-252-0064         W
## 1322      Plattenville           LA          70393 985-369-2306         B
## 1323     Napoleonville           LA          70390 985-369-6645         W
## 1324       Pierre Part           LA          70339 985-252-6528         W
## 1325     Napoleonville           LA     70390-0921 985-513-1055         B
## 1326     Napoleonville           LA          70390 985-369-3178         B
## 1327     Napoleonville           LA          70390 985-369-4729         W
## 1328     Napoleonville           LA          70390 225-226-6841         B
## 1329                                                                     
## 1330                                                                     
## 1331                                                                     
## 1332                                                                     
## 1333                                                                     
## 1334                                                                     
## 1335                                                                     
## 1336                                                                     
## 1337                                                                     
## 1338                                                                     
## 1339                                                                     
## 1340                                                                     
## 1341                                                                     
## 1342                                                                     
## 1343                                                                     
## 1344                                                                     
## 1345                                                                     
## 1346                                                                     
## 1347                                                                     
## 1348                                                                     
## 1349        Simmesport           LA     71369-2309 318-941-2857         W
## 1350        Marksville           LA          71351 318-253-7523         W
## 1351        Cottonport           LA          71327 318-876-3437         W
## 1352        Marksville           LA     71351-3217 318-253-5392         W
## 1353       Centerpoint           LA          71323 318-240-8297         W
## 1354           Hessmer           LA     71341-4111 318-563-1076         W
## 1355        Marksville           LA     71351-2433 318-253-7128         W
## 1356           Mansura           LA          71350 318-964-5930         B
## 1357        Marksville           LA     71351-3207 318-253-0348         B
## 1358            Bunkie           LA          71322 337-831-7246         B
## 1359      Plaucheville           LA          71362 318-305-7871         W
## 1360            Bunkie           LA     71322-4768 318-838-2322         W
## 1361        Simmesport           LA     71369-2301 318-941-5356         W
## 1362            Bunkie           LA          71322 318-346-6616         W
## 1363        Marksville           LA          71351 318-253-6423         W
## 1364            Bunkie           LA          71322 318-447-1254         W
## 1365        Marksville           LA          71351 318-253-6188         W
## 1366        Marksville           LA     71351-2537 318-253-8931         B
## 1367             Effie           LA          71331 318-253-0064         W
## 1368       Moreauville           LA          71351 318-985-2958         W
## 1369           Hessmer           LA     71341-4028 318-563-8482         W
## 1370           Mansura           LA          71350 318-264-2138         B
## 1371            Bunkie           LA     71322-1266 318-346-4372         B
## 1372        Cottonport           LA     71327-3854 318-876-2054         W
## 1373            Bunkie           LA          71322 318-346-7004         W
## 1374        Marksville           LA     71351-3411 318-253-5659         W
## 1375       Centerpoint           LA     71323-3000 318-253-8210         W
## 1376           Mansura           LA          71350 318-964-2097         B
## 1377           Hessmer           LA          71341 318-563-8346         W
## 1378        Marksville           LA     71351-4425 318-253-0187         W
## 1379       Moreauville           LA          71355 318-997-2129         W
## 1380      Plaucheville           LA          71362                       
## 1381      Plaucheville           LA          71362 318-922-3746         W
## 1382        Cottonport           LA          71327 318-876-3480         W
## 1383        Cottonport           LA          71327 318-985-2405         W
## 1384             Effie           LA          71331 318-253-5591         W
## 1385           Mansura           LA          71350 318-964-2433         W
## 1386           Hessmer           LA          71341 318-563-4430         W
## 1387        Marksville           LA          71351 318-253-4242         W
## 1388       Moreauville           LA          71355 318-997-2689         W
## 1389        Simmesport           LA          71369 318-941-2560         B
## 1390      Plaucheville           LA          71362 318-922-3176         W
## 1391        Cottonport           LA          71327 318-305-1394         W
## 1392        Cottonport           LA     71327-4313 318-452-2067         W
## 1393            Bunkie           LA     71322-1946 318-346-2133         W
## 1394        Marksville           LA     71351-3077 318-253-7253         W
## 1395        Cottonport           LA          71327 318-876-2053         W
## 1396         Evergreen           LA          71333 318-346-9181         W
## 1397           Mansura           LA     71350-4511 318-964-2208         B
## 1398        Simmesport           LA          71369 318-359-6262         W
## 1399           Hessmer           LA          71341 318-447-8888         W
## 1400       Moreauville           LA     71355-3724 318-985-2178         W
## 1401      Plaucheville           LA          71362 318-922-3229         W
## 1402            Bunkie           LA     71322-1964 318-346-6992         W
## 1403        Cottonport           LA          71327 318-717-0421         B
## 1404           Mansura           LA          71350 318-964-5420         B
## 1405        Simmesport           LA          71369                       
## 1406           Hessmer           LA          71341 318-305-1802         W
## 1407            Bunkie           LA          71322 318-717-0481         W
## 1408            Bunkie           LA     71322-1902 318-346-7407         W
## 1409        Simmesport           LA          71369 318-941-5858         W
## 1410        Cottonport           LA          71327 318-264-5850         B
## 1411            Bunkie           LA     71322-1125 318-346-2995         B
## 1412        Marksville           LA     71351-2464 318-253-7090         W
## 1413        Simmesport           LA          71369 318-941-5160         W
## 1414            Bunkie           LA     71322-1267 318-346-9346         B
## 1415        Marksville           LA     71351-2102 318-253-8915         W
## 1416        Simmesport           LA          71369 318-941-2525         W
## 1417            Bunkie           LA     71322-2156 318-729-3705         W
## 1418        Marksville           LA     71351-2512 318-201-8299         B
## 1419        Simmesport           LA          71369 318-240-4166         B
## 1420            Bunkie           LA     71322-1930 318-346-4747         W
## 1421        Marksville           LA     71351-2756 318-253-7076         B
## 1422        Simmesport           LA          71369 318-359-0122         B
## 1423        Marksville           LA     71351-2916 318-253-7772         W
## 1424         Evergreen           LA          71333 318-346-4488         W
## 1425         Evergreen           LA          71333 318-359-5811         W
## 1426         Evergreen           LA          71333 318-346-4488         W
## 1427         Evergreen           LA          71333 318-717-0639         W
## 1428         Evergreen           LA          71333 318-346-6400         W
## 1429           Mansura           LA          71350 318-964-2919         B
## 1430           Mansura           LA          71350 318-964-2375         W
## 1431           Mansura           LA          71350 318-964-2339         W
## 1432           Mansura           LA     71350-4910 318-964-5161         B
## 1433           Mansura           LA     71350-4604 318-717-2323         B
## 1434           Hessmer           LA          71341 318-359-6444         W
## 1435           Hessmer           LA          71341 318-563-8415         W
## 1436           Hessmer           LA          71341 318-305-0777         W
## 1437       Moreauville           LA          71355 318-985-2439         B
## 1438       Moreauville           LA          71355 318-985-2179         B
## 1439       Moreauville           LA          71355 318-985-2890         W
## 1440      Plaucheville           LA          71362 318-922-3719         W
## 1441      Plaucheville           LA          71362 318-922-3844         W
## 1442      Plaucheville           LA          71362 318-922-3228         W
## 1443        Cottonport           LA          71327 318-305-5949         B
## 1444        Cottonport           LA          71327 318-305-3473         B
## 1445        Cottonport           LA     71327-3540 318-876-2753         W
## 1446        Cottonport           LA          71327 318-876-2147         B
## 1447          DeRidder           LA          70634 337-842-0330         B
## 1448          DeRidder           LA     70634-5789 337-348-6992         B
## 1449          DeRidder           LA          70634                       
## 1450          DeRidder           LA     70634-5297 337-202-1892         B
## 1451          DeRidder           LA     70634-4102 337-462-0316         B
## 1452                                                                     
## 1453                                                                     
## 1454          DeRidder           LA     70634-4361 337-462-9955         B
## 1455                                                                     
## 1456          DeRidder           LA          70634                       
## 1457                                                                     
## 1458                                                                     
## 1459                                                                     
## 1460                                                                     
## 1461                                                                     
## 1462          DeRidder           LA          70634 337-462-2656         W
## 1463          DeRidder           LA     70634-5480 337-462-1135         W
## 1464                                                                     
## 1465                                                                     
## 1466                                                                     
## 1467                                                                     
## 1468                                                                     
## 1469                                                                     
## 1470                                                                     
## 1471                                                                     
## 1472                                                                     
## 1473                                                                     
## 1474         Longville           LA          70652 337-462-0141         W
## 1475          DeRidder           LA          70634 337-463-8595         W
## 1476          DeRidder           LA     70634-4520 337-462-1371         W
## 1477          DeRidder           LA     70634-4724 337-462-2659         W
## 1478            Singer           LA     70660-3326 000-000-0000         W
## 1479        Merryville           LA          70653 337-825-6390         W
## 1480          DeRidder           LA     70634-4381 337-463-6426         B
## 1481         Sugartown           LA     70662-3008 337-328-7270         W
## 1482         Longville           LA          70657 337-725-6406         W
## 1483          DeRidder           LA     70634-2405 337-463-7141         W
## 1484          DeRidder           LA     70634-4705 337-463-4616         W
## 1485            Ragley           LA          70657 337-725-6707         W
## 1486          DeRidder           LA          70634 337-463-9800         W
## 1487          DeRidder           LA          70634 337-463-3092         W
## 1488            Fields           LA     70653-4327 337-786-3450         W
## 1489        Merryville           LA          70653 337-825-6512         W
## 1490          DeRidder           LA     70634-4361 337-462-9955         B
## 1491         Dry Creek           LA     70637-3109 337-328-7131         W
## 1492          DeRidder           LA     70634-5480 337-462-0991         W
## 1493          DeRidder           LA     70634-2937 337-463-6966         W
## 1494          DeRidder           LA     70634-5304 337-462-0742         W
## 1495         longville           LA          70652 337-725-6676         W
## 1496          DeRidder           LA          70634 337-463-8525         W
## 1497         Sugartown           LA          70662 337-463-3559         W
## 1498            Fields           LA          70653 337-743-6375         W
## 1499        Merryville           LA          70653 337-825-6390         W
## 1500            Ragley           LA          70657 337-725-3175         W
## 1501          DeRidder           LA          70634 337-463-2758         W
## 1502            Singer           LA          70660 337-463-2599         W
## 1503          DeRidder           LA          70634                       
## 1504         Longville           LA          70652 337-725-3667         W
## 1505         Sugartown           LA          70662 337-328-7186         W
## 1506        Merryville           LA     70653-3022 337-825-6106         W
## 1507        Merryville           LA          70653 337-340-0040         W
## 1508        Merryville           LA     70653-3336 337-825-9852         W
## 1509        Merryville           LA          70653 337-825-0018         W
## 1510        Merryville           LA          70653 337-825-8616         B
## 1511        Merryville           LA     70653-3021 337-825-2858         W
## 1512        Merryville           LA          70653 337-401-0723         W
## 1513          Gibsland           LA          71028 318-843-6557         W
## 1514                                                                     
## 1515                                                                     
## 1516                                                                     
## 1517                                                                     
## 1518                                                                     
## 1519                                                                     
## 1520                                                                     
## 1521           Arcadia           LA     71001-5220 318-263-2129         W
## 1522                                                                     
## 1523                                                                     
## 1524                                                                     
## 1525                                                                     
## 1526                                                                     
## 1527                                                                     
## 1528                                                                     
## 1529         Jamestown           LA          71045 318-894-5418         W
## 1530           Arcadia           LA     71001-0746 318-263-2123         W
## 1531           Arcadia           LA     71001-3039 318-263-9748         W
## 1532           Arcadia           LA     71001-4133 318-263-8389         W
## 1533           Arcadia           LA     71001-5220 318-263-9317         W
## 1534           Arcadia           LA          71001 318-263-8341         B
## 1535          Gibsland           LA     71028-4587 318-843-2299         B
## 1536          Ringgold           LA     71068-2818 318-894-3125         W
## 1537          Ringgold           LA     71068-3117 000-000-0000         W
## 1538            Castor           LA     71016-4425 318-544-2345         W
## 1539            Saline           LA     71070-2323 318-259-2830         B
## 1540           Arcadia           LA     71001-3516 318-263-8932         W
## 1541           Arcadia           LA     71001-5603 318-263-2193         B
## 1542          Gibsland           LA          71028 318-843-6077         B
## 1543          Ringgold           LA     71068-3238 318-894-9594         B
## 1544          Ringgold           LA     71068-2630 318-894-9479         W
## 1545            Saline           LA          71070 318-576-3675         W
## 1546         Bienville           LA     71008-2631 000-000-0000         B
## 1547           Arcadia           LA          71001 318-263-3735         B
## 1548          Gibsland           LA          71028 318-268-0794         B
## 1549         Jamestown           LA     71045-4103 318-544-2542         W
## 1550         Jamestown           LA          71045 318-894-3309         W
## 1551           Quitman           LA          71268 318-259-8254         W
## 1552           Arcadia           LA          71001 318-263-8648         B
## 1553          Gibsland           LA          71028 251-472-5758         B
## 1554            Castor           LA     71016-4262 318-455-0974         W
## 1555          Ringgold           LA          71068 318-894-3020         W
## 1556         Bienville           LA          71008 318-385-9926         W
## 1557           Arcadia           LA     71001-3903 318-263-8457         W
## 1558          Gibsland           LA          71028 318-843-6461         B
## 1559          Gibsland           LA          71028 318-843-6991         W
## 1560          Ringgold           LA          71068 000-000-0000         B
## 1561         Bienville           LA          71008 318-385-7562         W
## 1562         Bryceland           LA     71008-2661 318-263-2439         W
## 1563            Castor           LA     71016-4003 318-544-8723         W
## 1564         Jamestown           LA          71045 318-894-9213         W
## 1565         Bienville           LA     71008-2829 318-576-8891         B
## 1566            Saline           LA     71070-2447 318-576-3880         W
## 1567           Arcadia           LA     71001-2546 318-263-8476         B
## 1568          Gibsland           LA          71028 318-843-6153         B
## 1569          Ringgold           LA          71068 318-894-4699          
## 1570         Bienville           LA     71008-2837 318-576-3643         B
## 1571            Saline           LA          71070 318-576-8743         W
## 1572          Gibsland           LA     71028-4429 318-843-6270         B
## 1573          Gibsland           LA          71028 318-843-3688         B
## 1574          Gibsland           LA          71028 318-843-9712         B
## 1575          Gibsland           LA          71028 318-843-6922         B
## 1576          Gibsland           LA          71028 318-843-6476         W
## 1577          Gibsland           LA     71028-4532 318-843-6844         W
## 1578          Gibsland           LA          71028 318-843-6658         W
## 1579          Gibsland           LA     71028-4527 318-843-6625         W
## 1580          Gibsland           LA     71028-4524 318-843-9275         W
## 1581         Bienville           LA          71008 318-385-9205         B
## 1582         Bienville           LA          71008 318-385-7761         B
## 1583         Bienville           LA     71008-6213 318-385-7522         W
## 1584          Gibsland           LA     71028-4656 318-263-8262         W
## 1585          Gibsland           LA     71028-4705 318-263-2256         W
## 1586          Gibsland           LA     71028-4654 000-000-0000         B
## 1587            Castor           LA     71016-4001 318-544-8646         W
## 1588            Castor           LA     71016-4043 318-544-8454         W
## 1589            Castor           LA          71016 318-544-9036         W
## 1590         Jamestown           LA     71045-4238 318-894-8713         W
## 1591         Jamestown           LA          71045 318-894-9213         W
## 1592         Jamestown           LA          71045 318-000-0000         W
## 1593            Saline           LA          71070 318-576-3348         B
## 1594            Castor           LA     71016-4032 000-000-0000         B
## 1595            Castor           LA     71016-4050 318-576-9061         B
## 1596            Saline           LA          71070 318-576-8743         W
## 1597            Saline           LA          71070 318-576-8743         W
## 1598            Saline           LA          71070 318-576-3272         B
## 1599            Saline           LA          71070 318-576-3287         W
## 1600            Saline           LA     71070-2496 318-576-3900         W
## 1601           Arcadia           LA     71001-2518 000-000-0000         B
## 1602           Arcadia           LA     71001-6830 318-263-8341         B
## 1603           Arcadia           LA     71001-4304 318-263-8221         W
## 1604           Arcadia           LA     71001-6552 318-263-2140         B
## 1605           Arcadia           LA     71001-6629 318-263-8080         W
## 1606          Ringgold           LA          71068 318-465-0638         B
## 1607          Ringgold           LA     71068-2870 318-894-7919         W
## 1608          Ringgold           LA          71068 318-894-4522         W
## 1609          Ringgold           LA          71068 318-894-9414         B
## 1610          Ringgold           LA     71068-2850 318-894-9855         W
## 1611      Bossier City           LA     71112-4268 318-230-5678         B
## 1612                                                                     
## 1613                                                                     
## 1614                                                                     
## 1615                                                                     
## 1616                                                                     
## 1617                                                                     
## 1618                                                                     
## 1619                                                                     
## 1620                                                                     
## 1621                                                                     
## 1622                                                                     
## 1623                                                                     
## 1624          Haughton           LA     71037-9394 318-949-4517         W
## 1625            Benton           LA     71006-3464 318-965-4925         W
## 1626            Benton           LA          71006 318-965-4500         W
## 1627            Benton           LA     71006-9707 318-572-8613         W
## 1628      Bossier City           LA     71111-5142 318-747-7466         W
## 1629                                                                     
## 1630                                                                     
## 1631            Benton           LA     71006-4324 318-965-4321         W
## 1632                                                                     
## 1633      Bossier City           LA     71111-6338 318-742-9402         W
## 1634      Bossier City           LA     71111-2278 318-741-1572         W
## 1635                                                                     
## 1636      Bossier City           LA     71111-5546 318-752-1012         W
## 1637                                                                     
## 1638                                                                     
## 1639      Bossier City           LA     71112-4346 318-742-8843         W
## 1640                                                                     
## 1641            Benton           LA     71006-8630 318-326-5972         W
## 1642            Benton           LA          71006 318-965-2336         W
## 1643            Benton           LA     71006-3464 318-965-4925         W
## 1644            Benton           LA     71006-3421 318-550-1962         W
## 1645         Elm Grove           LA     71051-8629 318-987-3337         W
## 1646          Haughton           LA     71037-8835 318-949-0851         W
## 1647            Benton           LA     71006-8445 318-965-2940         W
## 1648     Plain Dealing           LA     71064-3902 318-326-5557         W
## 1649      Bossier City           LA     71111-5570 318-746-8309         W
## 1650      Bossier City           LA     71111-2290 318-747-4185         W
## 1651      Bossier City           LA     71111-3448 318-742-8174         W
## 1652      Bossier City           LA     71111-5558 318-773-3359         W
## 1653      Bossier City           LA     71112-2318 318-752-8573         W
## 1654      Bossier City           LA     71112-3348 318-747-3489         B
## 1655      Bossier City           LA     71112-4031 318-746-6297         W
## 1656      Bossier City           LA     71112-9719 318-742-7489         W
## 1657      Bossier City           LA          71111 318-742-9404         W
## 1658      Bossier City           LA     71112-9705 318-746-0184         W
## 1659          Haughton           LA     71037-8949 318-949-3675         W
## 1660          Haughton           LA          71037 318-949-6680         W
## 1661            Benton           LA     71006-8302 318-742-9852         W
## 1662            Benton           LA     71006-9319 318-965-9839         W
## 1663      Bossier City           LA     71111-5744 318-489-8100         W
## 1664      Bossier City           LA     71111-2087 318-752-1371         W
## 1665      Bossier City           LA     71111-3448 318-746-5752         W
## 1666      Bossier City           LA     71111-3018 318-742-0251         B
## 1667      Bossier City           LA     71112-2024 318-746-7530         W
## 1668      Bossier City           LA     71112-3151 318-453-6864         B
## 1669      Bossier City           LA     71112-4142 318-746-2690         W
## 1670      Bossier City           LA     71112-8610 903-781-0933         W
## 1671      Bossier City           LA          71112 318-746-4526         W
## 1672     Plain Dealing           LA          71064 318-423-2368         W
## 1673     Plain Dealing           LA     71064-3546 318-326-4117         W
## 1674     Plain Dealing           LA          71064 318-326-5120         W
## 1675            Benton           LA          71006 318-965-0011         W
## 1676          Haughton           LA          71037 318-949-2581         W
## 1677         Princeton           LA          71067 318-949-3692         W
## 1678      Bossier City           LA          71112 318-286-5542          
## 1679     Plain Dealing           LA          71064 318-326-5659         W
## 1680     Plain Dealing           LA          71064 318-326-5463         W
## 1681     Plain Dealing           LA          71064 318-326-4049         W
## 1682            Benton           LA          71006 318-423-4875          
## 1683          Haughton           LA          71037 319-949-0322         W
## 1684         Princeton           LA          71067 318-949-0862          
## 1685      Bossier City           LA          71111 318-742-7123         W
## 1686      Bossier City           LA     71111-8211 318-742-7123         W
## 1687            Benton           LA     71006-8905 318-965-0089         W
## 1688          Haughton           LA     71037-9450 318-949-9194         W
## 1689     Plain Dealing           LA          71064 318-464-2091         W
## 1690            Benton           LA     71006-9537 318-965-2678         W
## 1691          Haughton           LA          71037 318-949-4854         W
## 1692     Plain Dealing           LA     71064-9202 318-423-5050         W
## 1693      Bossier City           LA     71111-5475 318-425-2300         W
## 1694      Bossier City           LA          71111 318-425-2300         W
## 1695      Bossier City           LA          71111 318-747-9886         W
## 1696      Bossier City           LA     71111-8123 318-424-1414         W
## 1697     Plain Dealing           LA     71064-4252 318-326-4696         W
## 1698     Plain Dealing           LA     71064-4275 318-326-4679         W
## 1699     Plain Dealing           LA     71064-4216 318-286-2045         W
## 1700            Benton           LA     71006-8333 318-965-0710         B
## 1701            Benton           LA          71006 318-965-1333         B
## 1702          Haughton           LA          71037 318-949-0018         W
## 1703          Haughton           LA     71037-9002 318-949-3663         W
## 1704          Haughton           LA          71037 318-949-0224         W
## 1705          Haughton           LA     71037-8926 318-949-8676         B
## 1706     Plain Dealing           LA     71064-0090 318-455-2189         W
## 1707     Plain Dealing           LA     71064-3546 318-326-4289         W
## 1708      Bossier City           LA          71112 318-742-2190         W
## 1709      Bossier City           LA     71112-3151 318-742-6908         B
## 1710      Bossier City           LA          71112 318-742-6908         B
## 1711      Bossier City           LA          71112 318-747-5320         W
## 1712      Bossier City           LA     71112-2073 318-747-5320         W
## 1713      Bossier City           LA     71111-8171 318-349-7445         W
## 1714      Bossier City           LA          71111 318-752-1944         W
## 1715      Bossier City           LA     71111-2212 318-746-7833         W
## 1716        Shreveport           LA     71109-1724 318-635-2820         B
## 1717        Shreveport           LA     71106-7775 318-798-3124         B
## 1718        Shreveport           LA     71109-4505 318-635-3851         B
## 1719        Shreveport           LA     71119-5002 318-636-1555         B
## 1720        Shreveport           LA     71109-6845 318-773-8281         B
## 1721        Shreveport           LA          71101 318-929-7360         W
## 1722        Shreveport           LA     71107-9358 318-218-0778         B
## 1723        Shreveport           LA     71107-3801 318-221-5957         B
## 1724        Shreveport           LA     71104-4209 318-869-0355         W
## 1725        Shreveport           LA     71109-3015 318-635-8335         B
## 1726        Shreveport           LA     71106-6332 318-347-5421         B
## 1727        Shreveport           LA     71166-1928 318-828-0726         B
## 1728        Shreveport           LA     71105-3304 318-347-8532         W
## 1729        Shreveport           LA     71106-8521 318-797-7711         O
## 1730                                                                     
## 1731        Keithville           LA     71047-7380 318-218-5691         B
## 1732         Greenwood           LA     71033-3339 318-938-5530         B
## 1733        Shreveport           LA     71105-4829 318-868-1212         W
## 1734        Shreveport           LA     71118-4016 318-564-3961         W
## 1735        Shreveport           LA     71105-5719 318-423-1508         W
## 1736        Shreveport           LA     71105-2015 318-868-3464         W
## 1737        Shreveport           LA     71115-2501 318-797-6184         W
## 1738        Shreveport           LA     71107-8417 318-227-2719         W
## 1739        Shreveport           LA     71107-2314 318-458-1637         W
## 1740                                                                     
## 1741        Shreveport           LA     71104-4429 318-868-0225         W
## 1742                                                                     
## 1743                                                                     
## 1744                                                                     
## 1745        Shreveport           LA          71135 318-841-1277         W
## 1746        Shreveport           LA     71105-5007 318-797-4761         W
## 1747        Shreveport           LA     71118-3910 318-688-0742         W
## 1748                                                                     
## 1749        Shreveport           LA     71119-5403 318-207-0405         W
## 1750        Shreveport           LA          71135 318-213-8300         B
## 1751        Shreveport           LA     71106-8223 318-797-5919          
## 1752        Shreveport           LA     71105-3136 318-861-4277          
## 1753        Shreveport           LA     71107-8997 318-678-8222         W
## 1754        Shreveport           LA     71110-5408 318-629-1105         W
## 1755        Shreveport           LA     71105-3422 318-226-6711         W
## 1756        Shreveport           LA     71115-2903 318-458-1776         W
## 1757            Vivian           LA     71082-3206 318-375-2356         W
## 1758        Shreveport           LA     71107-9358 318-218-0778         B
## 1759        Shreveport           LA     71103-2629 318-294-0508         B
## 1760        Shreveport           LA     71104-4333 318-402-1132          
## 1761        Shreveport           LA     71109-3327 318-635-6379         B
## 1762        Shreveport           LA     71106-5009 318-868-8340         B
## 1763        Shreveport           LA     71109-6644 318-517-9250         B
## 1764        Shreveport           LA     71106-6001 318-272-2143         W
## 1765        Shreveport           LA     71105-5602 318-797-6511         W
## 1766        Shreveport           LA     71118-2623 318-393-7660         W
## 1767        Shreveport           LA     71118-4709 318-686-7147         W
## 1768        Shreveport           LA     71119-6908 318-631-2581         B
## 1769        Shreveport           LA     71107-9260 318-929-2065          
## 1770        Shreveport           LA     71107-6028 318-703-6251         B
## 1771        Shreveport           LA     71101-2140 318-222-0132         B
## 1772        Shreveport           LA     71106-1523 318-470-7851         W
## 1773        Shreveport           LA     71109-2232 318-423-1582         B
## 1774        Shreveport           LA     71106-4903 318-219-3382         B
## 1775        Shreveport           LA     71109-3015 318-635-8335         B
## 1776        Shreveport           LA     71105-3040 318-868-3684         W
## 1777        Shreveport           LA     71115-2501 318-797-6184         W
## 1778        Shreveport           LA     71118-2723 318-686-7611         W
## 1779        Shreveport           LA     71118-4624 318-688-0676         W
## 1780        Shreveport           LA     71119-8866 318-218-7398         B
## 1781           Belcher           LA          71004 318-378-4530         W
## 1782          Oil City           LA     71061-9704 318-995-0403         W
## 1783            Vivian           LA     71082-8563 318-375-3158          
## 1784        Shreveport           LA     71107-9413 318-929-2083          
## 1785         Greenwood           LA          71033 318-938-1896         W
## 1786        Shreveport           LA     71129-9740 318-925-2286         W
## 1787        Shreveport           LA          71118 318-458-4834         W
## 1788        Shreveport           LA          71105 318-869-4267         W
## 1789               Ida           LA          71044 318-284-3528         W
## 1790        Shreveport           LA     71107-9131 318-309-0504         W
## 1791           Gilliam           LA          71029 318-296-4441         W
## 1792          Oil City           LA          71061 318-995-0403         W
## 1793          Oil City           LA          71061 318-995-6438         W
## 1794        Shreveport           LA     71107-9552 318-929-3720         W
## 1795      Mooringsport           LA     71060-0475 318-996-7523         W
## 1796         Greenwood           LA     71033-2975 318-453-5916         W
## 1797        Keithville           LA     71047-7551 318-925-2719         W
## 1798        Keithville           LA     71047-7317 318-925-2209         W
## 1799        Shreveport           LA          71136 318-866-9577         W
## 1800           Rodessa           LA     71069-0312 318-223-4302         W
## 1801         Blanchard           LA          71009 318-929-2020         W
## 1802         Greenwood           LA     71033-3348 318-938-1767         W
## 1803      Mooringsport           LA          71060 318-996-7412         W
## 1804          Oil City           LA     71061-8715 318-773-2418         W
## 1805            Vivian           LA     71082-2013 318-375-2546         W
## 1806           Belcher           LA     71004-3802 318-378-4206         W
## 1807           Gilliam           LA          71029 318-296-4393         W
## 1808           Hosston           LA          71043 318-773-3235         W
## 1809               Ida           LA     71044-8601 318-284-3820         W
## 1810           Rodessa           LA     71069-9173 318-464-1476         W
## 1811         Blanchard           LA          71107 318-929-7955         W
## 1812      Mooringsport           LA     71060-9603 318-996-0801         W
## 1813            Vivian           LA          71082 318-780-9023         B
## 1814           Belcher           LA     71004-3802 318-378-4206         W
## 1815           Gilliam           LA          71029 318-455-5646         W
## 1816           Hosston           LA          71043 318-617-2814         W
## 1817               Ida           LA          71044 318-284-3291         W
## 1818         Greenwood           LA     71033-3304 318-938-8936         W
## 1819            Vivian           LA     71082-2011 318-458-0350         W
## 1820      Mooringsport           LA          71060 318-532-9591         W
## 1821      Mooringsport           LA     71060-0313 318-996-7289         W
## 1822          Oil City           LA     71061-8667 318-773-8871         W
## 1823          Oil City           LA          71061 318-995-0037          
## 1824          Oil City           LA          71061 318-995-5396         B
## 1825          Oil City           LA          71061 318-995-7356         W
## 1826          Oil City           LA          71061 318-995-7325         W
## 1827         Greenwood           LA     71033-2315 318-938-7677         W
## 1828         Greenwood           LA     71033-3215 318-891-8154         W
## 1829         Greenwood           LA     71033-3340 318-938-7816         W
## 1830         Greenwood           LA     71033-3370 318-938-9777         W
## 1831        Shreveport           LA          71107 318-929-7368         W
## 1832         Blanchard           LA     71107-8606 318-929-7360         W
## 1833         Blanchard           LA          71009 318-929-4518         W
## 1834         Blanchard           LA     71107-9188 318-929-9272         W
## 1835        Shreveport           LA     71107-3440 318-929-1455         W
## 1836           Belcher           LA     71004-3802 318-378-4342         W
## 1837           Belcher           LA          71004 318-378-4345         W
## 1838           Belcher           LA          71004 318-378-4376         W
## 1839           Gilliam           LA          71029 318-296-4381         W
## 1840           Gilliam           LA          71029 318-296-4303         W
## 1841           Gilliam           LA          71029 318-296-4447         W
## 1842           Hosston           LA          71043 318-287-3399         W
## 1843           Hosston           LA     71043-9358 318-287-3972         W
## 1844           Hosston           LA          71043 318-287-3366         W
## 1845               Ida           LA          71044 318-284-3325         W
## 1846               Ida           LA     71044-8835 318-402-3113         W
## 1847               Ida           LA          71044 318-284-3880         W
## 1848           Rodessa           LA     71069-9317 903-824-8802         O
## 1849           Rodessa           LA     71069-9165 318-529-8658         W
## 1850           Rodessa           LA          71069 318-223-4444         W
## 1851            Vivian           LA     71082-2129 318-375-5948         B
## 1852            Vivian           LA     71082-9704 318-375-5203         W
## 1853            Vivian           LA     71082-3406 318-375-3717         W
## 1854            Vivian           LA     71082-3332 318-375-5730         B
## 1855      Mooringsport           LA          71060 318-996-7291         W
## 1856      Mooringsport           LA     71060-9065 318-996-7466         W
## 1857      Mooringsport           LA          71060 318-286-8738         W
## 1858      Lake Charles           LA     70611-5109 337-217-3663         B
## 1859      Lake Charles           LA     70605-4032 337-764-9946         B
## 1860      Lake Charles           LA          70602 337-936-1120         W
## 1861      Lake Charles           LA     70605-3946 337-477-2300         W
## 1862      Lake Charles           LA          70605 337-502-5164          
## 1863      Lake Charles           LA          70602 337-477-7320         W
## 1864      Lake Charles           LA          70611 337-405-8382          
## 1865      Lake Charles           LA          70601 337-912-3564          
## 1866      Lake Charles           LA          70601 337-526-0465          
## 1867                                                                     
## 1868      Lake Charles           LA     70605-2649 337-499-8856         W
## 1869                                                                     
## 1870      Lake Charles           LA          70607 337-524-7769          
## 1871      Lake Charles           LA     70605-5264 337-405-8859         B
## 1872      Lake Charles           LA          70607 337-782-2495          
## 1873                                                                     
## 1874                                                                     
## 1875                                                                     
## 1876                                                                     
## 1877                                                                     
## 1878                                                                     
## 1879      Lake Charles           LA          70606 337-304-4097         W
## 1880      Lake Charles           LA     70605-5629 337-477-0335         W
## 1881           Sulphur           LA     70663-6530 337-625-8168         W
## 1882           Sulphur           LA     70663-6535 337-626-9094         W
## 1883      Lake Charles           LA     70611-3922 337-304-3638         W
## 1884                                                                     
## 1885      Lake Charles           LA     70601-5260 337-292-5261         I
## 1886                                                                     
## 1887      Lake Charles           LA     70601-5852 337-721-0440         W
## 1888                                                                     
## 1889                                                                     
## 1890      Lake Charles           LA     70605-5985 337-474-2223         W
## 1891                                                                     
## 1892                                                                     
## 1893                                                                     
## 1894                                                                     
## 1895                                                                     
## 1896                                                                     
## 1897           Sulphur           LA          70663 443-285-9111         W
## 1898      Lake Charles           LA     70605-7900 337-477-0790         W
## 1899      Lake Charles           LA          70602 337-437-3558         W
## 1900      Lake Charles           LA     70601-8326 337-474-6729         W
## 1901      Lake Charles           LA     70605-4018 337-477-7537         W
## 1902      Lake Charles           LA     70611-4423 337-217-0209         W
## 1903      Lake Charles           LA     70601-1020 337-439-2095         B
## 1904      Lake Charles           LA     70601-1948 337-436-0318         B
## 1905      Lake Charles           LA     70601-3668 337-436-4601         B
## 1906      Lake Charles           LA     70601-8322 337-912-8110         W
## 1907      Lake Charles           LA     70605-7144 337-475-1023         W
## 1908      Lake Charles           LA     70605-4414 337-478-4020         W
## 1909      Lake Charles           LA     70605-5250 337-474-7155         W
## 1910      Lake Charles           LA     70607-3658 337-477-4367         B
## 1911              Iowa           LA          70647 337-582-3295         W
## 1912          DeQuincy           LA     70633-3053 337-786-8496         W
## 1913           Sulphur           LA     70665-8740 337-583-2450         W
## 1914           Sulphur           LA     70663-5624 337-527-5644         W
## 1915          Westlake           LA     70669-4101 337-488-4848         W
## 1916           Sulphur           LA     70663-6262 337-304-6446         W
## 1917           Sulphur           LA          70663 337-528-3532         W
## 1918      Lake Charles           LA          70605 337-491-1305         W
## 1919      Lake Charles           LA          70605 337-515-6706         W
## 1920      Lake Charles           LA          70605 337-478-8878         W
## 1921           Sulphur           LA          70663 337-527-8552         W
## 1922              Iowa           LA     70647-4117 337-436-2903         W
## 1923      Lake Charles           LA          70615 337-433-6988         B
## 1924      Lake Charles           LA     70601-4667 337-439-6905         B
## 1925      Lake Charles           LA     70605-2315 337-477-6345         W
## 1926      Lake Charles           LA     70607-5814 337-477-3961         W
## 1927      Lake Charles           LA     70605-5155 337-478-4909         W
## 1928      Lake Charles           LA     70601-8979 337-477-6019         B
## 1929      Lake Charles           LA     70605-6102 337-480-6540         W
## 1930          Westlake           LA     70669-5827 337-439-8416         W
## 1931          DeQuincy           LA          70633 337-786-2568         W
## 1932           Sulphur           LA     70665-8902 337-558-6056         W
## 1933           Sulphur           LA     70663-5918 337-527-3652         W
## 1934           Sulphur           LA     70663-3842 337-625-9861         W
## 1935      Lake Charles           LA     70607-3658 337-474-0027         B
## 1936      Lake Charles           LA     70611-5154 337-855-9598         W
## 1937      Lake Charles           LA          70611 337-855-3496         W
## 1938             Hayes           LA          70646 337-622-3417         W
## 1939            Starks           LA          70661 337-743-5318         W
## 1940          DeQuincy           LA          70633 337-274-2466         W
## 1941            Vinton           LA          70668 337-589-7844         W
## 1942              Iowa           LA          70647 337-309-0858         W
## 1943      Lake Charles           LA          70611 337-855-4065         W
## 1944             Hayes           LA          70646 337-622-3423         W
## 1945            Starks           LA          70661 337-703-6201         W
## 1946          DeQuincy           LA          70633 337-786-6061         W
## 1947            Vinton           LA          70668 337-589-3275         W
## 1948      Lake Charles           LA          70615 337-582-3411         W
## 1949          DeQuincy           LA     70633-3345 337-786-2292         W
## 1950      Lake Charles           LA     70605-6941 337-478-7763         W
## 1951      Lake Charles           LA          70605 337-478-7763         W
## 1952           Sulphur           LA     70663-5951 337-527-4484         W
## 1953          Westlake           LA     70669-3209 337-433-4478         W
## 1954              Iowa           LA     70647-3925 337-582-3698         W
## 1955            Vinton           LA     70668-4533 337-589-3962         W
## 1956            Vinton           LA          70668 337-589-3962         W
## 1957          Westlake           LA     70669-4101 337-802-6599         W
## 1958              Iowa           LA          70647 337-582-7681         W
## 1959            Vinton           LA          70668 337-589-7197         W
## 1960          DeQuincy           LA     70633-3048 337-786-4378         W
## 1961              Iowa           LA     70647-7001 337-582-6486         W
## 1962              Iowa           LA     70647-4038 337-582-6665         W
## 1963              Iowa           LA          70647 337-582-6433         B
## 1964              Iowa           LA          70647 337-582-3267         W
## 1965              Iowa           LA          70647 337-582-3217         W
## 1966          Westlake           LA     70669-4810 337-793-3683         W
## 1967          Westlake           LA     70669-5405 337-377-7472         W
## 1968          Westlake           LA     70669-4812 337-436-2632         W
## 1969          Westlake           LA     70669-4716 337-439-8519         W
## 1970          Westlake           LA     70669-2409 337-436-8961         W
## 1971          DeQunicy           LA     70633-3219 337-302-6665         W
## 1972           Sulphur           LA     70663-1324 337-528-2468         W
## 1973          DeQuincy           LA     70633-3015 337-786-2458         W
## 1974           Sulphur           LA     70663-6641 337-540-1272         W
## 1975          DeQuincy           LA     70633-3805 337-513-5810         W
## 1976           Sulphur           LA     70663-3559 337-287-4561         B
## 1977          DeQuincy           LA     70633-4134 337-786-4532         B
## 1978           Sulphur           LA     70663-5223 337-625-2558         W
## 1979           Sulphur           LA     70663-5515 337-625-5006         W
## 1980      Lake Charles           LA          70601 337-436-7895         B
## 1981      Lake Charles           LA          70601 337-439-5135         B
## 1982      Lake Charles           LA     70601-4823 337-433-4018         B
## 1983      Lake Charles           LA          70601 337-433-4018         B
## 1984      Lake Charles           LA          70601 337-433-1733         W
## 1985      Lake Charles           LA     70601-5606 337-433-1733         W
## 1986      Lake Charles           LA     70605-2518 337-540-9035         W
## 1987      Lake Charles           LA          70605 337-474-6465         W
## 1988      Lake Charles           LA          70607 337-478-3633         W
## 1989      Lake Charles           LA     70607-3706 337-478-3633         W
## 1990      Lake Charles           LA          70605 337-474-3976         W
## 1991            Vinton           LA          70668 337-589-5402         W
## 1992            Vinton           LA          70668 337-589-3905         W
## 1993            Vinton           LA          70668 337-589-4245         B
## 1994            Vinton           LA          70668 337-589-6702         W
## 1995            Vinton           LA          70668 337-589-7639         W
## 1996          Columbia           LA          71418 318-649-7335         B
## 1997          Columbia           LA          71418 318-649-2760         W
## 1998                                                                     
## 1999                                                                     
## 2000                                                                     
## 2001                                                                     
## 2002                                                                     
## 2003                                                                     
## 2004          Columbia           LA          71418 318-649-7159         W
## 2005                                                                     
## 2006                                                                     
## 2007                                                                     
## 2008                                                                     
## 2009                                                                     
## 2010                                                                     
## 2011                                                                     
## 2012          Columbia           LA          71418 318-649-5058         W
## 2013          Columbia           LA          71418 318-649-2272         W
## 2014          Columbia           LA          71418 318-649-2636         W
## 2015          Columbia           LA          71418 318-547-1693         W
## 2016          Columbia           LA          71418 318-649-5673         W
## 2017          Columbia           LA          71418 318-649-9054         W
## 2018           Grayson           LA          71435 318-649-3177         W
## 2019          Columbia           LA          71418 318-649-2767         B
## 2020          Columbia           LA          71418 318-649-2749         W
## 2021            Clarks           LA          71415 318-649-0794         W
## 2022           Grayson           LA          71435 318-649-2081         W
## 2023          Columbia           LA          71418 318-649-5027         W
## 2024          Columbia           LA          71418 318-649-2614         W
## 2025           Grayson           LA          71435 318-649-5484         W
## 2026          Columbia           LA          71418 318-348-1120         B
## 2027          Columbia           LA          71418 318-649-0856         W
## 2028            Clarks           LA          71415 318-649-6251         W
## 2029           Grayson           LA          71435 318-649-6304         W
## 2030          Columbia           LA          71418 318-649-6206         W
## 2031            Clarks           LA          71415 318-649-7974         W
## 2032          Columbia           LA          71418 318-649-0800         W
## 2033           Grayson           LA          71435 318-246-5308         W
## 2034            Clarks           LA          71415 318-649-2218         W
## 2035          Columbia           LA          71418 318-649-7389         W
## 2036           Grayson           LA          71435 318-649-5076         W
## 2037          Columbia           LA          71418 318-649-5210         W
## 2038           Grayson           LA          71435 318-649-6002         W
## 2039            Clarks           LA          71415 318-235-8950         W
## 2040            Clarks           LA          71415 318-512-5550         W
## 2041            Clarks           LA          71415 318-649-2218         W
## 2042            Clarks           LA          71415 318-649-5768         W
## 2043            Clarks           LA          71415 318-334-3285         W
## 2044           Grayson           LA          71435 318-649-2580         W
## 2045           Grayson           LA          71435 318-649-7117         W
## 2046           Grayson           LA          71435 318-649-2699         W
## 2047          Columbia           LA          71418 318-649-2829         W
## 2048          Columbia           LA          71418 318-649-7000         W
## 2049          Columbia           LA          71418 318-649-7192         W
## 2050          Columbia           LA          71418 318-649-7949         W
## 2051          Columbia           LA          71418 318-649-7335         B
## 2052      Lake Charles           LA          70607 337-912-3051         W
## 2053      Lake Charles           LA     70605-4040 337-474-3619         B
## 2054      Lake Charles           LA          70607 337-853-7133         W
## 2055                                                                     
## 2056                                                                     
## 2057                                                                     
## 2058                                                                     
## 2059                                                                     
## 2060                                                                     
## 2061                                                                     
## 2062                                                                     
## 2063                                                                     
## 2064                                                                     
## 2065                                                                     
## 2066                                                                     
## 2067                                                                     
## 2068                                                                     
## 2069                                                                     
## 2070      Lake Charles           LA     70607-8607 337-905-1141         W
## 2071           Cameron           LA          70631 337-775-5316         W
## 2072           Cameron           LA     70631-4916 337-775-5298         W
## 2073      Lake Charles           LA          70612 337-540-2242         W
## 2074         Hackberry           LA     70645-4803 337-762-4454         W
## 2075         Hackberry           LA     70645-4707 337-762-3906         W
## 2076         Bell City           LA     70630-5112 337-598-3426         W
## 2077         Bell City           LA          70630 337-598-4789         W
## 2078           Cameron           LA          70631 337-513-8240         W
## 2079        Grand Lake           LA          70607 337-905-5089         W
## 2080        Grand Lake           LA     70607-8509 337-905-1289         W
## 2081           Cameron           LA     70631-4101 337-569-2661         W
## 2082         Hackberry           LA          70645 337-230-7402         W
## 2083         Bell City           LA     70630-5119 337-905-2252         W
## 2084     Grand Chenier           LA     70643-3226 337-538-2272         W
## 2085     Grand Chenier           LA          70643 337-542-4186         W
## 2086           Cameron           LA     70631-4806 337-775-5292         W
## 2087        Grand Lake           LA     70607-8930 337-598-2230         W
## 2088       Lake Arthur           LA          70549 337-774-3248         W
## 2089     Grand Chenier           LA          70643 337-538-2369         W
## 2090                                                                     
## 2091      Lake Charles           LA          70607 337-598-2679         W
## 2092           Cameron           LA          70631 337-569-2333         W
## 2093         Hackberry           LA          70645 337-762-4626         W
## 2094       Lake Arthur           LA          70549 337-774-2923         W
## 2095     Grand Chenier           LA          70643 337-538-2272         W
## 2096           Cameron           LA          70631 337-775-5284         W
## 2097      Lake Charles           LA     70607-8511 337-661-7111         W
## 2098           Cameron           LA          70631 337-764-3651         W
## 2099         Hackberry           LA          70645 337-762-3555         W
## 2100      Harrisonburg           LA          71340 318-744-5573         W
## 2101      Harrisonburg           LA          71340 318-339-9587         W
## 2102      Harrisonburg           LA          71340 318-744-5471         W
## 2103                                                                     
## 2104                                                                     
## 2105                                                                     
## 2106                                                                     
## 2107                                                                     
## 2108                                                                     
## 2109                                                                     
## 2110                                                                     
## 2111                                                                     
## 2112      Harrisonburg           LA          71340 318-744-5431         W
## 2113                                                                     
## 2114                                                                     
## 2115                                                                     
## 2116                                                                     
## 2117                                                                     
## 2118                                                                     
## 2119                                                                     
## 2120                                                                     
## 2121                                                                     
## 2122        Jonesville           LA     71343-1438 318-339-8592         W
## 2123      Harrisonburg           LA          71340 318-744-5497         W
## 2124        Jonesville           LA     71343-6655 318-481-9702         W
## 2125        Jonesville           LA     71343-2004 318-339-6269         W
## 2126           Clayton           LA     71326-4709 318-389-5894         W
## 2127     Sicily Island           LA          71368 318-389-5912         W
## 2128           Grayson           LA          71439 318-495-3726         W
## 2129      Harrisonburg           LA          71340 318-744-5560         W
## 2130        Jonesville           LA     71343-1649 318-339-8451         W
## 2131        Jonesville           LA     71343-6376 318-339-8460         W
## 2132        Jonesville           LA     71343-3145 318-339-9218         B
## 2133        Jonesville           LA     71343-2534 318-339-9205         B
## 2134        Jonesville           LA     71343-7942 318-201-3121         W
## 2135     Sicily Island           LA     71368-4810 318-389-5911         B
## 2136     Sicily Island           LA     71368-4834 318-389-5513         W
## 2137         Rhinehart           LA          71363 318-992-2306         W
## 2138      Harrisonburg           LA          71340 318-744-5215         W
## 2139        Jonesville           LA     71343-6123 318-481-0301         W
## 2140        Jonesville           LA          71343 318-339-9513         W
## 2141        Jonesville           LA     71343-2836 318-339-4418         B
## 2142        Jonesville           LA     71343-2631 318-339-8467         B
## 2143        Jonesville           LA     71343-7610 318-339-8599         W
## 2144     Sicily Island           LA          71368 318-389-5562         W
## 2145        Jonesville           LA          71343 318-339-9924         W
## 2146        Jonesville           LA          71343 318-339-6755         W
## 2147     Sicily Island           LA          71368 318-389-6894         W
## 2148        Jonesville           LA          71343 318-339-7757         W
## 2149        Jonesville           LA     71343-7802 318-339-8625         W
## 2150        Jonesville           LA          71343 318-339-7374         B
## 2151      Harrisonburg           LA     71340-1601 318-744-5613         W
## 2152     Sicily Island           LA          71368 318-403-2194         B
## 2153      Harrisonburg           LA          71340 318-744-6701         B
## 2154        Jonesville           LA     71343-2533 318-339-9218         B
## 2155        Jonesville           LA     71343-2762 318-339-7785         W
## 2156        Jonesville           LA     71343-3127 318-403-2103         B
## 2157        Jonesville           LA     71343-2835 318-339-4913         B
## 2158        Jonesville           LA     71343-3022 318-339-4673         B
## 2159      Harrisonburg           LA          71340 318-744-9218         B
## 2160      Harrisonburg           LA          71340 318-744-9668         W
## 2161      Harrisonburg           LA          71340 318-744-5547         W
## 2162     Sicily Island           LA          71368 318-389-0040         B
## 2163     Sicily Island           LA          71368 318-389-4011         B
## 2164     Sicily Island           LA          71368 318-389-4470         W
## 2165       Haynesville           LA     71038-7585 318-433-1058         W
## 2166             Homer           LA     71040-3910 318-927-2566         W
## 2167                                                                     
## 2168                                                                     
## 2169                                                                     
## 2170                                                                     
## 2171                                                                     
## 2172                                                                     
## 2173                                                                     
## 2174                                                                     
## 2175                                                                     
## 2176                                                                     
## 2177       Haynesville           LA     71038-7134 318-927-3901         W
## 2178                                                                     
## 2179                                                                     
## 2180                                                                     
## 2181                                                                     
## 2182                                                                     
## 2183                                                                     
## 2184                                                                     
## 2185                                                                     
## 2186                                                                     
## 2187                                                                     
## 2188             Homer           LA     71040-3704 318-927-9339         W
## 2189             Homer           LA     71040-3206 318-927-9601         W
## 2190             Homer           LA     71040-7421 318-927-6063         W
## 2191             Homer           LA     71040-3715 318-927-3571         W
## 2192           Bernice           LA     71222-3409 318-285-7590         W
## 2193       Haynesville           LA     71038-6442 318-624-1126         W
## 2194       Haynesville           LA     71038-7428 318-624-0634         W
## 2195       Haynesville           LA     71038-5419 318-624-1845         B
## 2196            Athens           LA     71003-3062 318-258-3092         W
## 2197            Athens           LA     71003-3213 318-263-2544         W
## 2198             Homer           LA     71040-3813 318-927-6672         W
## 2199             Homer           LA     71040-7536 318-927-4932         B
## 2200             Homer           LA     71040-8001 318-927-5456         W
## 2201             Homer           LA     71040-4346 318-927-6218         B
## 2202           Bernice           LA     71222-3208 318-285-7333         W
## 2203       Haynesville           LA     71038-6435 318-624-0373         W
## 2204       Haynesville           LA     71038-7429 318-624-1606         W
## 2205       Haynesville           LA     71038-5520 318-624-2151         B
## 2206             Homer           LA          71040 318-258-5954         W
## 2207            Athens           LA     71003-3214 318-263-2585         W
## 2208             Homer           LA          71040 318-927-1060         B
## 2209             Homer           LA     71040-7551 318-927-9905         B
## 2210             Homer           LA     71040-8613 318-927-6924         W
## 2211             Homer           LA     71040-4332 318-927-9230         B
## 2212       Haynesville           LA          71038 318-624-0057         W
## 2213             Homer           LA          71040 318-927-2149         W
## 2214           Bernice           LA          71222 318-353-6808         W
## 2215             Homer           LA          71040 318-927-3965         B
## 2216             Homer           LA          71040 318-927-3796         W
## 2217             Homer           LA          71040 318-353-6553         W
## 2218       Haynesville           LA          71038 318-624-2468         B
## 2219             Homer           LA     71040-4009 318-927-1994         B
## 2220            Athens           LA          71003 318-258-4783         W
## 2221            Lisbon           LA     71048-0235 318-353-6114         W
## 2222       Haynesville           LA          71038 318-624-2628         B
## 2223            Athens           LA     71003-3073 318-258-5811         W
## 2224             Homer           LA     71040-3831 318-245-2149         W
## 2225            Athens           LA     71003-3095 318-258-3067         W
## 2226            Athens           LA     71003-3000 318-258-3489         B
## 2227             Homer           LA          71040 318-258-4771         W
## 2228             Homer           LA     71040-6853 318-353-6530         W
## 2229            Lisbon           LA          71048 318-353-6647         W
## 2230             Homer           LA     71040-8455 318-353-2116         W
## 2231       Haynesville           LA          71038 318-624-0778         B
## 2232       Haynesville           LA          71038 318-624-0515         W
## 2233       Haynesville           LA          71038 318-624-3085         B
## 2234       Haynesville           LA          71038 318-624-9154         W
## 2235       Haynesville           LA          71038 318-624-2221         W
## 2236             Homer           LA          71040 318-927-2319         B
## 2237             Homer           LA     71040-4315 318-918-3059         B
## 2238             Homer           LA     71040-3015 318-245-2921         W
## 2239             Homer           LA     71040-3219 318-927-2426         W
## 2240             Homer           LA     71040-3527 318-927-9537         B
## 2241           Vidalia           LA          71373 318-336-7980         W
## 2242                                                                     
## 2243          Ferriday           LA          71334 318-758-6553         W
## 2244                                                                     
## 2245                                                                     
## 2246                                                                     
## 2247                                                                     
## 2248                                                                     
## 2249                                                                     
## 2250          Monterey           LA          71354 318-386-7681         W
## 2251                                                                     
## 2252                                                                     
## 2253          Ferriday           LA          71334 318-757-3904         W
## 2254                                                                     
## 2255                                                                     
## 2256           Vidalia           LA     71373-3702 318-481-5632         W
## 2257          Ferriday           LA     71334-2004 318-757-6625         W
## 2258                                                                     
## 2259                                                                     
## 2260                                                                     
## 2261          Ferriday           LA     71334-4068 318-757-2772         W
## 2262           Vidalia           LA          71334 318-336-4204         W
## 2263           Vidalia           LA     71373-3719 318-336-7683         W
## 2264          Ferriday           LA     71334-3822 318-757-2008         W
## 2265          Ferriday           LA          71334 318-757-2251         B
## 2266           Clayton           LA          71326 318-719-9550         B
## 2267           Vidalia           LA     71373-3725 318-719-4002         B
## 2268           Vidalia           LA     71373-2664 601-431-4697         W
## 2269           Vidalia           LA     71373-3717 318-336-9267         W
## 2270          Ferriday           LA     71334-5400 318-757-0881         W
## 2271          Ferriday           LA     71334-3820 318-757-4671         W
## 2272        Jonesville           LA     71343-5441 318-339-8892         W
## 2273          Monterey           LA     71354-4220 318-386-2802         W
## 2274           Vidalia           LA     71373-2678 318-336-7668         W
## 2275           Vidalia           LA     71373-3822 318-336-7769         W
## 2276          Ferriday           LA     71334-3008 318-757-2300         B
## 2277           Clayton           LA          71326 318-757-6352         B
## 2278           Vidalia           LA     71373-3916 318-336-8070         B
## 2279           Vidalia           LA     71373-2626 318-336-5564         W
## 2280           Vidalia           LA     71373-3706 318-336-7723         W
## 2281          Ferriday           LA          71334 318-757-1072         B
## 2282          Ferriday           LA     71334-3823 318-757-6806         W
## 2283          Ferriday           LA     71334-4128 318-757-4738         W
## 2284          Monterey           LA     71354-4609 318-758-1131         W
## 2285          Ferriday           LA     71334-4437 318-757-2498         W
## 2286           Vidalia           LA     71373-4412 318-336-6134         B
## 2287           Vidalia           LA          71373 318-336-5803         W
## 2288          Ferriday           LA          71334 318-757-7613         W
## 2289          Ferriday           LA          71334 318-757-8977         W
## 2290              Acme           LA     71316-5034 318-729-2341         W
## 2291          Ferriday           LA          71334 318-757-2714         B
## 2292           Vidalia           LA          71373 318-336-9063         B
## 2293           Vidalia           LA          71373 318-336-5988         W
## 2294        Ridgecrest           LA          71334 318-757-1800         W
## 2295          Ferriday           LA          71373 318-757-2526         W
## 2296          Monterey           LA          71354 318-386-2649         W
## 2297           Clayton           LA          71326 318-719-0065         B
## 2298          Ferriday           LA          71334 318-757-2741         B
## 2299        Ridgecrest           LA     71334-3613 318-757-1325         W
## 2300           Vidalia           LA     71373-2629 318-336-7341         W
## 2301           Clayton           LA          71326 318-719-5757         B
## 2302        Ridgecrest           LA     71334-3607 318-757-6498         W
## 2303           Vidalia           LA     71373-3035 318-336-9671         B
## 2304           Vidalia           LA     71373-4080 601-870-8863         B
## 2305           Vidalia           LA     71373-2656 318-336-7057         W
## 2306           Vidalia           LA     71373-3005 318-336-5976         W
## 2307           Vidalia           LA     71373-2664 318-336-8676         W
## 2308           Vidalia           LA          71373 601-431-9998         W
## 2309          Ferriday           LA     71334-3905 318-201-0421         W
## 2310          Ferriday           LA     71334-2422 318-880-1398         B
## 2311          Ferriday           LA     71334-3243 318-757-8840         B
## 2312          Ferriday           LA     71334-3148 318-757-2311         B
## 2313          Ferriday           LA          71334 318-757-1624         B
## 2314           Clayton           LA          71326 318-267-5393         B
## 2315           Clayton           LA          71326 318-757-3507         B
## 2316           Clayton           LA          71326 318-884-2206         B
## 2317           Clayton           LA          71326 318-719-5141         B
## 2318           Clayton           LA          71326 318-719-1630         B
## 2319        Ridgecrest           LA     71334-3654 318-757-2623         W
## 2320        Ridgecrest           LA     71334-3621 318-757-2982         W
## 2321        Ridgecrest           LA     71334-3607 318-451-3054         B
## 2322        Ridgecrest           LA     71334-3640 318-757-9259         W
## 2323        Ridgecrest           LA     71334-3664 318-719-5049         W
## 2324        Logansport           LA          71049 936-572-6924         W
## 2325         Mansfield           LA          71052 318-393-3061         B
## 2326                                                                     
## 2327                                                                     
## 2328                                                                     
## 2329                                                                     
## 2330                                                                     
## 2331         Mansfield           LA     71052-6504 318-872-1400         B
## 2332         Mnasfield           LA          71052 318-871-2004         B
## 2333                                                                     
## 2334         Mansfield           LA          71052 318-567-2995         W
## 2335                                                                     
## 2336                                                                     
## 2337                                                                     
## 2338                                                                     
## 2339                                                                     
## 2340                                                                     
## 2341                                                                     
## 2342                                                                     
## 2343                                                                     
## 2344                                                                     
## 2345                                                                     
## 2346         Mansfield           LA     71052-5339 318-872-4707         W
## 2347                                                                     
## 2348                                                                     
## 2349         Stonewall           LA     71078-9389 318-925-4472         W
## 2350         Mansfield           LA          71052 318-872-3110         W
## 2351        Logansport           LA     71049-2068 318-697-5986         W
## 2352         Mansfield           LA     71052-3018 318-872-5786         W
## 2353          Keatchie           LA     71046-0147 318-933-5741         W
## 2354        Logansport           LA     71049-5203 318-697-2767         W
## 2355         Mansfield           LA          71052 318-453-3448         W
## 2356         Stonewall           LA     71078-9504 318-925-9362         W
## 2357         Stonewall           LA     71078-9111 318-925-9872         W
## 2358         Mansfield           LA     71052-6504 318-918-8709         B
## 2359         Mansfield           LA     71052-1053 318-872-6564         W
## 2360         Mansfield           LA     71052-4778 318-872-3358         B
## 2361         Mansfield           LA     71052-4126 318-872-2927         B
## 2362          Frierson           LA     71027-2118 318-797-8807         W
## 2363           Pelican           LA          71063 318-755-2862         W
## 2364           Gloster           LA          71030 318-933-5275         W
## 2365         Stonewall           LA     71078-9395 318-925-8825         W
## 2366        Grand Cane           LA     71032-6150 318-872-4767         B
## 2367         Mansfield           LA     71052-2152 318-872-3533         W
## 2368           Pelican           LA     71063-3257 318-796-2547         B
## 2369        Logansport           LA     71049-2134 318-697-2698         W
## 2370        Logansport           LA          71049 318-697-5193         W
## 2371           Gloster           LA     71030-3265 318-925-6052         W
## 2372         Mansfield           LA     71052-2904 318-872-3524         W
## 2373         Mansfield           LA          71052                       
## 2374         Mansfield           LA     71052-5761 318-272-1101         B
## 2375        Logansport           LA          71049 318-697-5707         W
## 2376         Stonewall           LA          71078 318-925-0569         W
## 2377         Mansfield           LA          71052 318-697-2361         W
## 2378         Mansfield           LA          71052 318-872-3291         B
## 2379                                                                     
## 2380        Logansport           LA          71049 318-697-5485         W
## 2381        Logansport           LA     71049-3219 318-697-5852         W
## 2382           Gloster           LA          71030 318-925-1240         W
## 2383         Mansfield           LA          71052 318-697-4731         W
## 2384         Mansfield           LA          71052 318-872-4239         W
## 2385         Mansfield           LA          71052 318-872-4794         W
## 2386        Logansport           LA          71049 318-697-5438         W
## 2387         Mansfield           LA     71052-2617 318-872-6527         B
## 2388            Keachi           LA          71046 318-933-8371         W
## 2389        Logansport           LA     71049-0819 318-697-4459         W
## 2390         Stonewall           LA     71078-9698 318-925-6688         W
## 2391        Grand Cane           LA          71032 318-858-2295         W
## 2392        Longstreet           LA     71050-2233 318-697-4089         W
## 2393         Mansfield           LA     71052-5629 318-872-1610         B
## 2394         Mansfield           LA          71052 318-453-3438         W
## 2395         Mansfield           LA     71052-6060 318-697-4435         W
## 2396         Stonewall           LA     71078-9605 318-458-5999         W
## 2397         Mansfield           LA          71052 318-872-3423         W
## 2398         Mansfield           LA     71052-6103 318-871-4815         W
## 2399         Mansfield           LA     71052-2925 318-872-4428         W
## 2400         Mansfield           LA     71052-2037 318-773-1111         W
## 2401         Mansfield           LA     71052-5013 318-872-0726         B
## 2402         Mansfield           LA     71052-2615 318-871-4806         B
## 2403         Mansfield           LA          71052                       
## 2404        Grand Cane           LA          71032 318-858-2441         W
## 2405        Grand Cane           LA          71032 000-000-0000         W
## 2406        Grand Cane           LA     71032-5165 318-858-6346         W
## 2407         Mansfield           LA     71052-5700 318-872-0852         B
## 2408         Mansfield           LA     71052-5719 318-872-1792         B
## 2409         Mansfield           LA     71052-5703 318-918-8711         B
## 2410         Mansfield           LA     71052-6110 318-697-4768         W
## 2411         Mansfield           LA          71052 318-697-4768         W
## 2412        Logansport           LA          71049 318-697-2551         W
## 2413        Logansport           LA     71049-2203 318-697-2551         W
## 2414         Mansfield           LA          71052 318-697-2792         W
## 2415         Mansfield           LA     71052-6109 318-697-2792         W
## 2416        Logansport           LA     71049-0425 318-697-5873         W
## 2417        Logansport           LA          71049 318-697-5782         W
## 2418        Logansport           LA     71049-0756 318-697-5534         W
## 2419        Logansport           LA     71049-3028 318-697-5484         W
## 2420        Logansport           LA     71049-0504 318-697-5085         B
## 2421         Stonewall           LA     71078-8240 318-925-9453         W
## 2422         Stonewall           LA     71078-9560 318-347-4811         W
## 2423         Stonewall           LA     71078-8328 318-925-0702         W
## 2424         Stonewall           LA     71078-9560 318-925-9943         W
## 2425         Stonewall           LA     71078-2804 318-925-3370         W
## 2426        Logansport           LA     71049-2465 318-697-5881         W
## 2427        Logansport           LA     71049-2465 318-697-2627         W
## 2428          Keatchie           LA     71046-2863 318-697-2880         B
## 2429          Keatchie           LA          71046 318-933-5729         W
## 2430          Keatchie           LA     71046-2578 318-933-5309         W
## 2431          Keatchie           LA          71046 318-933-5794         B
## 2432          Keatchie           LA     71046-3050 318-933-2226         W
## 2433          Keatchie           LA     71046-2560 318-779-7332         W
## 2434       Baton Rouge           LA     70806-4645 337-794-8873         W
## 2435       Baton Rouge           LA     70808-6834 225-389-6711         W
## 2436       Baton Rouge           LA     70802-6327 225-819-7309         B
## 2437       Baton Rouge           LA          70811 225-916-1840         W
## 2438       Baton Rouge           LA     70802-2511 225-383-0822         B
## 2439           Zachary           LA          70791 225-654-5844         B
## 2440             Baker           LA     70714-4654 225-775-6773         B
## 2441       Baton Rouge           LA          70810 225-610-9976         W
## 2442       Baton Rouge           LA     70814-7021 225-312-3238         B
## 2443       Baton Rouge           LA     70811-5961 225-357-0864         B
## 2444       Baton Rouge           LA     70806-2960 225-929-9711         B
## 2445       Baton Rouge           LA     70805-3720 225-328-4227         B
## 2446       Baton Rouge           LA     70816-8988 225-276-2998         B
## 2447       Baton Rouge           LA     70817-2031 225-268-1351         B
## 2448       Baton Rouge           LA     70802-6308 225-343-1057         B
## 2449       Baton Rouge           LA     70806-7703 225-928-9135         W
## 2450       Baton Rouge           LA     70808-6070 225-346-8716         B
## 2451       Baton Rouge           LA     70802-4641 225-344-2374         W
## 2452       Baton Rouge           LA     70816-4610 225-229-9693         W
## 2453       Baton Rouge           LA     70806-1807 225-921-1433         W
## 2454       Baton Rouge           LA          70810 225-978-1455         W
## 2455       Baton Rouge           LA     70808-5842 225-603-2544         W
## 2456           Zachary           LA     70791-5447 225-654-0789         W
## 2457             Baker           LA     70714-4201 225-278-9215         W
## 2458       Baton Rouge           LA     70810-0308 225-892-6000         W
## 2459           Central           LA     70739-3014 225-936-9687         W
## 2460       Baton Rouge           LA          70898 225-806-6923         B
## 2461       Baton Rouge           LA     70806-1844 225-926-7534         W
## 2462       Baton Rouge           LA     70806-6833 225-344-0768         W
## 2463       Baton Rouge           LA     70816-4954 225-752-7833         W
## 2464       Baton Rouge           LA     70817-4313 225-751-5522         W
## 2465       Baton Rouge           LA     70808-2137 225-938-6724         W
## 2466       Baton Rouge           LA          70802 225-387-5557         W
## 2467       Baton Rouge           LA     70810-4343 225-763-9749         W
## 2468       Baton Rouge           LA          70896 225-379-3277         W
## 2469       Baton Rouge           LA          70802 225-268-8989         B
## 2470       Baton Rouge           LA          70816 225-275-0040         B
## 2471           Central           LA     70818-4007 225-261-5632         W
## 2472       Baton Rouge           LA          70806 225-751-9746         W
## 2473       Baton Rouge           LA          70802 225-389-4678         W
## 2474           Zachary           LA     70791-6118 225-570-2601         W
## 2475       Baton Rouge           LA          70816 225-295-4765         W
## 2476 Greenwell Springs           LA     70739-4760 225-261-0320         W
## 2477       Baton Rouge           LA     70810-7323 225-978-1125         W
## 2478       Baton Rouge           LA     70807-2543 225-774-8995         B
## 2479           Zachary           LA          70791 225-654-8291         W
## 2480       Baton Rouge           LA     70874-5141 225-778-1202         B
## 2481       Baton Rouge           LA     70810-5056 225-766-6419         W
## 2482           Central           LA          70739 225-261-8667         W
## 2483       Baton Rouge           LA     70874-3018 225-357-0864         B
## 2484       Baton Rouge           LA          70802 225-439-9690         B
## 2485       Baton Rouge           LA          70802 225-933-4217         B
## 2486       Baton Rouge           LA          70816 225-806-6491         W
## 2487       Baton Rouge           LA          70879 225-572-6181         W
## 2488       Baton Rouge           LA     70802-3114 225-317-1849         B
## 2489       Baton Rouge           LA     70806-7507 225-439-7188         W
## 2490       Baton Rouge           LA     70808-7102 225-378-3001         W
## 2491             Baker           LA          70704 225-775-9888         B
## 2492           Zachary           LA     70791-2745 225-654-6006         W
## 2493       Baton Rouge           LA          70821 225-389-3025         B
## 2494       Baton Rouge           LA          70806 225-768-7682         B
## 2495       Baton Rouge           LA          70821 225-389-3021         W
## 2496       Baton Rouge           LA          70821 225-389-3346         W
## 2497       Baton Rouge           LA          70821 225-389-3095         W
## 2498       Baton Rouge           LA          70821 225-389-3004         B
## 2499           Zachary           LA     70791-6700 225-654-5551         B
## 2500           Zachary           LA          70791 225-235-3128         W
## 2501           Zachary           LA     70791-2239 225-654-5710         W
## 2502           Zachary           LA     70791-4533 225-772-6235         B
## 2503           Zachary           LA          70791 225-933-5868         W
## 2504           Zachary           LA     70791-3012 225-658-4809         B
## 2505           Zachary           LA     70791-4413 225-931-4548         W
## 2506           Zachary           LA     70791-3845 225-658-6281         W
## 2507           Zachary           LA     70791-7403 225-654-2249         W
## 2508       Baton Rouge           LA     70810-6558 225-754-7128         W
## 2509 Greenwell Springs           LA     70739-3105 225-572-5229         W
## 2510             Baker           LA     70714-4630 225-774-1558         B
## 2511       Baton Rouge           LA     70811-7724 225-356-1729         B
## 2512 Greenwell Springs           LA     70739-3719 225-261-5539         W
## 2513             Baker           LA     70714-1644 225-774-6331         B
## 2514       Baton Rouge           LA     70807-2908 225-505-8779         B
## 2515           Central           LA     70818-5820 225-261-1209         W
## 2516             Baker           LA          70704 225-454-2407         B
## 2517       Baton Rouge           LA     70815-8854 225-925-2416         B
## 2518       Baton Rouge           LA     70818-1105 225-261-3104         W
## 2519             Baker           LA          70704 225-775-9888         B
## 2520       Baton Rouge           LA     70806-3551 225-927-9064         B
## 2521             Baker           LA          70714 225-261-9467         W
## 2522             Baker           LA     70714-3729 225-778-0141         B
## 2523       Baton Rouge           LA     70806-6727 225-229-3613         B
## 2524 Greenwell Springs           LA     70739-5048 225-261-3751         W
## 2525       Baton Rouge           LA     70808-4603 225-766-1711         W
## 2526       Baton Rouge           LA     70811-2833 225-357-9658         W
## 2527       Baton Rouge           LA     70810-4343 225-763-9739         W
## 2528       Baton Rouge           LA     70809-9614 225-387-5557         W
## 2529       Baton Rouge           LA     70817-8301 225-753-6009         W
## 2530             Pride           LA     70770-9625 225-262-1812         W
## 2531           Zachary           LA          70791 225-654-2424         W
## 2532           Zachary           LA          70791 225-658-9778         W
## 2533       Baton Rouge           LA          70807 225-774-5452         B
## 2534 Greenwell Springs           LA          70739 225-926-9415         W
## 2535       Baton Rouge           LA          70817 225-752-9280         W
## 2536                                                                     
## 2537 Greenwell Springs           LA          70739 225-261-9328         W
## 2538           Zachary           LA          70791 225-413-3928         W
## 2539       Baton Rouge           LA          70874 225-356-9000         B
## 2540       Baton Rouge           LA          70818 225-261-3663         W
## 2541       Baton Rouge           LA     70817-8922 225-620-3069         W
## 2542       Baton Rouge           LA          70810 225-752-9364         W
## 2543             Baker           LA     70714-4633 225-774-1155         B
## 2544           Central           LA     70818-1706 225-933-4976         W
## 2545           Zachary           LA     70791-2657 225-654-0653         W
## 2546             Baker           LA     70714-2613 225-775-3106         W
## 2547           Central           LA     70739-4366 225-261-5988         W
## 2548           Zachary           LA     70791-2832 225-654-0670         W
## 2549 Greenwell Springs           LA     70739-3008 225-927-6520         W
## 2550 Greenwell Springs           LA     70739-3859 225-261-6000         W
## 2551       Baton Rouge           LA     70818-6523 225-261-4771         W
## 2552           Central           LA     70739-3418 225-324-6008         W
## 2553 Greenwell Springs           LA     70739-3007 225-262-0461         B
## 2554             Baker           LA     70714-4604 225-774-8777         B
## 2555           Zachary           LA     70791-6227 225-658-5816         B
## 2556             Baker           LA          70714 225-775-3577         W
## 2557           Zachary           LA     70791-2728 225-405-8799         W
## 2558             Baker           LA     70714-2458 225-778-0169         B
## 2559           Zachary           LA     70791-5447 225-654-0789         W
## 2560             Baker           LA     70714-3562 225-803-6466         B
## 2561             Baker           LA          70714 225-803-6466          
## 2562           Zachary           LA     70791-3939 225-654-5626         W
## 2563             Baker           LA     70714-4084 225-205-9051         B
## 2564           Zachary           LA     70791-7211 225-938-4334         W
## 2565                                                                     
## 2566                                                                     
## 2567   Lake Providence           LA     71254-2410 318-559-6177         B
## 2568                                                                     
## 2569                                                                     
## 2570   Lake Providence           LA     71254-2007 318-559-9019         B
## 2571                                                                     
## 2572                                                                     
## 2573                                                                     
## 2574                                                                     
## 2575                                                                     
## 2576                                                                     
## 2577                                                                     
## 2578                                                                     
## 2579                                                                     
## 2580                                                                     
## 2581                                                                     
## 2582                                                                     
## 2583                                                                     
## 2584                                                                     
## 2585   Lake Providence           LA     71254-2410 318-559-6177         B
## 2586   Lake Providence           LA          71254 318-559-2399         B
## 2587      Transylvania           LA     71286-7141 318-552-6333         W
## 2588   Lake Providence           LA     71254-6639 318-559-4555         W
## 2589              Epps           LA     71237-3729 318-552-6561         W
## 2590   Lake Providence           LA     71254-2832 318-418-0469         B
## 2591   Lake Providence           LA     71254-3520 318-559-4949         B
## 2592   Lake Providence           LA     71254-3744 318-559-1730         B
## 2593   Lake Providence           LA     71254-5436 318-559-6072         W
## 2594      Transylvania           LA     71286-8648 318-559-6612         W
## 2595   Lake Providence           LA     71254-6429 318-559-1855         W
## 2596   Lake Providence           LA     71254-6305 318-559-0741         B
## 2597   Lake Providence           LA     71254-5419 000-000-0000         W
## 2598   Lake Providence           LA     71254-2016 318-559-0258         B
## 2599   Lake Providence           LA     71254-2942 318-307-8311         B
## 2600   Lake Providence           LA     71254-3314 318-559-2344         B
## 2601   Lake Providence           LA     71254-3658 318-559-3029         B
## 2602   Lake Providence           LA     71254-2243 318-418-0755         B
## 2603      Transylvania           LA          71286 318-552-6796         W
## 2604   Lake Providence           LA          71254 318-559-9096         B
## 2605   Lake Providence           LA     71254-5330 318-559-2601         W
## 2606   Lake Providence           LA     71254-3637 318-559-3755         B
## 2607   Lake Providence           LA     71254-5701 318-559-5067         W
## 2608   Lake Providence           LA     71254-3100 318-559-2033         B
## 2609   Lake Providence           LA     71254-2940 318-559-5060         B
## 2610   Lake Providence           LA     71254-5657 318-559-0739         B
## 2611   Lake Providence           LA     71254-5206 318-559-0247         W
## 2612           Norwood           LA          70761 225-629-4003         W
## 2613                                                                     
## 2614             Ethel           LA     70730-4319 225-683-8143         W
## 2615                                                                     
## 2616                                                                     
## 2617           Jackson           LA     70748-5106 225-301-7752         W
## 2618                                                                     
## 2619                                                                     
## 2620                                                                     
## 2621                                                                     
## 2622             Ethel           LA     70730-3827 225-683-6629         W
## 2623                                                                     
## 2624                                                                     
## 2625                                                                     
## 2626                                                                     
## 2627                                                                     
## 2628                                                                     
## 2629                                                                     
## 2630                                                                     
## 2631                                                                     
## 2632           Clinton           LA          70722 225-683-8783         W
## 2633           Clinton           LA          70722 225-683-5145         W
## 2634           Clinton           LA     70722-3606 225-719-1099         W
## 2635           Jackson           LA     70748-3436 225-683-3358         W
## 2636           Clinton           LA          70722 225-683-8210         W
## 2637             Ethel           LA     70730-4051 225-683-5269         W
## 2638           Jackson           LA     70748-3613 225-634-7929         B
## 2639           Jackson           LA          70748 225-634-3137         B
## 2640           Jackson           LA          70748 225-939-5712         W
## 2641           Jackson           LA          70748 225-634-3250         W
## 2642           Clinton           LA     70722-3527 225-683-8057         W
## 2643           Clinton           LA          70722 225-683-6901         W
## 2644           Clinton           LA          70722 225-683-9373         B
## 2645           Jackson           LA     70748-3030 225-629-4063          
## 2646           Jackson           LA     70748-3300 225-634-5203         B
## 2647           Jackson           LA     70748-3613 225-634-7929         B
## 2648           Jackson           LA     70748-3731 225-634-5340         W
## 2649           Jackson           LA     70748-3714 225-654-9653         W
## 2650           Jackson           LA          70748 225-634-7551          
## 2651         Slaughter           LA          70777 225-324-0031         W
## 2652             Ethel           LA     70730-4059 225-683-5601         B
## 2653           Clinton           LA     70722-3946 225-683-5806         B
## 2654           Clinton           LA     70722-3963 225-683-5058         B
## 2655           Clinton           LA          70722 225-278-6532         B
## 2656           Clinton           LA     70722-4622 225-683-8785         W
## 2657             Ethel           LA          70730 225-683-9360         W
## 2658                                                                     
## 2659           Clinton           LA          70722                       
## 2660           Clinton           LA          70722 225-683-5765         B
## 2661         Slaughter           LA          70777 225-654-4344         W
## 2662           Clinton           LA          70722 225-301-6058          
## 2663           Clinton           LA          70722 225-719-2015         W
## 2664           Clinton           LA          70722 225-683-3331         B
## 2665           Clinton           LA     70722-3231 225-301-1921         B
## 2666           Jackson           LA     70748-5813 225-634-7351         W
## 2667         Slaughter           LA          70777 225-654-8560         W
## 2668           Norwood           LA          70761 225-629-5561         W
## 2669            Wilson           LA     70789-2509 225-629-4783         B
## 2670         Slaughter           LA          70777 225-658-2463         W
## 2671           Jackson           LA     70748-5006 225-634-2501         W
## 2672           Clinton           LA          70722 225-683-5133         W
## 2673           Clinton           LA          70722 225-683-5595         B
## 2674           Clinton           LA     70722-3514 225-244-1928         B
## 2675           Clinton           LA          70722 225-683-5398         B
## 2676           Clinton           LA          70722 225-683-5320         B
## 2677         Slaughter           LA          70777 225-654-7491         W
## 2678         Slaughter           LA     70777-3001 225-328-4433         W
## 2679         Slaughter           LA          70777 225-405-9315         W
## 2680         Slaughter           LA          70777 225-301-4164         W
## 2681         Slaughter           LA     70777-3003 225-654-9654         W
## 2682           Norwood           LA          70761 225-629-5084         W
## 2683           Norwood           LA     70761-2001 225-719-7450         W
## 2684           Norwood           LA          70761 225-629-5959         W
## 2685            Wilson           LA          70789 225-328-4558         B
## 2686            Wilson           LA          70789 225-629-9996         B
## 2687            Wilson           LA          70789 225-629-9996         B
## 2688            Wilson           LA          70789 225-629-5460         B
## 2689            Wilson           LA          70789 225-629-5460         B
## 2690            Wilson           LA          70789 225-629-5491         W
## 2691           Jackson           LA          70748 225-634-2335         W
## 2692           Jackson           LA          70748 225-634-7453         W
## 2693           Jackson           LA     70748-6110 225-719-1152         W
## 2694           Jackson           LA     70748-5106 225-301-7752         W
## 2695           Jackson           LA          70748 225-634-5312         W
## 2696      Ville Platte           LA     70586-2014 337-831-2412         W
## 2697      Ville Platte           LA          70586 337-945-2992         W
## 2698      Ville Platte           LA     70586-6563 337-945-5565         W
## 2699                                                                     
## 2700                                                                     
## 2701                                                                     
## 2702                                                                     
## 2703                                                                     
## 2704                                                                     
## 2705                                                                     
## 2706                                                                     
## 2707                                                                     
## 2708      Ville Platte           LA     70586-1914 337-363-0345         W
## 2709      Ville Platte           LA     70586-6728 337-363-5317         W
## 2710      Ville Platte           LA     70586-1941 337-363-0522         W
## 2711      Ville Platte           LA     70586-1941 337-363-0522         W
## 2712      Ville Platte           LA     70586-6728 337-831-1070         W
## 2713                                                                     
## 2714                                                                     
## 2715                                                                     
## 2716                                                                     
## 2717                                                                     
## 2718                                                                     
## 2719                                                                     
## 2720                                                                     
## 2721      Ville Platte           LA     70586-6067 337-336-0292         W
## 2722      Ville Platte           LA     70586-8745 337-363-5671         W
## 2723      Ville Platte           LA     70586-4324 337-363-4310         W
## 2724            Bunkie           LA     71322-5600 337-363-5521         W
## 2725      Ville Platte           LA     70586-6554 337-224-2428         W
## 2726            Basile           LA     70515-5114 318-729-6316         W
## 2727             Mamou           LA     70554-4115 337-459-8550         W
## 2728      Ville Platte           LA     70586-7936 337-599-2592         W
## 2729      Ville Platte           LA     70586-2723 337-523-4457         W
## 2730           Reddell           LA          70580 337-831-2862         W
## 2731      Ville Platte           LA     70586-7691 337-298-8126         W
## 2732      Ville Platte           LA     70586-8559 337-831-6934         B
## 2733      Ville Platte           LA     70586-4126 337-363-7924         B
## 2734      Ville Platte           LA          70586 337-363-5588         W
## 2735      Ville Platte           LA          70586 337-831-6276         B
## 2736      Ville Platte           LA     70586-6529 337-363-2344         W
## 2737            Basile           LA     70515-5588 337-432-6637         W
## 2738      Ville Platte           LA     70586-8768 337-363-2326         W
## 2739      Pine Prairie           LA     70576-8284 337-599-2134         W
## 2740      Ville Platte           LA     70586-7632 337-461-2202         W
## 2741             Mamou           LA     70554-4131 337-546-6458         W
## 2742             Mamou           LA     70554-3847 337-224-7977         W
## 2743      Ville Platte           LA     70586-5153 337-363-5259         B
## 2744      Ville Platte           LA     70586-6634 337-363-2341         W
## 2745      Ville Platte           LA     70586-1910 337-224-5400         W
## 2746      Ville Platte           LA     70586-4202 337-363-1944         W
## 2747      Ville Platte           LA     70586-3132 337-207-5393         B
## 2748      Ville Platte           LA     70586-4976 337-789-7493         B
## 2749             Mamou           LA          70554 337-207-2997         W
## 2750            Basile           LA          70515 337-658-2962         W
## 2751             Mamou           LA          70554 337-468-0109         W
## 2752      Pine Prairie           LA          70576 337-247-2634         W
## 2753      Ville Platte           LA          70586 337-461-2664         W
## 2754            Basile           LA          70515 337-654-2063         W
## 2755            Basile           LA          70515 337-230-6210         W
## 2756             Mamou           LA          70554 337-580-5694         W
## 2757      Ville Platte           LA          70586 337-461-2610         W
## 2758      Ville Platte           LA          70586 337-461-2759         W
## 2759      Ville Platte           LA     70586-3419 337-831-0831         B
## 2760             Mamou           LA     70554-2636 337-468-2370         B
## 2761       Chataignier           LA          70524 337-885-2013         B
## 2762      Pine Prairie           LA     70576-0735 337-230-8757         W
## 2763      Turkey Creek           LA          70585 337-461-7729         W
## 2764      Ville Platte           LA          70586 337-831-2395         B
## 2765             Mamou           LA     70554-3862 337-789-6272         W
## 2766       Chataignier           LA          70524 337-885-2002         B
## 2767      Pine Prairie           LA     70576-0261 337-336-2614         W
## 2768      Turkey Creek           LA          70585 337-224-2591         W
## 2769             Mamou           LA     70554-2811 337-468-2423         W
## 2770             Mamou           LA     70554-2506 337-789-0441         B
## 2771             Mamou           LA     70554-2304 337-468-2727         W
## 2772             Mamou           LA     70554-3626 337-658-3040         W
## 2773             Mamou           LA     70554-3839 337-468-4287         W
## 2774      Ville Platte           LA     70586-3031 337-363-2869         W
## 2775      Ville Platte           LA     70586-3301 337-363-0342         B
## 2776      Ville Platte           LA     70586-2405 337-363-1066         W
## 2777      Ville Platte           LA     70586-5020 337-363-1630         B
## 2778      Ville Platte           LA     70586-4814 337-363-6892         B
## 2779      Ville Platte           LA     70586-3737 337-356-7040         B
## 2780      Ville Platte           LA          70586 337-459-2422         B
## 2781       Chataignier           LA          70524 337-831-1083         B
## 2782       Chataignier           LA          70524 318-405-0439         B
## 2783      Pine Prairie           LA          70576 337-224-6627         W
## 2784      Pine Prairie           LA     70576-0231 337-831-0835         W
## 2785      Pine Prairie           LA          70576 337-224-3384         W
## 2786      Ville Platte           LA     70586-7857 337-275-0459         W
## 2787      Turkey Creek           LA          70585 337-831-0955         W
## 2788      Turkey Creek           LA          70585 337-461-2773         W
## 2789         Winnsboro           LA     71295-3007 318-614-3376         B
## 2790         Winnsboro           LA     71295-2519 318-435-4636         B
## 2791         Winnsboro           LA     71295-2825 318-439-0215          
## 2792                                                                     
## 2793                                                                     
## 2794                                                                     
## 2795                                                                     
## 2796                                                                     
## 2797                                                                     
## 2798                                                                     
## 2799             Delhi           LA          71232                       
## 2800         Winnsboro           LA          71295 318-535-5371          
## 2801         Winnsboro           LA          71295                       
## 2802             Delhi           LA     71232-6100 318-488-0857         W
## 2803         Winnsboro           LA          71295 318-535-5371          
## 2804            Wisner           LA          71478 318-614-1322          
## 2805         Winnsboro           LA          71295                       
## 2806                                                                     
## 2807         Winnsboro           LA          71295                       
## 2808                                                                     
## 2809            Baskin           LA          71219                       
## 2810                                                                     
## 2811         Winnsboro           LA     71295-4988 318-439-4971         W
## 2812         Winnsboro           LA          71295 318-435-5133         W
## 2813         Winnsboro           LA     71295-7013 318-435-9928         W
## 2814         Winnsboro           LA     71295-5367 318-435-8351         W
## 2815         Winnsboro           LA          71295 318-435-7164         W
## 2816         Winnsboro           LA     71295-4641 318-435-3613         W
## 2817           Gilbert           LA          71336 318-547-1597         W
## 2818         Winnsboro           LA     71295-5240 318-722-3336         W
## 2819         Winnsboro           LA     71295-3750 318-557-7222         B
## 2820         Winnsboro           LA     71295-6096 318-537-1063         W
## 2821           Gilbert           LA          71336 318-439-0087          
## 2822         Winnsboro           LA     71295-6127 318-435-3201         W
## 2823         Winnsboro           LA          71295 318-435-4047         W
## 2824         Winnsboro           LA          71295 318-723-4405         W
## 2825         Winnsboro           LA     71295-7433 318-435-6840         W
## 2826            Wisner           LA          71378 318-724-7333         W
## 2827         Winnsboro           LA          71295 318-498-0226         W
## 2828         Winnsboro           LA          71295 318-435-7347         B
## 2829            Baskin           LA          71219 318-248-2125         W
## 2830         Winnsboro           LA     71295-2812 318-435-6422         B
## 2831         Crowville           LA          71230 318-722-3995         W
## 2832         Winnsboro           LA          71295 318-435-7723         W
## 2833         Winnsboro           LA          71295 318-435-9543         W
## 2834           Gilbert           LA          71336 318-435-3192         W
## 2835            Wisner           LA          71378 318-724-6627         W
## 2836            Wisner           LA          71378 318-724-7774         W
## 2837         Winnsboro           LA          71295 318-435-5960         B
## 2838         Crowville           LA          71230 318-722-3752         W
## 2839         Winnsboro           LA          71295 318-435-0955         W
## 2840         Winnsboro           LA          71295 318-435-5808         W
## 2841           Gilbert           LA          71336 318-729-4219         W
## 2842            Wisner           LA          71378 318-724-7455         W
## 2843            Wisner           LA          71378 318-724-7693         W
## 2844         Winnsboro           LA          71295 318-435-4467         B
## 2845         Winnsboro           LA     71295-3015 318-729-4675         B
## 2846            Wisner           LA          71378 318-724-6604         B
## 2847            Baskin           LA          71219 318-286-6707         W
## 2848           Gilbert           LA          71336 318-412-8473         W
## 2849         Winnsboro           LA     71295-4012 318-435-4918         B
## 2850            Wisner           LA          71378 318-724-6322         W
## 2851            Baskin           LA          71219 318-248-3311         W
## 2852           Gilbert           LA     71336-3484 318-435-9809         W
## 2853            Wisner           LA          71378 318-724-6255         B
## 2854            Wisner           LA          71378 318-724-7724         B
## 2855            Wisner           LA          71378 318-724-6521         B
## 2856            Wisner           LA          71378 318-724-6570         W
## 2857            Wisner           LA          71378 318-724-6615         W
## 2858            Baskin           LA     71219-9288 318-248-3311         W
## 2859            Baskin           LA          71219 337-371-5787         W
## 2860            Baskin           LA          71219 318-248-3957         W
## 2861           Gilbert           LA          71336 318-439-0163         W
## 2862           Gilbert           LA          71336 318-435-4975         W
## 2863           Gilbert           LA          71336 318-435-8366         W
## 2864         Winnsboro           LA          71295 318-334-7228          
## 2865         Winnsboro           LA          71295 318-435-6276         B
## 2866         Winnsboro           LA     71295-4036 318-435-4496         B
## 2867         Winnsboro           LA     71295-2763 318-435-4565         W
## 2868         Winnsboro           LA     71295-3859 318-535-7111         B
## 2869            Colfax           LA     71417-1873 318-627-5447         W
## 2870                                                                     
## 2871                                                                     
## 2872                                                                     
## 2873                                                                     
## 2874                                                                     
## 2875                                                                     
## 2876                                                                     
## 2877                                                                     
## 2878           Pollock           LA     71467-3823 318-640-9791         W
## 2879         Dry Prong           LA          71423                       
## 2880                                                                     
## 2881                                                                     
## 2882            Colfax           LA          71417 318-419-2235          
## 2883                                                                     
## 2884                                                                     
## 2885                                                                     
## 2886                                                                     
## 2887                                                                     
## 2888            Colfax           LA     71417-5593 318-627-0080         W
## 2889            Colfax           LA          71417 318-627-3246         W
## 2890         Dry Prong           LA     71423-9307 318-899-1824         W
## 2891            Colfax           LA     71417-5903 318-627-3115         W
## 2892        Montgomery           LA     71454-5708 318-646-5972         W
## 2893         Dry Prong           LA     71423-4176 318-899-5876         W
## 2894            Colfax           LA     71417-1214 318-627-5731         B
## 2895         Dry Prong           LA     71423-3500 318-640-2375         W
## 2896            Colfax           LA          71417 318-419-4815         W
## 2897           Pollock           LA     71467-3062 318-765-3003         W
## 2898           Bentley           LA          71407 318-446-4562         W
## 2899           Bentley           LA     71407-2720 318-765-9422         W
## 2900        Montgomery           LA          71454 318-646-2830         W
## 2901            Colfax           LA     71417-5732 318-627-5485         W
## 2902            Colfax           LA     71417-1213 318-627-5432         B
## 2903         Dry Prong           LA     71423-3535 318-641-0948         W
## 2904         Dry Prong           LA     71423-3450 318-201-0645         W
## 2905           Pollock           LA     71467-4634 318-765-9626         W
## 2906         Dry Prong           LA     71423-3847 318-899-5305         W
## 2907        Georgetown           LA     71432-3831 318-827-5391         W
## 2908        Montgomery           LA     71454-5506 318-646-3737         W
## 2909                                                                     
## 2910         Dry Prong           LA          71423 318-640-2210         W
## 2911           Pollock           LA          71467 318-640-9791         W
## 2912         Dry Prong           LA          71423 318-899-3732         W
## 2913        Montgomery           LA          71454 318-646-2224         W
## 2914            Colfax           LA          71417 318-740-7104         W
## 2915           Pollock           LA     71467-3838 318-641-9031         W
## 2916           Pollock           LA     71467-4648 318-765-9385         W
## 2917         Dry Prong           LA          71423 318-899-3870         W
## 2918            Colfax           LA     71417-1213 318-627-3197         B
## 2919        Montgomery           LA          71454 318-646-2628         W
## 2920           Pollock           LA     71467-3579 318-765-9024         W
## 2921         Dry Prong           LA          71423 318-452-6364          
## 2922          DryProng           LA          71423 318-899-5186         W
## 2923        Georgetown           LA     71432-3833 318-827-5576         W
## 2924           Pollock           LA     71467-3987 318-446-0253         W
## 2925         Dry Prong           LA     71423-3521 318-640-2210         W
## 2926        Georgetown           LA          71432 318-715-5134         W
## 2927            Colfax           LA     71417-1408 318-627-5842         W
## 2928            Colfax           LA     71417-1108 318-627-5928         B
## 2929            Colfax           LA     71417-1031 318-627-9932         B
## 2930            Colfax           LA     71417-1208 318-627-2851         B
## 2931            Colfax           LA     71417-1320 318-627-3028         W
## 2932         Dry Prong           LA     71423-3512 318-308-2779         W
## 2933         Dry Prong           LA          71423 318-640-2125          
## 2934         Dry Prong           LA          71423 318-419-9327          
## 2935         Dry Prong           LA     71423-3909 318-899-7334         W
## 2936         Dry Prong           LA     71423-9310 318-899-5223         W
## 2937         Dry Prong           LA          71423 318-899-5913         W
## 2938        Georgetown           LA          71432 318-827-5587         W
## 2939        Georgetown           LA     71432-3831 318-827-5106         W
## 2940        Georgetown           LA          71432 318-715-3390         W
## 2941        Montgomery           LA     71454-5787 318-646-6243         W
## 2942        Montgomery           LA          71454 318-715-5408         W
## 2943        Montgomery           LA          71454 318-646-9226         B
## 2944        Montgomery           LA          71454 318-652-4754         W
## 2945        Montgomery           LA          71454 318-646-0205         W
## 2946           Pollock           LA     71467-3562 318-229-6728         W
## 2947           Pollock           LA          71467                       
## 2948           Pollock           LA          71467                       
## 2949           Pollock           LA     71467-3952 318-765-3856         W
## 2950           Pollock           LA     71467-3987 318-765-3623         W
## 2951        Jeanerette           LA     70544-5402 337-276-6106         B
## 2952        New Iberia           LA     70563-0913 337-577-3977         B
## 2953        New Iberia           LA     70562-3410 337-367-7785         W
## 2954                                                                     
## 2955                                                                     
## 2956                                                                     
## 2957                                                                     
## 2958                                                                     
## 2959        New Iberia           LA     70563-2909 337-367-0912         B
## 2960                                                                     
## 2961                                                                     
## 2962                                                                     
## 2963                                                                     
## 2964                                                                     
## 2965                                                                     
## 2966                                                                     
## 2967                                                                     
## 2968        New Iberia           LA          70563 985-465-0646         W
## 2969        New Iberia           LA     70563-2234 337-367-1782         W
## 2970                                                                     
## 2971        New Iberia           LA          70560 337-365-4202         W
## 2972                                                                     
## 2973        New Iberia           LA     70560-4637 337-365-0416         B
## 2974                                                                     
## 2975        New Iberia           LA     70563-3344 337-256-8683         I
## 2976                                                                     
## 2977                                                                     
## 2978                                                                     
## 2979        New Iberia           LA     70560-9077 337-364-9243         W
## 2980        Jeanerette           LA     70544-3440 337-579-4568         W
## 2981                                                                     
## 2982                                                                     
## 2983                                                                     
## 2984        New Iberia           LA     70563-1755 337-577-7728         W
## 2985        New Iberia           LA     70562-2010 337-365-7282         W
## 2986        New Iberia           LA     70560-1416 337-364-7313         W
## 2987        New Iberia           LA     70563-3087 337-367-3690         W
## 2988        New Iberia           LA     70563-8981 337-367-8772         W
## 2989        New Iberia           LA     70560-4285 337-380-9039         B
## 2990        New Iberia           LA     70560-6509 337-365-4144         W
## 2991        New Iberia           LA     70560-9103 337-367-3533         W
## 2992        New Iberia           LA     70560-5643 337-365-4298         B
## 2993        New Iberia           LA     70560-6730 337-369-6812         W
## 2994        New Ibeira           LA     70560-5724 337-364-3433         W
## 2995        New Iberia           LA     70563-2509 337-364-6686         W
## 2996        New Iberia           LA     70563-2249 337-364-9769         W
## 2997        New Iberia           LA     70563-8444 337-229-6529         W
## 2998        New Iberia           LA     70560-9337 337-369-9507         W
## 2999        Jeanerette           LA     70544-5826 337-276-4398         W
## 3000        Jeanerette           LA     70544-5104 337-241-9052         B
## 3001        New Iberia           LA     70560-0259 337-380-3866         W
## 3002        New Iberia           LA     70560-0502 337-277-8969         W
## 3003        Jeanerette           LA          70544 337-276-6034         W
## 3004        New Iberia           LA          70563 337-365-7103         W
## 3005        Jeanerette           LA          70544                      B
## 3006        New Iberia           LA          70563 337-364-7984         W
## 3007        New Iberia           LA          70560 337-364-2049         B
## 3008        New Iberia           LA          70560 337-369-3246         B
## 3009        New Iberia           LA          70563 337-365-2223         W
## 3010        New Iberia           LA          70560 337-288-8681          
## 3011        New Iberia           LA          70560 337-365-7632         W
## 3012        New Iberia           LA     70560-6903 337-365-8350         B
## 3013        New Iberia           LA          70563 337-365-6537         W
## 3014        New Iberia           LA          70563 337-365-2852         W
## 3015        New Iberia           LA     70563-0097 337-944-6179         W
## 3016        New Iberia           LA     70560-9033 337-230-0066         W
## 3017        Jeanerette           LA     70544-3513 337-276-4267         W
## 3018        Jeanerette           LA          70544 337-276-5713         B
## 3019        New Iberia           LA          70560 337-365-5823         W
## 3020        New Iberia           LA          70560 337-365-6004         W
## 3021        New Iberia           LA          70562 337-364-4409         W
## 3022        New Iberia           LA          70560 337-364-3662         W
## 3023        New Iberia           LA          70563 337-944-6045         W
## 3024        New Iberia           LA          70560 337-367-3515         W
## 3025        New Iberia           LA          70560 337-365-1019         W
## 3026        New Iberia           LA          70563 337-229-4506         W
## 3027        Jeanerette           LA     70544-5406 337-276-6104         B
## 3028        New Iberia           LA     70563-1718 337-369-3133         W
## 3029       Loreauville           LA          70552 337-229-6768         W
## 3030        Jeanerette           LA     70544-5128 337-519-5378         B
## 3031        New Iberia           LA     70563-2837 337-367-2511         W
## 3032       Loreauville           LA          70552 337-519-1331         W
## 3033       Loreauville           LA          70552 337-229-8425         W
## 3034       Loreauville           LA          70552 337-321-3590         W
## 3035        Jeanerette           LA     70544-5402 337-276-6106         B
## 3036        Jeanerette           LA     70544-5515 337-276-3526         B
## 3037        Jeanerette           LA     70544-3706 337-276-4017         W
## 3038        Jeanerette           LA     70544-4232 337-276-4389         W
## 3039        New Iberia           LA     70563-1279 337-365-8471         W
## 3040        New Iberia           LA     70560-5242 337-364-0357         B
## 3041        New Iberia           LA     70560-7218 337-367-1185         W
## 3042        New Iberia           LA     70560-4910 337-251-3400         B
## 3043        New Iberia           LA     70560-6235 337-367-5716         B
## 3044        New Iberia           LA     70563-2233 337-364-4976         W
## 3045        Plaquemine           LA     70764-5541 225-659-7143         W
## 3046        Plaquemine           LA          70765 225-687-2644         W
## 3047                                                                     
## 3048                                                                     
## 3049                                                                     
## 3050                                                                     
## 3051                                                                     
## 3052                                                                     
## 3053                                                                     
## 3054                                                                     
## 3055                                                                     
## 3056                                                                     
## 3057                                                                     
## 3058                                                                     
## 3059                                                                     
## 3060        Plaquemine           LA     70764-5218 225-687-8584         W
## 3061                                                                     
## 3062                                                                     
## 3063                                                                     
## 3064                                                                     
## 3065                                                                     
## 3066                                                                     
## 3067                                                                     
## 3068        Plaquemine           LA     70764-5212 225-687-8453         W
## 3069                                                                     
## 3070                                                                     
## 3071                                                                     
## 3072                                                                     
## 3073                                                                     
## 3074        Plaquemine           LA     70764-5919 225-659-7799         W
## 3075        Plaquemine           LA          70765 225-687-5160         W
## 3076       Grosse Tete           LA          70740 225-648-2392         W
## 3077        Plaquemine           LA          70764 225-659-2991         W
## 3078        Plaquemine           LA     70764-5541 225-659-9988         W
## 3079      White Castle           LA     70788-2402 225-545-3197         B
## 3080      White Castle           LA     70788-3827 225-806-5856         W
## 3081      White Castle           LA          70788 225-776-1759         B
## 3082        St Gabriel           LA          70776 225-642-8338         B
## 3083        Plaquemine           LA     70764-3534 225-687-9073         W
## 3084        Plaquemine           LA     70764-4163 225-776-1811         B
## 3085        Plaquemine           LA     70764-3048 225-687-2151         B
## 3086        Plaquemine           LA     70764-2101 225-975-1515         W
## 3087        Plaquemine           LA     70764-5508 225-385-4608         W
## 3088        Plaquemine           LA     70764-7308 225-659-7790         W
## 3089       Grosse Tete           LA     70740-3521 225-648-2784         W
## 3090        Maringouin           LA          70757 225-625-3656         W
## 3091          Sunshine           LA     70780-3101 225-642-5218         W
## 3092        Plaquemine           LA          70765 225-385-4477         W
## 3093        Plaquemine           LA          70765 225-687-2514         W
## 3094        Maringouin           LA          70757 225-625-3780         B
## 3095       Grosse Tete           LA     70740-3309 225-776-0581         W
## 3096        Plaquemine           LA     70764-7308 225-659-7790         W
## 3097        Plaquemine           LA     70764-5914 225-385-4678         W
## 3098        Plaquemine           LA     70764-7422 225-687-7655         W
## 3099        Plaquemine           LA     70764-3236 225-687-8060         I
## 3100        Plaquemine           LA     70764-3567 225-687-8924         W
## 3101        Plaquemine           LA     70764-2836 225-687-4068         B
## 3102        Plaquemine           LA     70764-4011 225-687-6566         B
## 3103        Plaquemine           LA          70764 225-687-2535         W
## 3104        St Gabriel           LA     70776-5505 225-642-8622         W
## 3105      White Castle           LA          70788 225-749-9767         B
## 3106        St Gabriel           LA     70776-4645 225-642-5184         B
## 3107      White Castle           LA     70788-2604 225-716-2236         B
## 3108      White Castle           LA     70788-3828 225-545-8961         W
## 3109      White Castle           LA          70788 225-545-3034         W
## 3110          Carville           LA          70721 225-319-7101         B
## 3111        Plaquemine           LA          70764 225-687-1235         W
## 3112        Plaquemine           LA     70764-5618 225-659-7486         W
## 3113        Plaquemine           LA          70764 225-776-5171         W
## 3114        Maringouin           LA          70757 225-625-2383         B
## 3115      White Castle           LA          70788 225-545-2463         W
## 3116        St Gabriel           LA          70776 225-642-8546         B
## 3117        Plaquemine           LA          70764 225-687-9521         W
## 3118        Plaquemine           LA          70764 225-776-0050         W
## 3119        Plaquemine           LA          70764 225-659-7049         W
## 3120        Maringouin           LA          70757 225-625-3213         B
## 3121        Plaquemine           LA     70764-3320 225-687-0113         W
## 3122        St Gabriel           LA     70776-5404 225-642-9888         B
## 3123        Maringouin           LA          70757 225-625-3558         B
## 3124      White Castle           LA     70788-2612 225-776-2265         B
## 3125       Grosse Tete           LA          70740 225-648-2431         W
## 3126          Rosedale           LA          70772 225-648-2175         W
## 3127        Plaquemine           LA     70764-2514 225-687-4943         W
## 3128          Carville           LA          70721 225-642-0444         B
## 3129        Maringouin           LA          70757 225-715-4730         B
## 3130      White Castle           LA     70788-2510 225-545-8844         B
## 3131       Grosse Tete           LA     70740-3309 225-648-2287         W
## 3132        Plaquemine           LA          70772 225-648-2815         W
## 3133          Rosedale           LA     70772-3817 225-648-2374         W
## 3134          Rosedale           LA          70772 225-413-8818         W
## 3135          Rosedale           LA     70772-3830 225-324-7908         W
## 3136        Maringouin           LA          70757 225-937-4557         B
## 3137        Maringouin           LA          70757 225-625-3126         B
## 3138        Maringouin           LA          70757 225-625-2057         B
## 3139        Maringouin           LA          70757 225-625-2714         B
## 3140        Maringouin           LA          70757 225-625-2433         B
## 3141      White Castle           LA     70788-2219 225-545-4017         W
## 3142      White Castle           LA     70788-2001 225-545-3842         B
## 3143      White Castle           LA     70788-2706 225-545-9164         B
## 3144      White Castle           LA     70788-2038 225-545-3644         B
## 3145      White Castle           LA     70788-2311 225-445-4258         B
## 3146       Grosse Tete           LA          70740 225-268-2004         W
## 3147       Grosse Tete           LA     70740-3200 225-648-2977         W
## 3148       Grosse Tete           LA          70740 225-648-2299         B
## 3149        St Gabriel           LA          70776 225-642-0391         B
## 3150        St Gabriel           LA     70776-4251 225-642-8375         B
## 3151        St Gabriel           LA          70776 225-642-0037         B
## 3152          Carville           LA          70721 225-319-2244         B
## 3153       St Garbriel           LA     70776-4244 225-326-3814         B
## 3154        Plaquemine           LA     70764-2429 225-687-9417         W
## 3155        Plaquemine           LA     70764-2886 225-776-1730         B
## 3156        Plaquemine           LA     70764-3152 225-687-0819         W
## 3157        Plaquemine           LA     70764-3511 225-687-4161         W
## 3158        Plaquemine           LA     70764-3400 225-687-6648         W
## 3159        Plaquemine           LA     70764-3008 225-776-4112         B
## 3160         Jonesboro           LA     71251-5588 318-259-4184         W
## 3161                                                                     
## 3162                                                                     
## 3163                                                                     
## 3164         Jonesboro           LA          71251 318-259-4741         B
## 3165                                                                     
## 3166                                                                     
## 3167                                                                     
## 3168         Jonesboro           LA     71251-3512 318-366-0948         W
## 3169                                                                     
## 3170                                                                     
## 3171                                                                     
## 3172                                                                     
## 3173                                                                     
## 3174                                                                     
## 3175                                                                     
## 3176         Jonesboro           LA          71251 318-259-8758         W
## 3177         Jonesboro           LA          71251 318-259-2424         W
## 3178         Jonesboro           LA          71251 318-255-4613         W
## 3179         Jonesboro           LA          71251 318-259-2764         W
## 3180           Quitman           LA          71268 318-259-6268         W
## 3181         Jonesboro           LA          71251 318-259-7448         W
## 3182         Jonesboro           LA     71251-5583 318-395-2837         W
## 3183         Jonesboro           LA     71251-2219 318-655-1777         B
## 3184         Jonesboro           LA          71251 318-259-7948         B
## 3185         Jonesboro           LA     71251-4130 318-259-7035         W
## 3186         Jonesboro           LA          71251 318-680-8510         W
## 3187              Eros           LA     71238-7130 318-249-2261         W
## 3188         Jonesboro           LA     71251-6625 318-259-3599         W
## 3189           Quitman           LA          71268 318-395-9562         W
## 3190             Hodge           LA          71247 318-259-4229         B
## 3191         Jonesboro           LA     71251-2549 318-259-3880         B
## 3192           Quitman           LA     71268-4509 318-259-6330         W
## 3193         Jonesboro           LA     71251-4103 318-259-9695         W
## 3194           Quitman           LA          71268 318-259-7492         W
## 3195           Quitman           LA          71268 318-259-9442         B
## 3196           Chatham           LA          71226 318-249-2200         W
## 3197             Hodge           LA          71247 318-259-8773         W
## 3198         Jonesboro           LA          71251 318-259-9736         B
## 3199           Quitman           LA          71268 318-259-9286         W
## 3200            Ruston           LA          71270 318-249-4158         W
## 3201           Chatham           LA          71226 318-249-2402         W
## 3202         Jonesboro           LA          71251 318-259-3278         W
## 3203         Jonesboro           LA          71251 318-259-7867         B
## 3204           Chatham           LA     71226-8899 318-245-7399         W
## 3205              Eros           LA          71238 318-331-4709         W
## 3206         Jonesboro           LA     71251-3003 318-259-4772         B
## 3207        East Hodge           LA          71247 318-259-1051         B
## 3208             Hodge           LA          71247 318-259-7930         W
## 3209       North Hodge           LA          71247 318-259-9144         W
## 3210           Quitman           LA          71268 318-259-9193         W
## 3211           Chatham           LA          71226 318-245-0536         W
## 3212                                                                     
## 3213         Jonesboro           LA     71251-5507 318-259-8855         W
## 3214        East Hodge           LA          71247 318-259-3223         B
## 3215             Hodge           LA          71247 318-395-0700         W
## 3216       North Hodge           LA          71247 318-259-1431         W
## 3217           Quitman           LA     71268-4640 318-259-9774         W
## 3218         Jonesboro           LA     71251-2748 318-243-9052         B
## 3219         Jonesboro           LA     71251-3934 318-259-9213         W
## 3220         Jonesboro           LA     71251-3416 318-259-6281         W
## 3221         Jonesboro           LA     71251-2115 318-475-1351         B
## 3222         Jonesboro           LA     71251-2557 318-259-8403         B
## 3223           Chatham           LA     71226-9206 318-249-4751         W
## 3224           Chatham           LA          71226 318-245-2349         B
## 3225           Chatham           LA          71226 318-548-7658         W
## 3226           Chatham           LA          71226 318-249-2667         W
## 3227           Chatham           LA     71226-9809 318-805-7734         W
## 3228              Eros           LA     71238-8722 870-918-3598         W
## 3229              Eros           LA          71238 318-331-7001         W
## 3230              Eros           LA     71238-7206 318-245-2741         W
## 3231           Quitman           LA     71268-1416 318-259-4105         B
## 3232        East Hodge           LA          71247 318-259-7085         B
## 3233        East Hodge           LA          71247 318-259-9195         B
## 3234             Hodge           LA          71247 318-259-1120         W
## 3235             Hodge           LA          71247 318-259-7549         W
## 3236             Hodge           LA          71247 318-259-3463         B
## 3237       North Hodge           LA          71247 318-395-9166         W
## 3238       North Hodge           LA          71247 318-259-8627         W
## 3239             Hodge           LA          71247 318-259-8183         W
## 3240           Quitman           LA     71268-4640 318-259-9774         W
## 3241           Quitman           LA     71268-3800 318-259-9474         W
## 3242           Quitman           LA     71268-4640 318-259-3090         W
## 3243            Gretna           LA     70056-3082 504-393-1331         B
## 3244          Metairie           LA     70003-2346 504-885-8610         W
## 3245           Marrero           LA     70072-4404 504-348-8954         B
## 3246         Jefferson           LA          70121 504-835-4289         W
## 3247            Gretna           LA     70053-3346 504-367-0465         B
## 3248                                                                     
## 3249          Metairie           LA     70003-6751 504-712-1632         B
## 3250            Harvey           LA     70058-2237 504-341-6423         B
## 3251           Marrero           LA     70072-4511 504-341-4029         B
## 3252            Kenner           LA     70064-0211 504-343-1488         B
## 3253          Metairie           LA     70003-5854 504-232-6409         W
## 3254          Metairie           LA          70009 504-835-2114         W
## 3255          Metairie           LA     70002-5052 504-831-9576         W
## 3256          Metairie           LA     70005-1650 504-430-2891         W
## 3257                                                                     
## 3258            Harvey           LA     70058-3083 504-368-0869         W
## 3259         Mertairie           LA     70005-4120 504-309-9645         W
## 3260            Kenner           LA     70065-1999 504-467-7402         W
## 3261            Kenner           LA     70065-2042 504-469-4268         W
## 3262          Metairie           LA     70002-1464 504-908-1288         W
## 3263          Metairie           LA     70001-3441 504-454-6178         W
## 3264          Metairie           LA     70003-2352 504-888-7718         W
## 3265          Metairie           LA     70002-5018 504-833-7727         W
## 3266          Metairie           LA     70005-3966 504-835-6936         W
## 3267          Metairie           LA     70001-2717 504-828-6670         W
## 3268            Harvey           LA     70058-3018 504-368-4292         W
## 3269           Marrero           LA     70072-7593 504-344-1397         W
## 3270            Gretna           LA     70053-4860 504-368-1118         W
## 3271         Terrytown           LA     70056-4206 504-914-2200         W
## 3272            Gretna           LA     70056-7003 504-368-7363         W
## 3273           Harahan           LA     70123-4919 504-650-0723         W
## 3274           Harahan           LA     70123-3825 504-250-8354         W
## 3275            Harvey           LA     70058-2527 504-340-5267         W
## 3276           Harahan           LA     70123-4822 504-738-3336         W
## 3277           Harahan           LA     70123-4711 504-737-7327         W
## 3278          Waggaman           LA     70094-2152 504-430-2124         W
## 3279          Waggaman           LA     70094-2452 504-232-2018         W
## 3280            Harvey           LA     70058-1609 504-347-2516         O
## 3281           Marrero           LA     70072-5376 504-460-6660         W
## 3282       River Ridge           LA     70123-5724 504-737-0965         W
## 3283            Kenner           LA     70065-1743 504-319-7262         W
## 3284            Kenner           LA     70065-6614 504-287-4322         W
## 3285            Kenner           LA     70065-1133 504-465-9069         W
## 3286            Kenner           LA     70065-1018 504-343-7327         W
## 3287          Metairie           LA     70003-7623 504-888-4125         W
## 3288          Metairie           LA     70002-1839 504-908-2447         W
## 3289          Metairie           LA     70005-1229 504-400-4629         W
## 3290          Metairie           LA     70001-2512 504-455-1527         W
## 3291          Metairie           LA          70055 504-833-6791         W
## 3292          Metairie           LA     70006-2834 504-454-3421         W
## 3293                                                                     
## 3294           Harahan           LA          70123 504-739-9933         W
## 3295            Kenner           LA          70065 504-889-2476         W
## 3296            Gretna           LA          70053 504-637-5577         W
## 3297                                                                     
## 3298            Harvey           LA          70059 504-367-3500         W
## 3299       River Ridge           LA          70123 504-737-0244         W
## 3300          Metairie           LA          70005 504-835-2909         W
## 3301          Metairie           LA     70005-3706 504-616-8725         W
## 3302            Gretna           LA     70054-0010 504-364-2900         W
## 3303          Metairie           LA     70006-2624 504-885-9883         W
## 3304          Metairie           LA     70002-1548 504-887-7422         W
## 3305            Gretna           LA          70053 504-352-8855         W
## 3306            Harvey           LA     70058-2906 504-263-0530         W
## 3307       River Ridge           LA     70123-1580 504-737-8237         W
## 3308            Gretna           LA     70053-4920 504-382-6832         W
## 3309           Harahan           LA     70123-3825 504-737-4345         W
## 3310           Marrero           LA     70072-3528 504-347-5056         B
## 3311            Kenner           LA     70065-1324 504-464-0791         W
## 3312          Metairie           LA     70005-1020 504-828-9746         A
## 3313            Gretna           LA     70053-4946 504-367-9001         W
## 3314            Gretna           LA          70056 504-233-1200         W
## 3315           Marrero           LA     70072-6238 504-341-9115         W
## 3316         Jefferson           LA     70121-1213 504-734-9163         W
## 3317            Kenner           LA     70065-4332 504-464-7011         B
## 3318          Metairie           LA     70001-5031 504-835-6387         W
## 3319       River Ridge           LA     70123-1924 504-734-8424         W
## 3320          Metairie           LA     70002-1813 504-837-6997         W
## 3321            Kenner           LA     70065-1654 504-467-4150         W
## 3322            Gretna           LA          70056 504-393-0032         W
## 3323           Marrero           LA          70072 504-324-3442         W
## 3324           Lafitte           LA          70067 504-689-4106         W
## 3325        Grand Isle           LA          70358 985-787-4767         W
## 3326          Metairie           LA          70002 504-834-2630         W
## 3327            Kenner           LA          70065 504-443-3238         W
## 3328          Avondale           LA          70094 504-436-3133         B
## 3329            Kenner           LA          70062 504-466-5931         B
## 3330         Terrytown           LA          70056 504-339-7012         W
## 3331           Marrero           LA          70072 504-347-1206         W
## 3332         Barataria           LA          70036 504-689-3179         W
## 3333        Grand Isle           LA          70358 985-787-2273         W
## 3334          Metairie           LA          70005 504-833-9290         W
## 3335       River Ridge           LA          70123 504-737-9196         W
## 3336          Avondale           LA          70094 504-436-7494         B
## 3337            Kenner           LA          70065 504-512-1426         B
## 3338            Gretna           LA          70053 504-366-8747         W
## 3339           Harahan           LA     70123-4822 504-738-3994         W
## 3340            Kenner           LA     70065-1773 504-461-9954         W
## 3341          Westwego           LA          70094 504-348-4021         W
## 3342        Grand Isle           LA          70358 504-382-3573         W
## 3343           Lafitte           LA     70067-3609 504-689-3540         W
## 3344            Gretna           LA     70053-4942 504-368-4123         W
## 3345            Gretna           LA          70053 504-363-1700         W
## 3346           Harahan           LA     70123-4433 504-739-9933         W
## 3347            Kenner           LA     70065-1109 504-466-2617         W
## 3348          Westwego           LA          70094 504-324-5903         W
## 3349          Westwego           LA     70094-5463 504-756-1080         W
## 3350        Grand Isle           LA     70358-9616 985-787-2324         W
## 3351            Kenner           LA     70065-2467 504-467-2979         W
## 3352            Kenner           LA     70065-3312 504-455-1980         W
## 3353            Gretna           LA     70053-3235 504-367-3452         B
## 3354            Gretna           LA     70053-3235 504-367-3452         B
## 3355          Westwego           LA     70094-3641 504-259-3694         B
## 3356          Westwego           LA          70094 504-259-3694         B
## 3357            Gretna           LA     70053-6126 504-382-8023         W
## 3358          Westwego           LA          70094 504-442-1199         W
## 3359            Gretna           LA     70053-7025 504-361-0810         W
## 3360          Westwego           LA          70094 504-347-1368         W
## 3361            Gretna           LA     70053-4959 504-361-4287         W
## 3362            Gretna           LA     70053-4959 504-361-4287         W
## 3363          Westwego           LA          70094 504-347-6020         W
## 3364          Westwego           LA          70094 504-340-4638         W
## 3365        Grand Isle           LA          70358 504-382-6068         W
## 3366        Grand Isle           LA          70358 985-787-2641         W
## 3367        Grand Isle           LA          70358 504-382-8602         W
## 3368        Grand Isle           LA          70358 985-637-8056         W
## 3369        Grand Isle           LA          70358 985-787-3537         W
## 3370            Gretna           LA          70053 504-366-3893         W
## 3371           Harahan           LA     70123-4912 504-738-1746         W
## 3372           Harahan           LA     70123-3731 504-737-0866         W
## 3373           Harahan           LA     70123-3744 504-250-7051         W
## 3374          Metairie           LA     70123-4605 504-738-9677         W
## 3375           Harahan           LA     70123-4612 504-812-9847         W
## 3376            Kenner           LA     70062-7549 504-469-1376         B
## 3377            Kenner           LA     70062-6336 504-467-9641         W
## 3378            Kenner           LA     70065-3771 504-461-0387         W
## 3379            Kenner           LA     70065-2029 504-467-1585         W
## 3380            Kenner           LA     70065-1044 504-884-4133         W
## 3381           Lafitte           LA     70067-3630 504-689-4720         W
## 3382           Lafitte           LA     70067-3628 504-689-2049         W
## 3383           Lafitte           LA     70067-5110 504-689-7722         W
## 3384           Lafitte           LA     70067-3630 985-637-8197         W
## 3385           Lafitte           LA     70067-5267 504-689-4521         W
## 3386                                                                     
## 3387                                                                     
## 3388                                                                     
## 3389          Jennings           LA          70546 337-824-1401          
## 3390                                                                     
## 3391                                                                     
## 3392                                                                     
## 3393                                                                     
## 3394                                                                     
## 3395                                                                     
## 3396                                                                     
## 3397                                                                     
## 3398                                                                     
## 3399                                                                     
## 3400                                                                     
## 3401                                                                     
## 3402                                                                     
## 3403                                                                     
## 3404                                                                     
## 3405                                                                     
## 3406                                                                     
## 3407                                                                     
## 3408                                                                     
## 3409                                                                     
## 3410                                                                     
## 3411                                                                     
## 3412                                                                     
## 3413                                                                     
## 3414          Jennings           LA     70546-8141 337-774-5539         W
## 3415          Jennings           LA          70546 337-824-1160         W
## 3416          Jennings           LA     70546-4212 337-824-0126         W
## 3417          Jennings           LA     70546-3238 337-824-5226         W
## 3418       Lake Arthur           LA     70549-5322 337-774-3413         W
## 3419       Lake Arthur           LA     70549-3408 337-774-3728         W
## 3420          Jennings           LA     70546-7424 337-824-7369         B
## 3421          Jennings           LA     70546-5503 337-824-6178         W
## 3422          Jennings           LA     70546-3807 337-224-2420         W
## 3423          Jennings           LA     70546-6832 337-329-0462         B
## 3424          Jennings           LA     70546-5938 337-824-8039         W
## 3425          Jennings           LA     70546-8229 337-824-9718         W
## 3426             Elton           LA     70532-4312 337-526-1258         W
## 3427            Kinder           LA     70648-4214 337-738-5710         W
## 3428             Welsh           LA     70591-3209 337-734-3231         W
## 3429             Welsh           LA     70591-5725 337-753-2466         W
## 3430              Iowa           LA     70647-6522 337-515-9528         W
## 3431          Jennings           LA          70546 337-824-0110         W
## 3432          Jennings           LA     70546-4858 337-824-1314         W
## 3433       Lake Arthur           LA     70549-5314 337-774-2172         W
## 3434       Lake Arthur           LA     70549-8029 337-774-3024         W
## 3435          Jennings           LA     70546-7821 337-824-0279         B
## 3436          Jennings           LA     70546-5116 337-824-8125         W
## 3437          Jennings           LA     70546-3732 337-824-6005         W
## 3438          Jennings           LA     70546-7300 337-824-1495         B
## 3439          Jennings           LA     70546-6009 337-824-3013         W
## 3440          Jennings           LA     70546-8229 337-616-3760         W
## 3441             Elton           LA     70532-4211 337-584-2937         W
## 3442            Kinder           LA     70648-4202 337-756-2340         W
## 3443             Welsh           LA     70591-4530 337-734-3490         W
## 3444           Roanoke           LA     70581-3423 337-753-2370         W
## 3445              Iowa           LA     70647-6611 337-588-4269         W
## 3446       Lake Arthur           LA          70549 337-774-5263         W
## 3447             Elton           LA          70532 337-584-2421         W
## 3448              Iowa           LA          70647 337-582-1669         W
## 3449             Welsh           LA          70591 337-734-2356         W
## 3450          Jennings           LA     70546-6530 337-824-2835         W
## 3451              Iowa           LA          70647 337-582-3170         W
## 3452       Lake Arthur           LA          70549 337-774-2852         W
## 3453             Elton           LA          70532 337-584-2617         W
## 3454                                                                     
## 3455             Welsh           LA          70591 337-387-9188         W
## 3456          Jennings           LA          70546 337-824-0822         W
## 3457         Lacassine           LA          70650 337-588-4485         W
## 3458          Jennings           LA          70546 337-824-3163         W
## 3459             Elton           LA          70532 337-584-2759         W
## 3460       Lake Arthur           LA     70549-4702 337-802-1179         W
## 3461             Welsh           LA          70591 337-734-3983         W
## 3462            Fenton           LA          70640 337-764-2586         B
## 3463             Elton           LA          70532 337-584-2354         B
## 3464       Lake Arthur           LA     70549-4502 337-224-1844         W
## 3465             Welsh           LA     70591-5601 337-526-6801         W
## 3466            Fenton           LA          70640 337-249-4538         B
## 3467             Welsh           LA          70591 337-734-4212         W
## 3468             Welsh           LA     70591-3510 337-734-4759         B
## 3469             Welsh           LA     70591-4108 337-734-4200         W
## 3470             Welsh           LA     70591-4245 337-734-4584         W
## 3471             Welsh           LA     70591-3623 337-734-2540         W
## 3472            Fenton           LA          70640 337-912-8119         B
## 3473            Fenton           LA          70640 337-756-2386         B
## 3474            Fenton           LA          70640 337-390-9302         B
## 3475             Elton           LA          70532 337-246-1993         W
## 3476             Elton           LA          70532 337-884-2312         W
## 3477             Elton           LA     70532-3207 337-584-5105         W
## 3478             Elton           LA          70532 337-584-3257         B
## 3479             Elton           LA     70532-3233 337-275-0495         W
## 3480       Lake Arthur           LA     70549-3126 337-774-2666         B
## 3481       Lake Arthur           LA     70549-3125 337-224-6655         W
## 3482       Lake Arthur           LA     70549-4805 337-774-3675         W
## 3483       Lake Arthur           LA     70549-4435 337-774-3902         W
## 3484       Lake Arthur           LA     70549-3818 337-774-5545         W
## 3485          Jennings           LA          70546 337-824-5785         B
## 3486          Jennings           LA          70546 337-824-8872         W
## 3487          Jennings           LA          70546 337-824-5426         W
## 3488          Jennings           LA          70546 337-824-6821         B
## 3489          Jennings           LA          70546 337-824-7905         W
## 3490          Carencro           LA     70520-5643 337-896-8211         W
## 3491         Lafayette           LA          70502 337-237-2147         W
## 3492         Lafayette           LA     70506-1002 337-232-9134         B
## 3493         Lafayette           LA     70501-3113 337-233-3963         W
## 3494         Lafayette           LA     70506-5534 337-962-1680         W
## 3495         Lafayette           LA     70506-7951 337-991-0294         W
## 3496          Carencro           LA     70520-6110 337-212-1950         B
## 3497         Lafayette           LA          70503 337-693-3493         B
## 3498         Lafayette           LA     70501-2517 337-371-5936         B
## 3499             Scott           LA     70583-5653 337-234-7225         O
## 3500         Lafayette           LA          70505 337-266-2344         W
## 3501         Lafayette           LA     70508-4034 337-234-2874         W
## 3502         Lafayette           LA          70501 337-233-1471         W
## 3503         Lafayette           LA     70508-1726 337-298-5835         W
## 3504         Lafayette           LA     70503-2538 337-237-6106         W
## 3505         Lafayette           LA     70503-8409 337-981-2006         W
## 3506         Lafayette           LA     70508-6784 337-319-7743         W
## 3507         Lafayette           LA     70508-6427 337-988-1031         W
## 3508         Lafayette           LA     70503-5832 337-658-4190         W
## 3509             Scott           LA     70583-4622 337-235-0377         W
## 3510          Carencro           LA     70520-5127 337-896-7958         W
## 3511         Lafayette           LA          70503                       
## 3512         Lafayette           LA          70502 337-315-0366         B
## 3513             Scott           LA     70583-5666 337-278-0761         W
## 3514         Lafayette           LA     70506-3125 337-232-7256         W
## 3515         Lafayette           LA     70508-4002 337-233-3365         W
## 3516         Lafayette           LA     70503-5834 337-504-4516         W
## 3517       Youngsville           LA     70592-5902 337-856-7436         W
## 3518         Lafayette           LA     70506-4269 337-237-0778         W
## 3519         Lafayette           LA          70502 337-291-6368         W
## 3520         Lafayette           LA     70506-5518 337-234-5906         W
## 3521         Lafayette           LA     70508-6006 337-981-1094         W
## 3522             Duson           LA     70529-3339 337-873-6679         W
## 3523          Carencro           LA     70520-4116 337-278-4089         W
## 3524         Lafayette           LA     70506-1101 337-852-9555         B
## 3525         Lafayette           LA     70501-1324 337-237-2793         B
## 3526             Scott           LA     70583-5607 337-261-5730         W
## 3527         Lafayette           LA     70506-6215 337-984-6874         W
## 3528         Lafayette           LA     70508-4955 337-257-9427         W
## 3529         Lafayette           LA     70503-4416 337-984-4170         W
## 3530       Youngsville           LA     70592-6013 337-856-9063         W
## 3531         Lafayette           LA          70502 337-291-8777         W
## 3532         Lafayette           LA          70502 337-291-8761         W
## 3533         Lafayette           LA          70501 337-233-3963         W
## 3534             Scott           LA     70583-4402 337-233-7766         W
## 3535          Carencro           LA          70520 337-257-0466         W
## 3536         Lafayette           LA          70501 337-233-4199         B
## 3537         Lafayette           LA     70501-2517 337-315-9234         B
## 3538             Duson           LA          70529 337-873-0342         W
## 3539         Lafayette           LA     70506-3922 337-296-4457         W
## 3540         Lafayette           LA     70508-5260 337-207-4757         W
## 3541         Lafayette           LA          70503 337-269-1894         W
## 3542       Youngsville           LA     70592-5722 337-298-7195         W
## 3543             Scott           LA          70583 337-873-3646         W
## 3544             Duson           LA          70529 337-873-8413         W
## 3545       Youngsville           LA          70592 337-856-5515         W
## 3546         Broussard           LA          70518 337-837-1404         W
## 3547          Carencro           LA          70520 337-349-3866         W
## 3548          Carencro           LA     70520-5128 337-280-6000         W
## 3549         Lafayette           LA          70508 337-856-4303         W
## 3550         Lafayette           LA          70503 337-989-1729         W
## 3551       Youngsville           LA          70592 337-856-6186         W
## 3552             Scott           LA          70583 337-873-4292         W
## 3553             Rayne           LA          70570 337-873-8918         W
## 3554       Youngsville           LA          70592 337-856-4560         W
## 3555         Broussard           LA          70518 337-837-6298         W
## 3556          Carencro           LA          70520 337-896-6512         W
## 3557          Carencro           LA          70520 337-319-3248         W
## 3558         Lafayette           LA          70508 337-989-9146         W
## 3559             Scott           LA          70583 337-232-2930         W
## 3560       Youngsville           LA          70592 337-856-5643         W
## 3561          Carencro           LA          70520 337-896-8541         W
## 3562             Scott           LA     70583-5018 337-873-9634         B
## 3563       Youngsville           LA     70592-5832 337-856-4622         W
## 3564          Carencro           LA     70520-6202 337-896-9021         W
## 3565             Scott           LA     70583-7921 337-233-3715         W
## 3566       Youngsville           LA     70592-5815 337-857-7295         W
## 3567             Scott           LA          70583 337-235-4589         W
## 3568          Carencro           LA          70520 337-896-8534         B
## 3569          Carencro           LA     70520-3913 337-896-8834         W
## 3570          Carencro           LA     70520-4020 337-255-5557         W
## 3571          Carencro           LA     70520-3916 337-896-6278         W
## 3572          Carencro           LA          70520 337-896-9761         B
## 3573             Scott           LA          70583 337-232-1353         W
## 3574         Lafayette           LA          70507 337-288-4661         W
## 3575         Lafayette           LA     70506-1715 337-235-6806         W
## 3576             Scott           LA          70583 337-235-2942         W
## 3577       Youngsville           LA          70592 337-849-5176         W
## 3578       Youngsville           LA          70592 337-856-9460         W
## 3579       Youngsville           LA     70592-5487 337-856-5089         W
## 3580       Youngsville           LA     70592-5414 337-856-5256         W
## 3581         Broussard           LA     70518-7717 337-781-8385         W
## 3582          Raceland           LA          70394 985-537-2010         W
## 3583         Thibodaux           LA     70301-4218 985-448-2627         B
## 3584          Raceland           LA          70394                       
## 3585         Thibodaux           LA          70301                       
## 3586         Thibodaux           LA     70301-4737 985-217-4266         B
## 3587         Thibodaux           LA     70301-4734 985-446-8264         W
## 3588         Thibodaux           LA          70301                       
## 3589         Thibodaux           LA          70301                       
## 3590          Raceland           LA     70394-3404 985-859-2771         W
## 3591                                                                     
## 3592          Raceland           LA     70394-2711 985-537-6818         W
## 3593                                                                     
## 3594            Larose           LA     70373-2056 985-693-7723         W
## 3595           Cut Off           LA          70345                       
## 3596         Thibodaux           LA     70301-7210 985-633-8233         W
## 3597                                                                     
## 3598                                                                     
## 3599                                                                     
## 3600                                                                     
## 3601                                                                     
## 3602                                                                     
## 3603                                                                     
## 3604                                                                     
## 3605          Galliano           LA          70354 985-325-7157         W
## 3606         Thibodaux           LA     70301-7904 985-438-9481         W
## 3607         Thibodaux           LA     70302-0818 985-447-4841         W
## 3608          Galliano           LA     70354-4020 985-475-5485         W
## 3609            Gheens           LA     70355-2103 985-537-3021         W
## 3610            Larose           LA          70373 985-665-6651         W
## 3611         Thibodaux           LA     70301-4218 985-448-2627         B
## 3612         Thibodaux           LA     70301-8903 985-633-9902         W
## 3613         Thibodaux           LA          70301 985-446-1284         W
## 3614         Thibodaux           LA     70301-3831 985-447-3693         W
## 3615              Gray           LA     70359-5322 985-713-1266         W
## 3616            Gheens           LA          70355 985-532-5889         W
## 3617          Lockport           LA     70374-3242 985-532-5226         W
## 3618           Cut Off           LA     70345-2209 985-691-4247         W
## 3619     Golden Meadow           LA     70357-0183 985-475-5013         W
## 3620         Thibodaux           LA          70301 985-446-7560         W
## 3621         Thibodaux           LA          70301 985-446-8001         W
## 3622         Thibodaux           LA     70301-7146 985-447-9407         W
## 3623         Thibodaux           LA     70301-3417 985-447-1545         W
## 3624         Thibodaux           LA     70301-4640 985-209-5860         B
## 3625         Thibodaux           LA     70301-3831 985-447-3693         W
## 3626         Thibodaux           LA     70301-2917 985-446-8108         W
## 3627         Thibodaux           LA     70301-6002 985-441-2019         W
## 3628          Raceland           LA     70394-3417 985-537-3433         W
## 3629          Raceland           LA     70394-2749 985-537-6946         W
## 3630            Gheens           LA     70355-2315 985-532-6283         W
## 3631          Lockport           LA     70374-3351 985-532-5758         W
## 3632             Houma           LA     70364-1146 985-857-9143         W
## 3633            Larose           LA          70373 985-693-3082         W
## 3634           Cut Off           LA          70345 985-696-9222         B
## 3635           Cut Off           LA     70345-3920 985-632-5735         W
## 3636     Golden Meadow           LA     70357-3117 985-475-6425         W
## 3637          Galliano           LA          70354 985-325-5647         W
## 3638           Cut Off           LA          70345 985-632-6363         W
## 3639           Cut Off           LA     70345-3043 985-632-6049         W
## 3640          Galliano           LA          70354 985-632-7129         W
## 3641     Golden Meadow           LA     70357-2857 985-475-7721         W
## 3642     Golden Meadow           LA     70357-2607 985-475-5459         W
## 3643     Golden Meadow           LA          70357 985-632-4030         W
## 3644            Larose           LA          70373 985-693-3767         W
## 3645           Cut Off           LA          70345 985-632-2123         W
## 3646         Thibodaux           LA          70301 985-446-1883         W
## 3647          Raceland           LA          70394 985-537-6413         W
## 3648            Larose           LA          70373 985-693-3892         W
## 3649          Galliano           LA          70354 985-632-3995         W
## 3650         Thibodaux           LA          70301 985-633-2005         W
## 3651          Raceland           LA          70394 985-537-5735         W
## 3652          Raceland           LA          70394 985-532-5287         W
## 3653          Galliano           LA          70354 985-632-6576         W
## 3654         Thibodaux           LA     70301-8084 985-448-2365         W
## 3655     Golden Meadow           LA          70357 985-677-1252         W
## 3656          Lockport           LA     70374-2940 985-532-5800         W
## 3657     Golden Meadow           LA     70357-2317 985-475-5213         W
## 3658          Lockport           LA          70374 985-413-9772         W
## 3659         Thibodaux           LA     70301-3225 985-446-6875         W
## 3660         Thibodaux           LA     70301-2432 985-859-0618         W
## 3661          Lockport           LA          70394 985-532-3582         W
## 3662          Lockport           LA          70374 985-532-5475         W
## 3663          Lockport           LA     70374-3115 985-532-3772         W
## 3664          Lockport           LA     70374-3117 985-532-3947         W
## 3665          Lockport           LA     70374-2433 985-532-5102         W
## 3666         Thibodaux           LA     70301-8044 985-446-5268         W
## 3667         Thibodaux           LA     70301-3512 985-446-1831         W
## 3668         Thibodaux           LA     70301-4735 985-446-1525         B
## 3669     Golden Meadow           LA     70357-2315 985-475-5837         W
## 3670     Golden Meadow           LA     70357-3178 985-475-4529         W
## 3671     Golden Meadow           LA     70357-3167 985-258-4688         W
## 3672     Golden Meadow           LA     70357-3118 985-475-6425         W
## 3673     Golden Meadow           LA     70357-2442 985-475-5253         W
## 3674              Jena           LA          71342 318-992-2790         W
## 3675              Jena           LA          71342 318-992-4066         W
## 3676                                                                     
## 3677                                                                     
## 3678                                                                     
## 3679                                                                     
## 3680                                                                     
## 3681                                                                     
## 3682                                                                     
## 3683                                                                     
## 3684                                                                     
## 3685                                                                     
## 3686              Jena           LA          71342 318-992-2085         W
## 3687              Jena           LA          71342 318-992-2997         W
## 3688              Jena           LA          71342 318-992-2603         W
## 3689              Jena           LA          71342 318-992-2603         W
## 3690                                                                     
## 3691                                                                     
## 3692            Urania           LA          71480 318-495-3735         W
## 3693                                                                     
## 3694              Jena           LA          71342 318-992-4504         W
## 3695              Jena           LA          71342 318-715-2982         W
## 3696                                                                     
## 3697                                                                     
## 3698              Jena           LA          71342 318-992-6204         W
## 3699                                                                     
## 3700             Trout           LA          71371 318-992-6625         W
## 3701              Jena           LA          71342 318-992-2158         W
## 3702              Jena           LA          71342 318-374-9080         W
## 3703              Jena           LA          71342 318-992-2033         W
## 3704              Olla           LA     71465-6553 318-495-5916         W
## 3705              Olla           LA          71465 318-495-5900         W
## 3706            Urania           LA          71480 318-495-3458         W
## 3707              Jena           LA     71342-6469 318-992-6719         W
## 3708              Jena           LA          71342 318-992-4666         I
## 3709             Trout           LA          71371 318-992-2838         W
## 3710             Trout           LA          71371 318-992-2380         W
## 3711              Jena           LA     71342-5844 318-992-2871         W
## 3712        Jonesville           LA     71343-4415 318-992-4633         W
## 3713              Jena           LA          71342 318-992-2972         B
## 3714              Olla           LA          71465 318-495-5923         W
## 3715              Olla           LA     71465-6508 318-495-5997         W
## 3716            Tullos           LA          71479 318-534-6249         W
## 3717              Jena           LA          71342 318-992-2931         W
## 3718              Jena           LA     71342-4180 318-992-8810         W
## 3719              Jena           LA     71342-3804 318-992-8728         W
## 3720             Trout           LA          71371 318-758-3739         W
## 3721              Jena           LA     71342-5705 318-992-2340         W
## 3722              Jena           LA     71342-5581 318-992-8345         W
## 3723              Jena           LA     71342-6543 318-992-2455         B
## 3724              Olla           LA          71465 318-992-8901         W
## 3725              Olla           LA          71465 318-495-5041         W
## 3726             Trout           LA          71371 318-992-6350         W
## 3727              Jena           LA          71342 318-992-2202         W
## 3728              Jena           LA          71342 318-992-5197         W
## 3729              Olla           LA          71465 318-992-4776         W
## 3730              Olla           LA          71465 318-495-5041         W
## 3731             Trout           LA          71371 318-992-5306         W
## 3732              Jena           LA          71342 318-992-6301         W
## 3733        Jonesville           LA          71343 318-992-0398         W
## 3734              Jena           LA          71342 318-992-5883         W
## 3735              Olla           LA          71465 318-495-5041         W
## 3736            Tullos           LA          71479 318-534-6562         W
## 3737            Urania           LA          71480 318-495-3439         W
## 3738              Jena           LA          71342 318-992-0452         W
## 3739              Olla           LA          71465 318-495-3687         W
## 3740            Tullos           LA     71479-3611 318-316-2565         W
## 3741            Urania           LA          71480 318-495-3439         W
## 3742              Olla           LA     71465-5633 318-495-7923         W
## 3743              Olla           LA          71465 318-495-5026         W
## 3744              Olla           LA     71465-4036 318-312-1106         W
## 3745              Olla           LA          71465 318-495-3219         W
## 3746              Olla           LA          71465 318-533-6929         W
## 3747            Tullos           LA     71479-3625 318-534-6115         W
## 3748            Tullos           LA          71479 318-534-6117         W
## 3749            Tullos           LA          71479 318-374-0818          
## 3750            Tullos           LA          71479 318-534-6578         W
## 3751            Tullos           LA     71479-6108 318-534-6210         W
## 3752            Urania           LA          71480 318-481-6205         W
## 3753            Urania           LA          71480 318-495-3482         W
## 3754            Urania           LA          71480 318-495-3440         W
## 3755            Urania           LA          71480 318-495-3651         W
## 3756            Urania           LA          71480 318-495-3656         W
## 3757              Jena           LA          71342 318-992-6893         W
## 3758              Jena           LA     71342-8253 318-992-6566         W
## 3759              Jena           LA     71342-4042 318-992-4879         W
## 3760              Jena           LA     71342-4242 318-992-2244         W
## 3761              Jena           LA     71342-4521 318-992-4203         W
## 3762                                                                     
## 3763         Grambling           LA     71245-2326 318-513-1580         B
## 3764         Grambling           LA     71245-3115 318-247-6579         B
## 3765          Simsboro           LA     71275-3120 318-263-8205         B
## 3766                                                                     
## 3767                                                                     
## 3768                                                                     
## 3769                                                                     
## 3770                                                                     
## 3771                                                                     
## 3772                                                                     
## 3773                                                                     
## 3774                                                                     
## 3775            Ruston           LA     71270-1643 318-255-5452         W
## 3776            Ruston           LA     71270-5211 318-255-2983         W
## 3777            Ruston           LA     71270-1654 318-254-8646         W
## 3778            Ruston           LA          71270 318-255-7101         W
## 3779            Dubach           LA     71235-2184 318-777-9447         W
## 3780                                                                     
## 3781                                                                     
## 3782                                                                     
## 3783            Dubach           LA     71235-3310 318-251-9322         W
## 3784                                                                     
## 3785                                                                     
## 3786                                                                     
## 3787                                                                     
## 3788                                                                     
## 3789                                                                     
## 3790                                                                     
## 3791            Ruston           LA     71270-5244 318-255-6078         W
## 3792            Ruston           LA     71270-1909 318-255-3045         W
## 3793            Ruston           LA          71273 318-251-5130         W
## 3794            Ruston           LA     71270-9518 318-255-5561         W
## 3795            Dubach           LA     71235-3444 318-251-3774         W
## 3796            Ruston           LA     71270-1151 318-247-8117         B
## 3797         Grambling           LA     71245-3100 318-247-6609         B
## 3798            Ruston           LA     71270-6979 318-255-5386         W
## 3799            Dubach           LA     71235-2338 318-579-0452         W
## 3800         Choudrant           LA     71227-3245 318-768-2410         W
## 3801            Ruston           LA     71270-7065 318-513-2984         W
## 3802            Ruston           LA     71270-2643 318-255-8893         W
## 3803            Ruston           LA     71270-3064 318-255-4826         W
## 3804            Ruston           LA          71270 318-251-1299         B
## 3805            Ruston           LA     71270-8572 318-255-8544         B
## 3806            Ruston           LA     71270-4950 318-251-3298         B
## 3807            Ruston           LA     71270-5246 318-278-9701         W
## 3808            Ruston           LA          71270 318-251-8614         W
## 3809            Ruston           LA          71270 318-251-0454         W
## 3810         Grambling           LA     71245-2317 318-247-6040         B
## 3811         Grambling           LA     71245-3016 318-247-6715         B
## 3812          Simsboro           LA     71275-3451 318-247-3380         W
## 3813            Dubach           LA     71235-3170 318-777-3761         W
## 3814            Ruston           LA     71270-1742 318-768-4471         W
## 3815            Ruston           LA     71270-7033 318-255-9292         W
## 3816            Ruston           LA     71270-2475 318-251-1079         W
## 3817            Ruston           LA     71270-8777 318-251-2348         W
## 3818            Ruston           LA          71270 318-251-1299         B
## 3819            Ruston           LA     71270-6327 318-255-9670         B
## 3820            Ruston           LA          71270 318-255-9733         B
## 3821            Ruston           LA     71270-5256 318-255-6631         W
## 3822         Grambling           LA          71245 318-247-6446         B
## 3823          Simsboro           LA          71275 318-243-4584         W
## 3824            Dubach           LA          71235 318-777-8314         W
## 3825         Choudrant           LA          71227 318-768-2692         W
## 3826         Grambling           LA          71245 318-243-5111         B
## 3827          Simsboro           LA          71275 318-247-8738         W
## 3828            Dubach           LA          71235 318-777-8314         W
## 3829         Choudrant           LA          71227 318-768-2591         W
## 3830         Grambling           LA     71245-2442 318-247-0099         B
## 3831            Ruston           LA     71270-8504 318-255-7569         W
## 3832            Dubach           LA          71235 318-548-1792         W
## 3833            Dubach           LA     71235-3235 318-254-8158         W
## 3834         Choudrant           LA          71227 318-768-2179         W
## 3835          Simsboro           LA     71275-3425 318-247-3504         B
## 3836            Dubach           LA     71235-3003 318-777-3365         W
## 3837         Choudrant           LA     71227-3000 318-768-2977         W
## 3838          Simsboro           LA     71275-3033 318-247-0581         W
## 3839         Choudrant           LA     71227-3087 318-768-2113         W
## 3840         Choudrant           LA     71227-3332 318-768-7712         W
## 3841         Choudrant           LA     71227-3065 318-254-2808         W
## 3842          Simsboro           LA     71275-3206 318-245-5611         W
## 3843           Simboro           LA          71275 318-247-8594         W
## 3844          Simsboro           LA     71275-3034 318-247-0833         W
## 3845            Ruston           LA     71270-6304 318-255-9264         B
## 3846            Ruston           LA     71270-6222 318-255-1073         B
## 3847            Ruston           LA     71270-2601 318-255-2634         W
## 3848            Ruston           LA     71270-7522 318-251-2866         W
## 3849            Ruston           LA     71270-5131 318-255-4093         W
## 3850         Grambling           LA     71245-2334 318-247-6583         B
## 3851         Grambling           LA     71245-2306 318-247-6659         B
## 3852         Grambling           LA     71245-3066 318-247-0744         B
## 3853         Grambling           LA     71245-3308 318-247-6975         B
## 3854         Grambling           LA     71245-2308 318-247-8755         B
## 3855            Dubach           LA          71235 318-777-3551         W
## 3856            Dubach           LA     71235-2065 318-777-3612         W
## 3857            Dubach           LA          71235 318-777-3323         W
## 3858            Dubach           LA     71235-2208 318-777-8653         B
## 3859            Dubach           LA     71235-2230 318-777-8781         B
## 3860            Dubach           LA          71235 318-251-2073         W
## 3861            Dubach           LA     71235-3232 318-255-3159         W
## 3862            Dubach           LA     71235-3207 318-255-2660         W
## 3863            Walker           LA     70785-2603 225-937-2826         W
## 3864     Denham Spring           LA     70726-7527 225-698-3161         W
## 3865            Walker           LA     70785-3901 504-686-7935         W
## 3866    Denham Springs           LA          70727 225-665-6056         W
## 3867                                                                     
## 3868    Denham Springs           LA     70726-4034 225-665-1170         B
## 3869                                                                     
## 3870                                                                     
## 3871                                                                     
## 3872    Springfield LA           LA     70462-8001 985-351-4044         W
## 3873      Independence           LA     70443-3211 985-878-8099         B
## 3874    Denham Springs           LA     70726-4503 225-664-6429         W
## 3875        Livingston           LA     70754-1900 225-686-7405         W
## 3876    Denham Springs           LA     70726-2796 225-614-3270         W
## 3877    Denham Springs           LA     70706-1810 225-329-5067         W
## 3878    Denham Springs           LA     70726-7810 225-664-7063         W
## 3879            Walker           LA     70785-3914 225-931-4749         W
## 3880    Denham Springs           LA     70706-0824 225-665-6515         W
## 3881    Denham Springs           LA     70726-1789 225-667-8257         W
## 3882    Denham Springs           LA     70726-3508 225-271-8818         W
## 3883    Denham Springs           LA     70726-4951 225-620-7272         W
## 3884    Denham Springs           LA     70726-5955 225-505-9505         W
## 3885            Walker           LA     70785-7206 225-664-7147         W
## 3886       Springfield           LA     70462-7303 225-939-9344         W
## 3887            Holden           LA     70744-6216 225-294-5883         W
## 3888    Denham Springs           LA     70706-0824 225-665-4296         W
## 3889        Livingston           LA          70754 225-686-2216         W
## 3890    Denham Springs           LA          70726 225-667-2795         W
## 3891    Denham Springs           LA     70726-6604 225-686-3940         W
## 3892    Denham Springs           LA     70726-2107 225-270-0322         W
## 3893    Denham Springs           LA     70706-0870 225-667-7370         W
## 3894    Denham Springs           LA     70706-0360 225-791-9193         W
## 3895    Denham Springs           LA     70726-7753 225-665-7765         W
## 3896    Denham Springs           LA     70726-2608 225-664-6647         W
## 3897    Denham Springs           LA     70726-5660 225-665-3112         W
## 3898 French Settlement           LA     70733-2212 225-698-6792         W
## 3899            Walker           LA     70785-5741 225-278-9096         W
## 3900       Springfield           LA     70462-7235 225-695-3627         W
## 3901            Albany           LA          70711 225-567-2475         W
## 3902    Denham Springs           LA          70727 225-665-1253         W
## 3903    Denham Springs           LA          70726 225-667-8702         W
## 3904            Walker           LA     70785-3901 225-686-7935         W
## 3905    Denham Springs           LA     70706-0860 225-664-2945         W
## 3906    Denham Springs           LA     70726-2703 225-664-4552         W
## 3907    Denham Springs           LA     70726-3523 225-665-5849         W
## 3908    Denham Springs           LA     70726-7015 225-667-3811         W
## 3909            Walker           LA     70785-4010 225-664-8084         W
## 3910            Walker           LA     70785-6328 225-665-5705         W
## 3911       Springfield           LA     70462-7621 225-695-3721         W
## 3912            Albany           LA          70711 225-567-1109         W
## 3913    Denham Springs           LA          70706 225-667-1500         W
## 3914        Livingston           LA          70754 225-698-6673         W
## 3915            Albany           LA          70711 225-567-3822         W
## 3916          Maurepas           LA          70449 225-695-3666         W
## 3917       Springfield           LA          70462 225-294-2864         W
## 3918    Denham Springs           LA          70726 225-664-9151         W
## 3919            Walker           LA          70785 225-686-3890         W
## 3920        Livingston           LA          70754 225-686-8244         W
## 3921       Springfield           LA          70462 225-695-3508         W
## 3922            Walker           LA          70785 225-664-2893         W
## 3923    Denham Springs           LA          70706 225-664-7695         W
## 3924        Livingston           LA          70754 225-698-3245         W
## 3925            Albany           LA          70711 225-567-3167         W
## 3926          Maurepas           LA          70449 225-695-3127         W
## 3927       Springfield           LA          70462 225-294-5571         W
## 3928    Denham Springs           LA          70726 225-664-9151         W
## 3929            Holden           LA          70744 225-567-3580         W
## 3930            Holden           LA          70744 225-567-6611         W
## 3931       Springfield           LA          70462 225-695-3508         W
## 3932            Walker           LA          70785 225-665-5028         W
## 3933    Denham Springs           LA     70726-3507 225-664-6126         W
## 3934            Walker           LA     70785-8206 225-665-7846         W
## 3935            Albany           LA          70711 225-567-3848         W
## 3936           Killian           LA          70462 225-695-3072         W
## 3937        Livingston           LA     70754-6117 225-686-7619         W
## 3938       Springfield           LA          70462 225-294-5491         W
## 3939       Springfield           LA          70462 225-294-5491         W
## 3940 French Settlement           LA     70733-2307 225-698-3646         W
## 3941      Port Vincent           LA     70726-8046 225-698-6218         W
## 3942            Walker           LA     70785-7927 225-806-0689         W
## 3943            Albany           LA          70711 225-567-3962         W
## 3944        Livingston           LA          70754 225-686-0337         W
## 3945 French Settlement           LA     70733-2408 225-328-3930         W
## 3946            Walker           LA     70785-8210 225-907-4715         W
## 3947            Walker           LA     70785-7743 225-243-4341         W
## 3948            Walker           LA     70785-7936 225-276-6154         W
## 3949            Walker           LA          70785 225-665-9125         W
## 3950            Walker           LA     70785-7932 225-665-6695         W
## 3951            Walker           LA          70785 225-667-0796         W
## 3952           Killian           LA          70462 985-320-5493         W
## 3953       Springfield           LA     70462-7156 225-695-3395         W
## 3954           Killian           LA          70462 225-695-3584         W
## 3955           Killian           LA     70462-7303 225-695-6518         W
## 3956           Killian           LA     70462-7303 225-695-6518         W
## 3957           Killian           LA          70462 225-695-3530         W
## 3958           Killian           LA     70462-7148 225-695-3530         W
## 3959       Springfield           LA          70462 225-695-6108         W
## 3960           Killian           LA     70462-3305 225-695-3072         W
## 3961       Springfield           LA     70462-7608 225-241-0737         W
## 3962        Livingston           LA          70754 225-485-0152         W
## 3963        Livingston           LA          70754 504-686-7149         W
## 3964        Livingston           LA          70754 225-686-3383         W
## 3965        Livingston           LA          70754 225-686-7533         W
## 3966        Livingston           LA          70754 225-686-2385         W
## 3967       Springfield           LA          70422 225-294-3959         W
## 3968       Springfield           LA          70462 225-294-5444         W
## 3969       Springfield           LA          70462 225-294-5617         W
## 3970       Springfield           LA          70462 225-294-3164         W
## 3971       Springfield           LA          70462 225-294-5364         W
## 3972 French Settlement           LA     70733-2002 225-450-5154         W
## 3973 French Settlement           LA     70733-2510 225-698-1909         W
## 3974 French Settlement           LA     70733-2514 225-698-6774         W
## 3975      Port Vincent           LA     70726-8001 225-698-3289         W
## 3976      Port Vincent           LA     70726-8046 225-698-3982         W
## 3977      Port Vincent           LA     70726-8038 225-335-8555         W
## 3978    Denham Springs           LA     70726-2906 225-284-5904         W
## 3979    Denham Springs           LA     70726-5426 225-802-6454         W
## 3980    Denham Springs           LA     70726-3007 225-445-0273         W
## 3981    Denham Springs           LA     70726-2621 225-664-6730         B
## 3982    Denham Springs           LA     70726-3510 225-665-7037         W
## 3983            Albany           LA          70711 225-567-9486         W
## 3984            Albany           LA          70711 225-567-3133         W
## 3985            Albany           LA          70711 225-567-2093         W
## 3986          Tallulah           LA          71282                       
## 3987          Tallulah           LA          71282                       
## 3988          Tallulah           LA          71282                       
## 3989          Tallulah           LA          71282                       
## 3990                                                                     
## 3991          Tallulah           LA          71282                       
## 3992          Tallulah           LA          71282                       
## 3993          Tallulah           LA          71282                       
## 3994          Tallulah           LA          71282                       
## 3995          Tallulah           LA          71282 318-574-3269         W
## 3996                                                                     
## 3997                                                                     
## 3998                                                                     
## 3999                                                                     
## 4000                                                                     
## 4001          Tallulah           LA          71282 318-574-3584         W
## 4002          Tallulah           LA          71284 318-574-0655         W
## 4003          Tallulah           LA          71282 318-574-1656         W
## 4004          Tallulah           LA          71282 318-574-4332         W
## 4005          Tallulah           LA          71282 318-574-3099         W
## 4006             Delhi           LA          71232 318-878-8541         W
## 4007          Tallulah           LA          71282 318-574-1242         B
## 4008          Tallulah           LA          71282 318-574-0853         B
## 4009          Tallulah           LA          71282 318-574-2519         B
## 4010          Tallulah           LA          71282 318-237-8633         W
## 4011          Tallulah           LA     71282-6068 318-574-4964         W
## 4012          Tallulah           LA     71282-2517 318-574-2586         B
## 4013          Tallulah           LA          71282 318-574-0786         B
## 4014          Tallulah           LA     71282-3411 318-574-5139         B
## 4015          Tallulah           LA     71282-3342 318-574-4712         B
## 4016          Tallulah           LA     71282-4013 318-574-0175         B
## 4017          Tallulah           LA     71282-5535 318-574-1843         W
## 4018          Tallulah           LA          71282 318-574-3464         W
## 4019          Tallulah           LA     71282-7041 318-341-0667         W
## 4020          Tallulah           LA     71282-2113 318-574-2286         B
## 4021          Tallulah           LA          71282 318-574-2959         B
## 4022          Tallulah           LA          71282 318-574-4128         W
## 4023          Tallulah           LA          71282 318-574-2248         W
## 4024          Tallulah           LA          71282 318-574-4689         B
## 4025          Tallulah           LA          71282 381-574-4427         W
## 4026          Tallulah           LA     71282-2336 318-574-0152         B
## 4027             Delta           LA          71233 318-633-9542         W
## 4028             Mound           LA     71282-5858 318-574-4969         W
## 4029          Tallulah           LA     71282-5515 318-574-1669         W
## 4030          Tallulah           LA     71282-2510 318-574-5113         B
## 4031          Tallulah           LA     71282-5868 318-574-8581         W
## 4032          Tallulah           LA     71282-5415 318-574-1417         W
## 4033             Delta           LA          71233 601-618-0132         W
## 4034             Delta           LA          71233 318-633-9510         W
## 4035             Delta           LA          71233 601-415-0783         W
## 4036          Tallulah           LA     71282-5858 318-574-0927         W
## 4037          Tallulah           LA     71282-5858 318-574-0927         W
## 4038          Tallulah           LA     71282-5859 318-574-2221         W
## 4039          Tallulah           LA     71282-5516 318-574-4155         W
## 4040          Tallulah           LA     71282-5416 318-574-3987         W
## 4041          Tallulah           LA     71282-5505 318-574-1900         W
## 4042          Tallulah           LA     71282-4504 318-574-2027         W
## 4043          Tallulah           LA     71282-4709 318-574-4456         B
## 4044          Tallulah           LA     71282-2324 318-574-1568         B
## 4045          Tallulah           LA     71282-2235 318-574-0625         B
## 4046          Tallulah           LA     71282-3409 318-574-5828         B
## 4047           Bastrop           LA     71220-5415 318-283-7816         B
## 4048           Bastrop           LA     71220-5624 318-791-7620         B
## 4049           Bastrop           LA     71220-3939 318-680-2608         B
## 4050           Bastrop           LA     71220-2112 318-283-7100         B
## 4051           Bastrop           LA     71220-2928 318-281-2885         B
## 4052                                                                     
## 4053           Bastrop           LA     71220-5624 318-280-9801         B
## 4054                                                                     
## 4055           Bastrop           LA     71220-7210 318-556-4487         B
## 4056           Bastrop           LA     71220-1866 318-281-0509         B
## 4057           Bastrop           LA     71220-5457 318-281-7887         B
## 4058           Bastrop           LA     71220-3759 318-669-0140         B
## 4059           Bastrop           LA     71220-8605 318-281-4454         W
## 4060                                                                     
## 4061                                                                     
## 4062                                                                     
## 4063                                                                     
## 4064                                                                     
## 4065                                                                     
## 4066                                                                     
## 4067           Bastrop           LA     71220-8615 318-281-2417         W
## 4068           Bastrop           LA     71221-1543 318-281-3343         W
## 4069           Bastrop           LA     71229-8927 318-281-8455         W
## 4070            Monroe           LA          71203 318-330-9062         W
## 4071           Bastrop           LA     71220-8405 318-283-5741         W
## 4072         Mer Rouge           LA     71261-8174 318-647-5330         B
## 4073           Bastrop           LA     71220-8607 318-281-9450         W
## 4074           Bastrop           LA     71220-1603 318-281-6549         W
## 4075           Bastrop           LA     71220-3350 318-281-8262         W
## 4076           Bastrop           LA     71220-5457 318-281-7887         B
## 4077           Bastrop           LA     71220-3759 318-281-1013         B
## 4078           Bastrop           LA          71220 318-283-3242         W
## 4079           Bastrop           LA          71220 318-281-9248         B
## 4080           Bastrop           LA     71220-0700 318-283-5995         W
## 4081           Bastrop           LA          71220 318-283-2923         B
## 4082         Mer Rouge           LA          71261 318-647-5246         W
## 4083           Bastrop           LA     71220-6814 318-281-9711         W
## 4084           Bastrop           LA     71220-2115 318-281-1293         W
## 4085           Bastrop           LA     71220-4212 318-537-1250         B
## 4086           Bastrop           LA     71220-3519 318-556-3303         B
## 4087           Bastrop           LA          71220 318-283-2299         W
## 4088           Bastrop           LA          71220 318-281-3563         W
## 4089         Oak Ridge           LA          71264 318-680-2583         W
## 4090         Mer Rouge           LA          71261 318-647-5298          
## 4091           Bastrop           LA          71220 318-283-0071         W
## 4092           Bastrop           LA          71220 318-283-3075         W
## 4093           Bastrop           LA          71220 318-283-7087         W
## 4094             Jones           LA          71250 318-823-2414         W
## 4095           Bastrop           LA          71220 318-281-8545         W
## 4096           Bastrop           LA     71220-6394 318-281-2005         W
## 4097         Oak Ridge           LA          71264 318-244-5650         W
## 4098         Mer Rouge           LA          71261 318-647-3913         W
## 4099           Bastrop           LA          71220 318-283-0329         B
## 4100        Collinston           LA          71229 318-874-2631         W
## 4101           Bastrop           LA          71220 318-281-4916         W
## 4102             Jones           LA          71250 318-823-2414         W
## 4103           Bastrop           LA          71220 318-283-2992         B
## 4104            Bonita           LA     71223-9622 318-823-2877         B
## 4105        Collinston           LA          71229 318-874-2339         W
## 4106         Mer Rouge           LA          71261 318-647-5301         W
## 4107         Oak Ridge           LA          71264 318-244-6815         W
## 4108           Bastrop           LA     71220-2112 318-283-7100         B
## 4109           Bastrop           LA          71220 318-283-7100         B
## 4110           Bastrop           LA          71220 318-281-8224         B
## 4111           Bastrop           LA          71220 318-281-7968         W
## 4112           Bastrop           LA     71220-3486 318-281-8011         W
## 4113           Bastrop           LA          71220 318-281-1470         B
## 4114           Bastrop           LA     71220-4719 318-235-4824         B
## 4115           Bastrop           LA          71220 318-281-5037         B
## 4116           Bastrop           LA     71220-4126 318-281-5037         B
## 4117            Bonita           LA          71223 318-823-4349         B
## 4118            Bonita           LA     71223-9666 318-823-4407         B
## 4119            Bonita           LA     71223-9670 318-823-2704         W
## 4120                                                                     
## 4121        Collinston           LA          71229 318-874-7172         W
## 4122        Collinston           LA          71229 318-874-3304         W
## 4123        Collinston           LA          71229 318-874-3328         B
## 4124         Mer Rouge           LA     71261-0125 318-647-5157         W
## 4125         Mer Rouge           LA          71261 318-647-9923         W
## 4126         Mer Rouge           LA          71261 318-366-7286         W
## 4127         Oak Ridge           LA          71264 318-244-7123         W
## 4128         Oak Ridge           LA          71264 318-244-6066         W
## 4129         Oak Ridge           LA          71264 318-244-6036         W
## 4130      Natchitoches           LA          71457 318-357-9455         B
## 4131          Robeline           LA     71469-5218 318-472-6774         B
## 4132           Natchez           LA          71456                       
## 4133                                                                     
## 4134                                                                     
## 4135                                                                     
## 4136                                                                     
## 4137                                                                     
## 4138                                                                     
## 4139                                                                     
## 4140            Campti           LA          71411                       
## 4141                                                                     
## 4142                                                                     
## 4143           Natchez           LA          71456                       
## 4144                                                                     
## 4145                                                                     
## 4146                                                                     
## 4147                                                                     
## 4148                                                                     
## 4149                                                                     
## 4150                                                                     
## 4151                                                                     
## 4152                                                                     
## 4153                                                                     
## 4154                                                                     
## 4155                                                                     
## 4156           Natchez           LA     71456-3638 318-379-2768         B
## 4157      Natchitoches           LA     71458-0476 318-352-8152         W
## 4158      Natchitoches           LA     71457-6915 318-472-5585         B
## 4159      Natchitoches           LA          71457 318-352-5543          
## 4160      Natchitoches           LA     71458-0779 318-357-1183         W
## 4161      Natchitoches           LA     71457-4707 318-357-1339         B
## 4162           Natchez           LA     71456-3430 318-352-0031         B
## 4163      Natchitoches           LA     71457-5523 318-214-8285         W
## 4164          Goldonna           LA     71031-0263 318-727-8770         W
## 4165         Provencal           LA          71468 318-356-9179         W
## 4166      Natchitoches           LA          71457 318-352-2787         W
## 4167      Natchitoches           LA          71457 318-352-9444         W
## 4168      Natchitoches           LA     71457-2859 318-357-2329         W
## 4169      Natchitoches           LA     71457-4015 318-652-1535         B
## 4170      Natchitoches           LA     71457-3629 318-352-7205         B
## 4171      Natchitoches           LA     71457-6440 318-352-1834         W
## 4172      Natchitoches           LA     71457-3003 318-352-8411         B
## 4173      Natchitoches           LA     71457-5519 318-471-6729         W
## 4174          Clarence           LA          71457 318-357-0532         W
## 4175      Natchitoches           LA     71457-7214 318-352-9102         B
## 4176          Robeline           LA     71469-4217 318-472-6778         W
## 4177         Provencal           LA     71468-6019 318-472-9637         W
## 4178     Cloutierville           LA     71416-2321 318-379-2707         W
## 4179            Campti           LA          71411 318-875-2112         W
## 4180          Robeline           LA          71469 318-472-8739         W
## 4181     Cloutierville           LA     71416-0005 318-332-7116         W
## 4182            Campti           LA          71411 318-875-2261         W
## 4183       Marthaville           LA          71450 318-472-6860         W
## 4184     Cloutierville           LA          71416 318-379-2731         W
## 4185      Natchitoches           LA          71457 318-357-1584         W
## 4186            Campti           LA     71411-4015 318-476-2408         B
## 4187           Ashland           LA     71002-2606 318-544-2546         W
## 4188          Clarence           LA     71414-0214 318-354-9607         B
## 4189          Goldonna           LA          71031 318-727-8770         W
## 4190           Natchez           LA          71456 318-354-8259         B
## 4191       Powhatan LA           LA     71066-0151 318-352-4371         B
## 4192         Provencal           LA          71468 318-472-9324         W
## 4193          Robeline           LA          71469 318-472-9246         W
## 4194            Campti           LA          71411 318-476-2611         B
## 4195           Ashland           LA     71002-4824 318-544-9161         W
## 4196          Clarence           LA          71414 318-352-7029         W
## 4197          Goldonna           LA     71031-3271 318-727-8033         W
## 4198           Natchez           LA          71456 318-214-0429         B
## 4199      Natchitoches           LA     71457-7662 318-352-1778         B
## 4200         Provencal           LA          71468 318-472-8214         W
## 4201          Robeline           LA          71469 318-472-9075         W
## 4202      Natchitoches           LA     71457-6118 318-352-5639         W
## 4203          Clarence           LA          71414 318-471-4680         W
## 4204          Clarence           LA          71414 318-352-7321         B
## 4205          Clarence           LA     71414-0024 832-776-6508         B
## 4206          Goldonna           LA     71031-3608 318-727-8554         W
## 4207          Goldonna           LA     71031-3608 318-727-9933         W
## 4208          Goldonna           LA          71031 318-727-8310         W
## 4209           Natchez           LA          71456 318-354-1644         B
## 4210           Natchez           LA     71456-3422 318-357-8091         B
## 4211           Natchez           LA          71456 318-652-4158         B
## 4212          Powhatan           LA     71066-0117 318-352-7685         B
## 4213          Powhatan           LA          71066 318-352-3926         B
## 4214      Natchitoches           LA     71457-7616 318-332-6749         B
## 4215          Robeline           LA          71469 318-207-0590         W
## 4216         Provencal           LA     71468-0372 318-332-0376         W
## 4217         Provencal           LA          71469 318-332-2902         W
## 4218          Robeline           LA          71469 318-472-5250         W
## 4219          Robeline           LA     71469-4015 318-472-9513         W
## 4220          Robeline           LA          71469 318-472-0500         W
## 4221           Ashland           LA     71002-4813 318-544-2593         W
## 4222           Ashland           LA     71002-5006 318-544-8641         B
## 4223           Ashland           LA     71002-5038 318-544-8856         W
## 4224      Natchitoches           LA     71457-6126 318-352-4381         W
## 4225      Natchitoches           LA     71457-5707 318-352-1603         W
## 4226      Natchitoches           LA     71457-3504 318-352-6129         B
## 4227      Natchitoches           LA     71457-4820 318-357-1292         B
## 4228            Campti           LA          71411 318-476-3432         B
## 4229            Campti           LA          71411 318-652-1232         B
## 4230            Campti           LA          71411 318-476-3812         B
## 4231            Campti           LA     71411-4049 318-476-2793         B
## 4232            Campti           LA          71411 318-476-3625         B
## 4233       New Orleans           LA     70118-3318 504-239-3631         B
## 4234       New Orleans           LA     70125-3416 504-338-1825         W
## 4235       New Orleans           LA     70118-2446 504-218-8862         B
## 4236       New Orleans           LA     70118-2114 504-861-8454         B
## 4237       New Orleans           LA          70185 504-343-9673         B
## 4238       New Orleans           LA     70119-5902 504-610-4271         W
## 4239       New Orleans           LA     70119-2113 504-218-5326         B
## 4240       New Orleans           LA     70118-1943 504-265-9909         B
## 4241    New Orleans LA           LA     70119-4308 504-258-9160         W
## 4242       New Orleans           LA     70119-5943 504-259-4525         W
## 4243       New Orleans           LA     70119-4308 504-259-4510         W
## 4244       New Orleans           LA     70119-4527 504-338-3823         B
## 4245       New Orleans           LA     70118-5352 504-861-1991         W
## 4246       New Orleans           LA     70118-3968 504-862-5945         W
## 4247       New Orleans           LA     70115-6213 504-891-4959         B
## 4248       New Orleans           LA          70175 504-899-2193         B
## 4249       New Orleans           LA          70175 504-891-0631         B
## 4250       New Orleans           LA     70113-2336 504-525-5819         B
## 4251       New Orleans           LA     70115-5353 504-416-5499         B
## 4252       New Orleans           LA     70130-5847 504-458-7979         B
## 4253       New Orleans           LA     70125-3648 504-324-8322         W
## 4254       New Orleans           LA          70150 504-975-4901         B
## 4255       New Orleans           LA     70125-1303 504-208-6228         B
## 4256       New Orleans           LA     70115-4931 504-899-1406         W
## 4257       New Orleans           LA          70130 504-588-9043         W
## 4258       New Orleans           LA     70113-3901 504-568-2740         W
## 4259       New Orleans           LA     70113-1094 504-309-3538         B
## 4260       New Orleans           LA          70130 504-237-4736         W
## 4261       New Orleans           LA     70131-5523 504-391-9641         B
## 4262       New Orleans           LA     70131-3330 504-442-1399         B
## 4263       New Orleans           LA     70131-8317 504-394-8418         B
## 4264       New Orleans           LA     70131-8444 504-392-8470         B
## 4265       New Orleans           LA     70131-8403 504-239-0932         B
## 4266       New Orleans           LA     70131-8601 504-715-8447         B
## 4267       New Orleans           LA     70114-6173 504-289-1234         B
## 4268       New Orleans           LA          70114                       
## 4269       New Orleans           LA     70114-5029 504-432-3650         B
## 4270       New Orleans           LA     70131-8613 504-391-7775         B
## 4271       New Orleans           LA          70174 504-616-7995         B
## 4272       New Orleans           LA     70131-8610 504-296-3691         B
## 4273       New Orleans           LA     70131-4136 504-416-7970         B
## 4274       New Orleans           LA     70131-8635 504-392-7074         B
## 4275       New Orleans           LA     70126-3032 504-242-4198         B
## 4276       New Orleans           LA          70177 504-945-1917         B
## 4277       New Orleans           LA     70122-5101 504-301-9308         B
## 4278       New Orleans           LA          70126 504-288-7844         B
## 4279       New Orleans           LA     70122-3228 504-302-1892         B
## 4280       New Orleans           LA     70122-1250 504-288-4349         B
## 4281       New Orleans           LA          70122 504-915-5212         B
## 4282       New Orleans           LA     70122-2515 504-282-7812         B
## 4283       New Orleans           LA          70185 504-874-3292         B
## 4284       New Orleans           LA     70122-2544 504-309-2285         B
## 4285       New Orleans           LA     70122-2515 504-282-7812         B
## 4286       New Orleans           LA          70122 504-286-2334         B
## 4287       New Orleans           LA     70119-2630 504-343-5009         B
## 4288       New Orleans           LA          70112 504-430-5570         B
## 4289       New Orleans           LA     70128-2538 504-246-1264         B
## 4290       New Orleans           LA     70129-2795 504-267-5695         B
## 4291       New Orleans           LA     70128-2704 504-495-8228         B
## 4292       New Orleans           LA     70128-2704 504-453-7995         B
## 4293       New Orleans           LA     70127-2818 504-450-0457         B
## 4294       New Orleans           LA     70127-1915 504-415-9680         B
## 4295       New Orleans           LA     70127-3810 504-913-9336         B
## 4296       New Orleans           LA          70128 504-231-9496         B
## 4297       New Orleans           LA          70112 504-522-0838         B
## 4298       New Orleans           LA     70128-3638 504-909-1634         B
## 4299       New Orleans           LA     70127-2815 504-430-4630         B
## 4300       New Orleans           LA          70187 504-453-6036         B
## 4301       New Orleans           LA     70129-2901 504-253-1364         B
## 4302       New Orleans           LA     70128-2939 504-301-9619         B
## 4303       New Orleans           LA          70130 504-915-2807         W
## 4304       New Orleans           LA     70119-6035 504-488-6431         W
## 4305       New Orleans           LA     70124-3234 504-482-9589         W
## 4306       New Orleans           LA          70124 504-324-5246         W
## 4307       New Orleans           LA          70124 504-324-5246         A
## 4308       New Orleans           LA     70124-4004 504-459-6628         W
## 4309       New Orleans           LA     70125-4039 504-669-7977         W
## 4310       New Orleans           LA          70130 504-593-9953         W
## 4311       New Orleans           LA     70119-3643 504-524-7727         W
## 4312       New Orleans           LA     70115-4243 504-908-7130         W
## 4313       New Orleans           LA     70118-5955 504-895-2084         W
## 4314       New Orleans           LA          70119 504-858-3137         W
## 4315       New Orleans           LA     70124-1407 504-715-8915         W
## 4316       New Orleans           LA     70125-4352 504-866-4449         W
## 4317       New Orleans           LA     70130-5715 504-393-1214         W
## 4318       New Orleans           LA     70115-6548 504-669-7560         W
## 4319       New Orleans           LA     70115-3040 504-899-4601         W
## 4320       New Orleans           LA     70130-5538 504-899-8539         W
## 4321       New Orleans           LA     70115-4725 504-899-7849         A
## 4322       New Orleans           LA     70115-4725 504-899-7849         W
## 4323       New Orleans           LA     70130-5608 504-376-4479         W
## 4324       New Orleans           LA          70130 504-952-8016         W
## 4325       New Orleans           LA     70130-5203 504-522-5044         W
## 4326       New Orleans           LA     70130-3400 504-616-6318         W
## 4327       New Orleans           LA     70115-3013 504-895-0488         W
## 4328       New Orleans           LA     70130-5951 504-324-8704         W
## 4329       New Orleans           LA     70114-8904 504-366-6180         W
## 4330       New Orleans           LA     70131-8300 504-392-8127         W
## 4331       New Orleans           LA     70131-8306 504-433-9090         W
## 4332      Belle Chasse           LA          70037 504-577-5736         W
## 4333       New Orleans           LA     70114-6834 504-343-2639         W
## 4334       New Orleans           LA     70116-2709 504-523-7047         W
## 4335       New Orleans           LA     70116-3266 504-339-0013         W
## 4336       New Orleans           LA     70126-3048 504-289-8482         W
## 4337       New Orleans           LA          70130 504-609-8686         B
## 4338       New Orleans           LA     70126-4622 504-343-3144         W
## 4339       New Orleans           LA     70126-4620 504-282-3194         W
## 4340       New Orleans           LA     70122-4934 504-858-0220         B
## 4341       New Orleans           LA     70122-2622 504-288-9546         W
## 4342       New Orleans           LA     70122-2222 504-283-6261         W
## 4343       New Orleans           LA          70122 504-309-2291         O
## 4344       New Orleans           LA     70129-2646 504-367-5001         A
## 4345       New Orleans           LA     70129-1032 404-401-9680         W
## 4346       New Orleans           LA          70112 504-565-7325         B
## 4347       New Orleans           LA          70117 504-512-1833         B
##      Gender PartyCode OfficeLevel ExpirationDate CommisionedDate
## 1        F          D          52     29-02-2016      04-03-2012
## 2                              52                               
## 3        F          D          52     29-02-2016      04-03-2012
## 4        M          D          52     29-02-2016      04-03-2012
## 5                   D          52     29-02-2016      04-03-2012
## 6        M          D          52     29-02-2016      04-03-2012
## 7         F         D          52     29-02-2016      04-03-2012
## 8         M         D          52     29-02-2016      04-03-2012
## 9       F           D          52     29-02-2016      04-03-2012
## 10      M           D          52     29-02-2016      04-03-2012
## 11        F         D          52     29-02-2016      04-03-2012
## 12        M         D          52     29-02-2016      04-03-2012
## 13        F         D          52     29-02-2016      04-03-2012
## 14        M         D          52     29-02-2016      04-03-2012
## 15        F         D          52     29-02-2016      04-03-2012
## 16        M         D          52     29-02-2016      04-03-2012
## 17        F         D          52     29-02-2016      04-03-2012
## 18                             52                               
## 19                             52                     29-10-2012
## 20                             52                     29-10-2012
## 21        F         D          52     29-02-2016      04-03-2012
## 22        M         D          52     29-02-2016      04-03-2012
## 23                             52                               
## 24                             52                               
## 25                             52                               
## 26        M         D          52     29-02-2016      04-03-2012
## 27        F         D          52     29-02-2016      04-03-2012
## 28        M         D          52     29-02-2016      04-03-2012
## 29                             52                     29-10-2012
## 30        M         D          52     29-02-2016      04-03-2012
## 31        F         D          52     29-02-2016      04-03-2012
## 32        M         D          52     29-02-2016      04-03-2012
## 33        F         D          52     29-02-2016      04-03-2012
## 34        M         D          52     29-02-2016      04-03-2012
## 35                             52                               
## 36        M         D          52     29-02-2016      04-03-2012
## 37        F         D          52     29-02-2016      04-03-2012
## 38        M         D          52     29-02-2016      04-03-2012
## 39        F         D          52     29-02-2016      04-03-2012
## 40        M         D          52     29-02-2016      04-03-2012
## 41        F         D          52     29-02-2016      04-03-2012
## 42                             52                               
## 43        F         D          52     29-02-2016      04-03-2012
## 44        M         D          52     29-02-2016      04-03-2012
## 45        F         D          52     29-02-2016      04-03-2012
## 46        M         D          52     29-02-2016      04-03-2012
## 47        F         D          52     29-02-2016      04-03-2012
## 48                             52                               
## 49        F         D          52     29-02-2016      04-03-2012
## 50        M         D          52     29-02-2016      04-03-2012
## 51        F         D          52     29-02-2016      04-03-2012
## 52        M         D          52     29-02-2016      04-03-2012
## 53        F         D          52     29-02-2016      04-03-2012
## 54                             52                     29-10-2012
## 55        F         D          52     29-02-2016      04-03-2012
## 56                             52                     29-10-2012
## 57        F         D          52     29-02-2016      04-03-2012
## 58        M         D          52     29-02-2016      04-03-2012
## 59        F         D          52     29-02-2016      04-03-2012
## 60        M         D          52     29-02-2016      04-03-2012
## 61        F         D          52     29-02-2016      04-03-2012
## 62                             52                               
## 63        F         D          52     29-02-2016      04-03-2012
## 64        M         D          52     29-02-2016      04-03-2012
## 65                             52                     29-10-2012
## 66                             52                     29-10-2012
## 67        F         D          52     29-02-2016      04-03-2012
## 68        M         D          52     29-02-2016      04-03-2012
## 69                             52                     29-10-2012
## 70        M         D          52     29-02-2016      04-03-2012
## 71        F         D          52     29-02-2016      04-03-2012
## 72        M         D          52     29-02-2016      04-03-2012
## 73                             52                     29-10-2012
## 74                             52                     29-10-2012
## 75        F         D          52     29-02-2016      04-03-2012
## 76        M         D          52     29-02-2016      04-03-2012
## 77        F         D          52     29-02-2016      04-03-2012
## 78        M         D          52     29-02-2016      04-03-2012
## 79        F         D          52     29-02-2016      04-03-2012
## 80        M         D          52     29-02-2016      04-03-2012
## 81                             52                               
## 82        M         D          52     29-02-2016      04-03-2012
## 83        F         D          52     29-02-2016      04-03-2012
## 84        M         D          52     29-02-2016      04-03-2012
## 85        F         D          52     29-02-2016      04-03-2012
## 86        M         D          52     29-02-2016      04-03-2012
## 87        F         D          52     29-02-2016      04-03-2012
## 88        M         D          52     29-02-2016      04-03-2012
## 89        F         D          52     29-02-2016      04-03-2012
## 90        M         D          52     29-02-2016      04-03-2012
## 91        F         D          52     29-02-2016      04-03-2012
## 92        M         D          52     29-02-2016      04-03-2012
## 93        F         D          52     29-02-2016      04-03-2012
## 94        M         D          52     29-02-2016      04-03-2012
## 95                             52                               
## 96        M         D          52     29-02-2016      04-03-2012
## 97        F         D          52     29-02-2016      04-03-2012
## 98        M         D          52     29-02-2016      04-03-2012
## 99        F         D          52     29-02-2016      04-03-2012
## 100       M         D          52     29-02-2016      04-03-2012
## 101       F         D          52     29-02-2016      04-03-2012
## 102       M         D          52     29-02-2016      04-03-2012
## 103       F         D          52     29-02-2016      04-03-2012
## 104       M         D          52     29-02-2016      04-03-2012
## 105       F         D          52     29-02-2016      04-03-2012
## 106       M         D          52     29-02-2016      04-03-2012
## 107                            52                     29-10-2012
## 108                            52                     29-10-2012
## 109       F         D          52     29-02-2016      04-03-2012
## 110       M         D          52     29-02-2016      04-03-2012
## 111       F         D          52     29-02-2016      04-03-2012
## 112       M         D          52     29-02-2016      04-03-2012
## 113       F         D          52     29-02-2016      04-03-2012
## 114       M         D          52     29-02-2016      04-03-2012
## 115                            52                               
## 116                            52                     29-10-2012
## 117                            52                               
## 118                            52                     29-10-2012
## 119       F         D          52     29-02-2016      04-03-2012
## 120       M         D          52     29-02-2016      04-03-2012
## 121       F         D          52     29-02-2016      04-03-2012
## 122       M         D          52     29-02-2016      04-03-2012
## 123                            52                               
## 124       M         D          52     29-02-2016      04-03-2012
## 125       F         D          52     29-02-2016      04-03-2012
## 126       M         D          52     29-02-2016      04-03-2012
## 127       F         D          52     29-02-2016      04-03-2012
## 128       M         D          52     29-02-2016      04-03-2012
## 129       F         D          52     29-02-2016      04-03-2012
## 130       M         D          52     29-02-2016      04-03-2012
## 131       F         D          52     29-02-2016      04-03-2012
## 132       M         D          52     29-02-2016      04-03-2012
## 133       F         D          52     29-02-2016      04-03-2012
## 134       M         D          52     29-02-2016      04-03-2012
## 135       F         D          52     29-02-2016      04-03-2012
## 136       M         D          52     29-02-2016      04-03-2012
## 137       F         D          52     29-02-2016      04-03-2012
## 138       M         D          52     29-02-2016      04-03-2012
## 139       F         D          52     29-02-2016      04-03-2012
## 140       M         D          52     29-02-2016      04-03-2012
## 141       F         D          52     29-02-2016      04-03-2012
## 142       M         D          52     29-02-2016      04-03-2012
## 143                            52                     29-10-2012
## 144       M         D          52     29-02-2016      04-03-2012
## 145                            52                               
## 146       M         D          52     29-02-2016      04-03-2012
## 147       F         D          52     29-02-2016      04-03-2012
## 148       M         D          52     29-02-2016      04-03-2012
## 149       F         D          52     29-02-2016      04-03-2012
## 150       M         D          52     29-02-2016      04-03-2012
## 151       F         D          52     29-02-2016      04-03-2012
## 152       M         D          52     29-02-2016      04-03-2012
## 153                            52                               
## 154       M         D          52     29-02-2016      04-03-2012
## 155       F         D          52     29-02-2016      04-03-2012
## 156                            52                               
## 157                            52                               
## 158                            52                               
## 159       F         D          52     29-02-2016      04-03-2012
## 160       M         D          52     29-02-2016      04-03-2012
## 161                            52                               
## 162       M         D          52     29-02-2016      04-03-2012
## 163                            52                               
## 164       M         D          52     29-02-2016      04-03-2012
## 165       F         D          52     29-02-2016      04-03-2012
## 166       M         D          52     29-02-2016      04-03-2012
## 167       F         D          52     29-02-2016      04-03-2012
## 168       M         D          52     29-02-2016      04-03-2012
## 169                            52                               
## 170       M         D          52     29-02-2016      04-03-2012
## 171                            52                               
## 172       M         D          52     29-02-2016      04-03-2012
## 173       F         D          52     29-02-2016      04-03-2012
## 174       M         D          52     29-02-2016      04-03-2012
## 175                            52                     29-10-2012
## 176       M         D          52     29-02-2016      04-03-2012
## 177       F         D          52     29-02-2016      04-03-2012
## 178                            52                               
## 179       F         D          52     29-02-2016      04-03-2012
## 180       M         D          52     29-02-2016      04-03-2012
## 181       F         D          52     29-02-2016      04-03-2012
## 182       M         D          52     29-02-2016      04-03-2012
## 183       F         D          52     29-02-2016      04-03-2012
## 184       M         D          52     29-02-2016      04-03-2012
## 185       F         D          52     29-02-2016      04-03-2012
## 186       M         D          52     29-02-2016      04-03-2012
## 187       F         D          52     29-02-2016      04-03-2012
## 188       M         D          52     29-02-2016      04-03-2012
## 189       F         D          52     29-02-2016      04-03-2012
## 190       M         D          52     29-02-2016      04-03-2012
## 191       F         D          52     29-02-2016      04-03-2012
## 192       M         D          52     29-02-2016      04-03-2012
## 193       F         D          52     29-02-2016      04-03-2012
## 194       M         D          52     29-02-2016      04-03-2012
## 195       F         D          52     29-02-2016      04-03-2012
## 196       M         D          52     29-02-2016      04-03-2012
## 197       F         D          52     29-02-2016      04-03-2012
## 198       M         D          52     29-02-2016      04-03-2012
## 199       F         D          52     29-02-2016      04-03-2012
## 200       M         D          52     29-02-2016      04-03-2012
## 201       F         D          52     29-02-2016      04-03-2012
## 202       M         D          52     29-02-2016      04-03-2012
## 203       F         D          52     29-02-2016      04-03-2012
## 204       M         D          52     29-02-2016      04-03-2012
## 205       F         D          52     29-02-2016      04-03-2012
## 206       M         D          52     29-02-2016      04-03-2012
## 207       F         D          52     29-02-2016      04-03-2012
## 208       M         D          52     29-02-2016      04-03-2012
## 209       F         D          52     29-02-2016      04-03-2012
## 210       M         D          52     29-02-2016      04-03-2012
## 211                            62                               
## 212       M         R          62     04-02-2016      04-07-2012
## 213       M         R          62     04-02-2016      04-07-2012
## 214                            62                               
## 215       M         R          62     04-02-2016      04-07-2012
## 216       F         R          62     04-02-2016      04-07-2012
## 217       M         R          62     04-02-2016      04-07-2012
## 218       M         R          62     04-02-2016      04-07-2012
## 219       M         R          62     04-02-2016      04-07-2012
## 220       M         R          62     04-02-2016      04-07-2012
## 221       M         R          62     04-02-2016      04-07-2012
## 222       M         R          62     04-02-2016      04-07-2012
## 223       M         R          62     04-02-2016      04-07-2012
## 224       M         R          62     04-02-2016      04-07-2012
## 225       M         R          62     04-02-2016      04-07-2012
## 226       M         R          62     04-02-2016      04-07-2012
## 227       M         R          62     04-02-2016      04-07-2012
## 228       F         R          62     04-02-2016      04-07-2012
## 229       M         R          62     04-02-2016      04-07-2012
## 230                            62                               
## 231       F         R          62     04-02-2016      04-07-2012
## 232       F         R          62     04-02-2016      04-07-2012
## 233       M         R          62     04-02-2016      04-07-2012
## 234       F         R          62     04-02-2016      04-07-2012
## 235       M         R          62     04-02-2016      04-07-2012
## 236       F         R          62     04-02-2016      04-07-2012
## 237       F         R          62     04-02-2016      04-07-2012
## 238                            62                     08-11-2012
## 239                            62                     08-11-2012
## 240       M         R          62     04-02-2016      04-07-2012
## 241       M         R          62     04-02-2016      04-07-2012
## 242       F         R          62     04-02-2016      04-07-2012
## 243       F         R          62     04-02-2016      04-07-2012
## 244       F         R          62     04-02-2016      04-07-2012
## 245       M         R          62     04-02-2016      04-07-2012
## 246       M         R          62     04-02-2016      04-07-2012
## 247       M         R          62     04-02-2016      04-07-2012
## 248       F         R          62     04-02-2016      04-07-2012
## 249       M         R          62     04-02-2016      04-07-2012
## 250                            62                               
## 251                            62                               
## 252       M         R          62     04-02-2016      04-07-2012
## 253                            62                     08-11-2012
## 254       M         R          62     04-02-2016      04-07-2012
## 255       M         R          62     04-02-2016      04-07-2012
## 256       M         R          62     04-02-2016      04-07-2012
## 257       M         R          62     04-02-2016      04-07-2012
## 258       M         R          62     04-02-2016      04-07-2012
## 259       M         R          62     04-02-2016      04-07-2012
## 260       F         R          62     04-02-2016      04-07-2012
## 261       M         R          62     04-02-2016      04-07-2012
## 262       M         R          62     04-02-2016      04-07-2012
## 263       M         R          62     04-02-2016      04-07-2012
## 264       M         R          62     04-02-2016      04-07-2012
## 265       M         R          62     04-02-2016      04-07-2012
## 266       M         R          62     04-02-2016      04-07-2012
## 267                            62                               
## 268       F         R          62     04-02-2016      04-07-2012
## 269       F         R          62     04-02-2016      04-07-2012
## 270       M         R          62     04-02-2016      04-07-2012
## 271       F         R          62     04-02-2016      04-07-2012
## 272       M         R          62     04-02-2016      04-07-2012
## 273                            62                               
## 274       M         R          62     04-02-2016      04-07-2012
## 275       M         R          62     04-02-2016      04-07-2012
## 276       M         R          62     04-02-2016      04-07-2012
## 277       M         R          62     04-02-2016      04-07-2012
## 278       M         R          62     04-02-2016      04-07-2012
## 279       M         R          62     04-02-2016      04-07-2012
## 280       M         R          62     04-02-2016      04-07-2012
## 281       F         R          62     04-02-2016      04-07-2012
## 282                            62                     08-11-2012
## 283       M         R          62     04-02-2016      04-07-2012
## 284       M         R          62     04-02-2016      04-07-2012
## 285       M         R          62     04-02-2016      04-07-2012
## 286                            62                     08-11-2012
## 287       M         R          62     04-02-2016      04-07-2012
## 288                 R          62     04-02-2016      04-07-2012
## 289       M         R          62     04-02-2016      04-07-2012
## 290       M         R          62     04-02-2016      04-07-2012
## 291       M         R          62     04-02-2016      04-07-2012
## 292       M         R          62     04-02-2016      04-07-2012
## 293       F         R          62     04-02-2016      04-07-2012
## 294       M         R          62     04-02-2016      04-07-2012
## 295       M         R          62     04-02-2016      04-07-2012
## 296       F         R          62     04-02-2016      04-07-2012
## 297       M         R          62     04-02-2016      04-07-2012
## 298       F         R          62     04-02-2016      04-07-2012
## 299       M         R          62     04-02-2016      04-07-2012
## 300       F         R          62     04-02-2016      04-07-2012
## 301       M         R          62     04-02-2016      04-07-2012
## 302       M         R          62     04-02-2016      04-07-2012
## 303       F         R          62     04-02-2016      04-07-2012
## 304       F         R          62     04-02-2016      04-07-2012
## 305       M         R          62     04-02-2016      04-07-2012
## 306                            62                               
## 307       F         R          62     04-02-2016      04-07-2012
## 308       M         R          62     04-02-2016      04-07-2012
## 309       M         R          62     04-02-2016      04-07-2012
## 310       M         R          62     04-02-2016      04-07-2012
## 311       M         R          62     04-02-2016      04-07-2012
## 312       M         R          62     04-02-2016      04-07-2012
## 313       M         R          62     04-02-2016      04-07-2012
## 314       F         R          62     04-02-2016      04-07-2012
## 315                            62                     08-11-2012
## 316       M         R          62     04-02-2016      04-07-2012
## 317       F         R          62     04-02-2016      04-07-2012
## 318       F         R          62     04-02-2016      04-07-2012
## 319                            62                               
## 320       F         R          62     04-02-2016      04-07-2012
## 321       M         R          62     04-02-2016      04-07-2012
## 322       F         R          62     04-02-2016      04-07-2012
## 323       F         R          62     04-02-2016      04-07-2012
## 324       M         R          62     04-02-2016      04-07-2012
## 325       M         R          62     04-02-2016      04-07-2012
## 326       M         R          62     04-02-2016      04-07-2012
## 327       M         R          62     04-02-2016      04-07-2012
## 328       F         R          62     04-02-2016      04-07-2012
## 329       M         R          62     04-02-2016      04-07-2012
## 330       M         R          62     04-02-2016      04-07-2012
## 331       M         R          62     04-02-2016      04-07-2012
## 332       M         R          62     04-02-2016      04-07-2012
## 333       F         R          62     04-02-2016      04-07-2012
## 334       M         R          62     04-02-2016      04-07-2012
## 335       M         R          62     04-02-2016      04-07-2012
## 336       M         R          62     04-02-2016      04-07-2012
## 337       M         R          62     04-02-2016      04-07-2012
## 338       M         R          62     04-02-2016      04-07-2012
## 339       F         R          62     04-02-2016      04-07-2012
## 340       M         R          62     04-02-2016      04-07-2012
## 341                 R          62     04-02-2016      04-07-2012
## 342       M         R          62     04-02-2016      04-07-2012
## 343       M         R          62     04-02-2016      04-07-2012
## 344       M         R          62     04-02-2016      04-07-2012
## 345       M         R          62     04-02-2016      04-07-2012
## 346       M         R          62     04-02-2016      04-07-2012
## 347       M         R          62     04-02-2016      04-07-2012
## 348       M         R          62     04-02-2016      04-07-2012
## 349                            62                     03-04-2013
## 350       F         R          62     04-02-2016      04-07-2012
## 351       M         R          62     04-02-2016      04-07-2012
## 352       F         R          62     04-02-2016      04-07-2012
## 353       M         R          62     04-02-2016      04-07-2012
## 354       M         R          62     04-02-2016      04-07-2012
## 355       M         R          62     04-02-2016      04-07-2012
## 356       M         R          62     04-02-2016      04-07-2012
## 357       F         R          62     04-02-2016      04-07-2012
## 358       M         R          62     04-02-2016      04-07-2012
## 359       M         R          62     04-02-2016      04-07-2012
## 360       M         R          62     04-02-2016      04-07-2012
## 361       M         R          62     04-02-2016      04-07-2012
## 362       M         R          62     04-02-2016      04-07-2012
## 363       F         R          62     04-02-2016      04-07-2012
## 364       M         R          62     04-02-2016      04-07-2012
## 365       F         R          62     04-02-2016      04-07-2012
## 366       F         R          62     04-02-2016      04-07-2012
## 367       M         R          62     04-02-2016      04-07-2012
## 368                            62                               
## 369       M         R          62     04-02-2016      04-07-2012
## 370       M         R          62     04-02-2016      04-07-2012
## 371       F         R          62     04-02-2016      04-07-2012
## 372       M         R          62     04-02-2016      04-07-2012
## 373       F         R          62     04-02-2016      04-07-2012
## 374       M         R          62     04-02-2016      04-07-2012
## 375       M         R          62     04-02-2016      04-07-2012
## 376       M         R          62     04-02-2016      04-07-2012
## 377       M         R          62     04-02-2016      04-07-2012
## 378       M         R          62     04-02-2016      04-07-2012
## 379       M         R          62     04-02-2016      04-07-2012
## 380       F         R          62     04-02-2016      04-07-2012
## 381       M         R          62     04-02-2016      04-07-2012
## 382                            62                     08-11-2012
## 383       F         R          62     04-02-2016      04-07-2012
## 384       M         R          62     04-02-2016      04-07-2012
## 385       M         R          62     04-02-2016      04-07-2012
## 386       M         R          62     04-02-2016      04-07-2012
## 387       F         R          62     04-02-2016      04-07-2012
## 388       F         R          62     04-02-2016      04-07-2012
## 389       M         R          62     04-02-2016      04-07-2012
## 390       M         R          62     04-02-2016      04-07-2012
## 391       F         R          62     04-02-2016      04-07-2012
## 392       M         R          62     04-02-2016      04-07-2012
## 393       F         R          62     04-02-2016      04-07-2012
## 394       M         R          62     04-02-2016      04-07-2012
## 395       M         R          62     04-02-2016      04-07-2012
## 396       F         R          62     04-02-2016      04-07-2012
## 397       M         R          62     04-02-2016      04-07-2012
## 398       M         R          62     04-02-2016      04-07-2012
## 399       M         R          62     04-02-2016      04-07-2012
## 400       M         R          62     04-02-2016      04-07-2012
## 401       F         R          62     04-02-2016      04-07-2012
## 402       M         R          62     04-02-2016      04-07-2012
## 403       M         R          62     04-02-2016      04-07-2012
## 404       M         R          62     04-02-2016      04-07-2012
## 405       M         R          62     04-02-2016      04-07-2012
## 406       M         R          62     04-02-2016      04-07-2012
## 407                            62                               
## 408                            62                               
## 409       M         R          62     04-02-2016      04-07-2012
## 410       M         R          62     04-02-2016      04-07-2012
## 411                            62                               
## 412                            62                               
## 413       F         R          62     04-02-2016      04-07-2012
## 414       F         R          62     04-02-2016      04-07-2012
## 415       M         R          62     04-02-2016      04-07-2012
## 416       M         R          62     04-02-2016      04-07-2012
## 417       M         R          62     04-02-2016      04-07-2012
## 418                            62                     08-11-2012
## 419       M         R          62     04-02-2016      04-07-2012
## 420       F         R          62     04-02-2016      04-07-2012
## 421       M         R          62     04-02-2016      04-07-2012
## 422       M         R          62     04-02-2016      04-07-2012
## 423       F         R          62     04-02-2016      04-07-2012
## 424       F         R          62     04-02-2016      04-07-2012
## 425       M         R          62     04-02-2016      04-07-2012
## 426       M         R          62     04-02-2016      04-07-2012
## 427       M         R          62     04-02-2016      04-07-2012
## 428                            62                               
## 429       M         R          62     04-02-2016      04-07-2012
## 430       M         R          62     04-02-2016      04-07-2012
## 431       M         R          62     04-02-2016      04-07-2012
## 432       M         R          62     04-02-2016      04-07-2012
## 433       M         R          62     04-02-2016      04-07-2012
## 434       M         R          62     04-02-2016      04-07-2012
## 435                            62                               
## 436                            62                               
## 437       M         R          62     04-02-2016      04-07-2012
## 438       M         R          62     04-02-2016      04-07-2012
## 439       M         R          62     04-02-2016      04-07-2012
## 440                            62                               
## 441       M         R          62     04-02-2016      04-07-2012
## 442       M         R          62     04-02-2016      04-07-2012
## 443       M         R          62     04-02-2016      04-07-2012
## 444       M         R         100     01-11-2016      01-09-2012
## 445       M         R         105     01-11-2016      01-09-2012
## 446       M         R         110     01-11-2016      01-09-2012
## 447       M         R         115     01-11-2016      01-09-2012
## 448       M         R         120     01-11-2016      01-09-2012
## 449       M         R         125     01-11-2016      01-09-2012
## 450       M         R         130     01-11-2016      01-09-2012
## 451       F         D         140     01-03-2015      01-03-2009
## 452       M         R         140     01-03-2017      01-03-2011
## 453       M         R         145     01-03-2015      01-03-2013
## 454       M         D         145     01-03-2015      01-03-2013
## 455       M         R         145     01-03-2015      01-03-2012
## 456       M         R         145     01-03-2015      01-03-2013
## 457       M         R         145     01-03-2015      01-03-2013
## 458       M         R         145     01-03-2015      01-03-2013
## 459       M         R         150     31-12-2018      01-01-2009
## 460       M         R         150     31-12-2014      01-01-2005
## 461       F         D         150     31-12-2016      01-01-2007
## 462       M         R         150     31-12-2016      27-10-2009
## 463       M         R         150     31-12-2018      02-01-2013
## 464                 N         150     31-12-2022      01-01-2013
## 465       F         D         150     31-12-2020      01-01-2011
## 466       F         R         155     31-12-2020      01-01-2011
## 467                 R         155     31-12-2022      01-01-2013
## 468       M         R         155     31-12-2014      01-01-2005
## 469       M         D         155     31-12-2021      01-01-2012
## 470       M         D         155     31-12-2018      01-01-2009
## 471       M         R         155     31-12-2022      01-01-2013
## 472       M         D         155     31-12-2014      01-01-2005
## 473       F         D         155     31-12-2022      01-01-2013
## 474       M         R         155     31-12-2014      01-01-2005
## 475       F         R         155     31-12-2022      01-01-2013
## 476       M         R         155     31-12-2014      28-02-2013
## 477       M         R         155     31-12-2022      01-01-2013
## 478       F         D         155     31-12-2022      01-01-2013
## 479       M         D         155     31-12-2018      01-01-2009
## 480       M         D         155     31-12-2022      01-01-2013
## 481       M         D         155     31-12-2016      01-01-2007
## 482       M         D         155     31-12-2018      01-01-2009
## 483       M         D         155     31-12-2020      01-01-2011
## 484       M         D         155     31-12-2014      01-01-2005
## 485       F         R         155     31-12-2022      01-01-2013
## 486                           155                     20-01-2012
## 487       F         N         155     31-12-2020      25-02-2013
## 488       F         D         155     31-12-2022      01-01-2013
## 489       M         D         155     31-12-2016      01-01-2007
## 490       M         D         155     31-12-2016      14-11-2008
## 491       M         D         155     31-12-2020      01-01-2011
## 492       M         D         155     31-12-2014      01-01-2005
## 493       M         R         155     31-12-2022      01-01-2013
## 494                 D         155     31-12-2022      01-01-2013
## 495       F         D         155     31-12-2022      01-01-2013
## 496       M         R         155     31-12-2022      01-01-2013
## 497                 D         155     31-12-2018      01-01-2009
## 498       F         R         155     31-12-2020      01-01-2011
## 499       M         D         155     31-12-2014      01-01-2005
## 500       M         D         155     31-12-2021      01-01-2012
## 501       M         D         155     31-12-2022      01-01-2013
## 502       M         D         155     31-12-2022      01-01-2013
## 503       M         D         155     31-12-2022      01-01-2013
## 504       M         D         155     31-12-2018      01-01-2009
## 505       M         D         155     31-12-2016      01-01-2007
## 506       F         D         155     31-12-2014      01-01-2005
## 507       F         D         155     31-12-2021      01-01-2012
## 508       F         D         155     31-12-2021      01-01-2012
## 509       F         D         155     31-12-2022      01-01-2013
## 510       F         R         155     31-12-2021      01-01-2012
## 511       M         D         155     31-12-2020      01-01-2011
## 512       M         D         155     31-12-2014      14-04-2009
## 513       F         R         155     31-12-2020      01-01-2011
## 514       F         R         155     31-12-2022      01-01-2013
## 515       M         R         155     31-12-2022      01-02-2013
## 516       M         R         155     31-12-2022      01-01-2013
## 517       M         R         155     31-12-2022      01-01-2013
## 518       M         D         155     31-12-2020      01-01-2011
## 519       M         D         155     31-12-2022      01-01-2013
## 520       M         R         160     31-12-2014      01-01-2009
## 521       M         R         160     31-12-2018      01-01-2013
## 522       M         D         160     31-12-2016      01-01-2011
## 523       M         R         160     31-12-2016      01-01-2011
## 524       M         D         160     31-12-2014      01-01-2009
## 525       M         R         165     01-11-2016      01-09-2012
## 526       F         D         165     01-11-2016      01-09-2012
## 527       F         R         165     01-11-2016      01-09-2012
## 528       M         R         165     01-11-2016      01-09-2012
## 529                 R         165     01-11-2016      01-09-2012
## 530       M         R         165     01-11-2016      01-09-2012
## 531       F         R         165     01-11-2016      01-09-2012
## 532       F         D         165     01-11-2016      01-09-2012
## 533       M         R         200     01-11-2016      01-09-2012
## 534       M         D         200     01-11-2016      01-09-2012
## 535       M         D         200     01-11-2016      01-09-2012
## 536       M         D         200     01-11-2016      01-09-2012
## 537       F         D         200     01-11-2016      01-09-2012
## 538       M         R         200     01-11-2016      01-09-2012
## 539       M         D         200     01-11-2016      01-09-2012
## 540       M         R         200     01-11-2016      01-09-2012
## 541       M         R         200     01-11-2016      01-09-2012
## 542       M         R         200     01-11-2016      01-09-2012
## 543       M         R         200     01-11-2016      01-09-2012
## 544       M         D         200     01-11-2016      01-09-2012
## 545       M         R         200     01-11-2016      01-09-2012
## 546       F         D         200     01-11-2016      01-09-2012
## 547       F         D         200     01-11-2016      01-09-2012
## 548       M         R         200     01-11-2016      01-09-2012
## 549       M         D         200     01-11-2016      01-09-2012
## 550       M         R         200     01-11-2016      01-09-2012
## 551       M         D         200     01-11-2016      01-09-2012
## 552       M         R         200     01-11-2016      01-09-2012
## 553       M         R         200     01-11-2016      01-09-2012
## 554       M         R         200     01-11-2016      01-09-2012
## 555       M         R         200     01-11-2016      01-09-2012
## 556       M         D         200     01-11-2016      01-09-2012
## 557       M         R         200     01-11-2016      01-09-2012
## 558       M         R         200     01-11-2016      01-09-2012
## 559       M         R         200     01-11-2016      01-09-2012
## 560       M         D         200     01-11-2016      01-09-2012
## 561       M         D         200     01-11-2016      01-09-2012
## 562       M         R         200     01-11-2016      01-09-2012
## 563       M         R         200     01-11-2016      01-09-2012
## 564       M         R         200     01-11-2016      01-09-2012
## 565       M         R         200     01-11-2016      01-09-2012
## 566       M         D         200     01-11-2016      01-09-2012
## 567       M         R         200     01-11-2016      01-09-2012
## 568       M         R         200     01-11-2016      01-09-2012
## 569       M         R         200     01-11-2016      01-09-2012
## 570       F         R         200     01-11-2016      01-09-2012
## 571       M         D         200     01-11-2016      01-09-2012
## 572       M         R         205     01-11-2016      01-09-2012
## 573       M         D         205     01-11-2016      01-09-2012
## 574       F         D         205     01-11-2016      01-09-2012
## 575       M         D         205     01-11-2016      01-09-2012
## 576       M         R         205     01-11-2016      01-09-2012
## 577       M         R         205     01-11-2016      01-09-2012
## 578       M         R         205     01-11-2016      01-09-2012
## 579       M         R         205     01-11-2016      01-09-2012
## 580       M         R         205     01-11-2016      01-09-2012
## 581       M         D         205     01-11-2016      01-09-2012
## 582       M         D         205     01-11-2016      01-09-2012
## 583       M         R         205     01-11-2016      01-09-2012
## 584       M         D         205     01-11-2016      01-09-2012
## 585       M         R         205     01-11-2016      01-09-2012
## 586       M         R         205     01-11-2016      01-09-2012
## 587       F         D         205     01-11-2016      01-09-2012
## 588       M         D         205     01-11-2016      01-09-2012
## 589       M         D         205     01-11-2016      01-09-2012
## 590       M         R         205     01-11-2016      01-09-2012
## 591       M         R         205     01-11-2016      01-09-2012
## 592       M         D         205     01-11-2016      01-09-2012
## 593       M         N         205     01-11-2016      01-09-2012
## 594       M         D         205     01-11-2016      01-09-2012
## 595       M         R         205     01-11-2016      01-09-2012
## 596       M         R         205     01-11-2016      01-09-2012
## 597       M         D         205     01-11-2016      01-09-2012
## 598       M         R         205     01-11-2016      01-09-2012
## 599       M         D         205     01-11-2016      01-09-2012
## 600       F         D         205     01-11-2016      01-09-2012
## 601       M         D         205     01-11-2016      01-09-2012
## 602       F         R         205     01-11-2016      01-09-2012
## 603       F         D         205     01-11-2016      01-09-2012
## 604       M         D         205     01-11-2016      01-09-2012
## 605       M         D         205     01-11-2016      01-09-2012
## 606       M         R         205     01-11-2016      01-09-2012
## 607       M         R         205     01-11-2016      01-09-2012
## 608       M         R         205     01-11-2016      01-09-2012
## 609       M         D         205     01-11-2016      01-09-2012
## 610       M         D         205     01-11-2016      01-09-2012
## 611       F         D         205     01-11-2016      01-09-2012
## 612       M         D         205     01-11-2016      01-09-2012
## 613       M         D         205     01-11-2016      01-09-2012
## 614       M         R         205     01-11-2016      01-09-2012
## 615       M         D         205     01-11-2016      01-09-2012
## 616       M         R         205     01-11-2016      01-09-2012
## 617       M         R         205     01-11-2016      01-09-2012
## 618       M         R         205     01-11-2016      01-09-2012
## 619       M         R         205     01-11-2016      01-09-2012
## 620       F         R         205     01-11-2016      01-09-2012
## 621       M         D         205     01-11-2016      01-09-2012
## 622       M         R         205     01-11-2016      01-09-2012
## 623       M         R         205     01-11-2016      01-09-2012
## 624       F         R         205     01-11-2016      01-09-2012
## 625       M         D         205     01-11-2016      01-09-2012
## 626       M         N         205     01-11-2016      01-09-2012
## 627       M         R         205     01-11-2016      01-09-2012
## 628       M         D         205     01-11-2016      01-09-2012
## 629       M         D         205     01-11-2016      01-09-2012
## 630       M         R         205     01-11-2016      01-09-2012
## 631       F         D         205     01-11-2016      01-09-2012
## 632       M         D         205     01-11-2016      01-09-2012
## 633       M         R         205     01-11-2016      01-09-2012
## 634       M         D         205     01-11-2016      01-09-2012
## 635       F         R         205     01-11-2016      01-09-2012
## 636       M         R         205     01-11-2016      03-12-2013
## 637       M         R         205     01-11-2016      01-09-2012
## 638       F         D         205     01-11-2016      01-09-2012
## 639       M         R         205     01-11-2016      01-09-2012
## 640       M         R         205     01-11-2016      01-09-2012
## 641       M         R         205     01-11-2016      01-09-2012
## 642       M         R         205     01-11-2016      01-09-2012
## 643       M         D         205     01-11-2016      01-09-2012
## 644       M         R         205     01-11-2016      01-09-2012
## 645       M         R         205     01-11-2016      01-09-2012
## 646       M         D         205     01-11-2016      01-09-2012
## 647       M         R         205     01-11-2016      01-09-2012
## 648       M         R         205     01-11-2016      01-09-2012
## 649       M         R         205     01-11-2016      01-09-2012
## 650       F         R         205     01-11-2016      03-12-2013
## 651       M         R         205     01-11-2016      01-09-2012
## 652       M         R         205     01-11-2016      01-09-2012
## 653       M         R         205     01-11-2016      01-09-2012
## 654       M         D         205     01-11-2016      01-09-2012
## 655       M         R         205     01-11-2016      01-09-2012
## 656       M         R         205     01-11-2016      01-09-2012
## 657       M         R         205     01-11-2016      01-09-2012
## 658       M         D         205     01-11-2016      01-09-2012
## 659       M         R         205     01-11-2016      01-09-2012
## 660       M         R         205     01-11-2016      01-09-2012
## 661       M         R         205     01-11-2016      01-09-2012
## 662       M         D         205     01-11-2016      01-09-2012
## 663       M         R         205     01-11-2016      01-09-2012
## 664       F         D         205     01-11-2016      01-09-2012
## 665       M         R         205     01-11-2016      01-09-2012
## 666       M         R         205     01-11-2016      01-09-2012
## 667       M         D         205     01-11-2016      01-09-2012
## 668       M         D         205     01-11-2016      01-09-2012
## 669       M         D         205     01-11-2016      01-09-2012
## 670       M         D         205     01-11-2016      01-09-2012
## 671       M         D         205     01-11-2016      01-09-2012
## 672       M         D         205     01-11-2016      01-09-2012
## 673       M         D         205     01-11-2016      01-09-2012
## 674       M         R         205     01-11-2016      01-09-2012
## 675       M         R         205     01-11-2016      01-09-2012
## 676       M         R         205     01-11-2016      01-09-2012
## 677       F         D         210     31-12-2014      01-01-2009
## 678       M         D         210     31-12-2014      01-01-2009
## 679       M         D         210     31-12-2014      01-01-2009
## 680       M         D         210     31-12-2014      01-01-2009
## 681       M         D         210     31-12-2014      01-01-2009
## 682                           210                               
## 683                 R         210     31-12-2014      01-01-2009
## 684                 D         210     31-12-2014      01-01-2009
## 685       M         R         210     31-12-2014      01-01-2009
## 686       F         R         210     31-12-2014      25-02-2013
## 687       M         R         210     31-12-2014      01-01-2009
## 688       F         D         210     31-12-2014      01-01-2009
## 689       M         D         210     31-12-2014      01-01-2009
## 690       M         D         210     31-12-2014      01-01-2009
## 691       F         N         210     31-12-2014      01-01-2009
## 692       M         N         210     31-12-2014      01-01-2009
## 693       M         D         210     31-12-2014      01-01-2009
## 694       M         D         210     31-12-2014      01-01-2009
## 695       M         D         210     31-12-2014      01-01-2009
## 696       M         D         210     31-12-2014      01-01-2009
## 697       M         D         210     31-12-2014      01-01-2009
## 698       M         R         210     31-12-2014      01-01-2009
## 699       F         R         210     31-12-2014      01-01-2009
## 700       M         N         210     31-12-2014      01-01-2009
## 701       M         D         210     31-12-2014      01-01-2009
## 702       M         N         210     31-12-2014      18-02-2010
## 703       M         R         210     31-12-2014      01-01-2009
## 704       M         R         210     31-12-2014      01-01-2009
## 705       M         R         210     31-12-2014      01-01-2009
## 706       M         R         210     31-12-2014      01-01-2009
## 707       M         D         210     31-12-2014      01-01-2009
## 708       M         D         210     31-12-2014      01-01-2009
## 709       M         D         210     31-12-2014      01-01-2009
## 710       F         D         210     31-12-2014      01-01-2009
## 711       M         D         210     31-12-2014      01-01-2009
## 712       M         R         210     31-12-2014      01-01-2009
## 713       M         D         210     31-12-2014      01-01-2009
## 714       M         D         210     31-12-2014      01-01-2009
## 715       M         O         210     31-12-2014      01-01-2009
## 716       F         D         210     31-12-2014      01-01-2009
## 717                 D         210     31-12-2014      01-01-2009
## 718       F         D         210     31-12-2014      01-01-2009
## 719       M         D         210     31-12-2014      01-01-2009
## 720       M         D         210     31-12-2014      01-01-2009
## 721       F         D         210     31-12-2014      01-01-2009
## 722       M         D         210     31-12-2014      01-01-2009
## 723       M         D         210     31-12-2014      01-01-2009
## 724       M         D         210     31-12-2014      01-01-2009
## 725       M         D         210     31-12-2014      01-01-2009
## 726       M         D         210     31-12-2014      01-01-2009
## 727       F         D         210     31-12-2014      01-01-2009
## 728       M         D         210     31-12-2014      01-01-2009
## 729       M         D         210     31-12-2014      01-01-2009
## 730       M         R         210     31-12-2014      01-01-2009
## 731       M         D         210     31-12-2014      21-01-2009
## 732       M         D         210     31-12-2014      01-01-2009
## 733       M         D         210     31-12-2014      01-01-2009
## 734       M         D         210     31-12-2014      01-01-2009
## 735       M         R         210     31-12-2014      01-01-2009
## 736       M         O         210     31-12-2014      01-01-2009
## 737       M         D         210     31-12-2014      01-01-2009
## 738       M         D         210     31-12-2014      01-01-2009
## 739       M         R         210     31-12-2014      01-01-2009
## 740       M         D         210     31-12-2014      01-01-2009
## 741       M         R         210     31-12-2014      01-01-2009
## 742       F         R         210     31-12-2014      01-01-2009
## 743       F         R         210     31-12-2014      29-11-2011
## 744       M         D         210     31-12-2014      01-01-2009
## 745       M         D         210     31-12-2014      01-01-2009
## 746       M         D         210     31-12-2014      01-01-2009
## 747       M         D         210     31-12-2014      01-01-2009
## 748                 D         210     31-12-2014      01-01-2009
## 749       M         D         210     31-12-2014      01-01-2009
## 750       F         D         210     31-12-2014      01-01-2009
## 751       M         D         210     31-12-2014      01-01-2009
## 752       M         R         210     31-12-2014      01-01-2009
## 753       M         D         210     31-12-2014      25-02-2013
## 754       M         N         210     31-12-2014      01-01-2009
## 755       M         N         210     31-12-2014      01-01-2009
## 756       M         D         210     31-12-2014      01-01-2009
## 757       M         D         210     31-12-2014      01-01-2009
## 758       M         D         210     31-12-2014      01-01-2009
## 759       M         D         210     31-12-2014      01-01-2009
## 760       M         D         210     31-12-2014      01-01-2009
## 761       M         D         210     31-12-2014      01-01-2009
## 762       M         D         210     31-12-2014      01-01-2009
## 763       M         D         210     31-12-2014      01-01-2009
## 764       M         D         210     31-12-2014      01-01-2009
## 765       M         D         210     31-12-2014      01-01-2009
## 766       M         D         210     31-12-2014      01-01-2009
## 767       F         D         210     31-12-2014      01-01-2009
## 768       F         D         210     31-12-2014      01-01-2009
## 769       F         D         210     31-12-2014      01-01-2009
## 770       M         D         210     31-12-2014      01-01-2009
## 771       M         R         210     31-12-2014      01-01-2009
## 772       M         R         210     31-12-2014      01-01-2009
## 773       M         D         210     31-12-2014      01-01-2009
## 774       F         D         210     31-12-2014      01-01-2009
## 775       M         R         210     31-12-2014      01-01-2009
## 776       M         R         210     31-12-2014      01-01-2009
## 777       M         R         210     31-12-2014      01-01-2009
## 778       M         R         210     31-12-2014      01-01-2009
## 779       M         D         210     31-12-2014      01-01-2009
## 780       M         R         210     31-12-2014      01-01-2009
## 781       M         D         210     31-12-2014      01-01-2009
## 782       M         D         210     31-12-2014      01-01-2009
## 783       M         R         210     31-12-2014      01-01-2009
## 784       M         R         210     31-12-2014      01-01-2009
## 785       M         R         210     31-12-2014      01-01-2009
## 786       M         R         210     31-12-2014      01-01-2009
## 787       F         R         210     31-12-2014      01-01-2009
## 788       F         R         210     31-12-2014      01-01-2009
## 789                           210                               
## 790       F         D         210     31-12-2014      01-01-2009
## 791       F         R         210     31-12-2014      01-01-2009
## 792       M         R         210     31-12-2014      01-01-2009
## 793       M         R         210     31-12-2014      01-01-2009
## 794       M         R         210     31-12-2014      01-01-2009
## 795       M         N         210     31-12-2014      01-01-2009
## 796       M         R         210     31-12-2014      01-01-2009
## 797       M         R         210     31-12-2014      01-01-2009
## 798                           210                     01-01-2013
## 799       F         R         210     31-12-2014      01-01-2009
## 800                 R         210     31-12-2014      01-01-2009
## 801       M         R         210     31-12-2014      01-01-2009
## 802       F         R         210     31-12-2014      01-01-2009
## 803       F         R         210     31-12-2014      01-01-2009
## 804       M         D         210     31-12-2014      01-01-2009
## 805       M         D         210     31-12-2014      01-01-2009
## 806       M         D         210     31-12-2014      01-01-2009
## 807       M         D         210     31-12-2014      01-01-2009
## 808       F         R         210     31-12-2014      04-03-2012
## 809       M         R         210     31-12-2014      01-01-2009
## 810       M         R         210     31-12-2014      01-01-2009
## 811       M         R         210     31-12-2014      05-11-2010
## 812                           210                     01-01-2013
## 813       M         R         210     31-12-2014      01-01-2013
## 814       M         R         210     31-12-2014      25-02-2013
## 815       F         R         210     31-12-2014      01-01-2009
## 816       M         R         210     31-12-2014      01-01-2009
## 817       M         R         210     31-12-2014      01-01-2009
## 818       F         R         210     31-12-2014      01-01-2009
## 819       F         D         210     31-12-2014      01-01-2009
## 820       M         D         210     31-12-2014      01-01-2009
## 821       M         R         210     31-12-2014      25-02-2013
## 822       M         D         210     31-12-2014      01-01-2009
## 823       M         R         210     31-12-2014      01-01-2009
## 824       M         R         210     31-12-2014      01-01-2009
## 825       M         O         210     31-12-2014      01-01-2009
## 826       M         D         210     31-12-2014      01-01-2012
## 827       M         R         210     31-12-2014      01-01-2009
## 828       M         D         210     31-12-2014      01-01-2009
## 829       M         R         210     31-12-2014      01-01-2009
## 830       M         N         210     31-12-2014      01-01-2009
## 831       M         R         210     31-12-2014      18-12-2012
## 832       M         D         210     31-12-2014      01-01-2009
## 833       M         D         210     31-12-2014      01-01-2009
## 834       M         D         210     31-12-2014      01-01-2009
## 835       M         D         210     31-12-2014      01-01-2009
## 836       M         D         210     31-12-2014      01-01-2009
## 837       M         D         210     31-12-2014      01-01-2009
## 838       M         D         210     31-12-2014      01-01-2009
## 839       F         D         210     31-12-2014      01-01-2009
## 840       F         R         210     31-12-2014      04-03-2012
## 841       M         D         210     31-12-2014      01-01-2009
## 842       M         D         210     31-12-2014      01-01-2009
## 843       M         R         210     31-12-2014      01-01-2009
## 844       M         D         210     31-12-2014      01-01-2009
## 845       M         D         210     31-12-2014      01-01-2009
## 846       M         D         210     31-12-2014      01-01-2009
## 847       M         R         210     31-12-2014      01-01-2009
## 848       M         R         210     31-12-2014      01-01-2009
## 849       M         R         210     31-12-2014      01-01-2009
## 850       M         D         210     31-12-2014      01-01-2009
## 851       F         D         210     31-12-2014      01-01-2009
## 852       M         D         210     31-12-2014      01-01-2009
## 853       M         D         210     31-12-2014      01-07-2009
## 854       M         D         210     31-12-2014      15-02-2010
## 855       M         D         210     31-12-2014      01-01-2009
## 856       M         D         210     31-12-2014      01-01-2009
## 857       M         R         210     31-12-2014      01-01-2009
## 858       F         D         210     31-12-2014      01-01-2009
## 859       M         N         210     31-12-2014      01-01-2009
## 860       M         D         210     31-12-2014      01-01-2009
## 861       F         D         210     31-12-2014      01-01-2009
## 862       M         D         210     31-12-2014      01-01-2009
## 863       F         D         210     31-12-2014      01-01-2009
## 864       F         D         210     31-12-2014      01-01-2009
## 865       M         D         210     31-12-2014      01-01-2009
## 866       M         N         210     31-12-2014      01-01-2009
## 867       M         R         210     31-12-2014      01-01-2009
## 868       F         D         210     31-12-2014      01-01-2009
## 869       F         D         210     31-12-2014      01-01-2012
## 870       M         D         210     31-12-2014      01-01-2009
## 871       M         D         210     31-12-2014      22-01-2009
## 872       F         D         210     31-12-2014      01-01-2012
## 873       M         D         210     31-12-2014      01-01-2009
## 874       F         D         210     31-12-2014      01-01-2009
## 875       M         D         210     31-12-2014      01-01-2009
## 876       F         D         210     31-12-2014      01-01-2009
## 877       F         D         210     31-12-2014      17-02-2010
## 878                           210                               
## 879       M         D         210     31-12-2014      01-01-2009
## 880       F         D         210     31-12-2014      01-01-2009
## 881       F         D         210     31-12-2014      01-01-2009
## 882       F         D         210     31-12-2014      02-02-2012
## 883       F         D         210     31-12-2014      01-01-2009
## 884       F         D         210     31-12-2014      01-01-2013
## 885       M         D         210     31-12-2014      01-01-2009
## 886       M         D         210     31-12-2014      01-01-2009
## 887       F         D         210     31-12-2014      01-01-2009
## 888       F         D         210     31-12-2014      01-01-2009
## 889       M         D         210     31-12-2014      01-01-2009
## 890       F         D         210     31-12-2014      01-01-2009
## 891       F         D         210     31-12-2014      01-01-2009
## 892       M         D         210     31-12-2014      01-01-2009
## 893       M         D         210     31-12-2014      01-01-2009
## 894       M         D         210     31-12-2014      01-04-2012
## 895       M         D         210     31-12-2014      01-01-2009
## 896                 D         215     01-11-2015      01-12-2009
## 897       M         D         215     01-11-2015      01-12-2009
## 898       M         N         215     01-11-2015      01-12-2009
## 899       M         D         215     01-11-2015      01-12-2009
## 900       M         N         215     01-11-2015      11-01-2011
## 901       M         D         215     01-11-2015      01-12-2009
## 902       M         D         215     01-11-2015      01-12-2009
## 903       M         D         215     01-11-2015      01-12-2009
## 904       M         D         215     01-11-2015      01-12-2009
## 905       M         D         215     01-11-2015      01-12-2009
## 906       M         R         215     01-11-2015      01-12-2009
## 907       M         D         215     01-11-2015      01-12-2009
## 908       M         D         215     01-11-2015      01-12-2009
## 909       M         D         215     01-11-2015      01-12-2009
## 910       M         D         215     01-11-2015      01-12-2009
## 911       M         D         215     01-11-2015      01-12-2009
## 912       M         D         215     01-11-2015      01-12-2009
## 913       M         D         215     01-11-2015      01-12-2009
## 914       M         D         215     01-11-2015      12-08-2011
## 915       M         D         215     01-11-2015      01-12-2009
## 916       M         R         215     01-11-2015      01-12-2009
## 917       M         R         215     01-11-2015      01-12-2009
## 918       M         D         215     01-11-2015      01-12-2009
## 919       M         D         215     01-11-2015      01-12-2009
## 920       M         D         215     01-11-2015      01-12-2009
## 921       M         R         215     01-11-2015      01-12-2009
## 922       M         D         215     01-11-2015      01-12-2009
## 923       M         D         215     01-11-2015      01-12-2009
## 924       M         D         215     01-11-2015      06-01-2012
## 925       M         N         215     01-11-2015      01-12-2009
## 926       M         D         215     01-11-2015      01-12-2009
## 927       M         D         215     01-11-2015      01-12-2009
## 928       M         D         215     01-11-2015      01-12-2009
## 929       M         D         215     01-11-2015      01-12-2009
## 930       M         D         215     01-11-2015      01-12-2009
## 931       M         D         215     01-11-2015      01-12-2009
## 932       M         D         215     01-11-2015      01-12-2009
## 933       M         D         215     01-11-2015      01-12-2009
## 934       F         D         215     01-11-2015      01-12-2009
## 935                 N         215     01-11-2015      01-12-2009
## 936       M         D         215     01-11-2015      01-01-2009
## 937       M         D         215     01-11-2015      14-11-2008
## 938       F         D         250     31-12-2014      01-01-2009
## 939       M         R         250     31-12-2014      01-01-2009
## 940       M         D         250     31-12-2014      01-01-2009
## 941                 D         250     31-12-2014      01-01-2009
## 942       F         D         250     31-12-2014      29-11-2011
## 943       M         D         250     31-12-2014      01-01-2009
## 944       M         D         250     31-12-2014      01-01-2009
## 945       M         O         300     31-12-2014      01-01-2011
## 946       M         N         300     30-06-2014      07-01-2010
## 947       M         R         300     31-12-2014      01-01-2011
## 948       M         D         300     24-11-2014      23-11-2010
## 949       F         D         300     31-12-2014      01-01-2011
## 950       F         D         300     31-12-2014      01-01-2011
## 951       M         D         300     31-12-2016      01-01-2013
## 952       M         D         300     31-12-2014      01-01-2011
## 953       M         D         300     31-12-2014      01-01-2011
## 954       M         R         300     31-12-2014      01-01-2011
## 955       M         R         305     31-12-2014      01-01-2011
## 956       M         R         305     31-12-2014      01-01-2011
## 957       M         N         305     31-12-2014      01-01-2011
## 958       M         D         305     31-12-2014      01-01-2011
## 959       M         D         305     31-12-2016      01-01-2013
## 960       M         D         305     31-12-2014      01-01-2011
## 961       M         R         305     31-12-2014      01-01-2011
## 962       M         D         308     31-12-2014      01-01-2011
## 963       M         D         308     31-12-2014      01-01-2011
## 964       M         R         308     31-12-2014      01-01-2011
## 965       M         D         308     30-06-2014      07-01-2010
## 966       M         D         308     30-06-2014      07-01-2010
## 967       M         D         310     31-12-2014      01-01-2011
## 968       M         N         310     31-12-2016      01-01-2013
## 969       F         N         310     31-12-2014      01-01-2011
## 970       F         D         310     31-12-2016      01-01-2013
## 971       M         D         310     31-12-2014      01-01-2011
## 972       M         O         310     31-12-2016      01-01-2013
## 973       M         D         310     31-12-2014      01-01-2011
## 974       M         D         310     31-12-2016      01-01-2013
## 975       F         D         310     31-12-2016      01-01-2013
## 976       F         D         310     31-12-2014      01-01-2011
## 977       M         D         310     31-12-2014      01-01-2011
## 978       M         R         310     31-12-2014      01-01-2011
## 979       F         N         310     31-12-2014      01-01-2011
## 980       M         D         310     31-12-2014      01-01-2011
## 981       M         D         310     31-12-2014      01-01-2011
## 982       M         D         310     31-12-2014      01-01-2011
## 983       M         N         310     31-12-2014      01-01-2011
## 984       F         D         310     31-12-2014      01-01-2011
## 985       M         D         310     31-12-2014      01-01-2011
## 986       F         R         310     31-12-2014      01-01-2011
## 987       M         N         310     31-12-2014      01-01-2011
## 988       M         D         310     31-12-2014      01-01-2011
## 989       F         D         310     31-12-2014      01-01-2011
## 990       M         D         310     31-12-2014      01-01-2011
## 991       M         D         310     31-12-2014      01-01-2011
## 992       M         R         310     31-12-2014      01-01-2011
## 993       F         D         310     31-12-2014      01-01-2011
## 994       M         R         310     31-12-2014      01-01-2011
## 995       M         N         310     31-12-2014      01-01-2011
## 996                 D         310     24-11-2014      23-11-2010
## 997       M         D         310     24-11-2014      23-11-2010
## 998                 R         310     24-11-2014      23-11-2010
## 999       M         R         310     24-11-2014      23-11-2010
## 1000      M         R         310     24-11-2014      23-11-2010
## 1001      M         D         310     24-11-2014      23-11-2010
## 1002      M         D         310     24-11-2014      23-11-2010
## 1003      F         D         310     31-12-2014      25-02-2013
## 1004      M         D         310     30-06-2014      07-01-2010
## 1005      M         R         310     31-12-2014      01-01-2011
## 1006      F         D         310     30-06-2014      07-01-2010
## 1007      M         R         310     31-12-2014      01-01-2011
## 1008      M         N         310     30-06-2014      07-01-2010
## 1009      M         D         310     31-12-2014      01-01-2011
## 1010      F         N         310     30-06-2014      07-01-2010
## 1011      M         R         310     31-12-2014      01-01-2011
## 1012      M         R         310     30-06-2014      07-01-2010
## 1013      M         D         310     31-12-2014      01-01-2011
## 1014      M         D          54     29-02-2016      04-03-2012
## 1015                           56                               
## 1016                           56                               
## 1017                           56                               
## 1018                           56                               
## 1019                           56                               
## 1020                           56                               
## 1021                           56                               
## 1022                           56                               
## 1023      M         R          64     29-02-2016      04-03-2012
## 1024      M         R          64     29-02-2016      04-03-2012
## 1025      M         R          64     29-02-2016      04-03-2012
## 1026      M         R          64     29-02-2016      04-03-2012
## 1027                           66                               
## 1028                           66                               
## 1029      F         R          66     29-02-2016      04-03-2012
## 1030      M         R          66     29-02-2016      04-03-2012
## 1031      F         R          66     29-02-2016      04-03-2012
## 1032      M         R          66     29-02-2016      04-03-2012
## 1033      M         R          66     29-02-2016      04-03-2012
## 1034      M         R          66     29-02-2016      04-03-2012
## 1035      M         D         225     30-06-2016      07-01-2012
## 1036      M         D         230     30-06-2016      07-01-2012
## 1037      M         D         235     31-12-2016      01-01-2013
## 1038      M         R         240     27-03-2016      26-03-2012
## 1039      M         D         245     01-10-2016      01-09-2012
## 1040      M         R         245     01-10-2016      01-09-2012
## 1041      F         D         245     01-10-2016      01-09-2012
## 1042      M         D         245     01-10-2016      01-09-2012
## 1043      M         D         245     01-10-2016      01-09-2012
## 1044      M         D         245     01-10-2016      01-09-2012
## 1045      M         R         245     01-10-2016      01-09-2012
## 1046      M         D         245     01-10-2016      01-09-2012
## 1047      F         D         250     31-12-2014      01-01-2009
## 1048      M         D         250     31-12-2014      01-01-2009
## 1049      M         D         250     31-12-2014      01-01-2009
## 1050      M         D         250     31-12-2014      01-01-2009
## 1051      M         D         255     31-12-2014      01-01-2011
## 1052      M         N         255     31-12-2014      01-01-2011
## 1053      M         D         255     31-12-2014      01-01-2011
## 1054      M         R         255     31-12-2014      01-01-2011
## 1055                          255                     01-09-2013
## 1056      M         D         255     31-12-2014      01-01-2011
## 1057      M         D         255     31-12-2014      01-01-2011
## 1058      M         D         255     31-12-2014      01-01-2011
## 1059      M         D         265     31-12-2014      01-01-2009
## 1060      M         D         265     31-12-2014      01-01-2009
## 1061      M         D         265     31-12-2014      01-01-2009
## 1062      M         D         265     31-12-2014      11-01-2011
## 1063      M         D         265     31-12-2014      01-01-2009
## 1064      M         D         267     31-12-2014      01-01-2009
## 1065      M         D         267     31-12-2014      01-01-2009
## 1066      M         R         267     31-12-2014      27-08-2012
## 1067      M         D         267     31-12-2014      01-01-2009
## 1068      F         O         267     31-12-2014      01-01-2009
## 1069      M         R         300     31-12-2014      01-01-2011
## 1070      M         D         300     31-12-2014      01-01-2013
## 1071      M         D         300     31-12-2014      01-01-2011
## 1072      F         O         300     31-12-2014      01-01-2011
## 1073      M         D         300     31-12-2014      01-01-2011
## 1074      M         D         300     31-12-2014      01-01-2011
## 1075      M         D         300     31-12-2014      01-01-2011
## 1076      M         D         305     31-12-2014      01-01-2011
## 1077      M         D         305     31-12-2014      01-01-2011
## 1078      M         D         305     31-12-2014      01-01-2011
## 1079      M         D         305     31-12-2014      01-01-2011
## 1080      M         N         305     31-12-2014      01-01-2011
## 1081                          305                     22-02-2012
## 1082      M         O         305     31-12-2014      01-01-2011
## 1083      M         D         308     31-12-2014      01-01-2011
## 1084      M         R         308     31-12-2014      01-01-2011
## 1085      M         R         310     31-12-2014      01-01-2011
## 1086      M         D         310     31-12-2014      01-01-2011
## 1087      M         D         310     31-12-2014      01-01-2011
## 1088      M         D         310     31-12-2014      01-01-2011
## 1089      F         O         310     31-12-2014      01-01-2011
## 1090      F         D         310     31-12-2014      01-01-2011
## 1091      M         R         310     31-12-2014      01-01-2011
## 1092      M         D         310     31-12-2014      01-01-2011
## 1093      M         D         310     31-12-2014      01-01-2011
## 1094      M         D         310     31-12-2014      01-01-2011
## 1095      F         D         310     31-12-2014      01-01-2011
## 1096      M         D         310     31-12-2014      11-01-2011
## 1097      F         D         310     31-12-2014      01-01-2011
## 1098      F         D         310     31-12-2014      27-08-2012
## 1099      F         D         310     31-12-2014      01-01-2011
## 1100      M         R         310     31-12-2014      01-01-2011
## 1101      F         R         310     31-12-2014      01-01-2011
## 1102      F         D         310     31-12-2014      01-01-2011
## 1103      M         D         310     31-12-2014      01-01-2011
## 1104      M         D         310     31-12-2014      01-01-2011
## 1105      M         D         310     31-12-2014      01-01-2011
## 1106      F         D         310     31-12-2014      01-01-2011
## 1107      M         D         310     31-12-2014      01-01-2011
## 1108      M         D         310     31-12-2014      01-01-2011
## 1109      F         D         310     31-12-2014      01-01-2011
## 1110      M         D         310     31-12-2014      01-01-2011
## 1111      M         D         310     31-12-2014      01-01-2011
## 1112      M         D         310     31-12-2014      01-01-2011
## 1113      F         D         310     31-12-2014      01-01-2011
## 1114      F         R         310     31-12-2014      01-01-2011
## 1115      M         D         310     31-12-2014      01-01-2011
## 1116      M         D          54     29-02-2016      04-03-2012
## 1117                           56                               
## 1118                           56                               
## 1119      M         D          56     29-02-2016      04-03-2012
## 1120                           56                               
## 1121                           56                               
## 1122                           56                               
## 1123                           56                               
## 1124      F         R          64     29-02-2016      04-03-2012
## 1125                           66                               
## 1126                           66                               
## 1127                           66                               
## 1128                           66                               
## 1129                           66                               
## 1130                           66                               
## 1131                           66                               
## 1132      M         D         225     30-06-2016      07-01-2012
## 1133      M         D         230     30-06-2016      07-01-2012
## 1134      M         D         235     31-12-2016      01-01-2013
## 1135      M         D         240     27-03-2016      26-03-2012
## 1136      M         D         245     01-10-2016      01-09-2012
## 1137      M         R         245     01-10-2016      01-09-2012
## 1138      M         D         245     01-10-2016      01-09-2012
## 1139      M         D         245     01-10-2016      01-09-2012
## 1140      M         N         245     01-10-2016      01-09-2012
## 1141      M         R         245     01-10-2016      01-09-2012
## 1142      M         D         245     01-10-2016      01-09-2012
## 1143      F         D         250     31-12-2014      01-01-2009
## 1144      M         N         250     31-12-2014      29-11-2011
## 1145      F         D         255     31-12-2014      01-01-2011
## 1146      F         D         255     31-12-2014      01-01-2011
## 1147      M         D         255     31-12-2014      18-12-2012
## 1148      M         D         255     31-12-2014      01-01-2011
## 1149      M         D         255     31-12-2014      01-01-2011
## 1150      F         D         255     31-12-2014      01-01-2011
## 1151      M         R         255     31-12-2014      01-01-2011
## 1152                          265                     28-11-2012
## 1153      M         D         265     31-12-2014      01-01-2009
## 1154      F         D         265     31-12-2014      01-01-2009
## 1155      M         D         265     31-12-2014      01-01-2009
## 1156                          267                     13-12-2012
## 1157      M         D         267     31-12-2014      01-01-2009
## 1158      M         D         267     31-12-2014      01-01-2009
## 1159      M         D         267     31-12-2014      01-01-2009
## 1160      M         D         300     31-12-2016      01-01-2013
## 1161      M         D         300     31-12-2014      01-01-2011
## 1162      M         D         300     31-12-2014      01-01-2011
## 1163      M         D         300     31-12-2014      01-01-2011
## 1164      M         R         300     31-12-2014      01-01-2011
## 1165      M         N         305     31-12-2016      01-01-2013
## 1166      M         D         305     31-12-2014      01-01-2011
## 1167      M         D         305     31-12-2014      01-01-2011
## 1168      M         D         305     31-12-2014      01-01-2011
## 1169      M         D         305     31-12-2014      01-01-2011
## 1170      M         D         308     31-12-2014      16-11-2012
## 1171      M         D         308     31-12-2016      01-01-2013
## 1172      M         D         308     31-12-2014      01-01-2011
## 1173      M         D         310     31-12-2014      01-01-2011
## 1174      M         D         310     31-12-2014      01-01-2011
## 1175      F         D         310     31-12-2014      16-11-2012
## 1176      F         D         310     31-12-2014      01-01-2011
## 1177      M         R         310     31-12-2014      01-01-2011
## 1178      F         D         310     31-12-2014      01-01-2011
## 1179      M         D         310     31-12-2014      01-01-2011
## 1180      M         D         310     31-12-2014      27-08-2012
## 1181      F         D         310     31-12-2014      01-01-2011
## 1182      M         D         310     31-12-2014      01-01-2011
## 1183      M         N         310     31-12-2014      01-01-2011
## 1184      F         N         310     31-12-2014      01-01-2011
## 1185      F         D         310     31-12-2016      01-01-2013
## 1186      M         D         310     31-12-2014      01-01-2011
## 1187      M         D         310     31-12-2016      01-01-2013
## 1188      M         D         310     31-12-2014      01-01-2011
## 1189      M         D         310     31-12-2016      01-01-2013
## 1190      F         R         310     31-12-2014      01-01-2011
## 1191      M         D         310     31-12-2016      01-01-2013
## 1192      F         R         310     31-12-2014      01-01-2011
## 1193      M         D          54     29-02-2016      04-03-2012
## 1194      M         D          54     29-02-2016      04-03-2012
## 1195      M         D          56     29-02-2016      04-03-2012
## 1196                           56                               
## 1197      M         D          56     29-02-2016      04-03-2012
## 1198                           56                               
## 1199      M         D          56     29-02-2016      04-03-2012
## 1200                           56                               
## 1201      M         D          56     29-02-2016      04-03-2012
## 1202                           56                               
## 1203                           56                               
## 1204      F         D          56     29-02-2016      04-03-2012
## 1205                           56                               
## 1206      M         R          64     29-02-2016      04-03-2012
## 1207      F         R          64     29-02-2016      04-03-2012
## 1208      M         R          64     29-02-2016      04-03-2012
## 1209      M         R          64     29-02-2016      04-03-2012
## 1210      M         R          64     29-02-2016      04-03-2012
## 1211                           66                     07-10-2012
## 1212      F         R          66     29-02-2016      04-03-2012
## 1213      M         R          66     29-02-2016      04-03-2012
## 1214      M         R          66     29-02-2016      04-03-2012
## 1215      F         R          66     29-02-2016      04-03-2012
## 1216                           66                               
## 1217      M         R          66     29-02-2016      04-03-2012
## 1218                           66                     04-10-2012
## 1219      F         R          66     29-02-2016      04-03-2012
## 1220      F         R          66     29-02-2016      04-03-2012
## 1221      F         R          66     29-02-2016      04-03-2012
## 1222      F         R         220     31-12-2018      01-01-2013
## 1223      M         O         225     30-06-2016      07-01-2012
## 1224      M         D         230     30-06-2016      07-01-2012
## 1225      M         R         235     31-12-2016      01-01-2013
## 1226      M         D         240     27-03-2016      26-03-2012
## 1227      M         O         243     01-04-2016      01-02-2012
## 1228      M         D         245     01-04-2016      01-02-2012
## 1229      M         O         245     01-04-2016      01-02-2012
## 1230      M         D         245     01-04-2016      01-02-2012
## 1231      M         R         245     01-04-2016      01-02-2012
## 1232      M         D         245     01-04-2016      01-02-2012
## 1233      M         O         245     01-04-2016      01-02-2012
## 1234      M         R         245     01-04-2016      01-02-2012
## 1235      F         R         245     01-04-2016      01-02-2012
## 1236      M         D         245     01-04-2016      01-02-2012
## 1237      M         R         245     01-04-2016      01-02-2012
## 1238      M         O         245     01-04-2016      01-02-2012
## 1239      F         D         255     31-12-2014      01-01-2011
## 1240      M         D         255     31-12-2014      01-01-2011
## 1241      M         D         255     31-12-2014      16-11-2012
## 1242      M         R         255     31-12-2014      01-01-2011
## 1243      M         R         255     31-12-2014      01-01-2011
## 1244      M         D         255     31-12-2014      01-01-2011
## 1245      M         R         255     31-12-2014      01-01-2011
## 1246      F         R         255     31-12-2014      01-01-2011
## 1247      M         D         255     31-12-2014      01-01-2011
## 1248      M         R         255     31-12-2014      01-01-2011
## 1249      F         D         255     31-12-2014      01-01-2011
## 1250      M         D         265     31-12-2014      01-01-2009
## 1251      M         R         265     31-12-2014      27-10-2009
## 1252      M         D         265     31-12-2014      01-01-2009
## 1253      M         D         267     31-12-2014      01-01-2009
## 1254      M         R         267     31-12-2014      01-01-2009
## 1255      M         D         267     31-12-2014      01-01-2009
## 1256      M         D         300     31-12-2016      01-01-2013
## 1257      M         D         300     31-12-2016      01-01-2013
## 1258      M         D         300     30-06-2013      06-01-2011
## 1259      M         D         305     31-12-2016      01-01-2013
## 1260      M         D         305                               
## 1261      M         D         305     30-06-2013      07-01-2009
## 1262      M         D         310     31-12-2016      01-01-2013
## 1263      M         D         310     31-12-2016      01-01-2013
## 1264      M         D         310     31-12-2016      01-01-2013
## 1265      M         D         310     31-12-2016      01-01-2013
## 1266      M         D         310     31-12-2016      01-01-2013
## 1267      M         D         310     31-12-2016      01-01-2013
## 1268      M         D         310     31-12-2016      01-01-2013
## 1269      M         D         310     31-12-2016      01-01-2013
## 1270      M         D         310     31-12-2016      01-01-2013
## 1271      M         D         310     31-12-2016      01-01-2013
## 1272      M         R         310     30-06-2013      27-08-2012
## 1273      M         D         310     30-06-2013      10-12-2010
## 1274      M         D         310     30-06-2013      24-11-2009
## 1275      M         D         310     30-06-2013      07-01-2009
## 1276      M         D         310     30-06-2013      16-09-2011
## 1277                           54                               
## 1278      M         D          56     29-02-2016      04-03-2012
## 1279      F         D          56     29-02-2016      04-03-2012
## 1280                           56                               
## 1281                           56                               
## 1282      M         D          56     29-02-2016      04-03-2012
## 1283      M         D          56     29-02-2016      04-03-2012
## 1284                           56                               
## 1285      F         D          56     29-02-2016      04-03-2012
## 1286                           56                               
## 1287                           64                               
## 1288                           66                               
## 1289                           66                               
## 1290                           66                               
## 1291                           66                               
## 1292      F         R          66     29-02-2016      04-03-2012
## 1293                           66                               
## 1294                           66                               
## 1295                           66                               
## 1296                           66                               
## 1297      M         D         225     30-06-2016      07-01-2012
## 1298      F         D         230     30-06-2016      07-01-2012
## 1299      M         D         235     31-12-2016      01-01-2013
## 1300      M         R         240     27-03-2016      27-08-2012
## 1301      M         D         245     01-10-2016      01-09-2012
## 1302      M         D         245     01-10-2016      01-09-2012
## 1303      M         D         245     01-10-2016      01-09-2012
## 1304      M         D         245     01-10-2016      01-09-2012
## 1305      M         D         245     01-10-2016      01-09-2012
## 1306      M         D         245     01-10-2016      01-09-2012
## 1307      M         D         245     01-10-2016      01-09-2012
## 1308      M         D         245     01-10-2016      01-09-2012
## 1309      M         D         245     01-10-2016      01-09-2012
## 1310      M         D         255     31-12-2014      01-01-2011
## 1311      M         D         255     31-12-2014      01-01-2011
## 1312      F         N         255     31-12-2014      01-01-2011
## 1313      F         D         255     31-12-2014      01-01-2011
## 1314      M         D         255     31-12-2014      01-01-2011
## 1315      M         D         255     31-12-2014      01-01-2011
## 1316      M         O         255     31-12-2014      01-01-2011
## 1317      F         D         255     31-12-2014      01-01-2011
## 1318      F         D         255     31-12-2014      01-01-2011
## 1319      F         D         265     31-12-2014      16-11-2012
## 1320      F         D         265     31-12-2014      01-02-2009
## 1321      F         D         265     31-12-2014      01-01-2009
## 1322      M         D         267     31-12-2014      29-11-2011
## 1323      M         D         267     31-12-2014      01-01-2009
## 1324      M         D         267     31-12-2014      01-01-2009
## 1325      M         D         300     31-12-2014      01-01-2011
## 1326      F         D         310     31-12-2014      01-01-2011
## 1327      M         D         310     31-12-2014      01-01-2011
## 1328      M         D         310     31-12-2014      01-01-2011
## 1329                           54                               
## 1330                           56                               
## 1331                           56                               
## 1332                           56                               
## 1333                           56                               
## 1334                           56                               
## 1335                           56                               
## 1336                           56                               
## 1337                           56                               
## 1338                           56                               
## 1339                           64                               
## 1340                           66                               
## 1341                           66                               
## 1342                           66                               
## 1343                           66                               
## 1344                           66                               
## 1345                           66                               
## 1346                           66                               
## 1347                           66                               
## 1348                           66                               
## 1349      M         D         225     30-06-2016      07-01-2012
## 1350      F         D         230     30-06-2016      07-01-2012
## 1351      M         D         235     31-12-2016      01-01-2013
## 1352      M         D         240     27-03-2016      26-03-2012
## 1353      M         D         245     01-10-2016      16-11-2012
## 1354      M         R         245     01-10-2016      16-11-2012
## 1355      M         D         245     01-10-2016      16-11-2012
## 1356      M         D         245     01-10-2016      16-11-2012
## 1357      M         D         245     01-10-2016      16-11-2012
## 1358      M         D         245     01-10-2016      16-11-2012
## 1359      M         N         245     01-10-2016      16-11-2012
## 1360      M         D         245     01-10-2016      16-11-2012
## 1361      M         D         245     01-10-2016      16-11-2012
## 1362      M         D         250     31-12-2014      01-01-2009
## 1363      M         D         250     31-12-2014      01-01-2009
## 1364      M         R         250     31-12-2014      01-01-2009
## 1365      M         D         250     31-12-2014      01-01-2009
## 1366      M         D         255     31-12-2014      01-01-2011
## 1367      M         N         255     31-12-2014      01-01-2011
## 1368      M         D         255     31-12-2014      01-01-2011
## 1369      M         D         255     31-12-2014      01-01-2011
## 1370      F         N         255     31-12-2014      01-01-2011
## 1371      F         D         255     31-12-2014      11-01-2011
## 1372      M         D         255     31-12-2014      01-01-2011
## 1373      M         R         255     31-12-2014      01-01-2011
## 1374      F         D         255     31-12-2014      01-01-2011
## 1375      M         R         265     31-12-2014      16-09-2011
## 1376      M         D         265     31-12-2014      01-01-2009
## 1377      M         D         265     31-12-2014      01-01-2009
## 1378      F         N         265     31-12-2014      21-02-2011
## 1379      F         D         265     31-12-2014      01-01-2009
## 1380                          265                     01-01-2012
## 1381      M         R         265     31-12-2014      01-01-2009
## 1382      M         D         265     31-12-2014      01-01-2009
## 1383      M         D         265     31-12-2014      01-01-2009
## 1384      M         D         267     31-12-2014      01-01-2009
## 1385      M         D         267     31-12-2014      01-01-2009
## 1386      M         D         267     31-12-2014      01-01-2009
## 1387      F         D         267     31-12-2014      01-01-2009
## 1388      M         D         267     31-12-2014      01-01-2009
## 1389      M         D         267     31-12-2014      01-01-2009
## 1390      M         D         267     31-12-2014      01-01-2009
## 1391      M         D         267     31-12-2014      01-01-2009
## 1392      F         D         267     31-12-2014      16-09-2011
## 1393      M         D         300     30-06-2014      07-01-2010
## 1394      M         D         300     30-06-2014      07-01-2010
## 1395      M         D         300     31-12-2016      01-01-2013
## 1396      M         R         300     31-12-2014      01-01-2011
## 1397      M         D         300     31-12-2014      01-01-2011
## 1398      M         R         300     31-12-2016      01-01-2013
## 1399      M         R         300     31-12-2016      01-01-2013
## 1400      M         D         300     01-10-2016      16-11-2012
## 1401      M         D         300     31-12-2016      01-01-2013
## 1402      F         D         305     30-06-2014      07-01-2010
## 1403      M         D         305     31-12-2016      01-01-2013
## 1404      M         D         305     31-12-2014      01-01-2011
## 1405                          305                     29-06-2011
## 1406      M         D         305     31-12-2016      01-01-2013
## 1407      M         N         305     31-12-2014      01-01-2011
## 1408      M         D         308     30-06-2014      07-01-2010
## 1409      M         N         308     31-12-2016      01-01-2013
## 1410      M         D         308     31-12-2016      01-01-2013
## 1411      F         D         310     30-06-2014      07-01-2010
## 1412      M         D         310     30-06-2014      07-01-2010
## 1413      M         D         310     31-12-2016      01-01-2013
## 1414      M         D         310     30-06-2014      07-01-2010
## 1415      M         D         310     30-06-2014      07-01-2010
## 1416      M         D         310     31-12-2016      01-01-2013
## 1417      M         D         310     30-06-2014      07-01-2010
## 1418      M         D         310     30-06-2014      07-01-2010
## 1419      M         D         310     31-12-2016      01-01-2013
## 1420      M         R         310     30-06-2014      07-01-2010
## 1421      F         D         310     30-06-2014      07-01-2010
## 1422      M         D         310     31-12-2016      01-01-2013
## 1423      M         D         310     30-06-2014      07-01-2010
## 1424      F         R         310     31-12-2014      01-01-2011
## 1425      F         O         310     31-12-2014      01-01-2011
## 1426      F         R         310     31-12-2014      01-01-2011
## 1427      F         N         310     31-12-2014      01-01-2011
## 1428      M         D         310     31-12-2014      01-01-2011
## 1429      F         D         310     31-12-2014      01-01-2011
## 1430      F         D         310     31-12-2014      01-01-2011
## 1431      M         N         310     31-12-2014      01-01-2011
## 1432      F         D         310     31-12-2014      01-01-2011
## 1433      M         D         310     31-12-2014      18-12-2012
## 1434      M         D         310     31-12-2016      01-01-2013
## 1435      M         D         310     31-12-2016      01-01-2013
## 1436      M         R         310     31-12-2016      01-01-2013
## 1437      M         D         310     31-12-2014      01-01-2011
## 1438      M         D         310     31-12-2014      18-12-2012
## 1439      M         N         310     31-12-2014      01-01-2011
## 1440      M         D         310     31-12-2016      01-01-2013
## 1441      F         R         310     31-12-2016      01-01-2013
## 1442      M         D         310     31-12-2016      01-01-2013
## 1443      F         D         310     31-12-2016      01-01-2013
## 1444      M         D         310     31-12-2016      01-01-2013
## 1445      M         R         310     31-12-2016      01-01-2013
## 1446      F         D         310     31-12-2016      01-01-2013
## 1447      F         D          54     29-02-2016      04-03-2012
## 1448      F         D          54     29-02-2016      04-03-2012
## 1449                           54                     23-10-2012
## 1450      F         D          54     29-02-2016      04-03-2012
## 1451      M         D          54     29-02-2016      04-03-2012
## 1452                           56                               
## 1453                           56                               
## 1454      F         D          56     29-02-2016      04-03-2012
## 1455                           56                               
## 1456                           56                     23-10-2012
## 1457                           56                               
## 1458                           56                               
## 1459                           56                               
## 1460                           56                               
## 1461                           56                               
## 1462      M         R          64     29-02-2016      04-03-2012
## 1463      M         R          64     29-02-2016      04-03-2012
## 1464                           66                               
## 1465                           66                               
## 1466                           66                               
## 1467                           66                               
## 1468                           66                               
## 1469                           66                               
## 1470                           66                               
## 1471                           66                               
## 1472                           66                               
## 1473                           66                               
## 1474      M         D         225     30-06-2016      07-01-2012
## 1475      M         R         230     30-06-2016      07-01-2012
## 1476      M         N         235     31-12-2016      01-01-2013
## 1477      M         R         240     27-03-2016      26-03-2012
## 1478      M         D         245     01-10-2016      01-09-2012
## 1479      M         D         245     01-10-2016      01-09-2012
## 1480      M         D         245     01-10-2016      01-09-2012
## 1481      M         D         245     01-10-2016      01-09-2012
## 1482      M         R         245     01-10-2016      01-09-2012
## 1483      M         D         245     01-10-2016      01-09-2012
## 1484      M         R         245     01-10-2016      01-09-2012
## 1485      M         N         245     01-10-2016      01-09-2012
## 1486      M         R         245     01-10-2016      01-09-2012
## 1487      M         D         245     01-10-2016      01-09-2012
## 1488      M         N         255     31-12-2014      01-01-2011
## 1489      M         D         255     31-12-2014      01-01-2011
## 1490      F         D         255     31-12-2014      01-01-2011
## 1491      M         D         255     31-12-2014      01-01-2011
## 1492      M         R         255     31-12-2014      01-01-2011
## 1493      M         R         255     31-12-2014      01-01-2011
## 1494      M         R         255     31-12-2014      01-01-2011
## 1495      M         D         255     31-12-2014      01-01-2011
## 1496      M         D         255     31-12-2014      01-01-2011
## 1497      M         D         255     31-12-2014      01-01-2011
## 1498      M         R         265     31-12-2014      01-01-2009
## 1499      F         D         265     31-12-2014      01-01-2009
## 1500      M         R         265     31-12-2014      01-01-2009
## 1501      F         D         265     31-12-2014      01-01-2009
## 1502      M         D         267     31-12-2014      01-01-2009
## 1503                          267                     11-05-2012
## 1504      M         D         267     31-12-2014      01-01-2009
## 1505      M         D         267     31-12-2014      01-01-2009
## 1506      M         D         300     30-06-2014      11-01-2011
## 1507      M         N         305     30-06-2014      16-11-2012
## 1508      M         R         310     30-06-2014      27-08-2012
## 1509      M         N         310     30-06-2014      27-08-2012
## 1510      M         D         310     30-06-2014      07-01-2010
## 1511      F         D         310     30-06-2014      27-08-2012
## 1512      M         D         310     30-06-2014      29-11-2011
## 1513      M         D          54     29-02-2016      04-03-2012
## 1514                           56                               
## 1515                           56                               
## 1516                           56                               
## 1517                           56                               
## 1518                           56                               
## 1519                           56                               
## 1520                           56                               
## 1521      F         R          64     29-02-2016      04-03-2012
## 1522                           66                               
## 1523                           66                               
## 1524                           66                               
## 1525                           66                               
## 1526                           66                               
## 1527                           66                               
## 1528                           66                               
## 1529      M         D         225     30-06-2016      07-01-2012
## 1530      M         D         230     30-06-2016      07-01-2012
## 1531      M         D         235     31-12-2016      01-01-2013
## 1532      M         D         240     27-03-2016      26-03-2012
## 1533      M         N         245     01-10-2016      01-09-2012
## 1534      M         D         245     01-10-2016      01-09-2012
## 1535      M         N         245     01-10-2016      01-09-2012
## 1536      M         D         245     01-10-2016      01-09-2012
## 1537      M         N         245     01-10-2016      01-09-2012
## 1538      M         D         245     01-10-2016      01-09-2012
## 1539      M         D         245     01-10-2016      01-09-2012
## 1540      M         N         255     31-12-2014      01-01-2011
## 1541      F         N         255     31-12-2014      01-01-2011
## 1542      F         D         255     31-12-2014      01-01-2011
## 1543      F         D         255     31-12-2014      01-01-2011
## 1544      F         D         255     31-12-2014      01-01-2011
## 1545      M         D         255     31-12-2014      01-01-2011
## 1546      M         N         255     31-12-2014      01-01-2011
## 1547      M         N         265     31-12-2014      01-01-2009
## 1548      M         N         265     31-12-2014      01-01-2009
## 1549      F         R         265     31-12-2014      25-02-2013
## 1550      M         N         265     31-12-2014      01-01-2009
## 1551      M         D         265     31-12-2014      01-01-2009
## 1552      M         D         267     31-12-2014      01-01-2009
## 1553      M         D         267     31-12-2014      27-08-2012
## 1554      M         N         267     31-12-2014      25-02-2013
## 1555      M         N         267     31-12-2014      01-01-2009
## 1556      M         N         267     31-12-2014      01-01-2009
## 1557      M         D         300     31-12-2014      01-01-2011
## 1558      M         D         300     31-12-2014      01-01-2011
## 1559      M         R         300     31-12-2014      01-01-2011
## 1560      M         D         300     31-12-2014      01-01-2011
## 1561      M         R         300     31-12-2014      01-01-2011
## 1562      M         N         300     30-06-2014      07-01-2010
## 1563      F         R         300     31-12-2014      01-01-2011
## 1564      M         N         300     31-12-2016      01-01-2013
## 1565      M         D         300     30-06-2016      27-08-2012
## 1566      M         N         300     30-06-2016      07-01-2012
## 1567      M         D         305     31-12-2014      01-01-2011
## 1568      M         D         305     31-12-2014      01-01-2011
## 1569                          305                     14-11-2012
## 1570      M         N         305     30-06-2016      07-01-2012
## 1571      M         N         305     30-06-2016      07-01-2012
## 1572      M         D         310     31-12-2014      01-01-2011
## 1573      M         N         310     31-12-2014      01-01-2011
## 1574      M         N         310     31-12-2014      01-01-2011
## 1575      F         N         310     31-12-2014      01-01-2011
## 1576      M         N         310     31-12-2014      01-01-2011
## 1577      F         N         310     31-12-2014      01-01-2011
## 1578      M         D         310     31-12-2014      01-01-2011
## 1579      F         R         310     31-12-2014      01-01-2011
## 1580      M         R         310     31-12-2014      01-01-2011
## 1581      F         N         310     31-12-2014      01-01-2011
## 1582      F         N         310     31-12-2014      01-01-2011
## 1583      M         N         310     31-12-2014      01-01-2011
## 1584      M         R         310     30-06-2014      07-01-2010
## 1585      M         R         310     30-06-2014      07-01-2010
## 1586      M         N         310     30-06-2014      27-08-2012
## 1587      M         N         310     31-12-2014      01-01-2011
## 1588      M         N         310     31-12-2014      01-01-2011
## 1589      F         N         310     31-12-2014      01-01-2011
## 1590      M         R         310     31-12-2016      01-01-2013
## 1591      F         N         310     31-12-2016      01-01-2013
## 1592      M         N         310     31-12-2016      01-01-2013
## 1593      M         D         310     30-06-2016      27-08-2012
## 1594      M         D         310     30-06-2016      27-08-2012
## 1595      M         N         310     30-06-2016      27-08-2012
## 1596      F         N         310     30-06-2016      07-01-2012
## 1597      F         N         310     30-06-2016      07-01-2012
## 1598      F         N         310     30-06-2016      07-01-2012
## 1599      F         N         310     30-06-2016      07-01-2012
## 1600      M         N         310     30-06-2016      07-01-2012
## 1601      F         D         310     31-12-2014      01-01-2011
## 1602      F         D         310     31-12-2014      01-01-2011
## 1603      M         N         310     31-12-2014      01-01-2011
## 1604      F         N         310     31-12-2014      01-01-2011
## 1605      M         R         310     31-12-2014      01-01-2011
## 1606      M         N         310     31-12-2014      01-01-2011
## 1607      M         D         310     31-12-2014      01-01-2011
## 1608      M         D         310     31-12-2014      01-01-2011
## 1609      M         D         310     31-12-2014      01-01-2011
## 1610      M         D         310     31-12-2014      01-01-2011
## 1611      M         D          54     29-02-2016      04-03-2012
## 1612                           56                               
## 1613                           56                               
## 1614                           56                               
## 1615                           56                               
## 1616                           56                               
## 1617                           56                               
## 1618                           56                               
## 1619                           56                               
## 1620                           56                               
## 1621                           56                               
## 1622                           56                               
## 1623                           56                               
## 1624      F         R          64     29-02-2016      04-03-2012
## 1625      M         R          64     29-02-2016      04-03-2012
## 1626      M         R          64     29-02-2016      04-03-2012
## 1627      M         R          64     29-02-2016      04-03-2012
## 1628      M         R          64     29-02-2016      04-03-2012
## 1629                           66                               
## 1630                           66                               
## 1631      M         R          66     29-02-2016      04-03-2012
## 1632                           66                               
## 1633      M         R          66     29-02-2016      04-03-2012
## 1634      F         R          66     29-02-2016      04-03-2012
## 1635                           66                               
## 1636      M         R          66     29-02-2016      04-03-2012
## 1637                           66                               
## 1638                           66                               
## 1639      M         R          66     29-02-2016      04-03-2012
## 1640                           66                               
## 1641      M         R         225     30-06-2016      07-01-2012
## 1642      F         R         230     30-06-2016      07-01-2012
## 1643      M         R         235     31-12-2016      01-01-2013
## 1644      M         R         240     27-03-2016      26-03-2012
## 1645      M         R         245     01-10-2016      01-09-2012
## 1646      M         R         245     01-10-2016      01-09-2012
## 1647      F         N         245     01-10-2016      01-09-2012
## 1648      M         R         245     01-10-2016      01-09-2012
## 1649      M         R         245     01-10-2016      01-09-2012
## 1650      M         R         245     01-10-2016      01-09-2012
## 1651      M         D         245     01-10-2016      01-09-2012
## 1652      M         R         245     01-10-2016      01-09-2012
## 1653      M         R         245     01-10-2016      01-09-2012
## 1654      M         N         245     01-10-2016      01-09-2012
## 1655      M         D         245     01-10-2016      01-09-2012
## 1656      M         R         245     01-10-2016      01-09-2012
## 1657      M         R         250     31-12-2014      22-01-2009
## 1658      M         R         250     31-12-2014      04-12-2011
## 1659      M         R         255     31-12-2014      01-01-2011
## 1660      M         R         255     31-12-2014      01-01-2011
## 1661      F         R         255     31-12-2014      01-01-2011
## 1662      F         D         255     31-12-2014      01-01-2011
## 1663      M         R         255     31-12-2014      01-01-2011
## 1664      M         R         255     31-12-2014      01-01-2011
## 1665      M         R         255     31-12-2014      01-01-2011
## 1666      M         D         255     31-12-2014      01-01-2011
## 1667      M         R         255     31-12-2014      01-01-2011
## 1668      F         N         255     31-12-2014      01-01-2011
## 1669      F         R         255     31-12-2014      01-01-2011
## 1670      F         R         255     31-12-2014      01-01-2011
## 1671      M         R         265     31-12-2014      01-01-2009
## 1672      M         N         265     31-12-2014      01-01-2009
## 1673      M         D         265     31-12-2014      25-02-2013
## 1674      F         D         265     31-12-2014      01-01-2009
## 1675      F         D         265     31-12-2014      01-01-2009
## 1676      M         D         265     31-12-2014      01-01-2009
## 1677      M         D         265     31-12-2014      01-01-2009
## 1678                D         267     31-12-2014      01-01-2009
## 1679      M         D         267     31-12-2014      01-01-2009
## 1680      M         D         267     31-12-2014      01-01-2009
## 1681      M         D         267     31-12-2014      01-01-2009
## 1682                          267                     28-01-2013
## 1683      M         D         267     31-12-2014      01-01-2009
## 1684                R         267     31-12-2014      01-01-2009
## 1685      M         R         300     30-06-2013      07-01-2009
## 1686      M         R         300                               
## 1687      M         N         300     31-12-2016      01-01-2013
## 1688      M         R         300     31-12-2016      01-01-2013
## 1689      M         D         300     31-12-2014      01-01-2013
## 1690      M         R         305     31-12-2016      01-01-2013
## 1691      M         R         305     31-12-2016      01-01-2013
## 1692      M         N         305     31-12-2014      01-01-2013
## 1693      M         R         308                               
## 1694      M         R         308     30-06-2013      07-01-2009
## 1695      M         R         308     30-06-2013      07-01-2009
## 1696      M         R         308                               
## 1697      M         O         310     31-12-2014      01-01-2013
## 1698      M         D         310     31-12-2014      01-01-2013
## 1699      M         R         310     31-12-2014      01-01-2013
## 1700      M         D         310                               
## 1701      F         D         310                               
## 1702      F         D         310     31-12-2016      01-01-2013
## 1703      M         R         310     31-12-2016      01-01-2013
## 1704      F         R         310     31-12-2016      01-01-2013
## 1705      M         D         310     31-12-2016      01-01-2013
## 1706      F         D         310     31-12-2014      01-01-2013
## 1707      F         D         310     31-12-2014      01-01-2013
## 1708      M         R         310     30-06-2013      07-01-2009
## 1709      M         O         310                               
## 1710      M         O         310     30-06-2013      07-01-2009
## 1711      M         D         310     30-06-2013      07-01-2009
## 1712      M         D         310                               
## 1713      M         R         310                               
## 1714      M         R         310     30-06-2013      07-01-2009
## 1715      M         R         310     30-06-2013      11-01-2011
## 1716      M         D          54     29-02-2016      04-03-2012
## 1717      M         D          54     29-02-2016      04-03-2012
## 1718      F         D          54     29-02-2016      04-03-2012
## 1719      M         D          54     29-02-2016      04-03-2012
## 1720      F         D          54     29-02-2016      04-03-2012
## 1721      F         D          56     29-02-2016      04-03-2012
## 1722      M         D          56     29-02-2016      04-03-2012
## 1723      F         D          56     29-02-2016      04-03-2012
## 1724      F         D          56     29-02-2016      04-03-2012
## 1725      F         D          56     29-02-2016      04-03-2012
## 1726      M         D          56     29-02-2016      04-03-2012
## 1727      F         D          56     29-02-2016      04-03-2012
## 1728      F         D          56     29-02-2016      04-03-2012
## 1729      F         D          56     29-02-2016      04-03-2012
## 1730                           56                               
## 1731      M         D          56     29-02-2016      04-03-2012
## 1732      M         D          56     29-02-2016      04-03-2012
## 1733      M         R          64     29-02-2016      04-03-2012
## 1734      M         R          64     29-02-2016      04-03-2012
## 1735      M         R          64     29-02-2016      04-03-2012
## 1736      F         R          64     29-02-2016      04-03-2012
## 1737      M         R          64     29-02-2016      04-03-2012
## 1738      M         R          66     29-02-2016      04-03-2012
## 1739      F         R          66     29-02-2016      04-03-2012
## 1740                           66                               
## 1741      M         R          66     29-02-2016      04-03-2012
## 1742                           66                               
## 1743                           66                               
## 1744                           66                               
## 1745      M         R          66     29-02-2016      04-03-2012
## 1746      M         R          66     29-02-2016      04-03-2012
## 1747      M         R          66     29-02-2016      04-03-2012
## 1748                           66                               
## 1749      M         R          66     29-02-2016      04-03-2012
## 1750      F         D         220     31-12-2014      01-01-2009
## 1751                D         220     31-12-2014      01-01-2009
## 1752                R         220     31-12-2014      01-01-2009
## 1753      M         R         225     30-06-2016      07-01-2012
## 1754      M         D         230     30-06-2016      07-01-2012
## 1755      M         D         235     31-12-2016      01-01-2013
## 1756      M         R         240     27-03-2016      26-03-2012
## 1757      M         R         245     01-11-2016      01-09-2012
## 1758      M         D         245     01-11-2016      01-09-2012
## 1759      M         D         245     01-11-2016      01-09-2012
## 1760                R         245     01-11-2016      01-09-2012
## 1761      F         D         245     01-11-2016      01-09-2012
## 1762      F         D         245     01-11-2016      01-09-2012
## 1763      F         D         245     01-11-2016      01-09-2012
## 1764      M         R         245     01-11-2016      01-09-2012
## 1765      M         R         245     01-11-2016      01-09-2012
## 1766      M         N         245     01-11-2016      01-09-2012
## 1767      M         R         245     01-11-2016      01-09-2012
## 1768      M         D         245     01-11-2016      01-09-2012
## 1769                R         255     31-12-2014      01-01-2011
## 1770      F         D         255     31-12-2014      01-01-2011
## 1771      M         D         255     31-12-2014      11-01-2011
## 1772      F         D         255     31-12-2014      01-01-2011
## 1773      M         D         255     31-12-2014      01-01-2011
## 1774      F         D         255     31-12-2014      01-01-2011
## 1775      F         D         255     31-12-2014      01-01-2011
## 1776      F         R         255     31-12-2014      01-01-2011
## 1777      M         R         255     31-12-2014      01-01-2011
## 1778      M         R         255     31-12-2014      01-01-2011
## 1779      F         R         255     31-12-2014      01-01-2011
## 1780      F         D         255     31-12-2014      01-01-2011
## 1781      F         R         265     31-12-2014      01-01-2009
## 1782      F         D         265     31-12-2014      01-01-2009
## 1783                D         265     31-12-2014      01-01-2009
## 1784                N         265     31-12-2014      05-11-2010
## 1785      M         R         265     31-12-2014      01-01-2009
## 1786      F         D         265     31-12-2014      01-01-2009
## 1787      F         R         265     31-12-2014      01-01-2009
## 1788      M         R         265     31-12-2014      09-03-2009
## 1789      M         D         265     31-12-2014      01-01-2009
## 1790      M         R         265     31-12-2014      11-01-2011
## 1791      M         N         267     31-12-2014      01-01-2009
## 1792      M         D         267     31-12-2014      01-01-2009
## 1793      M         R         267     31-12-2014      01-01-2009
## 1794      M         R         267     31-12-2014      01-01-2009
## 1795      M         R         267     31-12-2014      01-01-2009
## 1796      M         R         267     31-12-2014      27-08-2012
## 1797      M         R         267     31-12-2014      01-01-2009
## 1798      M         R         267     31-12-2014      01-01-2009
## 1799      M         R         267     31-12-2014      01-01-2009
## 1800      M         R         267     31-12-2014      01-01-2009
## 1801      M         R         300     31-12-2014      01-01-2011
## 1802      M         R         300     30-06-2016      07-01-2012
## 1803      F         D         300     31-12-2014      25-02-2013
## 1804      M         O         300     31-12-2016      01-01-2013
## 1805                N         300     31-12-2014      01-01-2011
## 1806      F         R         300     31-12-2014      01-01-2011
## 1807      F         D         300     31-12-2014      01-01-2011
## 1808      F         O         300     31-12-2016      01-01-2013
## 1809      M         N         300     31-12-2016      01-01-2013
## 1810      M         O         300     31-12-2016      01-01-2013
## 1811      M         D         305     31-12-2014      01-01-2011
## 1812      M         R         305     31-12-2014      01-01-2011
## 1813      M         D         305     31-12-2014      01-01-2011
## 1814      M         R         305     31-12-2014      01-01-2011
## 1815      M         R         305     31-12-2014      01-01-2011
## 1816      M         N         305     31-12-2016      01-01-2013
## 1817      M         N         305     31-12-2016      01-01-2013
## 1818      M         O         308     30-06-2016      07-01-2012
## 1819      M         D         308     31-12-2014      01-01-2011
## 1820      M         R         308     31-12-2014      27-08-2012
## 1821      M         R         308     31-12-2014      01-01-2011
## 1822      M         R         310                               
## 1823                D         310                               
## 1824      M         D         310                               
## 1825      F         D         310                               
## 1826      M         D         310                               
## 1827      M         R         310     30-06-2016      07-01-2012
## 1828      F         D         310     30-06-2016      07-01-2012
## 1829      M         R         310     30-06-2016      07-01-2012
## 1830      M         R         310     30-06-2016      07-01-2012
## 1831      M         N         310     31-12-2014      01-01-2011
## 1832      F         D         310     31-12-2014      01-01-2011
## 1833      F         R         310     31-12-2014      01-01-2011
## 1834                R         310     31-12-2014      01-01-2011
## 1835                R         310     31-12-2014      01-01-2011
## 1836      F         R         310     31-12-2014      01-01-2011
## 1837      F         R         310     31-12-2014      01-01-2011
## 1838      M         D         310     31-12-2014      01-01-2011
## 1839      F         D         310     31-12-2014      01-01-2011
## 1840      F         D         310     31-12-2014      01-01-2011
## 1841      F         R         310     31-12-2014      01-01-2011
## 1842      F         O         310     31-12-2016      01-01-2013
## 1843      F         R         310     31-12-2016      01-01-2013
## 1844      F         R         310     31-12-2016      01-01-2013
## 1845      F         D         310     31-12-2016      01-01-2013
## 1846      M         R         310     31-12-2016      01-01-2013
## 1847      M         O         310     31-12-2016      01-01-2013
## 1848      F         N         310     31-12-2016      01-01-2013
## 1849      M         N         310     31-12-2016      01-01-2013
## 1850      M         O         310     31-12-2016      01-01-2013
## 1851      M         D         310     31-12-2014      01-01-2011
## 1852      M         N         310     31-12-2014      01-01-2011
## 1853      F         R         310     31-12-2014      01-01-2011
## 1854      M         D         310     31-12-2014      01-01-2011
## 1855      F         D         310     31-12-2014      25-02-2013
## 1856      M         R         310     31-12-2014      01-01-2011
## 1857      M         N         310     31-12-2014      25-02-2013
## 1858      M         D          54     29-02-2016      04-03-2012
## 1859      F         D          54     29-02-2016      04-03-2012
## 1860      M         D          54     29-02-2016      04-03-2012
## 1861      M         D          54     29-02-2016      04-03-2012
## 1862                           54                     20-02-2013
## 1863      F         D          54     29-02-2016      04-03-2012
## 1864                           56                     20-02-2013
## 1865                           56                     20-02-2013
## 1866                           56                     20-02-2013
## 1867                           56                               
## 1868      F         D          56     29-02-2016      04-03-2012
## 1869                           56                               
## 1870                           56                     20-02-2013
## 1871      M         D          56     29-02-2016      04-03-2012
## 1872                           56                     20-02-2013
## 1873                           56                               
## 1874                           56                               
## 1875                           56                               
## 1876                           56                               
## 1877                           56                               
## 1878                           56                               
## 1879      M         R          64     29-02-2016      04-03-2012
## 1880      M         R          64     29-02-2016      04-03-2012
## 1881      M         R          64     29-02-2016      04-03-2012
## 1882      F         R          64     29-02-2016      04-03-2012
## 1883      M         R          66     29-02-2016      04-03-2012
## 1884                           66                               
## 1885      M         R          66     29-02-2016      04-03-2012
## 1886                           66                               
## 1887      M         R          66     29-02-2016      04-03-2012
## 1888                           66                               
## 1889                           66                               
## 1890      F         R          66     29-02-2016      04-03-2012
## 1891                           66                               
## 1892                           66                               
## 1893                           66                               
## 1894                           66                               
## 1895                           66                               
## 1896                           66                               
## 1897      M         R          66     29-02-2016      04-03-2012
## 1898      M         D         225     30-06-2016      07-01-2012
## 1899      M         D         230     30-06-2016      07-01-2012
## 1900      F         N         235     31-12-2016      01-01-2013
## 1901      M         N         240     27-03-2016      26-03-2012
## 1902      M         R         245     01-10-2016      01-09-2012
## 1903      M         D         245     01-10-2016      01-09-2012
## 1904      F         D         245     01-10-2016      01-09-2012
## 1905      M         D         245     01-10-2016      01-09-2012
## 1906      M         R         245     01-10-2016      01-09-2012
## 1907      M         R         245     01-10-2016      01-09-2012
## 1908      M         N         245     01-10-2016      01-09-2012
## 1909      M         R         245     01-10-2016      01-09-2012
## 1910      M         D         245     01-10-2016      01-09-2012
## 1911      M         D         245     01-10-2016      01-09-2012
## 1912      F         D         245     01-10-2016      01-09-2012
## 1913      M         R         245     01-10-2016      01-09-2012
## 1914      M         D         245     01-10-2016      01-09-2012
## 1915      M         D         245     01-10-2016      01-09-2012
## 1916      M         D         245     01-10-2016      01-09-2012
## 1917      M         D         250     31-12-2014      01-01-2009
## 1918      M         D         250     31-12-2014      01-01-2009
## 1919      M         D         250     31-12-2014      01-01-2009
## 1920      M         D         250     31-12-2014      01-01-2009
## 1921      M         D         250     31-12-2014      01-01-2009
## 1922      M         D         255     31-12-2014      01-01-2011
## 1923      M         D         255     31-12-2014      01-01-2011
## 1924      F         D         255     31-12-2014      01-01-2011
## 1925      F         D         255     31-12-2014      01-01-2011
## 1926      M         D         255     31-12-2014      01-01-2011
## 1927      M         R         255     31-12-2014      01-01-2011
## 1928      M         D         255     31-12-2014      01-01-2011
## 1929      M         N         255     31-12-2014      01-01-2011
## 1930      M         D         255     31-12-2014      01-01-2011
## 1931      M         D         255     31-12-2014      01-01-2011
## 1932      M         R         255     31-12-2014      01-01-2011
## 1933      M         D         255     31-12-2014      01-01-2011
## 1934      M         R         255     31-12-2014      01-01-2011
## 1935      M         D         255     31-12-2014      01-01-2011
## 1936      M         R         255     31-12-2014      01-01-2011
## 1937      M         R         265     31-12-2014      01-01-2009
## 1938      M         D         265     31-12-2014      01-01-2009
## 1939      M         D         265     31-12-2014      01-01-2009
## 1940      F         R         265     31-12-2014      25-02-2013
## 1941      M         D         265     31-12-2014      01-01-2009
## 1942      M         D         265     31-12-2014      01-01-2009
## 1943      M         R         267     31-12-2014      01-01-2009
## 1944      M         D         267     31-12-2014      01-01-2009
## 1945      M         D         267     31-12-2014      01-01-2009
## 1946      M         D         267     31-12-2014      01-01-2009
## 1947      M         D         267     31-12-2014      01-01-2009
## 1948      M         D         267     31-12-2014      01-01-2009
## 1949      M         D         300     31-12-2014      01-01-2011
## 1950      M         D         300                               
## 1951      M         D         300     30-06-2013      07-01-2009
## 1952      M         R         300     20-05-2014      18-05-2010
## 1953      M         D         300     31-12-2014      01-01-2011
## 1954      F         R         300     31-12-2014      01-01-2011
## 1955      M         D         300                               
## 1956      M         D         300     30-06-2013      07-01-2009
## 1957      M         R         305     31-12-2014      01-01-2011
## 1958      M         D         305     31-12-2014      01-01-2011
## 1959      M         D         305     30-06-2013      07-01-2009
## 1960      F         D         308     31-12-2014      01-01-2011
## 1961      F         N         310     31-12-2014      01-01-2011
## 1962      M         R         310     31-12-2014      01-01-2011
## 1963      M         D         310     31-12-2014      01-01-2011
## 1964      M         D         310     31-12-2014      01-01-2011
## 1965      M         D         310     31-12-2014      01-01-2011
## 1966      M         D         310     31-12-2014      01-01-2011
## 1967      F         R         310     31-12-2014      01-01-2011
## 1968      M         D         310     31-12-2014      01-01-2011
## 1969      M         D         310     31-12-2014      01-01-2011
## 1970      M         D         310     31-12-2014      01-01-2011
## 1971      M         R         310     31-12-2014      01-01-2011
## 1972      F         D         310     20-05-2014      18-05-2010
## 1973      F         D         310     31-12-2014      01-01-2011
## 1974      M         D         310     20-05-2014      18-05-2010
## 1975      F         D         310     31-12-2014      01-01-2011
## 1976      F         D         310     20-05-2014      18-05-2010
## 1977      F         D         310     31-12-2014      01-01-2011
## 1978      M         R         310     20-05-2014      18-05-2010
## 1979      M         D         310     20-05-2014      18-05-2010
## 1980      M         D         310     30-06-2013      07-01-2009
## 1981      F         D         310     30-06-2013      07-01-2009
## 1982      M         D         310                               
## 1983      M         D         310     30-06-2013      07-01-2009
## 1984      M         R         310     30-06-2013      07-01-2009
## 1985      M         R         310                               
## 1986      M         R         310                               
## 1987      M         R         310     30-06-2013      07-01-2009
## 1988      M         D         310     30-06-2013      07-01-2009
## 1989      M         D         310                               
## 1990      M         R         310     30-06-2013      07-01-2009
## 1991      M         R         310     30-06-2013      07-01-2009
## 1992      M         D         310     30-06-2013      07-01-2009
## 1993      M         D         310     30-06-2013      07-01-2009
## 1994      M         R         310     30-06-2013      07-01-2009
## 1995      M         D         310     30-06-2013      07-01-2009
## 1996      F         D          54     29-02-2016      04-03-2012
## 1997      F         D          56     29-02-2016      04-03-2012
## 1998                           56                               
## 1999                           56                               
## 2000                           56                               
## 2001                           56                               
## 2002                           56                               
## 2003                           56                               
## 2004      M         R          64     29-02-2016      04-03-2012
## 2005                           66                               
## 2006                           66                               
## 2007                           66                               
## 2008                           66                               
## 2009                           66                               
## 2010                           66                               
## 2011                           66                               
## 2012      M         D         225     30-06-2016      07-01-2012
## 2013      M         D         230     30-06-2016      07-01-2012
## 2014      M         O         235     31-12-2016      01-01-2013
## 2015      M         R         240     27-03-2016      26-03-2012
## 2016      M         D         245     01-10-2016      01-09-2012
## 2017      M         O         245     01-10-2016      01-09-2012
## 2018      F         D         245     01-10-2016      01-09-2012
## 2019      M         D         245     01-10-2016      01-09-2012
## 2020      M         D         245     01-10-2016      01-09-2012
## 2021      M         D         245     01-10-2016      01-09-2012
## 2022      M         D         245     01-10-2016      01-09-2012
## 2023      M         R         255     31-12-2014      01-01-2011
## 2024      F         D         255     31-12-2014      25-02-2013
## 2025      M         D         255     31-12-2014      01-01-2011
## 2026      M         D         255     31-12-2014      01-01-2011
## 2027      M         D         255     31-12-2014      01-01-2011
## 2028      M         R         255     31-12-2014      11-01-2011
## 2029      M         N         255     31-12-2014      01-01-2011
## 2030      F         D         265     31-12-2014      16-09-2011
## 2031      F         R         265     31-12-2014      01-01-2009
## 2032      M         D         267     31-12-2014      01-01-2009
## 2033      M         R         267     31-12-2014      16-09-2011
## 2034      F         R         300     31-12-2014      01-01-2011
## 2035      M         D         300     30-06-2016      07-01-2012
## 2036      F         R         300     31-12-2014      01-01-2011
## 2037      M         D         305     30-06-2016      07-01-2012
## 2038      M         R         305     31-12-2014      01-01-2011
## 2039      F         D         310     31-12-2014      01-01-2011
## 2040      F         N         310     31-12-2014      01-01-2011
## 2041      M         N         310     31-12-2014      01-01-2011
## 2042      F         N         310     31-12-2014      01-01-2011
## 2043      F         R         310     31-12-2014      01-01-2011
## 2044      M         D         310     31-12-2014      01-01-2011
## 2045      M         D         310     31-12-2014      01-01-2011
## 2046      F         D         310     31-12-2014      01-01-2011
## 2047      M         D         310     30-06-2016      07-01-2012
## 2048      F         D         310     30-06-2016      07-01-2012
## 2049      M         D         310     30-06-2016      07-01-2012
## 2050      M         R         310     30-06-2016      07-01-2012
## 2051      M         D         310     30-06-2016      07-01-2012
## 2052      F         D          54     29-02-2016      04-03-2012
## 2053      M         D          54     29-02-2016      04-03-2012
## 2054      M         D          54     29-02-2016      04-03-2012
## 2055                           56                               
## 2056                           56                               
## 2057                           56                               
## 2058                           56                               
## 2059                           56                               
## 2060                           56                               
## 2061                           56                               
## 2062                           64                               
## 2063                           66                               
## 2064                           66                               
## 2065                           66                               
## 2066                           66                               
## 2067                           66                               
## 2068                           66                               
## 2069                           66                               
## 2070      M         R         225     30-06-2016      07-01-2012
## 2071      M         N         230     30-06-2016      07-01-2012
## 2072      F         N         235     31-12-2016      01-01-2013
## 2073      M         N         240     27-03-2016      26-03-2012
## 2074      M         D         245     01-10-2016      28-12-2011
## 2075      M         D         245     01-10-2016      01-09-2012
## 2076      M         D         245     01-10-2016      01-09-2012
## 2077      M         D         245     01-10-2016      01-09-2012
## 2078      M         D         245     01-10-2016      01-09-2012
## 2079      M         R         245     01-10-2016      01-09-2012
## 2080      M         D         245     01-10-2016      01-09-2012
## 2081      F         D         255     31-12-2014      01-01-2011
## 2082      M         D         255     31-12-2014      01-01-2011
## 2083      M         D         255     31-12-2014      01-01-2011
## 2084      F         N         255     31-12-2014      01-01-2011
## 2085      F         R         255     31-12-2014      01-01-2011
## 2086      M         N         255     31-12-2014      01-01-2011
## 2087      F         N         255     31-12-2014      01-01-2011
## 2088      F         D         265     31-12-2014      01-01-2009
## 2089      F         D         265     31-12-2014      01-01-2009
## 2090                          265                               
## 2091      M         D         265     31-12-2014      01-01-2009
## 2092      F         D         265     31-12-2014      01-01-2009
## 2093      M         R         265     31-12-2014      01-01-2009
## 2094      M         N         267     31-12-2014      01-01-2009
## 2095      M         N         267     31-12-2014      01-01-2009
## 2096      M         D         267     31-12-2014      01-01-2009
## 2097      M         N         267     31-12-2014      16-11-2012
## 2098      M         R         267     31-12-2014      01-01-2009
## 2099      M         D         267     31-12-2014      01-01-2009
## 2100      M         D          54     29-02-2016      04-03-2012
## 2101      M         D          54     29-02-2016      04-03-2012
## 2102      M         D          54     29-02-2016      04-03-2012
## 2103                           56                               
## 2104                           56                               
## 2105                           56                               
## 2106                           56                               
## 2107                           56                               
## 2108                           56                               
## 2109                           56                               
## 2110                           56                               
## 2111                           56                               
## 2112      M         R          64     29-02-2016      04-03-2012
## 2113                           66                               
## 2114                           66                               
## 2115                           66                               
## 2116                           66                               
## 2117                           66                               
## 2118                           66                               
## 2119                           66                               
## 2120                           66                               
## 2121                           66                               
## 2122      M         D         225     30-06-2016      07-01-2012
## 2123      F         D         230     30-06-2016      07-01-2012
## 2124      M         N         235     31-12-2016      01-01-2013
## 2125      M         N         240     27-03-2016      26-03-2012
## 2126      M         R         245     01-10-2016      01-09-2012
## 2127      M         N         245     01-10-2016      01-09-2012
## 2128      M         N         245     01-10-2016      01-09-2012
## 2129      M         R         245     01-10-2016      01-09-2012
## 2130      F         N         245     01-10-2016      01-09-2012
## 2131      F         N         245     01-10-2016      01-09-2012
## 2132      M         N         245     01-10-2016      01-09-2012
## 2133      M         D         245     01-10-2016      01-09-2012
## 2134      M         N         245     01-10-2016      01-09-2012
## 2135      F         D         255     31-12-2014      01-01-2011
## 2136      F         D         255     31-12-2014      01-01-2011
## 2137      M         D         255     31-12-2014      01-01-2011
## 2138      F         D         255     31-12-2014      01-05-2011
## 2139      F         N         255     31-12-2014      01-01-2011
## 2140      M         D         255     31-12-2014      01-01-2011
## 2141      F         D         255     31-12-2014      01-01-2011
## 2142      F         D         255     31-12-2014      01-01-2011
## 2143      F         D         255     31-12-2014      01-01-2011
## 2144      M         R         265     31-12-2014      01-01-2009
## 2145      M         D         265     31-12-2014      01-01-2009
## 2146      F         D         265     31-12-2014      01-01-2009
## 2147      M         D         267     31-12-2014      01-01-2009
## 2148      M         D         267     31-12-2014      01-01-2009
## 2149      M         D         267     31-12-2014      25-02-2013
## 2150      M         D         300     31-12-2014      01-01-2011
## 2151      M         R         300     31-12-2014      01-01-2011
## 2152      F         D         300     31-12-2014      01-01-2011
## 2153      M         D         305     31-12-2014      01-01-2011
## 2154      M         D         310     31-12-2014      01-01-2011
## 2155      M         R         310     31-12-2014      01-01-2011
## 2156      F         D         310     31-12-2014      01-01-2011
## 2157      F         D         310     31-12-2014      01-01-2011
## 2158      M         D         310     31-12-2014      01-01-2011
## 2159      M         D         310     31-12-2014      01-01-2011
## 2160      M         R         310     31-12-2014      01-01-2011
## 2161      M         D         310     31-12-2014      01-01-2011
## 2162      M         D         310     31-12-2014      01-01-2011
## 2163      F         D         310     31-12-2014      01-01-2011
## 2164      M         D         310     31-12-2014      01-01-2011
## 2165      F         D          54     29-02-2016      04-03-2012
## 2166      F         D          54     29-02-2016      04-03-2012
## 2167                           56                               
## 2168                           56                               
## 2169                           56                               
## 2170                           56                               
## 2171                           56                               
## 2172                           56                               
## 2173                           56                               
## 2174                           56                               
## 2175                           56                               
## 2176                           56                               
## 2177      M         R          64     29-02-2016      04-03-2012
## 2178                           66                               
## 2179                           66                               
## 2180                           66                               
## 2181                           66                               
## 2182                           66                               
## 2183                           66                               
## 2184                           66                               
## 2185                           66                               
## 2186                           66                               
## 2187                           66                               
## 2188      M         D         225     30-06-2016      07-01-2012
## 2189      M         N         230     30-06-2016      07-01-2012
## 2190      M         R         235     31-12-2016      01-01-2013
## 2191      M         N         240     27-03-2016      26-03-2012
## 2192      M         N         245     01-10-2016      01-09-2012
## 2193      M         N         245     01-10-2016      01-09-2012
## 2194      M         N         245     01-10-2016      01-09-2012
## 2195      M         D         245     01-10-2016      01-09-2012
## 2196      M         D         245     01-10-2016      01-09-2012
## 2197      M         N         245     01-10-2016      01-09-2012
## 2198      M         D         245     01-10-2016      01-09-2012
## 2199      M         D         245     01-10-2016      01-09-2012
## 2200      M         N         245     01-10-2016      01-09-2012
## 2201      M         D         245     01-10-2016      01-09-2012
## 2202      M         N         255     31-12-2014      01-01-2011
## 2203      M         O         255     31-12-2014      01-01-2011
## 2204      F         O         255     31-12-2014      01-01-2011
## 2205      F         N         255     31-12-2014      01-01-2011
## 2206      M         R         255     31-12-2014      16-09-2011
## 2207      M         N         255     31-12-2014      01-01-2011
## 2208      F         N         255     31-12-2014      01-01-2011
## 2209      F         D         255     31-12-2014      01-01-2011
## 2210      M         N         255     31-12-2014      01-01-2011
## 2211      M         D         255     31-12-2014      01-01-2011
## 2212      M         N         265     31-12-2014      01-01-2009
## 2213      M         N         265     31-12-2014      01-01-2009
## 2214      F         N         265     31-12-2014      01-01-2009
## 2215      M         N         267     31-12-2014      01-01-2009
## 2216      M         N         267     31-12-2014      01-01-2009
## 2217      M         N         267     31-12-2014      01-01-2009
## 2218      M         N         300     31-12-2014      07-01-2009
## 2219      F         D         300     31-12-2014      01-01-2011
## 2220      M         N         300     31-12-2014      01-01-2011
## 2221      M         N         300     31-12-2016      01-01-2013
## 2222      M         D         305     31-12-2014      07-01-2009
## 2223      M         N         305     31-12-2014      01-01-2011
## 2224      M         N         305     31-12-2014      01-01-2011
## 2225      F         O         310     31-12-2014      01-01-2011
## 2226      M         N         310     31-12-2014      01-01-2011
## 2227      M         N         310     31-12-2014      01-01-2011
## 2228      M         N         310     31-12-2016      01-01-2013
## 2229      F         N         310     31-12-2016      01-01-2013
## 2230      M         N         310     31-12-2016      01-01-2013
## 2231      F         O         310     31-12-2014      07-01-2009
## 2232      M         O         310     31-12-2014      07-01-2009
## 2233      F         N         310     31-12-2014      07-01-2009
## 2234      M         N         310     31-12-2014      07-01-2009
## 2235      F         O         310     31-12-2014      07-01-2009
## 2236      F         D         310     31-12-2014      01-01-2011
## 2237      M         N         310     31-12-2014      01-01-2011
## 2238      M         O         310     31-12-2014      01-01-2011
## 2239      F         N         310     31-12-2014      01-01-2011
## 2240      F         N         310     31-12-2014      01-01-2011
## 2241      M         D          54     29-02-2016      04-03-2012
## 2242                           56                               
## 2243      M         D          56     29-02-2016      04-03-2012
## 2244                           56                               
## 2245                           56                               
## 2246                           56                               
## 2247                           56                               
## 2248                           56                               
## 2249                           56                               
## 2250      M         D          56     29-02-2016      04-03-2012
## 2251                           64                               
## 2252                           66                               
## 2253      F         R          66     29-02-2016      04-03-2012
## 2254                           66                               
## 2255                           66                               
## 2256      F         R          66     29-02-2016      04-03-2012
## 2257      M         R          66     29-02-2016      04-03-2012
## 2258                           66                               
## 2259                           66                               
## 2260                           66                               
## 2261      M         N         225     30-06-2016      07-01-2012
## 2262      M         R         230     30-06-2016      07-01-2012
## 2263      M         D         235     31-12-2016      01-01-2013
## 2264      M         N         240     27-03-2016      26-03-2012
## 2265      M         D         245     01-10-2016      04-03-2012
## 2266      M         D         245     01-10-2016      04-03-2012
## 2267      M         D         245     01-10-2016      05-01-2012
## 2268      M         N         245     01-10-2016      01-09-2012
## 2269      M         R         245     01-10-2016      04-03-2012
## 2270      M         D         245     01-10-2016      04-03-2012
## 2271      M         D         245     01-10-2016      05-01-2012
## 2272      M         D         245     01-10-2016      05-01-2012
## 2273      M         D         245     01-10-2016      04-03-2012
## 2274      M         D         250     31-12-2016      01-01-2011
## 2275      M         N         250     31-12-2016      01-01-2011
## 2276      M         D         255     31-12-2014      01-01-2011
## 2277      F         D         255     31-12-2014      01-01-2011
## 2278      M         D         255     31-12-2014      01-01-2011
## 2279      M         N         255     31-12-2014      01-01-2011
## 2280      F         D         255     31-12-2014      01-01-2011
## 2281      M         D         255     31-12-2014      01-01-2011
## 2282      M         N         255     31-12-2014      18-12-2012
## 2283      M         D         255     31-12-2014      27-08-2012
## 2284      F         D         255     31-12-2014      01-01-2011
## 2285      M         R         265     31-12-2014      09-04-2012
## 2286      M         D         265     31-12-2014      21-02-2011
## 2287      M         R         265     31-12-2014      01-01-2009
## 2288      M         D         265     31-12-2014      01-01-2009
## 2289      M         D         265     31-12-2014      01-01-2009
## 2290      M         D         265     31-12-2014      27-08-2012
## 2291      F         D         267     31-12-2014      01-01-2009
## 2292      M         D         267     31-12-2014      01-01-2009
## 2293      F         R         267     31-12-2014      01-01-2009
## 2294      M         D         267     31-12-2014      01-01-2009
## 2295      M         R         267     31-12-2014      01-01-2009
## 2296      M         D         267     31-12-2014      01-01-2009
## 2297      M         D         300     30-06-2016      07-01-2012
## 2298      M         D         300     30-06-2016      07-01-2012
## 2299      M         N         300     31-12-2014      27-08-2012
## 2300      M         D         300     30-06-2016      07-01-2012
## 2301      M         D         305     30-06-2016      07-01-2012
## 2302      M         R         305     31-12-2014      16-09-2011
## 2303      M         D         305     30-06-2016      07-01-2012
## 2304      M         D         310     30-06-2016      07-01-2012
## 2305      M         D         310     30-06-2016      07-01-2012
## 2306      M         R         310     30-06-2016      07-01-2012
## 2307      M         N         310     30-06-2016      07-01-2012
## 2308      F         D         310     30-06-2016      07-01-2012
## 2309      F         R         310     30-06-2016      18-12-2012
## 2310      M         D         310     30-06-2016      18-12-2012
## 2311      F         D         310     30-06-2016      18-12-2012
## 2312      M         N         310     30-06-2016      18-12-2012
## 2313      F         D         310     30-06-2016      18-12-2012
## 2314      M         D         310     30-06-2016      07-01-2012
## 2315      M         D         310     30-06-2016      07-01-2012
## 2316      F         D         310     30-06-2016      07-01-2012
## 2317      M         N         310     30-06-2016      07-01-2012
## 2318      F         D         310     30-06-2016      07-01-2012
## 2319      F         D         310     31-12-2014      11-01-2011
## 2320      M         N         310     31-12-2014      01-01-2011
## 2321      M         D         310     31-12-2014      16-11-2012
## 2322      F         N         310     31-12-2014      01-01-2011
## 2323      F         N         310     31-12-2014      01-01-2011
## 2324      M         D          54     29-02-2016      04-03-2012
## 2325      M         D          54     29-02-2016      04-03-2012
## 2326                           56                               
## 2327                           56                               
## 2328                           56                               
## 2329                           56                               
## 2330                           56                               
## 2331      M         D          56     29-02-2016      04-03-2012
## 2332      F         D          56     29-02-2016      04-03-2012
## 2333                           56                               
## 2334      F         D          56     29-02-2016      04-03-2012
## 2335                           56                               
## 2336                           56                               
## 2337                           64                               
## 2338                           66                               
## 2339                           66                               
## 2340                           66                               
## 2341                           66                               
## 2342                           66                               
## 2343                           66                               
## 2344                           66                               
## 2345                           66                               
## 2346      M         R          66     29-02-2016      04-03-2012
## 2347                           66                               
## 2348                           66                               
## 2349      M         N         225     30-06-2016      07-01-2012
## 2350      M         D         230     30-06-2016      07-01-2012
## 2351      F         D         235     31-12-2016      01-01-2013
## 2352      M         R         240     27-03-2016      26-03-2012
## 2353      M         D         245     01-10-2016      16-11-2012
## 2354      M         D         245     01-10-2016      01-09-2012
## 2355      M         D         245     01-10-2016      01-09-2012
## 2356      M         R         245     01-10-2016      01-09-2012
## 2357      M         R         245     01-10-2016      01-09-2012
## 2358      M         D         245     01-10-2016      01-09-2012
## 2359      M         D         245     01-10-2016      01-09-2012
## 2360      M         D         245     01-10-2016      01-09-2012
## 2361      M         D         245     01-10-2016      01-09-2012
## 2362      M         D         245     01-10-2016      01-09-2012
## 2363      M         R         245     01-10-2016      01-09-2012
## 2364      M         D         255     31-12-2014      01-01-2011
## 2365      M         R         255     31-12-2014      01-01-2011
## 2366      M         D         255     31-12-2014      01-01-2011
## 2367      M         D         255     31-12-2014      01-01-2011
## 2368      M         D         255     31-12-2014      13-01-2011
## 2369      M         D         255     31-12-2014      01-01-2011
## 2370      M         D         255     31-12-2014      01-01-2011
## 2371      M         R         255     31-12-2014      01-01-2011
## 2372      M         R         255     31-12-2014      01-01-2011
## 2373                          255                     02-08-2013
## 2374      M         D         255     31-12-2014      01-01-2011
## 2375      F         D         265     31-12-2014      01-01-2009
## 2376      F         D         265     31-12-2014      01-01-2009
## 2377      M         R         265     31-12-2014      01-01-2009
## 2378      M         D         265     31-12-2014      01-01-2009
## 2379                          265                               
## 2380      M         N         265     31-12-2014      01-01-2009
## 2381      M         D         267     31-12-2014      01-01-2009
## 2382      M         O         267     31-12-2014      01-01-2009
## 2383      M         D         267     31-12-2014      01-01-2009
## 2384      M         D         267     31-12-2014      01-01-2009
## 2385      F         D         267     31-12-2014      01-01-2009
## 2386      M         D         267     31-12-2014      01-01-2009
## 2387      M         D         300     30-06-2014      07-01-2010
## 2388      M         N         300     31-12-2014      01-01-2011
## 2389      F         D         300     31-12-2016      01-01-2013
## 2390      M         N         300     30-06-2014      07-01-2010
## 2391      F         D         300     31-12-2014      01-01-2011
## 2392      F         N         300     30-06-2014      19-07-2010
## 2393      F         D         300     31-12-2016      01-01-2013
## 2394      F         D         300     30-06-2013      07-01-2009
## 2395      M         R         300                               
## 2396      M         R         305     30-06-2014      07-01-2010
## 2397      M         D         305     30-06-2013      07-01-2009
## 2398      M         D         305                               
## 2399      M         D         310     30-06-2014      07-01-2010
## 2400      M         R         310     30-06-2014      07-01-2010
## 2401      M         D         310     30-06-2014      07-01-2010
## 2402      M         D         310     30-06-2014      07-01-2010
## 2403                          310                     29-10-2012
## 2404      M         R         310     31-12-2014      01-01-2011
## 2405      F         R         310     31-12-2014      01-01-2011
## 2406      M         D         310     31-12-2014      01-01-2011
## 2407      F         D         310     31-12-2016      01-01-2013
## 2408      F         D         310     31-12-2016      01-01-2013
## 2409      M         D         310     31-12-2016      01-01-2013
## 2410      F         D         310                               
## 2411      F         D         310     30-06-2013      07-01-2009
## 2412      F         D         310     30-06-2013      07-01-2009
## 2413      F         D         310                               
## 2414      M         R         310     30-06-2013      07-01-2009
## 2415      M         R         310                               
## 2416      M         R         310     31-12-2016      01-01-2013
## 2417      M         D         310     31-12-2016      01-01-2013
## 2418      F         D         310     31-12-2016      01-01-2013
## 2419      M         D         310     31-12-2016      01-01-2013
## 2420      F         D         310     31-12-2016      01-01-2013
## 2421      F         D         310     30-06-2014      07-01-2010
## 2422      M         R         310     30-06-2014      07-01-2010
## 2423      M         D         310     30-06-2014      07-01-2010
## 2424      M         D         310     30-06-2014      07-01-2010
## 2425      F         R         310     30-06-2014      07-01-2010
## 2426      F         R         310     30-06-2014      07-01-2010
## 2427      M         N         310     30-06-2014      21-02-2011
## 2428      F         D         310     30-06-2014      07-01-2010
## 2429      F         N         310     31-12-2014      01-01-2011
## 2430      M         R         310     31-12-2014      01-01-2011
## 2431      F         D         310     31-12-2014      01-01-2011
## 2432      F         D         310     31-12-2014      01-01-2011
## 2433      F         R         310     31-12-2014      01-01-2011
## 2434      M         D          54     29-02-2016      04-03-2012
## 2435      F         D          54     29-02-2016      04-03-2012
## 2436      M         D          54     29-02-2016      04-03-2012
## 2437      M         D          54     29-02-2016      04-03-2012
## 2438      M         D          54     29-02-2016      04-03-2012
## 2439      F         D          56     29-02-2016      04-03-2012
## 2440      F         D          56     29-02-2016      04-03-2012
## 2441      M         D          56     29-02-2016      04-03-2012
## 2442      F         D          56     29-02-2016      04-03-2012
## 2443      F         D          56     29-02-2016      04-03-2012
## 2444      F         D          56     29-02-2016      04-03-2012
## 2445      M         D          56     29-02-2016      04-03-2012
## 2446      F         D          56     29-02-2016      04-03-2012
## 2447      F         D          56     29-02-2016      04-03-2012
## 2448      F         D          56     29-02-2016      04-03-2012
## 2449      F         D          56     29-02-2016      04-03-2012
## 2450      M         D          56     29-02-2016      04-03-2012
## 2451      F         R          64     29-02-2016      04-03-2012
## 2452      M         R          64     29-02-2016      04-03-2012
## 2453      M         R          64     29-02-2016      04-03-2012
## 2454      M         R          64     29-02-2016      04-03-2012
## 2455      M         R          64     29-02-2016      04-03-2012
## 2456      M         R          66     29-02-2016      04-03-2012
## 2457      M         R          66     29-02-2016      04-03-2012
## 2458      M         R          66     29-02-2016      04-03-2012
## 2459      M         R          66     29-02-2016      04-03-2012
## 2460      M         R          66     29-02-2016      04-03-2012
## 2461      M         R          66     29-02-2016      04-03-2012
## 2462      M         R          66     29-02-2016      04-03-2012
## 2463      F         R          66     29-02-2016      04-03-2012
## 2464      M         R          66     29-02-2016      04-03-2012
## 2465      F         R          66     29-02-2016      04-03-2012
## 2466      M         R          66     29-02-2016      04-03-2012
## 2467      F         R          66     29-02-2016      04-03-2012
## 2468      F         D         220     31-12-2014      01-01-2009
## 2469      F         D         220     31-12-2014      01-01-2009
## 2470      F         D         220     31-12-2014      01-01-2009
## 2471      F         R         220     31-12-2014      04-12-2011
## 2472      F         R         220     31-12-2014      01-01-2009
## 2473      F         R         220     31-12-2014      01-01-2009
## 2474      M         R         225     30-06-2016      07-01-2012
## 2475      M         R         230     30-06-2016      07-01-2012
## 2476      M         R         235     31-12-2016      01-01-2013
## 2477      M         R         240     27-03-2016      26-03-2012
## 2478      M         D         243     31-12-2016      01-01-2013
## 2479      M         D         245     31-12-2016      01-01-2013
## 2480      F         D         245     31-12-2016      01-01-2013
## 2481      M         R         245     31-12-2016      01-01-2013
## 2482      M         R         245     31-12-2016      01-01-2013
## 2483      F         D         245     31-12-2016      01-01-2013
## 2484      F         D         245     31-12-2016      01-01-2013
## 2485      F         D         245     31-12-2016      01-01-2013
## 2486      M         R         245     31-12-2016      01-01-2013
## 2487      M         R         245     31-12-2016      01-01-2013
## 2488      F         D         245     31-12-2016      01-01-2013
## 2489      M         R         245     31-12-2016      01-01-2013
## 2490      M         R         245     31-12-2016      01-01-2013
## 2491      M         D         250     31-12-2014      01-01-2009
## 2492      M         D         250     31-12-2016      01-01-2011
## 2493      F         D         250     31-12-2018      01-01-2013
## 2494      F         D         250     31-12-2018      01-01-2013
## 2495      F         R         250     31-12-2018      01-01-2013
## 2496      M         D         250     31-12-2018      01-01-2013
## 2497      F         R         250     31-12-2018      01-01-2013
## 2498      M         D         253     31-12-2018      01-01-2013
## 2499      F         D         255     31-12-2014      01-01-2011
## 2500      M         R         255     31-12-2014      01-01-2011
## 2501      F         R         255     31-12-2014      01-01-2011
## 2502      M         D         255     31-12-2014      01-01-2011
## 2503      M         R         255     31-12-2014      01-01-2011
## 2504      F         D         255     31-12-2014      01-01-2011
## 2505      M         N         255     31-12-2014      25-02-2013
## 2506      M         R         255     31-12-2014      01-01-2011
## 2507      M         R         255     31-12-2014      01-01-2011
## 2508      M         R         255     31-12-2014      01-01-2011
## 2509      M         R         255     31-12-2014      01-01-2011
## 2510      F         D         255     31-12-2014      01-01-2011
## 2511      F         D         255     31-12-2014      01-01-2011
## 2512      F         R         255     31-12-2014      01-01-2011
## 2513      M         D         255     31-12-2014      01-01-2011
## 2514      F         D         255     31-12-2014      01-01-2011
## 2515      M         R         255     31-12-2014      01-01-2011
## 2516      F         D         255     31-12-2014      01-01-2011
## 2517      M         D         255     31-12-2014      01-01-2011
## 2518      M         R         255     31-12-2014      01-01-2011
## 2519      F         D         255     31-12-2014      01-01-2011
## 2520      F         D         255     31-12-2014      01-01-2011
## 2521      M         R         255     31-12-2014      01-01-2011
## 2522      F         D         255     31-12-2014      01-01-2011
## 2523      M         D         255     31-12-2014      01-01-2011
## 2524      F         R         255     31-12-2014      01-01-2011
## 2525      F         R         255     31-12-2014      01-01-2011
## 2526      F         R         255     31-12-2014      01-01-2011
## 2527      F         R         255     31-12-2014      01-01-2011
## 2528      M         R         255     31-12-2014      01-01-2011
## 2529      F         R         255     31-12-2014      01-01-2011
## 2530      M         R         255     31-12-2014      01-01-2011
## 2531      F         D         265     31-12-2014      01-01-2009
## 2532      F         R         265     31-12-2014      01-01-2009
## 2533      M         D         265     31-12-2014      01-01-2009
## 2534      M         R         265     31-12-2014      14-04-2009
## 2535      M         R         265     31-12-2014      01-01-2009
## 2536                          265                               
## 2537      M         D         267     31-12-2014      01-01-2009
## 2538      M         R         267     31-12-2014      01-01-2009
## 2539      M         D         267     31-12-2014      01-01-2009
## 2540      M         R         267     31-12-2014      01-01-2009
## 2541      M         R         267     31-12-2014      16-11-2012
## 2542      M         R         267     31-12-2014      01-01-2009
## 2543      M         D         300     30-06-2016      07-01-2012
## 2544      M         R         300     30-06-2014      07-01-2010
## 2545      M         N         300     01-12-2015      01-10-2011
## 2546      M         D         305     30-06-2016      07-01-2012
## 2547      M         R         305     30-06-2014      07-01-2010
## 2548      M         R         305     01-12-2015      11-01-2011
## 2549      M         R         310     30-06-2014      07-01-2010
## 2550      M         R         310     30-06-2014      07-01-2010
## 2551      M         R         310     30-06-2014      07-01-2010
## 2552      M         R         310     30-06-2014      07-01-2010
## 2553      M         D         310     30-06-2014      07-01-2010
## 2554      M         D         310     30-06-2016      07-01-2012
## 2555      M         N         310     01-12-2015      01-10-2011
## 2556      M         D         310     30-06-2016      07-01-2012
## 2557      M         R         310     01-12-2015      01-10-2011
## 2558      F         D         310     30-06-2016      07-01-2012
## 2559      M         R         310     01-12-2015      01-10-2011
## 2560      M         D         310     30-06-2016      07-01-2012
## 2561                          310                     05-08-2012
## 2562      M         R         310     01-12-2015      01-10-2011
## 2563      M         D         310     30-06-2016      07-01-2012
## 2564      M         D         310     01-12-2015      01-10-2011
## 2565                           54                               
## 2566                           56                               
## 2567      M         D          56     29-02-2016      04-03-2012
## 2568                           56                               
## 2569                           56                               
## 2570      M         D          56     29-02-2016      04-03-2012
## 2571                           56                               
## 2572                           56                               
## 2573                           56                               
## 2574                           56                               
## 2575                           64                               
## 2576                           66                               
## 2577                           66                               
## 2578                           66                               
## 2579                           66                               
## 2580                           66                               
## 2581                           66                               
## 2582                           66                               
## 2583                           66                               
## 2584                           66                               
## 2585      M         D         225     30-06-2016      07-01-2012
## 2586      F         D         230     30-06-2016      07-01-2012
## 2587      F         D         235     31-12-2016      01-01-2013
## 2588      M         N         240     27-03-2016      26-03-2012
## 2589      M         D         245     01-10-2016      01-09-2012
## 2590      F         D         245     01-10-2016      01-09-2012
## 2591      M         D         245     01-10-2016      01-09-2012
## 2592      M         D         245     01-10-2016      01-09-2012
## 2593      M         R         245     01-10-2016      01-09-2012
## 2594      F         D         255     31-12-2014      27-08-2012
## 2595      F         D         255     31-12-2014      01-01-2011
## 2596      F         D         255     31-12-2014      01-01-2011
## 2597      M         N         255     31-12-2014      01-01-2011
## 2598      M         D         255     31-12-2014      01-01-2011
## 2599      M         D         255     31-12-2014      01-01-2011
## 2600      F         D         255     31-12-2014      01-01-2011
## 2601      F         D         255     31-12-2014      01-01-2011
## 2602      F         D         255     31-12-2014      01-01-2011
## 2603      F         R         265     31-12-2014      01-01-2009
## 2604      M         D         267     31-12-2014      01-01-2009
## 2605      M         D         300     31-12-2014      01-01-2011
## 2606      M         D         305     31-12-2014      01-02-2011
## 2607      M         D         310     31-12-2014      01-01-2011
## 2608      M         D         310     31-12-2014      01-01-2011
## 2609      M         D         310     31-12-2014      01-01-2011
## 2610      F         D         310     31-12-2014      01-01-2011
## 2611      M         D         310     31-12-2014      01-01-2011
## 2612      M         D          54     29-02-2016      04-03-2012
## 2613                           56                               
## 2614      M         D          56     29-02-2016      04-03-2012
## 2615                           56                               
## 2616                           56                               
## 2617      M         D          56     29-02-2016      04-03-2012
## 2618                           56                               
## 2619                           56                               
## 2620                           56                               
## 2621                           56                               
## 2622      M         R          64     29-02-2016      04-03-2012
## 2623                           66                               
## 2624                           66                               
## 2625                           66                               
## 2626                           66                               
## 2627                           66                               
## 2628                           66                               
## 2629                           66                               
## 2630                           66                               
## 2631                           66                               
## 2632      M         D         225     30-06-2016      07-01-2012
## 2633      M         N         230     30-06-2016      07-01-2012
## 2634      M         D         235     31-12-2016      01-01-2013
## 2635      M         R         240     27-03-2016      26-03-2012
## 2636      M         R         245     01-10-2016      01-09-2012
## 2637      M         N         245     01-10-2016      04-03-2012
## 2638      M         D         245     01-10-2016      05-01-2012
## 2639      M         D         245     01-10-2016      04-03-2012
## 2640      M         D         245     01-10-2016      01-09-2012
## 2641      M         N         245     01-10-2016      04-03-2012
## 2642      M         N         245     01-10-2016      04-03-2012
## 2643      M         D         245     01-10-2016      04-03-2012
## 2644      M         D         245     01-10-2016      05-01-2012
## 2645      M         D         255     31-12-2014      01-01-2011
## 2646      M         D         255     31-12-2014      01-01-2011
## 2647      M         D         255     31-12-2014      01-01-2011
## 2648      M         D         255     31-12-2014      01-01-2011
## 2649      F         R         255     31-12-2014      11-01-2011
## 2650      F         D         255     31-12-2014      01-01-2011
## 2651      M         N         255     31-12-2014      01-01-2011
## 2652      F         D         255     31-12-2014      01-01-2011
## 2653      F         D         255     31-12-2014      01-01-2011
## 2654      M         D         255     31-12-2014      01-01-2011
## 2655      M         D         255     31-12-2014      01-01-2011
## 2656      M         N         255     31-12-2014      01-01-2011
## 2657      M         D         265     31-12-2014      01-01-2009
## 2658                          265                               
## 2659                          265                     23-01-2013
## 2660      F         D         265     31-12-2014      01-01-2009
## 2661      M         D         267     31-12-2014      01-01-2009
## 2662                          267                     20-11-2012
## 2663      M         D         267     31-12-2014      01-01-2009
## 2664      F         D         267     31-12-2014      01-01-2009
## 2665      F         D         300     31-12-2016      01-01-2013
## 2666      M         D         300     30-06-2016      07-01-2012
## 2667      M         R         300     30-06-2016      07-01-2012
## 2668      F         D         300     30-06-2016      07-01-2012
## 2669      F         D         300     30-06-2013      15-11-2010
## 2670      M         R         305     30-06-2016      07-01-2012
## 2671      M         D         305     30-06-2016      07-01-2012
## 2672      M         D         310     31-12-2016      01-01-2013
## 2673      M         D         310     31-12-2016      01-01-2013
## 2674      M         N         310     31-12-2016      01-01-2013
## 2675      F         D         310     31-12-2016      01-01-2013
## 2676      F         D         310     31-12-2016      01-01-2013
## 2677      F         R         310     30-06-2016      07-01-2012
## 2678      F         R         310     30-06-2016      07-01-2012
## 2679      F         N         310     30-06-2016      07-01-2012
## 2680      M         R         310     30-06-2016      07-01-2012
## 2681      M         D         310     30-06-2016      07-01-2012
## 2682      M         N         310     30-06-2016      07-01-2012
## 2683      M         R         310     30-06-2016      07-01-2012
## 2684      M         D         310     30-06-2016      07-01-2012
## 2685      F         D         310                               
## 2686      F         N         310     30-06-2013      15-11-2010
## 2687      F         N         310                               
## 2688      F         D         310                               
## 2689      F         D         310     30-06-2013      07-01-2009
## 2690      F         D         310     30-06-2013      07-01-2009
## 2691      M         D         310     30-06-2016      07-01-2012
## 2692      M         D         310     30-06-2016      07-01-2012
## 2693      M         D         310     30-06-2016      07-01-2012
## 2694      M         D         310     30-06-2016      07-01-2012
## 2695      M         D         310     30-06-2016      07-01-2012
## 2696      M         D          54     29-02-2016      04-03-2012
## 2697      M         D          54     29-02-2016      04-03-2012
## 2698      F         D          54     29-02-2016      04-03-2012
## 2699                           56                               
## 2700                           56                               
## 2701                           56                               
## 2702                           56                               
## 2703                           56                               
## 2704                           56                               
## 2705                           56                               
## 2706                           56                               
## 2707                           56                               
## 2708      M         R          64     29-02-2016      04-03-2012
## 2709      M         R          64     29-02-2016      04-03-2012
## 2710      M         R          64     29-02-2016      04-03-2012
## 2711      F         R          64     29-02-2016      04-03-2012
## 2712      M         R          66     29-02-2016      04-03-2012
## 2713                           66                               
## 2714                           66                               
## 2715                           66                               
## 2716                           66                               
## 2717                           66                               
## 2718                           66                               
## 2719                           66                               
## 2720                           66                               
## 2721      M         D         225     30-06-2016      07-01-2012
## 2722      M         D         230     30-06-2016      07-01-2012
## 2723      M         D         235     31-12-2016      01-01-2013
## 2724      M         D         240     27-03-2016      26-03-2012
## 2725      M         D         245     01-10-2016      01-09-2012
## 2726      M         R         245     01-10-2016      01-09-2012
## 2727      M         N         245     01-10-2016      01-09-2012
## 2728      M         D         245     01-10-2016      01-09-2012
## 2729      M         D         245     01-10-2016      01-09-2012
## 2730      M         D         245     01-10-2016      01-09-2012
## 2731      M         D         245     01-10-2016      01-09-2012
## 2732      M         D         245     01-10-2016      01-09-2012
## 2733      M         D         245     01-10-2016      01-09-2012
## 2734      M         D         250     31-12-2014      01-01-2009
## 2735      M         D         250     31-12-2014      01-01-2009
## 2736      M         D         255     31-12-2014      01-01-2011
## 2737      M         R         255     31-12-2014      01-01-2011
## 2738      M         D         255     31-12-2014      01-01-2011
## 2739      M         N         255     31-12-2014      01-01-2011
## 2740      F         D         255     31-12-2014      01-01-2011
## 2741      M         D         255     31-12-2014      01-01-2011
## 2742      M         D         255     31-12-2014      16-11-2012
## 2743      F         D         255     31-12-2014      01-01-2011
## 2744      M         R         255     31-12-2014      01-01-2011
## 2745      M         D         255     31-12-2014      01-01-2011
## 2746      F         D         255     31-12-2014      01-01-2011
## 2747      M         D         255     31-12-2014      01-01-2011
## 2748      F         D         255     31-12-2014      01-01-2011
## 2749      M         D         265     31-12-2014      01-01-2009
## 2750      F         D         265     31-12-2014      01-01-2009
## 2751      F         D         265     31-12-2014      01-01-2009
## 2752      M         N         265     31-12-2014      19-07-2010
## 2753      M         D         265     31-12-2014      01-01-2009
## 2754      M         D         267     31-12-2014      01-01-2009
## 2755      M         D         267     31-12-2014      01-01-2009
## 2756      M         D         267     31-12-2014      01-01-2009
## 2757      M         D         267     31-12-2014      01-01-2009
## 2758      M         D         267     31-12-2014      01-01-2009
## 2759      F         D         300     31-12-2014      01-01-2011
## 2760      M         D         300     31-12-2014      01-01-2011
## 2761      F         D         300     31-12-2014      05-01-2012
## 2762      M         R         300     31-12-2016      01-01-2013
## 2763      F         R         300     31-12-2014      01-01-2011
## 2764      M         D         305     31-12-2014      01-01-2011
## 2765      M         D         305     31-12-2014      01-01-2011
## 2766      M         D         305     31-12-2014      01-01-2011
## 2767      M         D         305     31-12-2016      01-01-2013
## 2768      M         D         305     31-12-2014      05-01-2012
## 2769      F         D         308     31-12-2014      01-01-2011
## 2770      M         D         310     31-12-2014      01-01-2011
## 2771      M         D         310     31-12-2014      01-01-2011
## 2772      M         D         310     31-12-2014      01-01-2011
## 2773      M         D         310     31-12-2014      01-01-2011
## 2774      M         D         310     31-12-2014      01-01-2011
## 2775      M         D         310     31-12-2014      01-01-2011
## 2776      M         D         310     31-12-2014      01-01-2011
## 2777      M         D         310     31-12-2014      01-01-2011
## 2778      M         D         310     31-12-2014      01-01-2011
## 2779      M         D         310     31-12-2014      01-01-2011
## 2780      F         D         310     31-12-2014      01-01-2011
## 2781      M         D         310     31-12-2014      04-03-2012
## 2782      M         D         310     31-12-2014      01-01-2011
## 2783      F         D         310     31-12-2016      01-01-2013
## 2784      F         D         310     31-12-2016      01-01-2013
## 2785      M         D         310     31-12-2016      01-01-2013
## 2786      M         D         310     31-12-2014      01-01-2011
## 2787      M         D         310     31-12-2014      25-02-2013
## 2788      M         D         310     31-12-2014      01-01-2011
## 2789      F         D          54     29-02-2016      04-03-2012
## 2790      M         D          54     29-02-2016      04-03-2012
## 2791      M         D          54     29-02-2016      04-03-2012
## 2792                           56                               
## 2793                           56                               
## 2794                           56                               
## 2795                           56                               
## 2796                           56                               
## 2797                           56                               
## 2798                           56                               
## 2799                           64                     04-03-2012
## 2800                           64                     04-03-2012
## 2801                           64                     04-03-2012
## 2802      M         R          64     29-02-2016      04-03-2012
## 2803                           64                     04-03-2012
## 2804                           66                     14-05-2012
## 2805                           66                     14-05-2012
## 2806                           66                               
## 2807                           66                     04-03-2012
## 2808                           66                               
## 2809                           66                     04-03-2012
## 2810                           66                               
## 2811      M         R         225     30-06-2016      07-01-2012
## 2812      F         D         230     30-06-2016      07-01-2012
## 2813      M         D         235     31-12-2016      01-01-2013
## 2814      M         D         240     27-03-2016      26-03-2012
## 2815      M         N         245     01-10-2016      01-09-2012
## 2816      M         N         245     01-10-2016      01-09-2012
## 2817      M         R         245     01-10-2016      01-09-2012
## 2818      M         D         245     01-10-2016      01-09-2012
## 2819      M         D         245     01-10-2016      01-09-2012
## 2820      M         D         245     01-10-2016      01-09-2012
## 2821      M         D         245     01-10-2016      01-09-2012
## 2822      F         D         250     31-12-2016      01-01-2011
## 2823      M         D         250     31-12-2016      01-01-2011
## 2824      M         D         255     31-12-2014      01-01-2011
## 2825      M         N         255     31-12-2014      01-01-2011
## 2826      M         N         255     31-12-2014      01-01-2011
## 2827      M         N         255     31-12-2014      01-01-2011
## 2828      F         N         255     31-12-2014      01-01-2011
## 2829      M         N         255     31-12-2014      01-01-2011
## 2830      F         D         255     31-12-2014      01-01-2011
## 2831      M         R         265     31-12-2014      11-03-2011
## 2832      M         N         265     31-12-2014      01-01-2009
## 2833      F         D         265     31-12-2014      23-02-2009
## 2834      M         R         265     31-12-2014      01-01-2009
## 2835      M         N         265     31-12-2014      01-01-2009
## 2836      M         R         265     31-12-2014      01-01-2009
## 2837      M         D         265     31-12-2014      01-01-2009
## 2838      M         D         267     31-12-2014      01-01-2009
## 2839      M         N         267     31-12-2014      01-01-2009
## 2840      M         D         267     31-12-2014      01-01-2009
## 2841      M         D         267     31-12-2014      25-02-2013
## 2842      M         N         267     31-12-2014      01-01-2009
## 2843      M         N         267     31-12-2014      01-01-2009
## 2844      M         D         267     31-12-2014      01-01-2009
## 2845      M         D         300     30-06-2014      07-01-2010
## 2846      F         D         300     31-12-2014      01-01-2011
## 2847      F         R         300     31-12-2014      01-01-2011
## 2848      M         N         300     31-12-2014      01-01-2011
## 2849      M         D         305     30-06-2014      07-01-2010
## 2850      M         D         305     31-12-2014      01-01-2011
## 2851      M         N         305     31-12-2014      01-01-2011
## 2852      M         N         305     31-12-2014      01-01-2011
## 2853      F         D         310     31-12-2014      01-01-2011
## 2854      M         D         310     31-12-2014      01-01-2011
## 2855      M         D         310     31-12-2014      01-01-2011
## 2856      M         R         310     31-12-2014      01-01-2011
## 2857      M         N         310     31-12-2014      01-01-2011
## 2858      F         N         310     31-12-2014      01-01-2011
## 2859      M         N         310     31-12-2014      01-01-2011
## 2860      M         N         310     31-12-2014      01-01-2011
## 2861      F         N         310     31-12-2014      01-01-2011
## 2862      F         D         310     31-12-2014      25-02-2013
## 2863      M         R         310     31-12-2014      01-01-2011
## 2864                          310                     26-02-2013
## 2865      M         D         310     30-06-2014      07-01-2010
## 2866      F         D         310     30-06-2014      07-01-2010
## 2867      M         R         310     30-06-2014      07-01-2010
## 2868      M         D         310     30-06-2014      07-01-2010
## 2869      M         D          54     29-02-2016      04-03-2012
## 2870                           56                               
## 2871                           56                               
## 2872                           56                               
## 2873                           56                               
## 2874                           56                               
## 2875                           56                               
## 2876                           56                               
## 2877                           56                               
## 2878      M         R          64     29-02-2016      04-03-2012
## 2879                           64                     04-03-2012
## 2880                           66                               
## 2881                           66                               
## 2882                           66                     21-03-2013
## 2883                           66                               
## 2884                           66                               
## 2885                           66                               
## 2886                           66                               
## 2887                           66                               
## 2888      M         O         225     30-06-2016      07-01-2012
## 2889      M         D         230     30-06-2016      07-01-2012
## 2890      M         D         235     31-12-2016      01-01-2013
## 2891      M         R         240     27-03-2016      26-03-2012
## 2892      M         N         245     01-10-2016      01-09-2012
## 2893      M         N         245     01-10-2016      01-09-2012
## 2894      M         D         245     01-10-2016      01-09-2012
## 2895      M         N         245     01-10-2016      01-09-2012
## 2896      M         R         245     01-10-2016      01-09-2012
## 2897      M         R         245     01-10-2016      01-09-2012
## 2898      M         R         245     01-10-2016      16-11-2012
## 2899      M         R         245     01-10-2016      01-09-2012
## 2900      M         R         255     31-12-2014      01-01-2011
## 2901      M         D         255     31-12-2014      01-01-2011
## 2902      F         D         255     31-12-2014      01-01-2011
## 2903      M         D         255     31-12-2014      01-01-2011
## 2904      M         R         255     31-12-2014      01-01-2011
## 2905      M         R         255     31-12-2014      01-01-2011
## 2906      M         R         255     31-12-2014      11-01-2011
## 2907      M         N         255     31-12-2014      01-01-2011
## 2908      M         R         265     31-12-2014      16-11-2012
## 2909                          265                               
## 2910      F         D         265     31-12-2014      01-01-2009
## 2911      F         R         265     31-12-2014      01-01-2009
## 2912      M         R         265     31-12-2014      01-01-2009
## 2913      M         D         267     31-12-2014      01-01-2009
## 2914      M         D         267     31-12-2014      01-01-2009
## 2915      M         N         267     31-12-2014      21-02-2011
## 2916      M         R         267     31-12-2014      27-08-2012
## 2917      M         R         267     31-12-2014      01-01-2009
## 2918      M         D         300     30-06-2014      07-01-2010
## 2919      F         D         300     31-12-2014      01-01-2011
## 2920      M         N         300     31-12-2014      01-01-2011
## 2921                          300                     15-02-2013
## 2922      M         D         300     30-06-2016      07-01-2012
## 2923      M         N         300     31-12-2016      01-01-2013
## 2924      M         D         305     31-12-2014      01-01-2011
## 2925      M         N         305     30-06-2015      07-01-2011
## 2926      M         R         305     31-12-2016      01-01-2013
## 2927      M         D         310     30-06-2014      07-01-2010
## 2928      F         D         310     30-06-2014      07-01-2010
## 2929      F         D         310     30-06-2014      07-01-2010
## 2930      F         D         310     30-06-2014      07-01-2010
## 2931      M         R         310     30-06-2014      07-01-2010
## 2932      F         N         310     30-06-2015      09-04-2012
## 2933                          310                     15-02-2013
## 2934                          310                     15-02-2013
## 2935      F         R         310     30-06-2016      07-01-2012
## 2936      F         D         310     30-06-2016      07-01-2012
## 2937      F         D         310     30-06-2016      07-01-2012
## 2938      M         N         310     31-12-2016      01-01-2013
## 2939      F         O         310     31-12-2016      01-01-2013
## 2940      M         N         310     31-12-2016      01-01-2013
## 2941      M         N         310     31-12-2014      01-01-2011
## 2942      M         N         310     31-12-2014      01-01-2011
## 2943      F         N         310     31-12-2014      01-01-2011
## 2944      M         N         310     31-12-2014      01-01-2011
## 2945      M         N         310     31-12-2014      01-01-2011
## 2946      M         R         310     31-12-2014      01-01-2011
## 2947                          310                     09-04-2012
## 2948                          310                     11-11-2012
## 2949      M         N         310     31-12-2014      01-01-2011
## 2950      F         D         310     31-12-2014      01-01-2011
## 2951      M         D          54     29-02-2016      04-03-2012
## 2952      M         D          54     29-02-2016      04-03-2012
## 2953      M         D          54     29-02-2016      04-03-2012
## 2954                           56                               
## 2955                           56                               
## 2956                           56                               
## 2957                           56                               
## 2958                           56                               
## 2959      M         D          56     29-02-2016      04-03-2012
## 2960                           56                               
## 2961                           56                               
## 2962                           56                               
## 2963                           56                               
## 2964                           56                               
## 2965                           56                               
## 2966                           56                               
## 2967                           56                               
## 2968      F         R          64     29-02-2016      04-03-2012
## 2969      F         R          64     29-02-2016      04-03-2012
## 2970                           66                               
## 2971      M         R          66     29-02-2016      04-03-2012
## 2972                           66                               
## 2973      M         R          66     29-02-2016      04-03-2012
## 2974                           66                               
## 2975      M         R          66     29-02-2016      04-03-2012
## 2976                           66                               
## 2977                           66                               
## 2978                           66                               
## 2979      M         R          66     29-02-2016      04-03-2012
## 2980      F         R          66     29-02-2016      04-03-2012
## 2981                           66                               
## 2982                           66                               
## 2983                           66                               
## 2984      M         R         225     30-06-2016      07-01-2012
## 2985      M         D         230     30-06-2016      07-01-2012
## 2986      M         D         235     31-12-2016      01-01-2013
## 2987      M         R         240     27-03-2016      26-03-2012
## 2988      M         R         243     01-11-2016      01-09-2012
## 2989      F         D         245     01-11-2016      01-09-2012
## 2990      M         D         245     01-11-2016      01-09-2012
## 2991      M         R         245     01-11-2016      01-09-2012
## 2992      M         D         245     01-11-2016      01-09-2012
## 2993      M         N         245     01-11-2016      01-09-2012
## 2994      M         R         245     01-11-2016      01-09-2012
## 2995      M         R         245     01-11-2016      01-09-2012
## 2996      M         R         245     01-11-2016      01-09-2012
## 2997      M         D         245     01-11-2016      01-09-2012
## 2998      M         R         245     01-11-2016      01-09-2012
## 2999      M         D         245     01-11-2016      01-09-2012
## 3000      F         D         245     01-11-2016      01-09-2012
## 3001      M         R         245     01-11-2016      01-09-2012
## 3002      M         D         245     01-11-2016      01-09-2012
## 3003      M         D         250     31-12-2014      01-01-2009
## 3004      M         D         250     31-12-2014      01-01-2009
## 3005      M         D         250     31-12-2014      01-01-2009
## 3006      M         D         250     31-12-2014      01-01-2009
## 3007      F         D         255     31-12-2014      01-01-2011
## 3008      M         D         255     31-12-2014      01-01-2011
## 3009      M         N         255     31-12-2014      01-01-2011
## 3010                          255                     01-09-2013
## 3011      M         O         255     31-12-2014      01-01-2011
## 3012      M         D         255     31-12-2014      01-01-2011
## 3013      M         R         255     31-12-2014      01-01-2011
## 3014      M         D         255     31-12-2014      01-01-2011
## 3015      M         R         255     31-12-2014      16-11-2012
## 3016      F         N         255     31-12-2014      01-01-2011
## 3017      F         R         255     31-12-2014      01-01-2011
## 3018      M         D         255     31-12-2014      01-01-2011
## 3019      M         N         255     31-12-2014      01-01-2011
## 3020      M         D         255     31-12-2014      01-01-2011
## 3021      M         N         265     31-12-2014      01-01-2009
## 3022      M         D         265     31-12-2014      01-01-2009
## 3023      F         R         265     31-12-2014      01-01-2009
## 3024      M         R         267     31-12-2014      01-01-2009
## 3025      M         D         267     31-12-2014      01-01-2009
## 3026      M         D         267     31-12-2014      01-01-2009
## 3027      M         D         300     30-06-2015      07-01-2011
## 3028      F         D         300     31-12-2016      01-01-2013
## 3029      M         R         300     31-12-2016      01-01-2013
## 3030      F         D         308     30-06-2015      07-01-2011
## 3031      M         R         308     31-12-2016      01-01-2013
## 3032      M         R         310     31-12-2016      01-01-2013
## 3033      M         R         310     31-12-2016      01-01-2013
## 3034      M         R         310     31-12-2016      01-01-2013
## 3035      M         D         310     30-06-2015      07-01-2011
## 3036      M         D         310     30-06-2015      07-01-2011
## 3037      M         D         310     30-06-2015      07-01-2011
## 3038      M         R         310     30-06-2015      07-01-2011
## 3039      F         R         310     31-12-2016      01-01-2013
## 3040      F         D         310     31-12-2016      01-01-2013
## 3041      M         D         310     31-12-2016      01-01-2013
## 3042      M         D         310     31-12-2016      01-01-2013
## 3043      M         D         310     31-12-2016      01-01-2013
## 3044      M         D         310     31-12-2016      01-01-2013
## 3045      M         D          54     29-02-2016      04-03-2012
## 3046      M         D          54     29-02-2016      04-03-2012
## 3047                           56                               
## 3048                           56                               
## 3049                           56                               
## 3050                           56                               
## 3051                           56                               
## 3052                           56                               
## 3053                           56                               
## 3054                           56                               
## 3055                           56                               
## 3056                           56                               
## 3057                           56                               
## 3058                           56                               
## 3059                           56                               
## 3060      F         R          64     29-02-2016      04-03-2012
## 3061                           66                               
## 3062                           66                               
## 3063                           66                               
## 3064                           66                               
## 3065                           66                               
## 3066                           66                               
## 3067                           66                               
## 3068      F         R          66     29-02-2016      04-03-2012
## 3069                           66                               
## 3070                           66                               
## 3071                           66                               
## 3072                           66                               
## 3073                           66                               
## 3074      M         D         225     30-06-2016      07-01-2012
## 3075      M         D         230     30-06-2016      07-01-2012
## 3076      M         D         235     31-12-2016      01-01-2013
## 3077      M         R         240     27-03-2016      26-03-2012
## 3078      M         D         243     01-11-2016      01-09-2012
## 3079      M         D         245     01-11-2016      01-09-2012
## 3080      M         D         245     01-11-2016      01-09-2012
## 3081      M         D         245     01-11-2016      01-09-2012
## 3082      M         D         245     01-11-2016      01-09-2012
## 3083      M         D         245     01-11-2016      01-09-2012
## 3084      M         D         245     01-11-2016      01-09-2012
## 3085      M         D         245     01-11-2016      01-09-2012
## 3086      M         D         245     01-11-2016      01-09-2012
## 3087      M         D         245     01-11-2016      01-09-2012
## 3088      M         D         245     01-11-2016      01-09-2012
## 3089      M         D         245     01-11-2016      01-09-2012
## 3090      M         D         245     01-11-2016      01-09-2012
## 3091      M         N         245     01-11-2016      01-09-2012
## 3092      M         D         250     31-12-2014      01-01-2009
## 3093      M         D         250     31-12-2014      01-01-2009
## 3094      M         D         255     31-12-2014      01-01-2011
## 3095      F         D         255     31-12-2014      01-01-2011
## 3096      F         D         255     31-12-2014      01-01-2011
## 3097      M         D         255     31-12-2014      01-01-2011
## 3098      F         R         255     31-12-2014      18-12-2012
## 3099      M         D         255     31-12-2014      01-01-2011
## 3100      M         D         255     31-12-2014      01-01-2011
## 3101      F         D         255     31-12-2014      01-01-2011
## 3102      F         D         255     31-12-2014      01-01-2011
## 3103      M         D         255     31-12-2014      01-01-2011
## 3104      F         N         255     31-12-2014      01-01-2011
## 3105      M         D         255     31-12-2014      01-01-2011
## 3106      M         D         255     31-12-2014      01-01-2011
## 3107      M         D         255                     25-02-2013
## 3108      F         D         255     31-12-2014      01-01-2011
## 3109      M         D         265     31-12-2014      01-01-2009
## 3110      M         N         265     31-12-2014      01-01-2009
## 3111      M         D         265     31-12-2014      01-01-2009
## 3112      M         N         265     31-12-2014      16-11-2012
## 3113      M         D         265     31-12-2014      01-01-2009
## 3114      F         D         265     31-12-2014      01-01-2009
## 3115      M         D         267     31-12-2014      01-01-2009
## 3116      M         D         267     31-12-2014      01-01-2009
## 3117      M         D         267     31-12-2014      01-01-2009
## 3118      M         D         267     31-12-2014      01-01-2009
## 3119      M         D         267     31-12-2014      01-01-2009
## 3120      M         D         267     31-12-2014      01-01-2009
## 3121      M         D         300     31-12-2016      01-01-2013
## 3122      M         D         300     30-06-2015      07-01-2011
## 3123      M         D         300     31-12-2014      01-01-2011
## 3124      M         D         300     31-12-2014      01-01-2011
## 3125      M         D         300     31-12-2016      01-01-2013
## 3126      M         D         300     31-12-2016      01-01-2013
## 3127      M         D         305     31-12-2016      01-01-2013
## 3128      M         D         305     30-06-2015      07-01-2011
## 3129      M         D         305     31-12-2014      01-01-2011
## 3130      M         D         305     31-12-2014      01-01-2011
## 3131      M         D         305     31-12-2016      01-01-2013
## 3132      M         D         305     31-12-2016      01-01-2013
## 3133      M         D         310     31-12-2016      01-01-2013
## 3134      M         D         310     31-12-2016      01-01-2013
## 3135      F         N         310     31-12-2016      01-01-2013
## 3136      M         D         310     31-12-2014      01-01-2011
## 3137      M         D         310     31-12-2014      01-01-2011
## 3138      F         D         310     31-12-2014      01-01-2011
## 3139      M         D         310     31-12-2014      01-01-2011
## 3140      M         N         310     31-12-2014      01-01-2011
## 3141      M         D         310     31-12-2014      01-01-2011
## 3142      M         D         310     31-12-2014      01-01-2011
## 3143      F         D         310     31-12-2014      01-01-2011
## 3144      F         D         310     31-12-2014      01-01-2011
## 3145      M         D         310     31-12-2014      01-01-2011
## 3146      M         R         310     31-12-2016      01-01-2013
## 3147      F         R         310     31-12-2016      01-01-2013
## 3148      M         D         310     31-12-2016      01-01-2013
## 3149      F         D         310     30-06-2015      07-01-2011
## 3150      F         D         310     30-06-2015      07-01-2011
## 3151      M         D         310     30-06-2015      07-01-2011
## 3152      M         D         310     30-06-2015      07-01-2011
## 3153      M         D         310     30-06-2015      07-01-2011
## 3154      M         D         310     31-12-2016      01-01-2013
## 3155      M         D         310     31-12-2016      01-01-2013
## 3156      M         D         310     31-12-2016      01-01-2013
## 3157      M         D         310     31-12-2016      01-01-2013
## 3158      M         D         310     31-12-2016      01-01-2013
## 3159      M         D         310     31-12-2016      01-01-2013
## 3160      M         D          54     29-02-2016      04-03-2012
## 3161                           56                               
## 3162                           56                               
## 3163                           56                               
## 3164      M         D          56     29-02-2016      04-03-2012
## 3165                           56                               
## 3166                           56                               
## 3167                           56                               
## 3168      M         R          64     29-02-2016      04-03-2012
## 3169                           66                               
## 3170                           66                               
## 3171                           66                               
## 3172                           66                               
## 3173                           66                               
## 3174                           66                               
## 3175                           66                               
## 3176      M         D         225     30-06-2016      07-01-2012
## 3177      F         R         230     30-06-2016      07-01-2012
## 3178      M         D         235     31-12-2016      01-01-2013
## 3179                D         240     27-03-2016      26-03-2012
## 3180      M         O         245     01-10-2016      01-09-2012
## 3181      M         O         245     01-10-2016      01-09-2012
## 3182      M         N         245     01-10-2016      01-09-2012
## 3183      M         D         245     01-10-2016      16-11-2012
## 3184      F         D         245     01-10-2016      01-09-2012
## 3185      M         D         245     01-10-2016      01-09-2012
## 3186      M         D         245     01-10-2016      01-09-2012
## 3187      M         D         255     31-12-2014      01-01-2011
## 3188      F         R         255     31-12-2014      01-01-2011
## 3189      F         R         255     31-12-2014      01-01-2011
## 3190      M         D         255     31-12-2014      01-01-2011
## 3191      M         D         255     31-12-2014      01-01-2011
## 3192      M         R         255     31-12-2014      01-01-2011
## 3193      M         D         255     31-12-2014      01-01-2011
## 3194      M         D         265     31-12-2014      01-01-2009
## 3195      M         N         265     31-12-2014      01-01-2009
## 3196      F         D         265     31-12-2014      01-01-2009
## 3197      F         D         265     31-12-2014      04-03-2012
## 3198      F         D         265     31-12-2014      01-01-2009
## 3199      M         D         267     31-12-2014      01-01-2009
## 3200      F         R         267     31-12-2014      01-01-2009
## 3201      M         R         267     31-12-2014      01-01-2009
## 3202      M         R         267     31-12-2014      01-01-2009
## 3203      M         D         267     31-12-2014      01-01-2009
## 3204      M         D         300     31-12-2016      01-01-2013
## 3205      M         R         300     31-12-2016      01-01-2013
## 3206      M         D         300     31-12-2014      01-01-2011
## 3207      M         D         300     31-12-2014      01-01-2011
## 3208      M         D         300     31-12-2014      01-01-2011
## 3209      F         D         300     31-12-2014      01-01-2011
## 3210      M         D         300     31-12-2014      01-01-2011
## 3211      M         D         305     31-12-2016      01-01-2013
## 3212                          305                               
## 3213      M         D         305     31-12-2014      01-01-2011
## 3214      M         D         305     31-12-2014      01-01-2011
## 3215      M         D         305     31-12-2014      01-01-2011
## 3216      M         N         305     31-12-2014      01-01-2011
## 3217      M         N         305     31-12-2014      01-01-2011
## 3218      M         D         308     31-12-2014      01-01-2011
## 3219      M         R         310     31-12-2014      01-01-2011
## 3220      F         R         310     31-12-2014      01-01-2011
## 3221      F         D         310     31-12-2014      01-01-2011
## 3222      M         D         310     31-12-2014      01-01-2011
## 3223      F         R         310     31-12-2016      01-01-2013
## 3224      M         D         310     31-12-2016      01-01-2013
## 3225      F         R         310     31-12-2016      01-01-2013
## 3226      F         N         310     31-12-2016      01-01-2013
## 3227      F         D         310     31-12-2016      01-01-2013
## 3228      F         N         310     31-12-2016      01-01-2013
## 3229      F         D         310     31-12-2016      01-01-2013
## 3230      M         N         310     31-12-2016      01-01-2013
## 3231      M         D         310     31-12-2014      01-01-2011
## 3232      F         D         310     31-12-2014      01-01-2011
## 3233      M         D         310     31-12-2014      01-01-2011
## 3234      M         N         310     31-12-2014      01-01-2011
## 3235      M         D         310     31-12-2014      01-01-2011
## 3236      M         D         310     31-12-2014      01-01-2011
## 3237      M         D         310     31-12-2014      01-01-2011
## 3238      F         D         310     31-12-2014      01-01-2011
## 3239      M         O         310     31-12-2014      01-01-2011
## 3240      F         N         310     31-12-2014      27-08-2012
## 3241      F         D         310     31-12-2014      01-01-2011
## 3242      M         N         310     31-12-2014      01-01-2011
## 3243      M         D          54     29-02-2016      04-03-2012
## 3244      M         D          54     29-02-2016      04-03-2012
## 3245      M         D          54     29-02-2016      04-03-2012
## 3246      M         D          54     29-02-2016      04-03-2012
## 3247      M         D          56     29-02-2016      04-03-2012
## 3248                           56                               
## 3249      M         D          56     29-02-2016      04-03-2012
## 3250      M         D          56     29-02-2016      04-03-2012
## 3251      F         D          56     29-02-2016      04-03-2012
## 3252      F         D          56     29-02-2016      04-03-2012
## 3253      F         D          56     29-02-2016      04-03-2012
## 3254      M         D          56     29-02-2016      04-03-2012
## 3255      M         D          56     29-02-2016      04-03-2012
## 3256      F         D          56     29-02-2016      04-03-2012
## 3257                           56                               
## 3258      M         R          64     29-02-2016      04-03-2012
## 3259      M         R          64     29-02-2016      04-03-2012
## 3260      F         R          64     29-02-2016      04-03-2012
## 3261      F         R          64     29-02-2016      04-03-2012
## 3262      M         R          64     29-02-2016      04-03-2012
## 3263      M         R          64     29-02-2016      04-03-2012
## 3264      M         R          64     29-02-2016      04-03-2012
## 3265      F         R          64     29-02-2016      04-03-2012
## 3266      M         R          64     29-02-2016      04-03-2012
## 3267      M         R          64     29-02-2016      04-03-2012
## 3268      M         R          66     29-02-2016      04-03-2012
## 3269      M         R          66     29-02-2016      04-03-2012
## 3270      M         R          66     29-02-2016      04-03-2012
## 3271      M         R          66     29-02-2016      04-03-2012
## 3272      M         R          66     29-02-2016      04-03-2012
## 3273      F         R          66     29-02-2016      04-03-2012
## 3274      M         R          66     29-02-2016      04-03-2012
## 3275      M         R          66     29-02-2016      04-03-2012
## 3276      M         R          66     29-02-2016      04-03-2012
## 3277      M         R          66     29-02-2016      04-03-2012
## 3278      M         R          66     29-02-2016      04-03-2012
## 3279      M         R          66     29-02-2016      04-03-2012
## 3280      M         R          66     29-02-2016      04-03-2012
## 3281      M         R          66     29-02-2016      04-03-2012
## 3282      M         R          66     29-02-2016      04-03-2012
## 3283      M         R          66     29-02-2016      04-03-2012
## 3284      M         R          66     29-02-2016      04-03-2012
## 3285      M         R          66     29-02-2016      04-03-2012
## 3286      M         R          66     29-02-2016      04-03-2012
## 3287      M         R          66     29-02-2016      04-03-2012
## 3288      M         R          66     29-02-2016      04-03-2012
## 3289      M         R          66     29-02-2016      04-03-2012
## 3290      M         R          66     29-02-2016      04-03-2012
## 3291      M         R          66     29-02-2016      04-03-2012
## 3292      M         R          66     29-02-2016      04-03-2012
## 3293                           66                               
## 3294      F         R         220     31-12-2014      01-01-2009
## 3295      M         R         220     31-12-2014      01-01-2009
## 3296      M         D         220     31-12-2014      01-01-2009
## 3297                          220                               
## 3298      F         R         220     31-12-2014      01-01-2009
## 3299      F         R         220     31-12-2014      01-01-2009
## 3300      F         R         220     31-12-2014      01-01-2009
## 3301      M         R         225     30-06-2016      07-01-2012
## 3302      M         R         230     30-06-2016      07-01-2012
## 3303      M         R         235     31-12-2016      01-06-2013
## 3304      M         R         240     27-03-2016      26-03-2012
## 3305      M         R         243     01-05-2016      01-04-2012
## 3306      M         R         244     01-05-2016      01-04-2012
## 3307      M         R         244     01-05-2016      01-04-2012
## 3308      M         R         245     01-05-2016      01-04-2012
## 3309      M         R         245     01-05-2016      01-04-2012
## 3310      M         D         245     01-05-2016      01-04-2012
## 3311      M         R         245     01-05-2016      01-04-2012
## 3312      F         R         245     01-05-2016      01-04-2012
## 3313      M         D         255     31-12-2014      01-01-2011
## 3314      F         R         255     31-12-2014      01-01-2011
## 3315      M         R         255     31-12-2014      01-01-2011
## 3316      M         R         255     31-12-2014      01-01-2011
## 3317      M         D         255     31-12-2014      01-01-2011
## 3318      M         R         255     31-12-2014      01-01-2011
## 3319      M         R         255     31-12-2014      01-01-2011
## 3320      M         R         255     31-12-2014      01-01-2011
## 3321      F         R         255     31-12-2014      01-01-2011
## 3322      M         D         265     31-12-2014      01-01-2009
## 3323      M         D         265     31-12-2014      01-01-2009
## 3324      M         D         265     31-12-2014      01-01-2009
## 3325      M         N         265     31-12-2014      01-01-2009
## 3326      M         R         265     31-12-2014      01-01-2009
## 3327      M         R         265     31-12-2014      01-01-2009
## 3328      M         D         265     31-12-2014      01-01-2009
## 3329      M         D         265     31-12-2014      01-01-2009
## 3330      M         D         267     31-12-2014      01-01-2009
## 3331      M         D         267     31-12-2014      01-01-2009
## 3332      M         D         267     31-12-2014      01-01-2009
## 3333      M         N         267     31-12-2014      01-01-2009
## 3334      M         R         267     31-12-2014      01-01-2009
## 3335      M         R         267     31-12-2014      01-01-2009
## 3336      M         D         267     31-12-2014      01-01-2009
## 3337      M         D         267     31-12-2014      01-01-2009
## 3338      M         D         300     30-06-2013      07-01-2009
## 3339      M         R         300     31-12-2014      01-01-2011
## 3340      M         R         300     30-06-2014      07-01-2010
## 3341      M         D         300     30-06-2013      07-01-2009
## 3342      M         D         300     30-06-2016      07-01-2012
## 3343      M         D         300     30-06-2015      07-01-2011
## 3344      M         N         305                               
## 3345      M         D         305     30-06-2013      07-01-2009
## 3346      M         R         305     31-12-2014      01-01-2011
## 3347      M         R         305     30-06-2014      07-01-2010
## 3348      M         R         305     30-06-2013      07-01-2009
## 3349      M         R         305                               
## 3350      M         D         305     30-06-2016      07-01-2012
## 3351      F         R         308     30-06-2014      07-01-2010
## 3352      F         R         308     30-06-2014      07-01-2010
## 3353      M         D         310                               
## 3354      M         D         310     30-06-2013      05-11-2010
## 3355      M         D         310                               
## 3356      M         D         310     30-06-2013      07-01-2009
## 3357      F         D         310     30-06-2013      15-02-2010
## 3358      M         D         310     30-06-2013      07-01-2009
## 3359      M         D         310     30-06-2013      15-02-2010
## 3360      M         D         310     30-06-2013      07-01-2009
## 3361      F         D         310                               
## 3362      F         D         310     30-06-2013      15-02-2010
## 3363      M         D         310     30-06-2013      07-01-2009
## 3364      M         N         310     30-06-2013      07-01-2009
## 3365      M         D         310     30-06-2016      07-01-2012
## 3366      M         D         310     30-06-2016      07-01-2012
## 3367      M         R         310     30-06-2016      07-01-2012
## 3368      M         D         310     30-06-2016      07-01-2012
## 3369      F         D         310     30-06-2016      07-01-2012
## 3370      M         D         310     30-06-2013      07-01-2009
## 3371      M         R         310     31-12-2014      01-01-2011
## 3372      M         R         310     31-12-2014      04-03-2012
## 3373      F         R         310     31-12-2014      01-01-2011
## 3374      M         R         310     31-12-2014      01-01-2011
## 3375      F         R         310     31-12-2014      01-01-2011
## 3376      M         D         310     30-06-2014      07-01-2010
## 3377      M         R         310     30-06-2014      07-01-2010
## 3378      M         R         310     30-06-2014      05-01-2012
## 3379      F         R         310     30-06-2014      07-01-2010
## 3380      M         R         310     30-06-2014      07-01-2010
## 3381      M         D         310     30-06-2015      07-01-2011
## 3382      F         D         310     30-06-2015      07-01-2011
## 3383      F         D         310     30-06-2015      07-01-2011
## 3384      M         D         310     30-06-2015      07-01-2011
## 3385      F         D         310     30-06-2015      07-01-2011
## 3386                           54                               
## 3387                           56                               
## 3388                           56                               
## 3389                           56                     02-06-2013
## 3390                           56                               
## 3391                           56                               
## 3392                           56                               
## 3393                           56                               
## 3394                           56                               
## 3395                           56                               
## 3396                           56                               
## 3397                           56                               
## 3398                           56                               
## 3399                           56                               
## 3400                           64                               
## 3401                           66                               
## 3402                           66                               
## 3403                           66                               
## 3404                           66                               
## 3405                           66                               
## 3406                           66                               
## 3407                           66                               
## 3408                           66                               
## 3409                           66                               
## 3410                           66                               
## 3411                           66                               
## 3412                           66                               
## 3413                           66                               
## 3414      M         D         225     30-06-2016      07-01-2012
## 3415      M         D         230     30-06-2016      07-01-2012
## 3416      M         D         235     31-12-2016      01-01-2013
## 3417      M         N         240     27-03-2016      26-03-2012
## 3418      M         D         245     01-10-2016      01-09-2012
## 3419      M         R         245     01-10-2016      01-09-2012
## 3420      M         N         245     01-10-2016      01-09-2012
## 3421      M         D         245     01-10-2016      01-09-2012
## 3422      M         R         245     01-10-2016      01-09-2012
## 3423      M         D         245     01-10-2016      01-09-2012
## 3424      M         D         245     01-10-2016      01-09-2012
## 3425      M         N         245     01-10-2016      01-09-2012
## 3426      M         D         245     01-10-2016      01-09-2012
## 3427      M         R         245     01-10-2016      01-09-2012
## 3428      M         D         245     01-10-2016      01-09-2012
## 3429      M         R         245     01-10-2016      01-09-2012
## 3430      M         D         245     01-10-2016      01-09-2012
## 3431      M         N         250     31-12-2014      15-10-2008
## 3432      M         D         250     31-12-2014      01-01-2009
## 3433      M         N         255     31-12-2014      01-01-2011
## 3434      M         D         255     31-12-2014      01-01-2011
## 3435      M         D         255     31-12-2014      01-01-2011
## 3436      M         N         255     31-12-2014      01-01-2011
## 3437      M         D         255     31-12-2014      01-01-2011
## 3438      M         D         255     31-12-2014      01-01-2011
## 3439      M         N         255     31-12-2014      01-01-2011
## 3440      M         R         255     31-12-2014      01-01-2011
## 3441      M         D         255     31-12-2014      01-01-2011
## 3442      M         N         255     31-12-2014      01-01-2011
## 3443      M         D         255     31-12-2014      01-01-2011
## 3444      M         N         255     31-12-2014      01-01-2011
## 3445      M         R         255     31-12-2014      01-01-2011
## 3446      F         D         265     31-12-2014      01-01-2009
## 3447      F         D         265     31-12-2014      01-01-2009
## 3448      F         D         265     31-12-2014      01-01-2009
## 3449      M         O         265     31-12-2014      01-01-2009
## 3450      F         R         265     31-12-2014      01-01-2009
## 3451      M         D         265     31-12-2014      01-01-2009
## 3452      M         R         267     31-12-2014      01-01-2009
## 3453      M         D         267     31-12-2014      01-01-2009
## 3454                          267                               
## 3455      F         D         267     31-12-2014      01-01-2009
## 3456      M         D         267     31-12-2014      01-01-2009
## 3457      M         D         267     31-12-2014      01-01-2009
## 3458      M         D         300     30-06-2013      07-01-2009
## 3459      F         D         300     31-12-2014      01-01-2011
## 3460      M         D         300     31-12-2014      01-01-2011
## 3461      F         D         300     31-12-2016      01-01-2013
## 3462      M         D         300     31-12-2016      01-01-2013
## 3463      M         D         305     31-12-2014      01-01-2011
## 3464      F         D         305     31-12-2014      01-01-2011
## 3465      M         D         305     31-12-2016      01-01-2013
## 3466      M         N         305     31-12-2016      01-01-2013
## 3467      M         D         310     31-12-2016      01-01-2013
## 3468      M         D         310     31-12-2016      01-01-2013
## 3469      M         N         310     31-12-2016      01-01-2013
## 3470      F         D         310     31-12-2016      01-01-2013
## 3471      M         R         310     31-12-2016      01-01-2013
## 3472      M         D         310     31-12-2016      01-01-2013
## 3473      F         D         310     31-12-2016      01-01-2013
## 3474      M         D         310     31-12-2016      01-01-2013
## 3475      M         N         310     31-12-2014      01-01-2011
## 3476      F         N         310     31-12-2014      01-01-2011
## 3477      F         D         310     31-12-2014      01-01-2011
## 3478      M         D         310     31-12-2014      01-01-2011
## 3479      F         D         310     31-12-2014      01-01-2011
## 3480      F         D         310     31-12-2014      01-01-2011
## 3481      F         D         310     31-12-2014      01-01-2011
## 3482      M         D         310     31-12-2014      01-01-2011
## 3483      M         D         310     31-12-2014      01-01-2011
## 3484      M         R         310     31-12-2014      01-01-2011
## 3485      M         D         310     30-06-2013      07-01-2009
## 3486      M         R         310     30-06-2013      07-01-2009
## 3487      M         N         310     30-06-2013      07-01-2009
## 3488      M         D         310     30-06-2013      07-01-2009
## 3489      M         R         310     30-06-2013      07-01-2009
## 3490      F         D          54     29-02-2016      04-03-2012
## 3491      M         D          54     29-02-2016      04-03-2012
## 3492      M         D          54     29-02-2016      04-03-2012
## 3493      M         D          54     29-02-2016      04-03-2012
## 3494      M         D          54     29-02-2016      04-03-2012
## 3495      M         D          56     29-02-2016      04-03-2012
## 3496      F         D          56     29-02-2016      04-03-2012
## 3497      M         D          56     29-02-2016      04-03-2012
## 3498      M         D          56     29-02-2016      04-03-2012
## 3499      F         D          56     29-02-2016      04-03-2012
## 3500      M         D          56     29-02-2016      04-03-2012
## 3501      M         D          56     29-02-2016      04-03-2012
## 3502      M         D          56     29-02-2016      04-03-2012
## 3503      F         D          56     29-02-2016      04-03-2012
## 3504      M         R          64     29-02-2016      04-03-2012
## 3505      M         R          64     29-02-2016      04-03-2012
## 3506      M         R          64     29-02-2016      04-03-2012
## 3507      M         R          64     29-02-2016      04-03-2012
## 3508      M         R          64     29-02-2016      04-03-2012
## 3509      M         R          66     29-02-2016      04-03-2012
## 3510      M         R          66     29-02-2016      04-03-2012
## 3511                           66                     10-11-2012
## 3512      F         R          66     29-02-2016      04-03-2012
## 3513      M         R          66     29-02-2016      04-03-2012
## 3514      F         R          66     29-02-2016      04-03-2012
## 3515      M         R          66     29-02-2016      04-03-2012
## 3516      M         R          66     29-02-2016      04-03-2012
## 3517      M         R          66     29-02-2016      04-03-2012
## 3518      M         D         225     30-06-2016      07-01-2012
## 3519      M         R         230     30-06-2016      07-01-2012
## 3520      M         R         235     31-12-2016      01-01-2013
## 3521      M         R         243     01-04-2016      01-02-2012
## 3522      M         D         245     01-04-2016      01-02-2012
## 3523      M         D         245     01-04-2016      01-02-2012
## 3524      M         D         245     01-04-2016      01-02-2012
## 3525      M         D         245     01-04-2016      01-02-2012
## 3526      M         R         245     01-04-2016      01-02-2012
## 3527      M         R         245     01-04-2016      01-02-2012
## 3528      M         R         245     01-04-2016      01-02-2012
## 3529      M         R         245     01-04-2016      01-02-2012
## 3530      M         R         245     01-04-2016      01-02-2012
## 3531      F         N         250     31-12-2014      01-01-2009
## 3532      M         D         250     31-12-2014      01-01-2009
## 3533      M         D         250     31-12-2014      01-01-2009
## 3534      M         D         255     31-12-2014      01-01-2011
## 3535      M         D         255     31-12-2014      01-01-2011
## 3536      M         D         255     31-12-2014      01-01-2011
## 3537      M         D         255     31-12-2014      01-01-2011
## 3538      M         R         255     31-12-2014      01-01-2011
## 3539      M         R         255     31-12-2014      01-01-2011
## 3540      M         R         255     31-12-2014      01-01-2011
## 3541      M         N         255     31-12-2014      01-01-2011
## 3542      F         D         255     31-12-2014      01-01-2011
## 3543      M         D         265     31-12-2014      01-01-2009
## 3544      M         D         265     31-12-2014      01-01-2009
## 3545      M         O         265     31-12-2014      01-01-2009
## 3546      F         D         265     31-12-2014      01-01-2009
## 3547      M         D         265     31-12-2014      01-01-2009
## 3548      M         D         265     31-12-2014      04-12-2011
## 3549      M         D         265     31-12-2014      01-01-2009
## 3550      M         R         265     31-12-2014      01-01-2009
## 3551      F         R         265     31-12-2014      28-07-2008
## 3552      F         D         267     31-12-2014      01-01-2009
## 3553      M         D         267     31-12-2014      01-01-2009
## 3554      M         R         267     31-12-2014      01-01-2009
## 3555      F         D         267     31-12-2014      01-01-2009
## 3556      M         D         267     31-12-2014      01-01-2009
## 3557      M         D         267     31-12-2014      01-01-2009
## 3558      M         R         267     31-12-2014      01-01-2009
## 3559      M         D         267     31-12-2014      01-01-2009
## 3560      M         D         267     31-12-2014      01-01-2009
## 3561      M         N         300     31-12-2014      01-01-2011
## 3562      M         D         300     31-12-2014      01-01-2011
## 3563      M         R         300     31-12-2014      01-01-2011
## 3564      M         D         305     31-12-2014      01-01-2011
## 3565      M         D         305     31-12-2014      01-01-2011
## 3566      M         R         305     31-12-2014      01-01-2011
## 3567      M         N         308     31-12-2014      01-01-2011
## 3568      M         D         310     31-12-2014      01-01-2011
## 3569      M         D         310     31-12-2014      01-01-2011
## 3570      F         R         310     31-12-2014      01-01-2011
## 3571      M         D         310     31-12-2014      01-01-2011
## 3572      M         D         310     31-12-2014      01-01-2011
## 3573      M         D         310     31-12-2014      01-01-2011
## 3574      M         D         310     31-12-2014      01-01-2011
## 3575      M         R         310     31-12-2014      01-01-2011
## 3576      M         R         310     31-12-2014      01-01-2011
## 3577      M         R         310     31-12-2014      01-01-2011
## 3578      F         R         310     31-12-2014      01-01-2011
## 3579      M         R         310     31-12-2014      01-01-2011
## 3580      M         R         310     31-12-2014      01-01-2011
## 3581      F         R         310     31-12-2014      01-01-2011
## 3582      M         D          54     29-02-2016      04-03-2012
## 3583      M         D          54     29-02-2016      04-03-2012
## 3584                           54                     29-03-2012
## 3585                           54                     29-03-2012
## 3586      M         D          54     29-02-2016      04-03-2012
## 3587      M         D          56     29-02-2016      04-03-2012
## 3588                           56                     29-03-2012
## 3589                           56                     29-03-2012
## 3590      F         D          56     29-02-2016      04-03-2012
## 3591                           56                               
## 3592      F         D          56     29-02-2016      04-03-2012
## 3593                           56                               
## 3594      M         D          56     29-02-2016      04-03-2012
## 3595                           56                     27-04-2012
## 3596      F         R          64     29-02-2016      04-03-2012
## 3597                           66                               
## 3598                           66                               
## 3599                           66                               
## 3600                           66                               
## 3601                           66                               
## 3602                           66                               
## 3603                           66                               
## 3604                           66                               
## 3605      M         R          66     29-02-2016      04-03-2012
## 3606      M         R         225     30-06-2016      07-01-2012
## 3607      M         D         230     30-06-2016      07-01-2012
## 3608      M         D         235     31-12-2016      01-01-2013
## 3609      M         N         240     27-03-2016      26-03-2012
## 3610      F         R         243     01-01-2016      01-01-2012
## 3611      M         D         245     01-01-2016      01-01-2012
## 3612      M         D         245     01-01-2016      01-01-2012
## 3613      M         N         245     01-01-2016      01-01-2012
## 3614      M         R         245     01-01-2016      01-01-2012
## 3615      M         R         245     01-01-2016      01-01-2012
## 3616      M         D         245     01-01-2016      01-01-2012
## 3617      M         D         245     01-01-2016      01-01-2012
## 3618      M         N         245     01-01-2016      01-01-2012
## 3619      M         D         245     01-01-2016      01-01-2012
## 3620      M         R         250     31-12-2014      01-01-2009
## 3621      M         D         250     31-12-2014      01-01-2009
## 3622      M         D         255     31-12-2014      01-01-2011
## 3623      F         D         255     31-12-2014      01-01-2011
## 3624      M         D         255     31-12-2014      01-01-2011
## 3625      F         R         255     31-12-2014      01-01-2011
## 3626      F         D         255     31-12-2014      01-01-2011
## 3627      M         R         255     31-12-2014      01-01-2011
## 3628      M         D         255     31-12-2014      01-01-2011
## 3629      M         D         255     31-12-2014      01-01-2011
## 3630      F         D         255     31-12-2014      01-01-2011
## 3631      M         D         255     31-12-2014      01-01-2011
## 3632      M         D         255     31-12-2014      01-01-2011
## 3633      F         D         255     31-12-2014      01-01-2011
## 3634      M         D         255     31-12-2014      01-01-2011
## 3635      M         D         255     31-12-2014      01-01-2011
## 3636      M         D         255     31-12-2014      01-01-2011
## 3637      M         D         260     31-12-2018      01-01-2013
## 3638      M         D         260     31-12-2018      01-01-2013
## 3639      M         R         260     31-12-2018      01-01-2013
## 3640      M         R         260     31-12-2018      01-01-2013
## 3641      M         R         260     31-12-2018      01-01-2013
## 3642      M         D         260     31-12-2018      01-01-2013
## 3643      M         R         260     31-12-2018      01-01-2013
## 3644      M         R         260     31-12-2018      01-01-2013
## 3645      M         D         260     31-12-2018      01-01-2013
## 3646      M         D         265     31-12-2014      01-01-2009
## 3647      F         D         265     31-12-2014      01-01-2009
## 3648      M         D         265     31-12-2014      01-01-2009
## 3649      F         D         265     31-12-2014      01-01-2009
## 3650      M         D         267     31-12-2014      01-01-2009
## 3651      M         D         267     31-12-2014      01-01-2009
## 3652      M         D         267     31-12-2014      01-01-2009
## 3653      M         D         267     31-12-2014      01-01-2009
## 3654      M         N         300     12-07-2014      13-12-2010
## 3655      M         D         300     31-12-2016      01-01-2013
## 3656      M         R         300     31-12-2016      01-01-2013
## 3657      M         D         305     31-12-2016      01-01-2013
## 3658      M         D         305     31-12-2016      01-01-2013
## 3659      M         R         308     12-07-2014      13-12-2010
## 3660      M         D         308     12-07-2014      13-12-2010
## 3661      M         D         310     31-12-2016      01-01-2013
## 3662      F         R         310     31-12-2016      01-01-2013
## 3663      M         R         310     31-12-2016      01-01-2013
## 3664      M         R         310     31-12-2016      01-01-2013
## 3665      M         D         310     31-12-2016      01-01-2013
## 3666      M         D         310     12-07-2014      13-12-2010
## 3667      M         R         310     12-07-2014      13-12-2010
## 3668      F         D         310     12-07-2014      13-12-2010
## 3669      M         D         310     31-12-2016      01-01-2013
## 3670      M         D         310     31-12-2016      01-01-2013
## 3671      M         N         310     31-12-2016      01-01-2013
## 3672      F         N         310     31-12-2016      01-01-2013
## 3673      M         R         310     31-12-2016      01-01-2013
## 3674      F         D          54     29-02-2016      04-03-2012
## 3675      M         D          54     29-02-2016      04-03-2012
## 3676                           56                               
## 3677                           56                               
## 3678                           56                               
## 3679                           56                               
## 3680                           56                               
## 3681                           56                               
## 3682                           56                               
## 3683                           56                               
## 3684                           56                               
## 3685                           56                               
## 3686      M         R          64     29-02-2016      04-03-2012
## 3687      F         R          64     29-02-2016      04-03-2012
## 3688      F         R          64     29-02-2016      04-03-2012
## 3689      M         R          64     29-02-2016      04-03-2012
## 3690                           66                               
## 3691                           66                               
## 3692      M         R          66     29-02-2016      04-03-2012
## 3693                           66                               
## 3694      F         R          66     29-02-2016      04-03-2012
## 3695      F         R          66     29-02-2016      04-03-2012
## 3696                           66                               
## 3697                           66                               
## 3698      F         R          66     29-02-2016      04-03-2012
## 3699                           66                               
## 3700      M         N         225     30-06-2016      07-01-2012
## 3701      M         D         230     30-06-2016      07-01-2012
## 3702      M         R         235     31-12-2016      01-01-2013
## 3703      M         R         240     27-03-2016      26-03-2012
## 3704      M         D         245     01-10-2016      01-09-2012
## 3705      M         D         245     01-10-2016      01-09-2012
## 3706      M         R         245     01-10-2016      01-09-2012
## 3707      M         D         245     01-10-2016      01-09-2012
## 3708      M         R         245     01-10-2016      01-09-2012
## 3709      M         D         245     01-10-2016      01-09-2012
## 3710      M         D         245     01-10-2016      01-09-2012
## 3711      M         D         245     01-10-2016      01-09-2012
## 3712      M         D         245     01-10-2016      01-09-2012
## 3713      M         D         245     01-10-2016      01-09-2012
## 3714      F         R         255     31-12-2014      01-01-2011
## 3715      M         N         255     31-12-2014      01-01-2011
## 3716      F         N         255     31-12-2014      01-01-2011
## 3717      F         R         255     31-12-2014      01-01-2011
## 3718      F         R         255     31-12-2014      01-01-2011
## 3719      M         D         255     31-12-2014      01-01-2011
## 3720      M         N         255     31-12-2014      01-01-2011
## 3721      M         R         255     31-12-2014      01-01-2011
## 3722      M         R         255     31-12-2014      01-01-2011
## 3723      M         D         255     31-12-2014      01-01-2011
## 3724      F         R         265     31-12-2014      16-09-2011
## 3725      F         N         265     31-12-2014      01-01-2009
## 3726      M         N         265     31-12-2014      01-01-2009
## 3727      M         R         265     31-12-2014      01-01-2009
## 3728      M         D         265     31-12-2014      01-01-2009
## 3729      M         R         267     31-12-2014      01-01-2009
## 3730      M         N         267     01-10-2016      16-11-2012
## 3731      M         D         267     31-12-2014      01-01-2009
## 3732      M         N         267     01-10-2016      16-11-2012
## 3733      M         D         267     31-12-2014      01-01-2009
## 3734      M         R         300     31-12-2014      01-01-2011
## 3735      M         R         300     31-12-2014      01-01-2011
## 3736      M         N         300     31-12-2014      01-01-2011
## 3737      F         D         300     31-12-2014      01-01-2011
## 3738      M         R         305     31-12-2014      01-01-2011
## 3739      M         R         305     31-12-2014      27-08-2012
## 3740      M         R         305     31-12-2014      01-01-2011
## 3741      M         D         305     31-12-2014      01-01-2011
## 3742      M         R         310     31-12-2014      01-01-2011
## 3743      F         D         310     31-12-2014      01-01-2011
## 3744      M         R         310     31-12-2014      01-01-2011
## 3745      M         R         310     31-12-2014      26-09-2011
## 3746      F         N         310     31-12-2014      16-09-2011
## 3747      M         N         310     31-12-2014      01-01-2011
## 3748      M         N         310     31-12-2014      16-11-2012
## 3749                          310                     12-03-2012
## 3750      M         N         310     31-12-2014      01-01-2011
## 3751      F         D         310     31-12-2014      01-01-2011
## 3752      F         N         310     31-12-2014      01-01-2011
## 3753      M         D         310     31-12-2014      01-01-2011
## 3754      M         R         310     31-12-2014      01-01-2011
## 3755      M         N         310     31-12-2014      01-01-2011
## 3756      F         D         310     31-12-2014      01-01-2011
## 3757      M         R         310     31-12-2014      01-01-2011
## 3758      M         R         310     31-12-2014      01-01-2011
## 3759      M         R         310     31-12-2014      01-01-2011
## 3760      M         R         310     31-12-2014      01-01-2011
## 3761      M         R         310     31-12-2014      01-01-2011
## 3762                           54                               
## 3763      M         D          56     29-02-2016      04-03-2012
## 3764      F         D          56     29-02-2016      04-03-2012
## 3765      F         D          56     29-02-2016      04-03-2012
## 3766                           56                               
## 3767                           56                               
## 3768                           56                               
## 3769                           56                               
## 3770                           56                               
## 3771                           56                               
## 3772                           56                               
## 3773                           56                               
## 3774                           56                               
## 3775      M         R          64     29-02-2016      04-03-2012
## 3776      F         R          64     29-02-2016      04-03-2012
## 3777      M         R          64     29-02-2016      04-03-2012
## 3778      M         R          64     29-02-2016      04-03-2012
## 3779      F         R          64     29-02-2016      04-03-2012
## 3780                           66                               
## 3781                           66                               
## 3782                           66                               
## 3783      F         R          66     29-02-2016      04-03-2012
## 3784                           66                               
## 3785                           66                               
## 3786                           66                               
## 3787                           66                               
## 3788                           66                               
## 3789                           66                               
## 3790                           66                               
## 3791      F         R          66     29-02-2016      04-03-2012
## 3792      M         D         225     30-06-2016      07-01-2012
## 3793      F         D         230     30-06-2016      07-01-2012
## 3794      F         R         235     31-12-2016      01-01-2013
## 3795      M         N         240     27-03-2016      26-03-2012
## 3796      F         D         245     01-10-2016      01-09-2012
## 3797      F         D         245     01-10-2016      01-09-2012
## 3798      M         D         245     01-10-2016      01-09-2012
## 3799      M         R         245     01-10-2016      01-09-2012
## 3800      M         R         245     01-10-2016      01-09-2012
## 3801      M         R         245     01-10-2016      01-09-2012
## 3802      M         R         245     01-10-2016      01-09-2012
## 3803      M         R         245     01-10-2016      01-09-2012
## 3804      M         N         245     01-10-2016      01-09-2012
## 3805      F         D         245     01-10-2016      01-09-2012
## 3806      F         D         245     01-10-2016      01-09-2012
## 3807      M         R         245     01-10-2016      01-09-2012
## 3808      M         D         250     31-12-2014      01-01-2009
## 3809      M         D         250     31-12-2014      01-01-2009
## 3810      F         D         255     31-12-2014      01-01-2011
## 3811      M         D         255     31-12-2014      01-01-2011
## 3812      M         R         255     31-12-2014      01-01-2011
## 3813      M         R         255     31-12-2014      01-01-2011
## 3814      M         R         255     31-12-2014      01-01-2011
## 3815      M         R         255     31-12-2014      01-01-2011
## 3816      M         R         255     31-12-2014      01-01-2011
## 3817      F         R         255     31-12-2014      01-01-2011
## 3818      F         N         255     31-12-2014      01-01-2011
## 3819      M         D         255     31-12-2014      01-01-2011
## 3820      M         D         255     31-12-2014      27-08-2012
## 3821      F         D         255     31-12-2014      01-01-2011
## 3822      M         D         265     31-12-2014      01-01-2009
## 3823      M         R         265     31-12-2014      01-01-2009
## 3824      F         R         265     31-12-2014      01-01-2009
## 3825      M         D         265     31-12-2014      01-01-2009
## 3826      M         N         267     31-12-2014      01-01-2009
## 3827      M         D         267     31-12-2014      01-01-2009
## 3828      M         R         267     31-12-2014      01-01-2009
## 3829      M         R         267     31-12-2014      01-01-2009
## 3830      M         D         300     31-12-2014      01-01-2011
## 3831      M         N         300     31-12-2014      01-01-2011
## 3832      M         N         300     31-12-2014      27-08-2012
## 3833      M         R         300     01-11-2016      01-09-2012
## 3834      M         R         300     31-12-2014      01-01-2011
## 3835      M         R         300     31-12-2014      01-01-2011
## 3836      M         N         305     31-12-2014      01-01-2011
## 3837      M         R         305     31-12-2014      01-01-2011
## 3838      M         D         305     31-12-2014      01-01-2011
## 3839      M         D         310     31-12-2014      01-01-2011
## 3840      M         N         310     31-12-2014      01-01-2011
## 3841      M         R         310     31-12-2014      25-02-2013
## 3842      F         N         310     31-12-2014      01-01-2011
## 3843      M         D         310     31-12-2014      01-01-2011
## 3844      F         N         310     31-12-2014      01-01-2011
## 3845      F         D         310     31-12-2014      01-01-2011
## 3846      M         D         310     31-12-2014      01-01-2011
## 3847      M         R         310     31-12-2014      01-01-2011
## 3848      M         D         310     31-12-2014      01-01-2011
## 3849      F         D         310     31-12-2014      01-01-2011
## 3850      M         D         310     31-12-2014      01-01-2011
## 3851      F         D         310     31-12-2014      01-01-2011
## 3852      F         D         310     31-12-2014      01-01-2011
## 3853      M         D         310     31-12-2014      01-01-2011
## 3854      M         D         310     31-12-2014      01-01-2011
## 3855      F         R         310     31-12-2014      01-01-2011
## 3856      F         R         310     31-12-2014      16-09-2011
## 3857      M         R         310     31-12-2014      27-08-2012
## 3858      M         D         310     31-12-2014      01-01-2011
## 3859      F         D         310     31-12-2014      01-01-2011
## 3860      M         N         310     01-11-2016      01-09-2012
## 3861      F         R         310     01-11-2016      01-09-2012
## 3862      M         R         310     01-11-2016      01-09-2012
## 3863      M         D          54     29-02-2016      04-03-2012
## 3864      F         D          54     29-02-2016      04-03-2012
## 3865      M         D          56     29-02-2016      04-03-2012
## 3866      M         D          56     29-02-2016      04-03-2012
## 3867                           56                               
## 3868      M         D          56     29-02-2016      04-03-2012
## 3869                           56                               
## 3870                           56                               
## 3871                           56                               
## 3872      M         D          56     29-02-2016      04-03-2012
## 3873      F         D          56     29-02-2016      04-03-2012
## 3874      M         R          64     29-02-2016      04-03-2012
## 3875      F         R          64     29-02-2016      04-03-2012
## 3876      M         R          64     29-02-2016      04-03-2012
## 3877      M         R          64     29-02-2016      04-03-2012
## 3878      M         R          64     29-02-2016      04-03-2012
## 3879      M         R          66     29-02-2016      04-03-2012
## 3880      M         R          66     29-02-2016      04-03-2012
## 3881      F         R          66     29-02-2016      04-03-2012
## 3882      M         R          66     29-02-2016      04-03-2012
## 3883      M         R          66     29-02-2016      04-03-2012
## 3884      M         R          66     29-02-2016      04-03-2012
## 3885      F         R          66     29-02-2016      04-03-2012
## 3886      M         R          66     29-02-2016      04-03-2012
## 3887      M         R          66     29-02-2016      04-03-2012
## 3888      M         R         225     30-06-2016      07-01-2012
## 3889      M         R         230     30-06-2016      07-01-2012
## 3890      M         R         235     31-12-2016      01-01-2013
## 3891      M         R         240     27-03-2016      26-03-2012
## 3892      M         R         243     01-11-2016      01-09-2012
## 3893      M         R         245     01-11-2016      01-09-2012
## 3894      M         R         245     01-11-2016      01-09-2012
## 3895      F         R         245     01-11-2016      01-09-2012
## 3896      M         R         245     01-11-2016      01-09-2012
## 3897      F         R         245     01-11-2016      01-09-2012
## 3898      F         R         245     01-11-2016      01-09-2012
## 3899      M         R         245     01-11-2016      01-09-2012
## 3900      M         D         245     01-11-2016      01-09-2012
## 3901      M         D         245     01-11-2016      01-09-2012
## 3902      M         D         250     31-12-2014      01-01-2009
## 3903      M         R         250     31-12-2014      01-01-2009
## 3904      M         D         255     31-12-2014      01-01-2011
## 3905      F         R         255     31-12-2014      01-01-2011
## 3906      M         R         255     31-12-2014      01-01-2011
## 3907      F         R         255     31-12-2014      01-01-2011
## 3908      M         D         255     31-12-2014      01-01-2011
## 3909      M         D         255     31-12-2014      01-01-2011
## 3910      M         R         255     31-12-2014      01-01-2011
## 3911      M         D         255     31-12-2014      01-01-2011
## 3912      M         D         255     31-12-2014      01-01-2011
## 3913      M         R         265     31-12-2014      01-01-2009
## 3914      F         D         265     31-12-2014      01-01-2009
## 3915      M         D         265     31-12-2014      01-01-2009
## 3916      F         D         265     31-12-2014      01-01-2009
## 3917      F         D         265     31-12-2014      01-01-2009
## 3918      F         D         265     31-12-2014      01-01-2009
## 3919      M         D         265     31-12-2014      01-01-2009
## 3920      F         D         265     31-12-2014      01-01-2009
## 3921      F         D         265     31-12-2014      01-01-2009
## 3922      F         R         265     31-12-2014      01-01-2009
## 3923      M         D         267     31-12-2014      01-01-2009
## 3924      M         D         267     31-12-2014      01-01-2009
## 3925      M         D         267     31-12-2014      01-01-2009
## 3926      M         D         267     31-12-2014      01-01-2009
## 3927      M         D         267     31-12-2014      01-01-2009
## 3928      M         R         267     31-12-2014      01-01-2009
## 3929      M         D         267     31-12-2014      01-01-2009
## 3930      M         R         267     31-12-2014      01-01-2009
## 3931      M         D         267     31-12-2014      01-01-2009
## 3932      M         R         267     31-12-2014      01-01-2009
## 3933      M         D         300     31-12-2014      01-01-2011
## 3934      M         R         300     31-12-2016      01-01-2013
## 3935      M         D         300     31-12-2014      01-01-2011
## 3936      M         R         300     30-06-2013      07-01-2009
## 3937      M         R         300     31-12-2016      01-01-2013
## 3938      M         D         300                               
## 3939      M         D         300     30-06-2013      07-01-2009
## 3940      F         R         300     31-12-2016      01-01-2013
## 3941      M         D         300     31-12-2016      01-01-2013
## 3942      M         D         305     31-12-2016      01-01-2013
## 3943      M         D         305     31-12-2014      01-01-2011
## 3944      M         D         305     31-12-2016      01-01-2013
## 3945      M         D         305     31-12-2016      01-01-2013
## 3946      M         R         310     31-12-2016      01-01-2013
## 3947      M         R         310     31-12-2016      01-01-2013
## 3948      M         R         310                               
## 3949      M         R         310     31-12-2016      01-01-2013
## 3950      F         R         310     31-12-2016      01-01-2013
## 3951      M         R         310     31-12-2016      01-01-2013
## 3952      M         D         310     30-06-2013      07-01-2009
## 3953      M         N         310                               
## 3954      M         N         310     30-06-2013      07-01-2009
## 3955      M         R         310                               
## 3956      M         R         310     30-06-2013      16-09-2011
## 3957      M         N         310     30-06-2013      07-01-2009
## 3958      M         O         310                               
## 3959      M         R         310     30-06-2013      07-01-2009
## 3960      M         R         310                               
## 3961      M         N         310                               
## 3962      M         N         310     31-12-2016      01-01-2013
## 3963      M         R         310     31-12-2016      01-01-2013
## 3964      M         D         310     31-12-2016      01-01-2013
## 3965      M         D         310     31-12-2016      01-01-2013
## 3966      M         R         310     31-12-2016      01-01-2013
## 3967      M         D         310     30-06-2013      07-01-2009
## 3968      F         D         310     30-06-2013      07-01-2009
## 3969      F         D         310     30-06-2013      07-01-2009
## 3970      F         D         310     30-06-2013      07-01-2009
## 3971      M         D         310     30-06-2013      07-01-2009
## 3972      F         R         310     31-12-2016      01-01-2013
## 3973      F         R         310     31-12-2016      01-01-2013
## 3974      M         N         310     31-12-2016      01-01-2013
## 3975      M         D         310     31-12-2016      01-01-2013
## 3976      M         R         310     31-12-2016      01-01-2013
## 3977      M         R         310     31-12-2016      01-01-2013
## 3978      M         R         310     31-12-2014      01-01-2011
## 3979      F         R         310     31-12-2014      01-01-2011
## 3980      F         R         310     31-12-2014      01-01-2011
## 3981      M         D         310     31-12-2014      01-01-2011
## 3982      M         N         310     31-12-2014      01-01-2011
## 3983      M         R         310     31-12-2014      01-01-2011
## 3984      M         D         310     31-12-2014      01-01-2011
## 3985      M         D         310     31-12-2014      01-01-2011
## 3986                           54                     18-10-2012
## 3987                           54                     18-10-2012
## 3988                           54                     18-10-2012
## 3989                           54                     18-10-2012
## 3990                           56                               
## 3991                           56                     18-10-2012
## 3992                           56                     18-10-2012
## 3993                           56                     18-10-2012
## 3994                           56                     18-10-2012
## 3995      M         R          64     29-02-2016      04-03-2012
## 3996                           66                               
## 3997                           66                               
## 3998                           66                               
## 3999                           66                               
## 4000                           66                               
## 4001      M         D         225     30-06-2016      07-01-2012
## 4002      F         D         230     30-06-2016      07-01-2012
## 4003      M         D         235     31-12-2016      01-01-2013
## 4004      M         N         240     27-03-2016      26-03-2012
## 4005      M         R         245     01-10-2016      01-09-2012
## 4006      M         N         245     01-10-2016      01-09-2012
## 4007      F         D         245     01-10-2016      01-09-2012
## 4008      M         N         245     01-10-2016      01-09-2012
## 4009      F         D         245     01-10-2016      01-09-2012
## 4010      F         R         255     31-12-2014      16-11-2012
## 4011      M         R         255     31-12-2014      01-01-2011
## 4012      M         D         255     31-12-2014      01-01-2011
## 4013      F         N         255     31-12-2014      01-01-2011
## 4014      F         N         255     31-12-2014      01-01-2011
## 4015      M         D         255     31-12-2014      01-01-2011
## 4016      F         D         255     31-12-2014      01-01-2011
## 4017      F         R         255     31-12-2014      01-01-2011
## 4018      F         R         265     31-12-2014      01-01-2009
## 4019      F         N         265     31-12-2014      27-08-2012
## 4020      M         D         265     31-12-2014      19-12-2011
## 4021      F         N         265     31-12-2014      03-04-2013
## 4022      M         D         267     31-12-2014      01-01-2009
## 4023      M         R         267     31-12-2014      01-01-2009
## 4024      M         D         267     31-12-2014      01-01-2009
## 4025      M         R         267     31-12-2014      01-01-2009
## 4026      M         N         300     30-06-2014      07-01-2010
## 4027      M         N         300     31-12-2016      01-01-2013
## 4028      F         R         300     31-12-2014      01-01-2011
## 4029      M         R         300     31-12-2014      01-01-2011
## 4030      M         D         305     30-06-2014      07-01-2010
## 4031      M         D         305     31-12-2014      01-01-2011
## 4032      M         N         305     31-12-2014      01-01-2011
## 4033      M         N         310     31-12-2016      01-01-2013
## 4034      F         O         310     31-12-2016      01-01-2013
## 4035      M         O         310     31-12-2016      01-01-2013
## 4036      F         R         310     31-12-2014      01-01-2011
## 4037      M         R         310     31-12-2014      01-01-2011
## 4038      M         R         310     31-12-2014      01-01-2011
## 4039      F         R         310     31-12-2014      01-01-2011
## 4040      M         N         310     31-12-2014      01-01-2011
## 4041      M         D         310     31-12-2014      01-01-2011
## 4042      M         D         310     30-06-2014      07-01-2010
## 4043      F         D         310     30-06-2014      07-01-2010
## 4044      M         D         310     30-06-2014      07-01-2010
## 4045      F         D         310     30-06-2014      07-01-2010
## 4046      F         N         310     30-06-2014      07-01-2010
## 4047      M         D          54     29-02-2016      04-03-2012
## 4048      F         D          54     29-02-2016      04-03-2012
## 4049      M         D          54     29-02-2016      04-03-2012
## 4050      M         D          54     29-02-2016      04-03-2012
## 4051      F         D          54     29-02-2016      04-03-2012
## 4052                           56                               
## 4053      M         D          56     29-02-2016      04-03-2012
## 4054                           56                               
## 4055      M         D          56     29-02-2016      04-03-2012
## 4056      M         D          56     29-02-2016      04-03-2012
## 4057      M         D          56     29-02-2016      04-03-2012
## 4058      M         D          56     29-02-2016      04-03-2012
## 4059      M         R          64     29-02-2016      04-03-2012
## 4060                           66                               
## 4061                           66                               
## 4062                           66                               
## 4063                           66                               
## 4064                           66                               
## 4065                           66                               
## 4066                           66                               
## 4067      M         D         225     30-06-2016      07-01-2012
## 4068      F         D         230     30-06-2016      07-01-2012
## 4069      M         D         235     31-12-2016      01-01-2013
## 4070      M         R         240     27-03-2016      26-03-2012
## 4071      M         D         245     01-10-2016      01-09-2012
## 4072      M         D         245     01-10-2016      01-09-2012
## 4073      M         R         245     01-10-2016      01-09-2012
## 4074      M         R         245     01-10-2016      01-09-2012
## 4075      M         R         245     01-10-2016      01-09-2012
## 4076      M         D         245     01-10-2016      01-09-2012
## 4077      M         D         245     01-10-2016      01-09-2012
## 4078      M         D         250     31-12-2014      01-01-2009
## 4079      F         D         250     31-12-2014      01-01-2009
## 4080      F         N         255     31-12-2014      01-01-2011
## 4081      M         D         255     31-12-2014      01-01-2011
## 4082      M         D         255     31-12-2014      01-01-2011
## 4083      M         N         255     31-12-2014      01-01-2011
## 4084      M         R         255     31-12-2014      11-01-2011
## 4085      F         D         255     31-12-2014      27-08-2012
## 4086      M         D         255     31-12-2014      01-01-2011
## 4087      M         N         265     31-12-2014      01-01-2009
## 4088      F         N         265     31-12-2014      01-01-2009
## 4089      M         N         265     31-12-2014      01-01-2009
## 4090                D         265     31-12-2014      01-01-2009
## 4091      M         R         265     31-12-2014      01-01-2009
## 4092      M         D         265     31-12-2014      01-01-2009
## 4093      F         N         265     31-12-2014      01-01-2009
## 4094      F         D         265     31-12-2014      01-01-2009
## 4095      M         D         267     31-12-2014      01-01-2009
## 4096      M         R         267     31-12-2014      27-08-2012
## 4097      M         D         267     31-12-2014      01-01-2009
## 4098      M         D         267     31-12-2014      01-01-2009
## 4099      F         D         267     31-12-2014      01-01-2009
## 4100      M         N         267     31-12-2014      01-01-2009
## 4101      F         N         267     31-12-2014      01-01-2009
## 4102      M         D         267     31-12-2014      01-01-2009
## 4103      F         D         300     30-06-2013      07-01-2009
## 4104      M         N         300     31-12-2014      01-01-2011
## 4105      M         N         300     31-12-2014      01-01-2011
## 4106      M         D         300     31-12-2014      01-01-2011
## 4107      M         D         300     31-12-2016      01-01-2013
## 4108      M         D         310                               
## 4109      M         D         310     30-06-2013      07-01-2009
## 4110      M         D         310     30-06-2013      07-01-2009
## 4111      M         R         310     30-06-2013      07-01-2009
## 4112      M         N         310                               
## 4113      M         D         310     30-06-2013      07-01-2009
## 4114      M         D         310                               
## 4115      M         D         310     30-06-2013      07-01-2009
## 4116      M         D         310                               
## 4117      M         D         310     31-12-2014      01-01-2011
## 4118      F         D         310     31-12-2014      01-01-2011
## 4119      M         R         310     31-12-2014      01-01-2011
## 4120                          310                               
## 4121      F         R         310     31-12-2014      01-01-2011
## 4122      F         D         310     31-12-2014      01-01-2011
## 4123      M         D         310     31-12-2014      01-01-2011
## 4124      M         D         310     31-12-2014      01-01-2011
## 4125      M         R         310     31-12-2014      01-01-2011
## 4126      M         R         310     31-12-2014      27-08-2012
## 4127      M         R         310     31-12-2016      01-01-2013
## 4128      M         N         310     31-12-2016      01-01-2013
## 4129      M         D         310     31-12-2016      01-01-2013
## 4130      F         D          54     29-02-2016      04-03-2012
## 4131      M         D          54     29-02-2016      04-03-2012
## 4132                           54                     21-06-2012
## 4133                           56                               
## 4134                           56                               
## 4135                           56                               
## 4136                           56                               
## 4137                           56                               
## 4138                           56                               
## 4139                           56                               
## 4140                           56                     21-06-2012
## 4141                           56                               
## 4142                           56                               
## 4143                           56                     21-06-2012
## 4144                           64                               
## 4145                           66                               
## 4146                           66                               
## 4147                           66                               
## 4148                           66                               
## 4149                           66                               
## 4150                           66                               
## 4151                           66                               
## 4152                           66                               
## 4153                           66                               
## 4154                           66                               
## 4155                           66                               
## 4156      M         D         225     30-06-2016      07-01-2012
## 4157      M         D         230     30-06-2016      07-01-2012
## 4158      F         D         235     31-12-2016      01-01-2013
## 4159                          240                     02-11-2013
## 4160      M         R         243     01-10-2016      18-12-2012
## 4161      M         D         245     01-10-2016      18-12-2012
## 4162      M         D         245     01-10-2016      18-12-2012
## 4163      M         R         245     01-10-2016      18-12-2012
## 4164      M         R         245     01-10-2016      18-12-2012
## 4165      M         D         245     01-10-2016      18-12-2012
## 4166      M         D         250     31-12-2014      01-01-2009
## 4167      M         D         250     31-12-2014      01-01-2009
## 4168      M         N         255     31-12-2014      01-01-2011
## 4169      M         D         255     31-12-2014      01-01-2011
## 4170      M         D         255     31-12-2014      01-01-2011
## 4171      M         R         255     31-12-2014      01-01-2011
## 4172      F         D         255     31-12-2014      01-01-2011
## 4173      M         D         255     31-12-2014      01-01-2011
## 4174      M         D         255     31-12-2014      01-01-2011
## 4175      M         D         255     31-12-2014      01-01-2011
## 4176      M         D         255     31-12-2014      01-01-2011
## 4177      M         D         255     31-12-2014      01-01-2011
## 4178      F         D         255     31-12-2014      11-01-2011
## 4179      F         D         265     31-12-2014      01-01-2009
## 4180      F         D         265     31-12-2014      01-01-2009
## 4181      F         D         265     31-12-2014      01-01-2009
## 4182      M         D         267     31-12-2014      01-01-2009
## 4183      M         D         267     31-12-2014      01-01-2009
## 4184      M         D         267     31-12-2014      01-01-2009
## 4185      M         N         300     31-05-2016      06-01-2012
## 4186      F         D         300     31-12-2014      01-01-2011
## 4187      M         R         300     31-12-2014      01-01-2011
## 4188      M         D         300     30-06-2016      07-01-2012
## 4189      F         D         300     31-12-2014      01-01-2011
## 4190      F         N         300     30-06-2014      07-01-2010
## 4191      F         D         300     30-06-2016      07-01-2012
## 4192      M         D         300     31-12-2014      01-01-2011
## 4193      M         D         300     31-12-2014      01-01-2011
## 4194      M         D         305     31-12-2014      01-01-2011
## 4195      M         R         305     31-12-2014      01-01-2011
## 4196      M         D         305     30-06-2016      07-01-2012
## 4197      M         N         305     31-12-2014      01-01-2011
## 4198      M         D         305     30-06-2014      07-01-2010
## 4199      F         D         305     30-06-2016      07-01-2012
## 4200      M         D         305     31-12-2014      01-01-2011
## 4201      M         R         305     31-12-2014      11-01-2011
## 4202      M         D         308     31-05-2016      06-01-2012
## 4203      F         R         310     30-06-2016      07-01-2012
## 4204      M         D         310     30-06-2016      07-01-2012
## 4205      F         D         310     30-06-2016      07-01-2012
## 4206      M         R         310     31-12-2014      01-01-2011
## 4207      M         R         310     31-12-2014      01-01-2011
## 4208      M         R         310     31-12-2014      01-01-2011
## 4209      F         D         310     30-06-2014      07-01-2010
## 4210      F         N         310     30-06-2014      07-01-2010
## 4211      M         D         310     30-06-2014      21-02-2011
## 4212      M         D         310     30-06-2016      07-01-2012
## 4213      M         D         310     30-06-2016      25-02-2013
## 4214      M         D         310     30-06-2016      07-01-2012
## 4215      M         N         310     31-12-2014      01-01-2011
## 4216      M         D         310     31-12-2014      16-11-2012
## 4217      M         N         310     31-12-2014      01-01-2011
## 4218      M         D         310     31-12-2014      01-01-2011
## 4219      M         D         310     31-12-2014      01-01-2011
## 4220      F         D         310     31-12-2014      01-01-2011
## 4221      M         R         310     31-12-2014      01-01-2011
## 4222      F         D         310     31-12-2014      01-01-2011
## 4223      F         D         310     31-12-2014      01-01-2011
## 4224      M         N         310     31-05-2016      06-01-2012
## 4225      M         R         310     31-05-2016      06-01-2012
## 4226      F         D         310     31-05-2016      06-01-2012
## 4227      M         D         310     31-05-2016      06-01-2012
## 4228      F         D         310     31-12-2014      01-01-2011
## 4229      M         N         310     31-12-2014      01-01-2011
## 4230      M         D         310     31-12-2014      01-01-2011
## 4231      M         D         310     31-12-2014      01-01-2011
## 4232      F         N         310     31-12-2014      16-09-2011
## 4233      M         D          56     29-02-2016      04-03-2012
## 4234      F         D          56     29-02-2016      04-03-2012
## 4235      F         D          56     29-02-2016      04-03-2012
## 4236      M         D          56     29-02-2016      04-03-2012
## 4237      F         D          56     29-02-2016      04-03-2012
## 4238      F         D          56     29-02-2016      04-03-2012
## 4239      F         D          56     29-02-2016      04-03-2012
## 4240      M         D          56     29-02-2016      04-03-2012
## 4241      M         D          56     29-02-2016      04-03-2012
## 4242      F         D          56     29-02-2016      04-03-2012
## 4243      F         D          56     29-02-2016      04-03-2012
## 4244      M         D          56     29-02-2016      04-03-2012
## 4245      F         D          56     29-02-2016      04-03-2012
## 4246      F         D          56     29-02-2016      04-03-2012
## 4247      M         D          56     29-02-2016      04-03-2012
## 4248      F         D          56     29-02-2016      04-03-2012
## 4249      M         D          56     29-02-2016      04-03-2012
## 4250      F         D          56     29-02-2016      04-03-2012
## 4251      M         D          56     29-02-2016      04-03-2012
## 4252      F         D          56     29-02-2016      04-03-2012
## 4253      F         D          56     29-02-2016      04-03-2012
## 4254      M         D          56     29-02-2016      04-03-2012
## 4255      M         D          56     29-02-2016      04-03-2012
## 4256      F         D          56     29-02-2016      04-03-2012
## 4257      M         D          56     29-02-2016      04-03-2012
## 4258      F         D          56     29-02-2016      04-03-2012
## 4259      M         D          56     29-02-2016      04-03-2012
## 4260      M         D          56     29-02-2016      04-03-2012
## 4261      M         D          56     29-02-2016      04-03-2012
## 4262      M         D          56     29-02-2016      04-03-2012
## 4263      F         D          56     29-02-2016      04-03-2012
## 4264      M         D          56     29-02-2016      04-03-2012
## 4265      F         D          56     29-02-2016      04-03-2012
## 4266      F         D          56     29-02-2016      04-03-2012
## 4267      M         D          56     29-02-2016      04-03-2012
## 4268                           56                     10-08-2012
## 4269      F         D          56     29-02-2016      04-03-2012
## 4270      M         D          56     29-02-2016      04-03-2012
## 4271      M         D          56     29-02-2016      04-03-2012
## 4272      M         D          56     29-02-2016      04-03-2012
## 4273      M         D          56     29-02-2016      04-03-2012
## 4274      F         D          56     29-02-2016      04-03-2012
## 4275      M         D          56     29-02-2016      04-03-2012
## 4276      F         D          56     29-02-2016      04-03-2012
## 4277      M         D          56     29-02-2016      04-03-2012
## 4278      M         D          56     29-02-2016      04-03-2012
## 4279      F         D          56     29-02-2016      04-03-2012
## 4280      F         D          56     29-02-2016      04-03-2012
## 4281      M         D          56     29-02-2016      04-03-2012
## 4282      F         D          56     29-02-2016      04-03-2012
## 4283      F         D          56     29-02-2016      04-03-2012
## 4284      M         D          56     29-02-2016      04-03-2012
## 4285      M         D          56     29-02-2016      04-03-2012
## 4286      M         D          56     29-02-2016      04-03-2012
## 4287      M         D          56     29-02-2016      04-03-2012
## 4288      F         D          56     29-02-2016      04-03-2012
## 4289      F         D          56     29-02-2016      04-03-2012
## 4290      M         D          56     29-02-2016      04-03-2012
## 4291      M         D          56     29-02-2016      04-03-2012
## 4292      F         D          56     29-02-2016      04-03-2012
## 4293      F         D          56     29-02-2016      04-03-2012
## 4294      F         D          56     29-02-2016      04-03-2012
## 4295      F         D          56     29-02-2016      04-03-2012
## 4296      F         D          56     29-02-2016      04-03-2012
## 4297      M         D          56     29-02-2016      04-03-2012
## 4298      F         D          56     29-02-2016      04-03-2012
## 4299      M         D          56     29-02-2016      04-03-2012
## 4300      M         D          56     29-02-2016      04-03-2012
## 4301      F         D          56     29-02-2016      04-03-2012
## 4302      F         D          56     29-02-2016      04-03-2012
## 4303      M         R          66     29-02-2016      04-03-2012
## 4304      F         R          66     29-02-2016      04-03-2012
## 4305      M         R          66     29-02-2016      04-03-2012
## 4306      M         R          66     29-02-2016      04-03-2012
## 4307      F         R          66     29-02-2016      04-03-2012
## 4308      M         R          66     29-02-2016      04-03-2012
## 4309      M         R          66     29-02-2016      04-03-2012
## 4310      M         R          66     29-02-2016      04-03-2012
## 4311      F         R          66     29-02-2016      04-03-2012
## 4312      M         R          66                     04-03-2012
## 4313      M         R          66     29-02-2016      04-03-2012
## 4314      M         R          66     29-02-2016      04-03-2012
## 4315      M         R          66     29-02-2016      04-03-2012
## 4316      F         R          66     29-02-2016      04-03-2012
## 4317      M         R          66     29-02-2016      04-03-2012
## 4318      M         R          66     29-02-2016      04-03-2012
## 4319      M         R          66     29-02-2016      04-03-2012
## 4320      M         R          66     29-02-2016      04-03-2012
## 4321      F         R          66     29-02-2016      04-03-2012
## 4322      M         R          66     29-02-2016      04-03-2012
## 4323      M         R          66     29-02-2016      04-03-2012
## 4324      F         R          66     29-02-2016      04-03-2012
## 4325      M         R          66     29-02-2016      04-03-2012
## 4326      M         R          66     29-02-2016      04-03-2012
## 4327      M         R          66     29-02-2016      04-03-2012
## 4328      M         R          66     29-02-2016      04-03-2012
## 4329      M         R          66     29-02-2016      04-03-2012
## 4330      M         R          66     29-02-2016      04-03-2012
## 4331      M         R          66     29-02-2016      04-03-2012
## 4332      M         R          66     29-02-2016      04-03-2012
## 4333      M         R          66     29-02-2016      04-03-2012
## 4334      M         R          66     29-02-2016      04-03-2012
## 4335      M         R          66     29-02-2016      04-03-2012
## 4336      M         R          66     29-02-2016      04-03-2012
## 4337      M         R          66     29-02-2016      04-03-2012
## 4338      M         R          66     29-02-2016      04-03-2012
## 4339      M         R          66     29-02-2016      04-03-2012
## 4340      M         R          66     29-02-2016      04-03-2012
## 4341      M         R          66     29-02-2016      04-03-2012
## 4342      F         R          66     29-02-2016      04-03-2012
## 4343      F         R          66     29-02-2016      04-03-2012
## 4344      M         R          66     29-02-2016      04-03-2012
## 4345      M         R          66     29-02-2016      04-03-2012
## 4346      F         D         220     31-12-2014      01-01-2003
## 4347      F         D         220     31-12-2014      14-04-2009
##                                   Salutation
## 1                    Mrs Helen Godfrey Smith
## 2                                           
## 3                         Mrs Frances Kelley
## 4                   Mr Frederic D Washington
## 5                             Barbara Norton
## 6                           Mr Steve Jackson
## 7                          Mrs June Phillips
## 8                         Mr Larry Ferdinand
## 9                            Mrs Nita Steele
## 10                             Mr Artis Cash
## 11                       Mrs Allison McClung
## 12                         Mr Lee A Jeter Sr
## 13                      Mrs Cynthia Williams
## 14                      Mr Johnny C McFerren
## 15               Mrs Linda Pitchford Jackson
## 16                        Mr Ronald Griffing
## 17                       Mrs Deborah B Knapp
## 18                                          
## 19                               Pattie Odom
## 20                                 John Agan
## 21                           Mrs Tara Hollis
## 22                           Mr Glenn Hollis
## 23                                          
## 24                                          
## 25                                          
## 26                        Mr Bobby Culpepper
## 27                   Mrs Brenda HensleySmith
## 28                         Mr Fred Huenefeld
## 29                              Mary Kincade
## 30                        Mr Charles Kincade
## 31                       Mrs Katrina Jackson
## 32                         Mr Ronnie Traylor
## 33                          Mrs Billye Burns
## 34                          Mr Marcus Hunter
## 35                                          
## 36                           Mr Stephen Juge
## 37                  Mrs Linda Jenkins Turner
## 38                 Mr Charles Walter Cochran
## 39                         Mrs Mary E Cooper
## 40                Mr Gregory Greg Richardson
## 41               Mrs Leslie Dandridge Durham
## 42                                          
## 43                           Mrs Mary Bonier
## 44                             Mr Johnny Cox
## 45                Mrs Mozella Jeanetter Bell
## 46                            Mr Larry Paige
## 47                       Mrs Gloria H Ruffin
## 48                           Willie Banks Jr
## 49               Mrs Nancy Grandquist Fields
## 50                           Mr Chris Roy Sr
## 51                     Mrs Mary L Wardsworth
## 52                        Mr Herbert B Dixon
## 53                 Mrs Gloria Williams Hearn
## 54                              Stanley Lott
## 55                          Mrs Caina Munson
## 56                                 Dan McKay
## 57                         Mrs Regina Barrow
## 58                 Mr Rawlston D Phillips Jr
## 59                     Mrs Frankie Mae Evans
## 60                           Mr Alton Bailey
## 61                 Mrs Denise Tauzin D'Amato
## 62                                          
## 63                      Mrs Patricia R Jones
## 64                          Mr J Craig Jones
## 65                             Myrna Bennett
## 66                           Charles Bennett
## 67                       Mrs Edwina Medearis
## 68                          Mr Davante Lewis
## 69                                Evia Hodge
## 70                       Mr Maurice Griffith
## 71                  Mrs Diana Handy Hamilton
## 72                          Mr David Darbone
## 73                         Torrie Thibodeaux
## 74                            Kieran Coleman
## 75                      Mrs Jennifer Vidrine
## 76                           Mr Dirk Deville
## 77              Mrs Valerie Broussard Boston
## 78                        Mr Danny L Uriegas
## 79                     Mrs Leona Henry Boxie
## 80                       Mr Robert  J Wilson
## 81                                          
## 82                  Mr Marshall A Thibodeaux
## 83                        Mrs Dianne Granger
## 84                          Mr James Proctor
## 85                   Mrs Evanette C Richards
## 86                        Mr Frank Art Flynn
## 87                      Mrs Tonya BoldenBall
## 88              Mr Joseph J B Bowman Cormier
## 89                        Mrs Sally O Donlon
## 90                       Mr John D Bernhardt
## 91                        Mrs Lynda T Guidry
## 92                           Mr Shane Riddle
## 93               Mrs Cynthia Sudduth Campisi
## 94                           Mr Ronald Darby
## 95                                          
## 96                           Mr Perry Segura
## 97                Mrs Aquicline Rener Arnold
## 98                        Mr Elbert S Dawson
## 99                          Mrs Thai Browder
## 100                Mr Anthony Troy Dennis Jr
## 101                    Mrs Anna B Cunningham
## 102                    Mr Wayne J Thibodeaux
## 103                        Mrs Karen Dillard
## 104                     Mr Clarence Williams
## 105                     Mrs Arlanda Williams
## 106                           Mr S P LaRussa
## 107                              Nell Guidry
## 108                            Albert Guidry
## 109                      Mrs Carol R Leblanc
## 110                         Mr Peter Jenkins
## 111                         Mrs Judy B Songy
## 112                           Mr Joey Murray
## 113                     Mrs Lynncal T Bering
## 114                         Mr Randal Gaines
## 115                                         
## 116                            Oliver Joseph
## 117                                         
## 118                              Armand Link
## 119                     Mrs Karen St Germain
## 120               Mr Edward A Lucky Songy Jr
## 121                    Mrs C Denise Marcelle
## 122                     Mr Alfred C Williams
## 123                                         
## 124                       Mr Jim Mack Parker
## 125                       Mrs Elaine G Davis
## 126                        Mr Ronald Rodgers
## 127                Mrs Juanita CarterSanford
## 128                         Mr Roger Sanford
## 129                          Mrs Maura Lewis
## 130                         Mr Dalton Honore
## 131                     Mrs Jane Scheuermann
## 132                         Mr Brett Jackson
## 133                Mrs Patricia Haynes Smith
## 134                           Mr Ben Jeffers
## 135                        Mrs Robin Shelbia
## 136                         Mr James Bullman
## 137               Mrs Elizabeth Betty Powers
## 138                          Mr Kevin Garner
## 139           Mrs Charlotte McDaniel McGehee
## 140                      Mr Brandon J DeCuir
## 141                       Mrs Paeton Burkett
## 142                       Mr Ronnie H Wilson
## 143                       Linda Guy Phillips
## 144                       Mr Nathaniel Adams
## 145                                         
## 146                  Mr Robert Tiger Hammond
## 147                 Mrs Alicia Walker Breaux
## 148                           Mr Alan B Tusa
## 149                        Mrs Patsy Ritchie
## 150                            Mr Brad Orman
## 151                   Mrs Elsie P Burkhalter
## 152                        Mr Lionel J Hicks
## 153                                         
## 154                    Mr James K Jim Harlan
## 155                           Mrs Gilda Reed
## 156                                         
## 157                                         
## 158                                         
## 159                      Mrs Dwan S Hilferty
## 160                       Mr David Gereighty
## 161                                         
## 162                           Mr Tomy Acosta
## 163                                         
## 164                           Mr Donald Blum
## 165            Mrs Sharlayne Jackson Prevost
## 166                         Mr Kyle Green Jr
## 167                        Mrs Nora B Romano
## 168                      Mr Patrick J DeJean
## 169                                         
## 170                          Mr Rudy S Smith
## 171                                         
## 172                         Mr Kelly S Wells
## 173                    Mrs Danielle Duffourc
## 174                          Mr Paul Johnson
## 175                           Lesile Jackson
## 176                         Mr Kyle Gautreau
## 177                          Mrs Erin Powell
## 178                                         
## 179            Mrs d'Andrea McMooain Chatman
## 180                          Mr T J Smith Jr
## 181                       Mrs Diana E Bajoie
## 182                           Mr Jay H Banks
## 183                  Mrs Malinda HillsHolmes
## 184                    Mr Keith M Hutchinson
## 185                Mrs Karen Carter Peterson
## 186                           Mr James Perry
## 187                     Mrs Deborah Langhoff
## 188                        Mr Nolan Marshall
## 189                     Mrs Cassandra Butler
## 190                   Mr Randall Randy Albin
## 191                     Mrs Maggie F Daniels
## 192                          Mr Marlon Lewis
## 193                 Mrs Cynthia HedgeMorrell
## 194                      Mr Arthur A Morrell
## 195                      Mrs Irma Muse Dixon
## 196                       Mr Marshall Hevron
## 197                    Mrs Elaine BoutteYost
## 198                       Mr Wesley T Bishop
## 199              Mrs Jerrelda DrummerSanders
## 200                          Mr Willie Jones
## 201                         Mrs Dawn Collins
## 202                      Mr Edward Ted James
## 203                  Mrs Ericka EdwardsJones
## 204                   Mr Joseph Broussard Jr
## 205                     Mrs Barbara R Keller
## 206                        Mr Reed Henderson
## 207                    Mrs Brenda Ann Palmer
## 208                       Mr Carlo Hernandez
## 209                       Mrs Lisa Ray Diggs
## 210                        Mr Morris Reed Jr
## 211                                         
## 212                          Mr Matt Varnell
## 213                       Mr JeanPaul Guidry
## 214                                         
## 215                       Mr Neil B Carlisle
## 216                         Mrs Sandy McDade
## 217                      Mr Stephen C Gibson
## 218                       Mr Ronnie Remedies
## 219                     Mr Randall J Wallace
## 220                         Mr Alan Seabaugh
## 221                         Mr Jimmy C Allen
## 222                Mr Edward Eddie Brossette
## 223                         Mr John C Kay Jr
## 224                         Mr Harold Coates
## 225                              Mr Ron Webb
## 226                    Mr Bryan B Norwood Jr
## 227                          Mr Lindell Webb
## 228                           Mrs Anne Price
## 229                           Mr Duke Lowrie
## 230                                         
## 231                       Mrs Holly K Talley
## 232                          Mrs Laura Adley
## 233                      Mr E Charles Jacobs
## 234                   Mrs Jerri Ray dePingre
## 235                 Mr Thomas Harold Garrett
## 236                 Mrs Jennifer Daulton Ham
## 237                           Mrs Lisa Owens
## 238                              Gina Garris
## 239                            Sandra Rhodes
## 240                         Mr Dusty Hampton
## 241                        Mr Arron McGuffee
## 242                   Mrs Patsy P Montgomery
## 243                        Mrs Suzan S Betts
## 244             Mrs Deborah Wisdom McCulloch
## 245                Mr M Randall Randy Donald
## 246                         Mr Gordon Dasher
## 247                          Mr John Cooksey
## 248                     Mrs Kay Kellogg Katz
## 249                             Mr Paul Hurd
## 250                                         
## 251                                         
## 252                    Mr William Bill Davis
## 253                              Ambia Baker
## 254                      Mr Doyle E Robinson
## 255                            Mr Neil Riser
## 256                      Mr Henry Herford Jr
## 257                          Mr Bob Strozier
## 258                       Mr William Guthrie
## 259                            Mr Sam Brimer
## 260                       Mrs Billie Turnley
## 261                          Mr Paul Johnson
## 262                           Mr Rick Nowlin
## 263                      Mr Bobby E Williams
## 264                         Mr Valmore Byles
## 265                          Mr Chuck Tosten
## 266                            Mr Wayne Ryan
## 267                                         
## 268                         Mrs Kim P Knight
## 269                            Mrs Gena Gore
## 270                         Mr Edwin B Jones
## 271                          Mrs Olivia Nash
## 272                             Mr Van Kojis
## 273                                         
## 274                           Mr Steven Iles
## 275                    Mr Logan Oscar Morris
## 276                        Mr Ross Little Jr
## 277                   Mr William P Mills III
## 278                    Mr Nathan G Broussard
## 279               Mr Llewellyn Biscuit Smith
## 280                  Mr William E Bill Murry
## 281               Mrs Lillie Wilkinson Brady
## 282                              Billy White
## 283                         Mr Nathan Curtis
## 284                           Mr Chris Brown
## 285                         Mr James Boswell
## 286                           John Hoffpauir
## 287                 Mr Eric Scott Fitzgerald
## 288                            Korey S Dugas
## 289                   Mr Chester Lee Mallett
## 290                 Mr David Emile Marcantel
## 291                           Mr Dan R Poret
## 292                         Mr Jimmy LaFleur
## 293                        Mrs Julie Emerson
## 294                  Mr Michael Louis Hebert
## 295                          Mr Kenny Boagni
## 296                      Mrs Suzanne Bercier
## 297                      Mr Russell P Pavich
## 298                      Mrs Janice Hartiens
## 299                         Mr Larry M Lege'
## 300                     Mrs Brandy P Edwards
## 301                          Mr Chris Pettus
## 302                          Mr Tim Reynolds
## 303               Mrs Sandra Sandy Hindelang
## 304                      Mrs Deborah R Young
## 305                   Mr W Thomas Tom Angers
## 306                                         
## 307                      Mrs Hannah Joy Dake
## 308                           Mr Blake Douet
## 309                   Mr Joseph Rick Pearson
## 310                      Mr Russell Ferguson
## 311                          Mr Dexter Duhon
## 312                        Mr Kristian Magar
## 313                       Mr James Wyche III
## 314                     Mrs Simone Champagne
## 315                              Jude Savoie
## 316                       Mr Christian J Gil
## 317                        Mrs Jessie Morton
## 318                     Mrs Leilani N Hardee
## 319                                         
## 320                   Mrs Beryl Adams Amedee
## 321                          Mr Fred Fondren
## 322                     Mrs Theresa Ellender
## 323                        Mrs Lenar Whitney
## 324                         Mr Brent Callais
## 325                       Mr Matthew Alleman
## 326                          Mr David Gauthe
## 327                       Mr Garrett C Monti
## 328                   Mrs Beth Anne Billings
## 329                   Mr David W Dave Millet
## 330                      Mr Nicholas M James
## 331                   Mr Charles B Carpenter
## 332                          Mr Paul Goppelt
## 333                         Mrs Tonya Veazey
## 334                      Mr George Valentine
## 335                      Mr Arthur N Bagwell
## 336                            Mr Dan Richey
## 337                         Mr Rick Guillory
## 338                          Mr Jimmy Kaiser
## 339                       Mrs Barbara Thomas
## 340                 Mr Gordon William Atwell
## 341                      Valarie Hope Hodges
## 342                           Mr Neal Cotton
## 343                         Mr Scott Wilfong
## 344                        Mr Brennan Easley
## 345                          Mr Barry D Ivey
## 346                           Mr Gene Guffey
## 347                       Mr Malcolm Richard
## 348                        Mr Ray E Williams
## 349                           Elizabeth Dent
## 350                       Mrs Lynda Carville
## 351                    Mr James Morgan Field
## 352                       Mrs Connie Bernard
## 353                       Mr Bryan Jeansonne
## 354                          Mr Tommy French
## 355                            Mr Ryan Booth
## 356                  Mr Jonathan Brandenburg
## 357                   Mrs Kathleen Edgeworth
## 358                         Mr Charlie Davis
## 359                              Mr Dan Kyle
## 360                         Mr Craig Lindsay
## 361                   Mr Robert W Bob Morgan
## 362                     Mr Jon Chris Comeaux
## 363                 Mrs Donna Carlisle Erdey
## 364                   Mr Charles D Christmas
## 365                       Mrs Adonica Duggan
## 366                 Mrs Elizabeth Beth Davis
## 367                         Mr George Holton
## 368                                         
## 369                           Mr Scott Simon
## 370                    Mr Christopher Trahan
## 371                   Mrs Mary S Beth Mizell
## 372                           Mr Merlin Duke
## 373              Mrs Virginia Ginger Corkern
## 374                            Mr Mark Sigur
## 375                          Mr Drew LaPlace
## 376                        Mr Robert A Deese
## 377                             Mr A G Crowe
## 378                           Mr Mark Wright
## 379                         Mr Lester P Dore
## 380                 Mrs Sandra BaileySimmons
## 381                Mr George R Buddy Blue Jr
## 382                              Joe Spinato
## 383                        Mrs Debbie Cooper
## 384                     Mr Ralph E Brandt Jr
## 385                        Mr Bryan J St Cyr
## 386                Mr Philip Phil L Capitano
## 387                         Mrs Betty Bonura
## 388                Mrs Debbie Mabile Settoon
## 389                         Mr Archie Corder
## 390                  Mr Vinson J Vince Serio
## 391                      Mrs Lynn E Skidmore
## 392                   Mr Joseph P Lopinto Jr
## 393                       Mrs Charlotte Ruiz
## 394                    Mr Roger F Villere Jr
## 395                         Mr Eric Skrmetta
## 396                        Mrs Monica Monica
## 397                          Mr Jeffrey Zewe
## 398                         Mr Daniel Shanks
## 399                      Mr Bruce P Donnelly
## 400                     Mr George A Peterson
## 401                   Mrs Ashleigh Carpenter
## 402                           Mr Rickey Ullo
## 403                       Mr Michael O'Brien
## 404                          Mr Keith B Hall
## 405                          Mr Billy Arnold
## 406                      Mr Wallace Lucas Sr
## 407                                         
## 408                                         
## 409                            Mr Earl Price
## 410                        Mr Floyd Gonzalez
## 411                                         
## 412                                         
## 413                 Mrs Jan Conlin McAlister
## 414                       Mrs Lynn Pablovich
## 415                          Mr Pat Phillips
## 416                           Mr Dewey Spies
## 417                        Mr John R Morello
## 418                              Tony Jurich
## 419                    Mr Jonathan D Johnson
## 420                       Mrs Tiffany Parker
## 421                         Mr John P O'Neil
## 422                       Mr George White Jr
## 423                      Mrs Sherry Willmott
## 424                          Mrs Penny Frame
## 425                        Mr J Bryan Wagner
## 426                      Mr John Jay Batt Jr
## 427            Mr Salvador Sal Palmisano III
## 428                                         
## 429                            Mr David Toso
## 430                       Mr Stephen M Swain
## 431                        Mr Lloyd A Harsch
## 432                      Mr Louis Gurvich Jr
## 433                          Mr David Kepper
## 434                        Mr Rafael Perales
## 435                                         
## 436                                         
## 437                        Mr Andrew Bautsch
## 438                            Mr Joseph Cao
## 439                         Mr Mark A Madary
## 440                                         
## 441                        Mr Michael Bayham
## 442                          Mr Jeff Dimarco
## 443                        Mr Ray Griffin Jr
## 444                          Mr Bobby Jindal
## 445                          Mr Jay Dardenne
## 446                          Mr Tom Schedler
## 447                Mr James D Buddy Caldwell
## 448                          Mr John Kennedy
## 449                 Mr Michael G Mike Strain
## 450                           Mr Jim Donelon
## 451                        Mrs Mary Landrieu
## 452                          Mr David Vitter
## 453                         Mr Steve Scalise
## 454                       Mr Cedric Richmond
## 455                 Mr Charles W Boustany Jr
## 456                          Mr John Fleming
## 457                      Mr Rodney Alexander
## 458                  Mr William Bill Cassidy
## 459                           Mr Greg Guidry
## 460                     Mr Jeffrey P Victory
## 461              Mrs Jeannette Theriot Knoll
## 462                        Mr Marcus R Clark
## 463                           Mr Jeff Hughes
## 464                            John L Weimer
## 465              Mrs Bernette Joshua Johnson
## 466            Mrs Toni Manning Higginbotham
## 467                            Mike McDonald
## 468                    Mr Jewel E Duke Welch
## 469                   Mr John Michael Guidry
## 470                      Mr John T Pettigrew
## 471                         Mr Mitch Theriot
## 472                  Mr Randolph Randy Parro
## 473                Mrs Vanessa GuidryWhipple
## 474                    Mr James E Jimmy Kuhn
## 475                       Mrs Page McClendon
## 476               Mr Ernest G Ernie Drake Jr
## 477                  Mr William J Will Crain
## 478               Mrs Felicia Toney Williams
## 479                     Mr John Larry Lolley
## 480                    Mr D Milton Moore III
## 481                     Mr James Jay Caraway
## 482                      Mr R Harmon Drew Jr
## 483                           Mr Henry Brown
## 484                    Mr James E Stewart Sr
## 485                       Mrs Frances Pitman
## 486                            Fred C Sexton
## 487                     Mrs Jeanette Garrett
## 488                  Mrs Elizabeth A Pickett
## 489                       Mr Jimmie C Peters
## 490              Mr Shannon James Gremillion
## 491               Mr Ulysses Gene Thibodeaux
## 492                  Mr Joseph David Painter
## 493                         Mr Billy H Ezell
## 494                            John Saunders
## 495                       Mrs Sylvia R Cooks
## 496                         Mr John E Conery
## 497                                 Marc Amy
## 498             Mrs Phyllis Montgomery Keaty
## 499                        Mr Jimmy Genovese
## 500                        Mr Roland Belsome
## 501                     Mr James F McKay III
## 502                       Mr Edwin A Lombard
## 503                            Mr Paul Bonin
## 504                  Mr Dennis R Bagneris Sr
## 505                       Mr Max N Tobias Jr
## 506                           Mrs Terri Love
## 507                 Mrs Madeleine M Landrieu
## 508                           Mrs Rose Ledet
## 509               Mrs Sandra Cabrina Jenkins
## 510            Mrs Joyce Cossich Joy Lobrano
## 511                       Mr Daniel L Dysart
## 512                        Mr Marc E Johnson
## 513            Mrs Fredericka Homberg Wicker
## 514                     Mrs Susan M Chehardy
## 515                   Mr Stephen J Windhorst
## 516                        Mr Hans Liljeberg
## 517                       Mr Robert M Murphy
## 518                        Mr Jude G Gravois
## 519                     Mr Robert A Chaisson
## 520                         Mr Eric Skrmetta
## 521                       Mr Scott A Angelle
## 522               Mr Lambert C Boissiere III
## 523                      Mr Clyde C Holloway
## 524                       Mr Foster Campbell
## 525                      Mr James Jim Garvey
## 526                    Mrs Kira Orange Jones
## 527                Mrs Lottie Polozola Beebe
## 528                          Mr Walter C Lee
## 529                              Jay Guillot
## 530              Mr Charles E Chas Roemer IV
## 531                          Mrs Holly Boffy
## 532                         Mrs Carolyn Hill
## 533                             Mr A G Crowe
## 534                          Mr Troy E Brown
## 535                           Mr J P Morrell
## 536                     Mr Edwin R Ed Murray
## 537                Mrs Karen Carter Peterson
## 538                    Mr Mack Bodi White Jr
## 539                       Mr David Heitmeier
## 540                      Mr John A Alario Jr
## 541                          Mr Conrad Appel
## 542                Mr Daniel R Danny Martiny
## 543                       Mr Jack Donahue Jr
## 544                            Mr Ben Nevers
## 545                            Mr Dale Erdey
## 546                        Mrs Yvonne Dorsey
## 547                 Mrs Sharon Weston Broome
## 548                           Mr Dan Claitor
## 549                         Mr Rick Ward III
## 550                           Mr Jody Amedee
## 551                       Mr Gary L Smith Jr
## 552                         Mr Norby Chabert
## 553                    Mr R L Bret Allain II
## 554                   Mr Fred TFred Mills Jr
## 555                   Mr Patrick Page Cortez
## 556                   Mr Elbert Lee Guillory
## 557                     Mr Dan Blade Morrish
## 558                        Mr Jonathan Perry
## 559                          Mr Ronnie Johns
## 560                          Mr Eric LaFleur
## 561                           Mr Rick Gallot
## 562                            Mr John Smith
## 563                           Mr Gerald Long
## 564                            Mr Neil Riser
## 565              Mr Michael A Mike Walsworth
## 566                      Mr Francis Thompson
## 567                 Mr Robert W Bob Kostelka
## 568                          Mr Robert Adley
## 569                        Mr Barrow Peacock
## 570                   Mrs Sherri Smith Cheek
## 571                        Mr Gregory Tarver
## 572                    Mr James H Jim Morris
## 573                         Mr Roy A Burrell
## 574                       Mrs Barbara Norton
## 575                    Mr Patrick C Williams
## 576                         Mr Alan Seabaugh
## 577             Mr Thomas Gaughan Carmody Jr
## 578                Mr Richard Richie Burford
## 579                         Mr Jeff Thompson
## 580                         Mr Henry L Burns
## 581                         Mr Gene Reynolds
## 582                   Mr Patrick O Jefferson
## 583                           Mr Rob Shadoin
## 584                    Mr James R Jim Fannin
## 585                            Mr Jay Morris
## 586                        Mr Frank Hoffmann
## 587                      Mrs Katrina Jackson
## 588                         Mr Marcus Hunter
## 589                         Mr Major Thibaut
## 590                Mr Charles R Bubba Chaney
## 591                       Mr Steven E Pylant
## 592                           Mr Andy Anders
## 593                     Mr Terry Ralph Brown
## 594                             Mr Kenny Cox
## 595                        Mr Frankie Howard
## 596                          Mr Lance Harris
## 597                       Mr Herbert B Dixon
## 598                           Mr Chris Hazel
## 599                        Mr Robert Johnson
## 600                 Mrs Regina AshfordBarrow
## 601                     Mr James K Armes III
## 602                         Mrs Nancy Landry
## 603                     Mrs Dorothy Sue Hill
## 604                          Mr Mike Danahay
## 605                          Mr A B Franklin
## 606                         Mr Brett Geymann
## 607                        Mr Chuck Kleckley
## 608                   Mr John E Johnny Guinn
## 609                       Mr H Bernard LeBas
## 610                        Mr Stephen Ortego
## 611             Mrs Ledricka Johnson Thierry
## 612                     Mr Mickey J Guillory
## 613                        Mr Jack Montoucet
## 614                       Mr Stuart J Bishop
## 615                      Mr Vincent J Pierre
## 616                        Mr Joel Robideaux
## 617                       Mr Mike Pete Huval
## 618                          Mr Bob Hensgens
## 619                         Mr Taylor Barras
## 620                   Mrs Simone B Champagne
## 621                             Mr Sam Jones
## 622                   Mr Joseph Joe Harrison
## 623                           Mr Gordon Dove
## 624                        Mrs Lenar Whitney
## 625                  Mr Jerry Truck Gisclair
## 626                    Mr Jerome Dee Richard
## 627                      Mr Gregory A Miller
## 628                       Mr Randal L Gaines
## 629                              Mr Ed Price
## 630                       Mr Eddie J Lambert
## 631                     Mrs Karen St Germain
## 632                     Mr Alfred C Williams
## 633                          Mr Kenny Havard
## 634                       Mr Dalton W Honore
## 635                       Mrs Valarie Hodges
## 636                            Mr Barry Ivey
## 637                         Mr Hunter Greene
## 638                     Mrs Patricia H Smith
## 639                Mr Stephen F Steve Carter
## 640                           Mr Erich Ponti
## 641                         Mr Franklin Foil
## 642                         Mr J Rogers Pope
## 643                      Mr John Bel Edwards
## 644                            Mr Steve Pugh
## 645                         Mr Scott M Simon
## 646                      Mr Harold L Ritchie
## 647                         Mr Kevin Pearson
## 648                       Mr John M Schroder
## 649                           Mr Kirk Talbot
## 650                         Mrs Julie Stokes
## 651                        Mr Joseph Lopinto
## 652                      Mr Clay Schexnayder
## 653                    Mr J Cameron Henry Jr
## 654                      Mr Robert E Billiot
## 655                       Mr Patrick Connick
## 656                           Mr Bryan Adams
## 657                      Mr Chris Broadwater
## 658                   Mr Girod H Jackson III
## 659               Mr John A Johnny Berthelot
## 660                             Mr Tim Burns
## 661                           Mr Greg Cromer
## 662                        Mr Walt Leger III
## 663                          Mr Tom Willmott
## 664                        Mrs Helena Moreno
## 665               Mr Nicholas J Nick Lorusso
## 666                        Mr Sherman Q Mack
## 667                          Mr Terry Landry
## 668                        Mr Jared Brossett
## 669                         Mr Neil Abramson
## 670                       Mr Wesley T Bishop
## 671                          Mr Austin Badon
## 672                      Mr Edward Ted James
## 673                   Mr Jeffery Jeff Arnold
## 674                          Mr Ray Garofalo
## 675                           Mr Paul Hollis
## 676                         Mr Chris Leopold
## 677                       Mrs Ramona Emanuel
## 678                        Mr Leon L Emanuel
## 679                        Mr John Mosely Jr
## 680                         Mr Ramon Lafitte
## 681                      Mr Scott J Crichton
## 682                                         
## 683                           Craig Marcotte
## 684                   Robert P Bobby Waddell
## 685                           Mr Mike Pitman
## 686                     Mrs Katherine Dorroh
## 687                            Mr Roy L Brun
## 688                  Mrs Jenifer Ward Clason
## 689                            Mr Jimmy Teat
## 690                          Mr Glenn Fallin
## 691                      Mrs Cynthia Woodard
## 692                         Mr R Wayne Smith
## 693                        Mr Jay B McCallum
## 694                            Mr Carl Sharp
## 695                        Mr Benjamin Jones
## 696                         Mr Alvin R Sharp
## 697                      Mr Robert C Johnson
## 698                           Mr Scott Leehy
## 699               Mrs Sharon Ingram Marchman
## 700                     Mr John Wilson Rambo
## 701                      Mr Stephens Winters
## 702                            Mr Fred Amman
## 703                       Mr Wendell Manning
## 704                Mr Daniel Joseph Ellender
## 705                       Mr Terry A Doughty
## 706                Mr James M Jimbo Stephens
## 707                         Mr Rudy McIntyre
## 708                   Mr Michael E Lancaster
## 709                        Mr John D Crigler
## 710                        Mrs Kathy Johnson
## 711                            Mr Leo Boothe
## 712                           Mr Jacque Derr
## 713                        Mr Donald Johnson
## 714                   Mr George C Metoyer Jr
## 715                     Mr Thomas Tom Yeager
## 716                   Mrs Mary Lauve Doggett
## 717                          John C Davidson
## 718                  Mrs Patricia Evans Koch
## 719                        Mr Harry F Randow
## 720                       Mr Rick Harrington
## 721                      Mrs Dee A Hawthorne
## 722                       Mr Stephen Beasley
## 723                        Mr Mark Jeansonne
## 724               Mr William J Billy Bennett
## 725                       Mr J Larry Vidrine
## 726                   Mr Thomas Tom Fuselier
## 727                        Mrs Lilynn Cutrer
## 728                      Mr Wilford D Carter
## 729                              Mr Ron Ware
## 730                         Mr Clayton Davis
## 731                         Mr Guy Bradberry
## 732                        Mr Robert L Wyatt
## 733                  Mr Michael Mike Canaday
## 734                         Mr D Kent Savoie
## 735                         Mr David Ritchie
## 736                       Mr Jules D Edwards
## 737                              Mr Ed Rubin
## 738                         Mr Herman Clause
## 739                      Mr David A Blanchet
## 740                     Mr Thomas Duplantier
## 741          Mr Patrick Louis Rick Michot Sr
## 742                     Mrs Marilyn C Castle
## 743                         Mrs Susan Theall
## 744                         Mr John D Trahan
## 745                         Mr Glenn Everett
## 746                     Mr Kristian D Earles
## 747                          Mr Ed Broussard
## 748                           Durwood Conque
## 749                      Mr Charles L Porter
## 750                        Mrs Lori A Landry
## 751                     Mr Gerard B Wattigny
## 752                           Mr Paul deMahy
## 753                       Mr Vincent J Borne
## 754                    Mr James R McClelland
## 755                         Mr Keith Comeaux
## 756                  Mr Edward Ed Leonard Jr
## 757                          Mr John LeBlanc
## 758            Mr Jerome J Jerry Barbera III
## 759                   Mr Walter I Lanier III
## 760                         Mr Bruce Simpson
## 761                   Mr F Hugh Buddy Larose
## 762                      Mr Alvin Batiste Jr
## 763                      Mr William C Dupont
## 764                          Mr J Robin Free
## 765                          Mr James J Best
## 766                    Mr Donald Don Johnson
## 767                         Mrs Janice Clark
## 768                          Mrs Trudy White
## 769                       Mrs Bonnie Jackson
## 770                         Mr Wilson Fields
## 771                        Mr Todd Hernandez
## 772                    Mr Richard D Anderson
## 773                            Mr Mike Erwin
## 774                            Mrs Kay Bates
## 775                Mr Richard Chip Moore III
## 776                        Mr Louis R Daniel
## 777                       Mr William Morvant
## 778                            Mr Tim Kelley
## 779           Mr Anthony J Tony Marabella Jr
## 780                    Mr R Michael Caldwell
## 781                              Mr Hal Ware
## 782                  Mr William G Carmichael
## 783                       Mr Wayne Ray Chutz
## 784                       Mr Bruce C Bennett
## 785             Mr Robert H Bob Morrison III
## 786                  Mr Milton D Doug Hughes
## 787                 Mrs Brenda Bedsole Ricks
## 788                 Mrs Elizabeth Beth Wolfe
## 789                                         
## 790           Mrs Zorraine M Zoey Waguespack
## 791                Mrs Blair Downing Edwards
## 792                         Mr Ray Childress
## 793                              Mr A J Hand
## 794                   Mr Richard Rick Swartz
## 795                        Mr Peter J Garcia
## 796                 Mr William J Bill Burris
## 797                        Mr Martin E Coady
## 798                          Hillary J Crain
## 799              Mrs Allison Hopkins Penzato
## 800                       Reginald T Badeaux
## 801                  Mr William Rusty Knight
## 802               Mrs Mary Clemence Devereux
## 803                         Mrs Dawn Amacker
## 804                       Mr Alvin Turner Jr
## 805                          Mr Ralph Tureau
## 806                          Mr Tom Kliebert
## 807                         Mr Guy Holdridge
## 808                       Mrs Jessie LeBlanc
## 809                 Mr Robert A Bob Pitre Jr
## 810                         Mr Ross P LaDart
## 811                     Mr Raymond Ray Steib
## 812                      Walter J Rothschild
## 813                       Mr Michael P Mentz
## 814                         Mr Steve Enright
## 815                  Mrs Ellen Shirer Kovach
## 816              Mr Donald A Donnie Rowan Jr
## 817                       Mr Glenn B Ansardi
## 818                       Mrs Nancy A Miller
## 819                Mrs June Berry Darensburg
## 820                     Mr Lee V Faulkner Jr
## 821                  Mr Stephen Steve Grefer
## 822                   Mr Henry G Sullivan Jr
## 823                Mr Cornelius E Conn Regan
## 824                    Mr John J Molaison Jr
## 825                          Mr Kevin Conner
## 826                     Mr Michael D Clement
## 827                    Mr Michael Mike Craig
## 828                     Mr Ford E Stinson Jr
## 829                              Mr Jeff Cox
## 830                       Mr John M Robinson
## 831                           Mr Mike Nerren
## 832                           Mr Parker Self
## 833                         Mr Alonzo Harris
## 834                Mr James P Jim Doherty Jr
## 835                       Mr Donald W Hebert
## 836                        Mr Ellis J Daigle
## 837                  Mr J Christopher Peters
## 838                     Mr Emile R St Pierre
## 839                        Mrs Lauren Lemmon
## 840                        Mrs Michele Morel
## 841                        Mr Vernon B Clark
## 842                             Mr John Ford
## 843                  Mr James R Jim Mitchell
## 844                         Mr Steve Gunnell
## 845                     Mr George J Larke Jr
## 846                         Mr John R Walker
## 847                    Mr Timothy C Ellender
## 848                     Mr David W Arceneaux
## 849           Mr Randall L Randy Bethancourt
## 850                            Mr Joel Davis
## 851                        Mrs Patricia Cole
## 852                  Mr Robert A Bob Buckley
## 853              Mr Manuel A Manny Fernandez
## 854                         Mr Perry Nicosia
## 855                         Mr Kirk A Vaughn
## 856                     Mr Jacques A Sanborn
## 857           Mr Warren Daniel Danny Willett
## 858                    Mrs Martha Ann O'Neal
## 859                        Mr Kerry Anderson
## 860                           Mr Don C Burns
## 861               Mrs Penelope Quinn Richard
## 862                          Mr Lewis O Sams
## 863                   Mrs Mary Hotard Becnel
## 864                     Mrs Madeline Jasmine
## 865                       Mr Sterling Snowdy
## 866                      Mr Robert E Burgess
## 867                       Mr Charles B Adams
## 868                Mrs Tiffany Gautier Chase
## 869                   Mrs Regina Bartholomew
## 870                     Mr Sidney H Cates IV
## 871                     Mr Lloyd J Medley Jr
## 872                        Mrs Clare Jupiter
## 873               Mr Christopher Chris Bruno
## 874                      Mrs Robin Giarrusso
## 875                    Mr Michael G Bagneris
## 876                        Mrs Piper Griffin
## 877                          Mrs Paula Brown
## 878                                         
## 879                          Mr Kern A Reese
## 880                       Mrs Paulette Irons
## 881                         Mrs Ethel Julien
## 882                   Mrs Bernadette D'Souza
## 883                         Mrs Laurie White
## 884             Mrs Tracey FlemingsDavillier
## 885                    Mr Benedict J Willard
## 886                       Mr Frank A Marullo
## 887                  Mrs Keva LandrumJohnson
## 888                        Mrs Robin Pittman
## 889                       Mr Julian A Parker
## 890                        Mrs Camille Buras
## 891                         Mrs Karen Herman
## 892                       Mr Darryl Derbigny
## 893                         Mr Arthur Hunter
## 894                        Mr Franz Zibilich
## 895                       Mr Gerard J Hansen
## 896                        Charles Rex Scott
## 897                    Mr Jonathan M Stewart
## 898                         Mr Robert W Levy
## 899                         Mr Jerry L Jones
## 900                   Mr John Mack Lancaster
## 901                        Mr James E Paxton
## 902                      Mr Bradley R Burget
## 903                      Mr R C Chris Nevils
## 904                     Mr James C Jam Downs
## 905                           Mr Van H Kyzar
## 906                         Mr Don M Burkett
## 907            Mr Charles Charlie Riddle III
## 908                         Mr Trent Brignac
## 909                         Mr John DeRosier
## 910                        Mr Michael Harson
## 911                          Mr J Phil Haney
## 912              Mr Camille A Cam Morvant II
## 913               Mr Richard J Ricky Ward Jr
## 914                      Mr Hillar Moore III
## 915                         Mr Sam D'Aquilla
## 916                    Mr Scott M Perrilloux
## 917                         Mr Walter P Reed
## 918                           Mr Ricky Babin
## 919                     Mr Paul D Connick Jr
## 920                      Mr Charles J Ballay
## 921                       Mr Schuyler Marvin
## 922                           Mr Earl Taylor
## 923                          Mr Reed Walters
## 924                    Mr Joel T Chaisson II
## 925                           Mr Asa Skinner
## 926                     Mr Michael C Cassidy
## 927                          Mr Joe Waitz Jr
## 928                          Mr H Todd Nesom
## 929                    Mr John F Jack Rowley
## 930                   Mr James P Jay Lemoine
## 931                          Mr David Burton
## 932                          Mr W Mark McKee
## 933                        Mr Cecil R Sanner
## 934                        Mrs Julie C Jones
## 935                         Thomas Tom Daley
## 936                  Mr Richard Z Johnson Jr
## 937                  Mr Leon A Cannizzaro Jr
## 938                 Mrs Lynette Young Feucht
## 939                           Mr R Lee Irvin
## 940                            Mr Bill Kelly
## 941                          Pammela Lattier
## 942                           Mrs Sheva Sims
## 943                      Mr Terry J Darbonne
## 944                      Mr Charlie Caldwell
## 945                  Mr Charles E Langlinais
## 946                           Mr Ron Roberts
## 947                     Mr Claud Rusty Moody
## 948                       Mr Cedric B Glover
## 949                     Mrs Kathy  M Richard
## 950                    Mrs Berline B Sonnier
## 951                       Mr Carol Broussard
## 952                     Mr Johnny Thibodeaux
## 953                       Mr Reggie G Skains
## 954                        Mr Preston Rogers
## 955                       Mr Brannon J Decou
## 956                           Mr Ronald Dies
## 957                      Mr Richard  B Mizzi
## 958                        Mr Allen Ivory Jr
## 959                       Mr James Broussard
## 960                          Mr Earl Roberts
## 961                      Mr Mark A McLelland
## 962              Mr I Jackson Jack Burson Jr
## 963                      Mr John J J Jenkins
## 964                        Mr Johnnie M Foco
## 965                         Mr Vincent Labue
## 966                        Mr Hayward Steele
## 967                       Mr Rodney J Bellon
## 968                         Mr Scott Saunier
## 969                       Mrs Mona F Jenkins
## 970                       Mrs Sarah A Trahan
## 971                          Mr Dwayne Smith
## 972                   Mr Timothy Slim Derise
## 973                       Mr Frank Ceasar Sr
## 974                  Mr Donald Phonse Martin
## 975                  Mrs Mildred D Delcambre
## 976                     Mrs Annette K Guidry
## 977                      Mr Ricky J Lagrange
## 978                            Mr Todd Meche
## 979             Mrs Stephanie Stelly Navarre
## 980                       Mr Louis  E Stelly
## 981                   Mr Eugene Gene Cahanin
## 982                       Mr Jimmy Champagne
## 983                    Mr Daniel J Forestier
## 984             Mrs Marquita Robertson Henry
## 985                        Mr Carroll Pepper
## 986                       Mrs Sheree H Allen
## 987                            Mr Myron Toft
## 988                   Mr John Edward Wallace
## 989                    Mrs Barbara B Daniels
## 990                    Mr William Terry Enis
## 991                          Mr Arnold Jones
## 992                         Mr Roland Miller
## 993                     Mrs Germaine Simpson
## 994                     Mr James Jr Bergeron
## 995                        Mr Scott Fontenot
## 996                    Rose Wilson McCulloch
## 997                          Mr Jeff Everson
## 998                           Oliver Jenkins
## 999                      Mr Michael D Corbin
## 1000                             Mr Ron Webb
## 1001                            Mr Joe Shyne
## 1002              Mr Samuel L Sam Jenkins Jr
## 1003             Mrs Angelique G Angel Racca
## 1004                       Mr Robert Bo Rice
## 1005                        Mr David M Bonin
## 1006                Mrs Faith Buckley Thomas
## 1007                          Mr Ray Bourque
## 1008                     Mr Gordon C Jenkins
## 1009                       Mr Harold Johnson
## 1010            Mrs Elizabeth Storer Granger
## 1011                   Mr Kenny Higginbotham
## 1012                 Mr Joseph Joe Siciliano
## 1013                             Mr Ray Gary
## 1014                       Mr Jerrl Thompson
## 1015                                        
## 1016                                        
## 1017                                        
## 1018                                        
## 1019                                        
## 1020                                        
## 1021                                        
## 1022                                        
## 1023                          Mr Steve Barry
## 1024                          Mr Rick Beslin
## 1025                        Mr Eric Fontenot
## 1026                        Mr Bryan Francis
## 1027                                        
## 1028                                        
## 1029                        Mrs Sandi Maples
## 1030                        Mr Louis Soileau
## 1031                  Mrs Helen Blue Garrett
## 1032                    Mr Frank Bergeron Jr
## 1033                        Mr Mac Atteberry
## 1034                       Mr Larry G Miller
## 1035                       Mr Wayne Melancon
## 1036              Mr Robert T Robby Barousse
## 1037              Mr James J Jimbo Petitjean
## 1038                          Mr Mark Dawson
## 1039                   Mr Alton Al Stevenson
## 1040                   Mr AJ Fatty Broussard
## 1041                Mrs Julie LeJeune Borill
## 1042                          Mr Dale Trahan
## 1043                      Mr Jimmie Pellerin
## 1044                        Mr A Jay Credeur
## 1045                          Mr David Savoy
## 1046                      Mr Robert J Guidry
## 1047          Mrs Marie Elise M'elise Trahan
## 1048           Mr James M Jim Cunningham III
## 1049                      Mr Glenn J Deville
## 1050                     Mr Alex Joe Lacroix
## 1051                       Mr Israel G Syria
## 1052            Mr Douglas John Doug LaCombe
## 1053                         Mr Lynn Shamsie
## 1054                         Mr John A Suire
## 1055                         Janet Boudreaux
## 1056                        Mr Gene I Daigle
## 1057               Mr James Boz Higginbotham
## 1058                         Mr Milton Simar
## 1059                         Mr Wayne Doucet
## 1060                    Mr Elton Bee Cormier
## 1061                      Mr Elridge Pousson
## 1062          Mr Lawrence Rusty Broussard Jr
## 1063                      Mr Horace Darbonne
## 1064                     Mr James June Meche
## 1065                        Mr Ferdie Miller
## 1066                          Mr Mike Habetz
## 1067                           Mr Treg Myers
## 1068             Mrs Suzellen Stroderd Lopez
## 1069                         Mr Greg A Jones
## 1070                     Mr Roland Boudreaux
## 1071                      Mr Roger Boudreaux
## 1072            Mrs Cynthia F Cindy McDaniel
## 1073                       Mr Anthony Borill
## 1074                          Mr David Fruge
## 1075                   Mr Robert Butch Istre
## 1076                           Mr K P Gibson
## 1077                       Mr Carroll Stelly
## 1078                  Mr Albert J Venable Sr
## 1079                  Mr David Scott Pousson
## 1080                        Mr Kevin LeBlanc
## 1081                        Ricky S Istre II
## 1082                   Mr Jason Todd Richard
## 1083                    Mr Steven C Premeaux
## 1084                         Mr Paul Molbert
## 1085               Mr Nicholas Nick Bouterie
## 1086                           Mr Troy Lantz
## 1087                       Mr Raleigh Miller
## 1088                       Mr Warren Pousson
## 1089                    Mrs Brenda H Prather
## 1090                  Mrs Donna Kay Bertrand
## 1091                      Mr Donald Don Popp
## 1092                           Mr Tim Savant
## 1093                         Mr Troy Cormier
## 1094             Mr Ernest Sheeney Gautreaux
## 1095                         Mrs Darla Istre
## 1096                   Mr Roger Red Fuselier
## 1097                      Mrs Peggy S Romero
## 1098                  Mrs Darlene Thibodeaux
## 1099         Mrs Anna Ann DomingueWashington
## 1100                         Mr Jeffrey Dore
## 1101            Mrs Kathleen Kitty Valdetero
## 1102                  Mrs Debra GuidryThomas
## 1103                   Mr Jude Butch Abshire
## 1104                         Mr Bryan Borill
## 1105                   Mr Lyle O Fogleman Jr
## 1106                          Mrs Joy Daigle
## 1107                       Mr Michael Doucet
## 1108                   Mr Vernon Step Martin
## 1109                      Mrs Laurita D Pete
## 1110                     Mr Gary J Duplechin
## 1111                       Mr Gerald Foreman
## 1112                          Mr Elliot Dore
## 1113                     Mrs Mary T Melancon
## 1114                   Mrs Aimia MiMi Doucet
## 1115                       Mr Donald LeJeune
## 1116                       Mr Jonathan Jones
## 1117                                        
## 1118                                        
## 1119                      Mr Joe Abrusley Jr
## 1120                                        
## 1121                                        
## 1122                                        
## 1123                                        
## 1124                    Mrs Margaret E Murry
## 1125                                        
## 1126                                        
## 1127                                        
## 1128                                        
## 1129                                        
## 1130                                        
## 1131                                        
## 1132                          Mr Doug Hebert
## 1133                    Mr Gerald Harrington
## 1134                       Mr Richard C Earl
## 1135                            Mr Don Nesom
## 1136                     Mr Ruffin George Jr
## 1137                         Mr Heath Ardoin
## 1138                   Mr John W Strother Jr
## 1139                    Mr Huey Creig Vizena
## 1140                         Mr Doug Sonnier
## 1141                        Mr Matt Fontenot
## 1142                        Mr Kent Fontenot
## 1143                       Mrs Judi Abrusley
## 1144                    Mr Joseph Lockett Sr
## 1145                      Mrs Alma W Johnson
## 1146                        Mrs Cathy Farris
## 1147                       Mr Steven Sumbler
## 1148                         Mr Jason Turner
## 1149                     Mr Gregory Monceaux
## 1150                      Mrs Carolyn Manuel
## 1151                        Mr Brett Fawcett
## 1152                          Ronald Craiger
## 1153                          Mr Ron Craiger
## 1154                  Mrs Billie Faye Felice
## 1155                          Mr Chad Reeves
## 1156                   Wilbert Lucian LeBleu
## 1157                         Mr Donnie Shuff
## 1158                      Mr Ryland Dunnehoo
## 1159                    Mr Donald Don Dowies
## 1160                            Mr Gene Paul
## 1161                   Mr Robert Bob Crafton
## 1162                         Mr Estes Ledoux
## 1163                           Mr Rick Smith
## 1164                       Mr Scott R Walker
## 1165                       Mr Scotty LaBorde
## 1166                           Mr Shane Ware
## 1167                       Mr Gary G Pelican
## 1168                       Mr Grady K Haynes
## 1169                          Mr Buddy Estay
## 1170                      Mr Wayne Courville
## 1171                     Mr George A Ashy II
## 1172                          Mr CJ Fontenot
## 1173                        Mr Mark E Manuel
## 1174                           Mr Phil Beard
## 1175                  Mrs Linda Whip Boulden
## 1176                        Mrs Janice Simon
## 1177                         Mr Wayne A Earl
## 1178                        Mrs Lydia Kingan
## 1179                       Mr Bobby Saunders
## 1180                           Mr Dave Smith
## 1181                       Mrs Shirley Smith
## 1182                       Mr Michael Dotson
## 1183                           Mr Mick Estay
## 1184                 Mrs Jean Jeanne Markway
## 1185                  Mrs Gwendolyn Alsburry
## 1186                         Mr Ferda Wykoff
## 1187                 Mr Fredrick Pos Douglas
## 1188                          Mr Lowell Keys
## 1189                      Mr Ervin Willis Sr
## 1190                       Mrs Susan Doumite
## 1191                      Mr Ralph Stapleton
## 1192 Mrs Angela Weatherford Angie Van Norman
## 1193                             Mr LC Irvin
## 1194                        Mr Jerry Thibeau
## 1195                        Mr Oliver Joseph
## 1196                                        
## 1197                      Mr Jesse J Bartley
## 1198                                        
## 1199                     Mr Alton AJ Nickens
## 1200                                        
## 1201                      Mr Larry H Christy
## 1202                                        
## 1203                                        
## 1204                  Mrs Shirley Waguespack
## 1205                                        
## 1206                      Mr Todd P Gautreau
## 1207                     Mrs Kathryn Goppelt
## 1208                     Mr Coral CJ Lambert
## 1209            Mr Ernest F Joe Opperman III
## 1210                         Mr Alvin Robert
## 1211                           Dwayne Bailey
## 1212                    Mrs Elsie JoAn Brown
## 1213                         Mr Robert W Lee
## 1214                   Mr Milton Clouatre Jr
## 1215                     Mrs Kathy Edmonston
## 1216                                        
## 1217           Mr Douglas A Doug Hillensbeck
## 1218                             Jeremy Epps
## 1219                     Mrs Cheryl Fontenot
## 1220                       Mrs Tiffani Brown
## 1221                 Mrs Samantha Thibodeaux
## 1222                     Mrs Marilyn Lambert
## 1223                      Mr Jeffrey F Wiley
## 1224                  Mr Kermit Hart Bourque
## 1225                   Mr M J Mert Smiley Jr
## 1226                       Mr John F Fraiche
## 1227                       Mr Tommy Martinez
## 1228                        Mr Oliver Joseph
## 1229                   Mr Kent A Schexnaydre
## 1230                        Mr Travis Turner
## 1231                 Mr Daniel Doc Satterlee
## 1232                      Mr Dempsey Lambert
## 1233                  Mr Randy T Clouatre Sr
## 1234                           Mr Chris Loar
## 1235                          Mrs Teri Casso
## 1236                         Mr Todd Lambert
## 1237                       Mr Bryan Melancon
## 1238                        Mr Benny Johnson
## 1239                   Mrs Catherine C Davis
## 1240                  Mr Thomas Moose Pearce
## 1241                  Mr Richard Coach Brown
## 1242                           Mr Kerry Diez
## 1243                        Mr John D Murphy
## 1244                          Mr A J Nickens
## 1245                    Mr Taft C Kleinpeter
## 1246                   Mrs Lorraine Wimberly
## 1247                    Mr Jamie L Bourgeois
## 1248                   Mr Troy J Gautreau Sr
## 1249                  Mrs Patricia Pat Russo
## 1250                        Mr Andrew Falcon
## 1251                    Mr Leroy J Laiche Jr
## 1252                        Mr John C Hebert
## 1253                Mr Andrew Banana LeBlanc
## 1254                   Mr Danny P Thibodeaux
## 1255                Mr James E Chief LeBlanc
## 1256                    Mr Leroy Sullivan Sr
## 1257                   Mr Barney D Arceneaux
## 1258                Mr Wilson Longanecker Jr
## 1259                      Mr Sherman Jackson
## 1260                      Mr Earl Theriot Jr
## 1261                    Mr Earl L Theriot Jr
## 1262                Mr Lauthaught Delaney Sr
## 1263                       Mr Raymond Aucoin
## 1264                  Mr Reginald Francis Sr
## 1265                        Mr Charles Brown
## 1266                        Mr Emile J Spano
## 1267                Mr Kenneth Kenny Matassa
## 1268                       Mr Kirk Boudreaux
## 1269                    Mr Timothy Vessel Sr
## 1270                      Mr Terance L Irvin
## 1271                       Mr Gary J Lacombe
## 1272                        Mr Jason R Adams
## 1273                           Mr Randy Anny
## 1274                      Mr Marvin L Martin
## 1275           Mr Milton Needlenose Vicknair
## 1276                          Mr John Wright
## 1277                                        
## 1278                      Mr Patrick Lawless
## 1279                    Mrs Darlene D Landry
## 1280                                        
## 1281                                        
## 1282                    Mr Spergeon Holly Jr
## 1283                   Mr Christopher Carter
## 1284                                        
## 1285                    Mrs Karen St Germain
## 1286                                        
## 1287                                        
## 1288                                        
## 1289                                        
## 1290                                        
## 1291                                        
## 1292                         Mrs Abby Daigle
## 1293                                        
## 1294                                        
## 1295                                        
## 1296                                        
## 1297                      Mr Mike Waguespack
## 1298                      Mrs Darlene Landry
## 1299                  Mr Wayne Cat Blanchard
## 1300                         Mr Keith Landry
## 1301                      Mr Patrick Lawless
## 1302                Mr Jeff Big Daddy Naquin
## 1303                       Mr Irving Comeaux
## 1304                      Mr Patrick Johnson
## 1305                         Mr Marty Triche
## 1306                      Mr Calvin JC James
## 1307                        Mr Henry J Dupre
## 1308                     Mr Booster J Breaux
## 1309                     Mr Myron J Matherne
## 1310                        Mr Honoray Lewis
## 1311                         Mr Lee Meyer Sr
## 1312                       Mrs Andrea Barras
## 1313             Mrs Electa Fletcher Mickens
## 1314                Mr Lawrence Larry Howell
## 1315               Mr Daniel Jack Washington
## 1316                            Mr John Beck
## 1317                Mrs Jessica Kooney Ourso
## 1318                         Mrs Doris Dugas
## 1319                       Mrs Donna B Booty
## 1320                     Mrs Roselyn Peltier
## 1321                Mrs Bridget Marie Landry
## 1322                     Mr Maurice Southall
## 1323               Mr Richard Roach Arcement
## 1324                     Mr Jamie P Ponville
## 1325                       Mr Ron Animashaun
## 1326                          Mrs Joyce Bell
## 1327                      Mr Richard Bilello
## 1328                      Mr Renard Southall
## 1329                                        
## 1330                                        
## 1331                                        
## 1332                                        
## 1333                                        
## 1334                                        
## 1335                                        
## 1336                                        
## 1337                                        
## 1338                                        
## 1339                                        
## 1340                                        
## 1341                                        
## 1342                                        
## 1343                                        
## 1344                                        
## 1345                                        
## 1346                                        
## 1347                                        
## 1348                                        
## 1349                     Mr Douglas Anderson
## 1350                  Mrs Connie B Couvillon
## 1351                         Mr Emeric Dupuy
## 1352                  Mr Lovell LJ Mayeux Jr
## 1353                    Mr Samuel Sam Piazza
## 1354                      Mr Kirby A Roy III
## 1355                          Mr Mark Borrel
## 1356                     Mr Glenn B McKinley
## 1357                  Mr Charles Sonny Jones
## 1358                  Mr McKinley Pop Keller
## 1359              Mr Jimmy J Dr Jim Guillory
## 1360                          Mr John Earles
## 1361                     Mr George L Mayeaux
## 1362                        Mr James H Mixon
## 1363                    Mr Angelo Piazza III
## 1364                       Mr Fred Carmouche
## 1365                        Mr Floyd Voinche
## 1366                         Mr Freeman Ford
## 1367                        Mr Darrell Wiley
## 1368                   Mr Carlos A Mayeux Jr
## 1369                       Mr James Gauthier
## 1370                Mrs Shelia BlackmanDupas
## 1371                      Mrs Lizzie Liz Ned
## 1372                  Mr Michael Pea Lacombe
## 1373                            Mr Van Kojis
## 1374                  Mrs Cynthia Cindy Hill
## 1375                   Mr Jerry Wayne McNeal
## 1376                       Mr Sterling Hayes
## 1377                           Mr Gerald Roy
## 1378                 Mrs Christine Carmouche
## 1379              Mrs Eugenia Geane Desselle
## 1380                         Ronald McDonald
## 1381                    Mr Ronald A McDonald
## 1382                      Mr Chris J Lemoine
## 1383                     Mr Robert J Lemoine
## 1384                       Mr John M Hathorn
## 1385                         Mr Bert Lemoine
## 1386                           Mr Marvin Roy
## 1387                     Mrs Michele Guillot
## 1388                      Mr Ernest Desselle
## 1389                   Mr Sylvester Callihan
## 1390                    Mr Leon Ray Rabalais
## 1391                       Mr Jason Bergeron
## 1392              Mrs Sandra D Sandy Lemoine
## 1393                       Mr Mike Robertson
## 1394                         Mr John Lemoine
## 1395                 Mr William Scotty Scott
## 1396                        Mr John M Armand
## 1397                   Mr Kenneth Pickett Sr
## 1398                            Mr Eric Rusk
## 1399                        Mr Travis Franks
## 1400                      Mr Timmy A Lemoine
## 1401                     Mr Terryl St Romain
## 1402                       Mrs Mary L Fanara
## 1403                     Mr Earnest Anderson
## 1404                         Mr John Johnson
## 1405                           Dale J Dupuis
## 1406                        Mr Kenneth Smith
## 1407                    Mr Charles Mayeux Jr
## 1408                       Mr Greg Prudhomme
## 1409                    Mr Charles Austin Jr
## 1410                   Mr Curtis J Francisco
## 1411                      Mrs Brenda Sampson
## 1412                         Mr Earl R Adams
## 1413                           Mr Ted Turner
## 1414                       Mr Craig W Foster
## 1415                      Mr Mike Gremillion
## 1416                      Mr Kenneth L Marsh
## 1417                        Mr Travis Armand
## 1418                Mr Elliot Pete Jordan Jr
## 1419                    Mr Myron Keith Brown
## 1420               Mr Clayton Rick Henderson
## 1421                         Mrs Joyce Prier
## 1422                    Mr Sherman R Bell Sr
## 1423                      Mr Daniel L Decuir
## 1424                       Mrs Wanda S Clark
## 1425               Mrs Michelle Mayeux Dupuy
## 1426                    Mrs Kathy A Joffrion
## 1427               Mrs Heather Oliver Juneau
## 1428                 Mr Kenneth Ken Thompson
## 1429               Mrs Judy Augustine Bazert
## 1430                     Mrs Connie D Ducote
## 1431                        Mr Gaon E Escude
## 1432                     Mrs Lucille B Hayes
## 1433               Mr Phillip Pecan Lucas Jr
## 1434                       Mr Keith P Armand
## 1435                       Mr Donald Bernard
## 1436                           Mr Joshua Roy
## 1437                       Mr Felix Benjamin
## 1438                    Mr Oscar OP Goody Jr
## 1439                         Mr Penn Lemoine
## 1440                     Mr Craig Gremillion
## 1441                    Mrs Andrea G Lemoine
## 1442                Mr Lawrence Chock Taylor
## 1443             Mrs Margaret Prater Jenkins
## 1444                     Mr Kenneth W Friels
## 1445                           Mr Luke Welch
## 1446                 Mrs Brenda Moore Bazile
## 1447                   Mrs Frankie Mae Evans
## 1448                      Mrs Jennifer Handy
## 1449                   Michael Dwayne Harris
## 1450                      Mrs Jonnie F Mango
## 1451                       Mr Robert Bo Rice
## 1452                                        
## 1453                                        
## 1454                   Mrs Kathy JonesBruner
## 1455                                        
## 1456                          Linda D Bailey
## 1457                                        
## 1458                                        
## 1459                                        
## 1460                                        
## 1461                                        
## 1462                      Mr David R Lestage
## 1463                 Mr James Ramsey Lestage
## 1464                                        
## 1465                                        
## 1466                                        
## 1467                                        
## 1468                                        
## 1469                                        
## 1470                                        
## 1471                                        
## 1472                                        
## 1473                                        
## 1474                        Mr Ricky L Moses
## 1475                      Mr Brian S Lestage
## 1476                     Mr Brent Rutherford
## 1477                       Mr Flynn A Taylor
## 1478                      Mr Gerald M McLeod
## 1479                 Mr N R Rusty Williamson
## 1480                      Mr Carlos Archield
## 1481                       Mr SE Teddy Welch
## 1482                    Mr Johnnie E Bennett
## 1483                         Mr Gary D Crowe
## 1484                      Mr Jerry L Shirley
## 1485                          Mr Brad Harris
## 1486              Mr Llewellyn Biscuit Smith
## 1487                        Mr Ronnie Libick
## 1488                  Mr Russell W Havens Jr
## 1489                     Mr Charles E Hudson
## 1490                   Mrs Kathy JonesBruner
## 1491                        Mr Jimmy Barrett
## 1492                      Mr David Q Vidrine
## 1493                          Mr Randy Brown
## 1494                      Mr Wesley M Taylor
## 1495                        Mr Darrin Manuel
## 1496                         Mr Jerry Cooley
## 1497                             Mr Don Gray
## 1498                      Mr Allen Ray Brown
## 1499           Mrs Connie E Sissy Williamson
## 1500                       Mr Clyde H Dennis
## 1501                      Mrs Ruthie Huckaby
## 1502                      Mr Alfred Al Doyle
## 1503                           Leonard Stark
## 1504                         Mr Tony Deville
## 1505                          Mr Ray Dickens
## 1506                        Mr Larry Carroll
## 1507                         Mr Craig Lanier
## 1508                         Mr Mark W Allen
## 1509                        Mr Alton Bennett
## 1510                    Mr Beaver B Knighton
## 1511                      Mrs Amanda Pointer
## 1512                          Mr Mance Stark
## 1513                         Mr Roy Lilly Jr
## 1514                                        
## 1515                                        
## 1516                                        
## 1517                                        
## 1518                                        
## 1519                                        
## 1520                                        
## 1521                          Mrs Kathy Sims
## 1522                                        
## 1523                                        
## 1524                                        
## 1525                                        
## 1526                                        
## 1527                                        
## 1528                                        
## 1529                      Mr John E Ballance
## 1530                   Mr James W Jim Martin
## 1531                       Mr Jimmie D Smith
## 1532                            Mr Don Smith
## 1533                            Mr Bill Sims
## 1534                       Mr Jerry Roberson
## 1535                         Mr Darryl Ryder
## 1536                          Mr Greg Wilson
## 1537                   Mr Joseph Tony Lawson
## 1538                        Mr Mike McCarthy
## 1539                       Mr Raymond Malone
## 1540                            Mr Dan K Loe
## 1541             Mrs Esther Ballard Sullivan
## 1542                  Mrs Freddie Mae R Blow
## 1543                     Mrs Bonita Reliford
## 1544                      Mrs Martha B Grigg
## 1545                 Mr Kenneth Larry Knotts
## 1546                       Mr Richard Walker
## 1547                         Mr David E Cook
## 1548                        Mr Reginald Shaw
## 1549                      Mrs Melanie Jordan
## 1550                       Mr Ryanie O Evans
## 1551                    Mr David W McConathy
## 1552                      Mr Craig A Jenkins
## 1553                      Mr Darren Brackens
## 1554                      Mr Randall Bradley
## 1555               Mr Eugene L Rudy Basinger
## 1556                        Mr R Yale Poland
## 1557                         Mr Eugene Smith
## 1558                             Mr Odis Key
## 1559                      Mr Charles Andrews
## 1560                      Mr Stephone Taylor
## 1561                        Mr Wesley Boddie
## 1562                   Mr Donald Donnie Byrd
## 1563                       Mrs Vicki Pickett
## 1564                     Mr James Ralph Todd
## 1565                     Mr Tommy L Thompson
## 1566                   Mr Robert R D Slayton
## 1567                        Mr Victor Rogers
## 1568                        Mr Shelton Scott
## 1569                         Rickey A Pearce
## 1570                        Mr Victor Mcneal
## 1571                       Mr Sammy Matthews
## 1572                         Mr Timmy L Cato
## 1573                      Mr Marketris Jones
## 1574                     Mr Alvin Pearson Jr
## 1575                      Mrs Delinda Wright
## 1576                          Mr Aaron Clark
## 1577                       Mrs Ruby L Grubbs
## 1578                       Mr Herbert Newman
## 1579               Mrs Ora Elizabeth H Towns
## 1580                       Mr Philip L Towns
## 1581                    Mrs Dorothy Anderson
## 1582                       Mrs Marcie Boston
## 1583                      Mr Roy Steve Walls
## 1584                         Mr James E Moss
## 1585                         Mr Don M Travis
## 1586                       Mr Eugene Venzant
## 1587                       Mr Charles Harper
## 1588                        Mr Mark Plunkett
## 1589                         Mrs Beth Warren
## 1590                      Mr Conley Ray Bare
## 1591                          Mrs Kelly Todd
## 1592                      Mr James G Wiggins
## 1593                      Mr Columbus Boston
## 1594                        Mr Raymond Calep
## 1595                        Mr Devertis Lard
## 1596                     Mrs Brenda Matthews
## 1597                 Mrs Jennifer M Matthews
## 1598                     Mrs Dorothy Satcher
## 1599                   Mrs Patricia Sullivan
## 1600                   Mr Sherwon Williamson
## 1601                     Mrs Doreatha Nelson
## 1602                   Mrs Maggie C Roberson
## 1603                           Mr Billy Cook
## 1604                   Mrs Mattye Lou Harris
## 1605                        Mr Gary Carlisle
## 1606                  Mr Johnny Lee Shepherd
## 1607                           Mr Bobby Guin
## 1608                           Mr Larry Hays
## 1609                      Mr Keith C Johnson
## 1610                        Mr Alan Clayborn
## 1611                       Mr Lee A Jeter Sr
## 1612                                        
## 1613                                        
## 1614                                        
## 1615                                        
## 1616                                        
## 1617                                        
## 1618                                        
## 1619                                        
## 1620                                        
## 1621                                        
## 1622                                        
## 1623                                        
## 1624                         Mrs Laura Adley
## 1625                     Mr Bobby W Edmiston
## 1626                          Mr Duke Lowrie
## 1627                       Mr Mike McConnell
## 1628                        Mr Jeff Thompson
## 1629                                        
## 1630                                        
## 1631                         Mr Mike Collier
## 1632                                        
## 1633                          Mr Richard Ray
## 1634                          Mrs Anne Price
## 1635                                        
## 1636                           Mr Ryan Gatti
## 1637                                        
## 1638                                        
## 1639                           Mr Jerry Kutz
## 1640                                        
## 1641                 Mr Julian C Whittington
## 1642                      Mrs Cindy Johnston
## 1643                     Mr Bobby W Edmiston
## 1644                      Mr John M Chandler
## 1645                 Mr Coach Bob Brotherton
## 1646                         Mr Glenn Benton
## 1647                     Mrs Wanda S Bennett
## 1648                           Mr Sonny Cook
## 1649                     Mr Jack Bump Skaggs
## 1650                         Mr Rick L Avery
## 1651                Mr James O Jimmy Cochran
## 1652                Mr Douglas E Doug Rimmer
## 1653                      Mr Freddy Shewmake
## 1654                         Mr Jerome Darby
## 1655                      Mr W Wayne Hammack
## 1656                   Mr Paul M Mac Plummer
## 1657             Mr Thomas A Tommy Wilson Jr
## 1658                          Mr Lynn Austin
## 1659                           Mr Jack Raley
## 1660                        Mr Brad Bockhaus
## 1661                   Mrs Allison O Brigham
## 1662                   Mrs Tammy Armer Smith
## 1663                  Mr Michael Mike Mosura
## 1664              Mr Glenwood L Glen Bullard
## 1665                            Mr J W Slack
## 1666                      Mr Kenneth Wiggins
## 1667                     Mr Eddy Ray Presley
## 1668                   Mrs Sandra Samm Darby
## 1669                      Mrs Barbara B Rudd
## 1670                    Mrs Kay Padgett Byrd
## 1671                         Mr Tom Carleton
## 1672                      Mr Clifford Cannon
## 1673                       Mr Robert Hamiter
## 1674                      Mrs Julia A Budwah
## 1675                 Mrs Lorraine S Ragsdale
## 1676                         Mr Charles Gray
## 1677                       Mr Cullen B Keith
## 1678                         Charles R Logan
## 1679                       Mr Eddie Chandler
## 1680                     Mr Roy Tony Jenkins
## 1681                Mr Ronald Ronnie Matlock
## 1682                          Charles Scholz
## 1683                     Mr Kenneth Stephens
## 1684                              Jeff Weems
## 1685                     Mr Lorenz Lo Walker
## 1686                     Mr Lorenz Lo Walker
## 1687                       Mr Wayne Cathcart
## 1688              Mr Carlton Peewee Anderson
## 1689                       Mr Wiley Robinson
## 1690                    Mr Charles Pilkinton
## 1691                    Mr Rodney Farrington
## 1692                        Mr Ronnie Murray
## 1693                           Mr Tim Larkin
## 1694                       Mr Timothy Larkin
## 1695                Mr David A Montgomery Jr
## 1696                Mr David A Montgomery Jr
## 1697                        Mr Ronnie Griggs
## 1698                          Mr Jeff Benson
## 1699                   Mr Terry J Richardson
## 1700                      Mr Richard Jackson
## 1701                     Mrs Linda Ann Gates
## 1702                        Mrs Doris Grappe
## 1703                           Mr Jack Hicks
## 1704                   Mrs Martha Wynn McGee
## 1705                      Mr Elbert Winfield
## 1706             Mrs Charlotte Giles Hamiter
## 1707                       Mrs Linda Hamiter
## 1708                        Mr Scott P Irwin
## 1709                         Mr Jeff D Darby
## 1710                 Mr Jeffery D Jeff Darby
## 1711                   Mr Don Bubba Williams
## 1712                   Mr Don Bubba Williams
## 1713                            Mr Jeff Free
## 1714                          Mr David Jones
## 1715                        Mr Larry Hanisee
## 1716                      Mr Willie Bradford
## 1717                           Mr Artis Cash
## 1718                  Mrs Earnestine Coleman
## 1719                      Mr Larry Ferdinand
## 1720                Mrs Deloris Deedee Lynch
## 1721                     Mrs Allison A Jones
## 1722                     Mr Lyndon B Johnson
## 1723                       Mrs June Phillips
## 1724                      Mrs Frances Kelley
## 1725                      Mrs Lillian Priest
## 1726                        Mr Steve Jackson
## 1727                     Mrs Stephanie Lynch
## 1728                Mrs Michelle M AndrePont
## 1729                        Mrs Eileen Velez
## 1730                                        
## 1731                    Mr Michael D Hall Sr
## 1732                     Mr James E Heard Sr
## 1733                        Mr Harold Coates
## 1734                         Mr Alan W Koloc
## 1735                      Mr Creighton Light
## 1736                        Mrs Betsy Malone
## 1737                         Mr Barry Rachal
## 1738                      Mr Neil B Carlisle
## 1739                      Mrs Nancy T Adcock
## 1740                                        
## 1741               Mr Edward Eddie Brossette
## 1742                                        
## 1743                                        
## 1744                                        
## 1745                     Mr Louis R Avallone
## 1746                        Mr Jimmy C Allen
## 1747                     Mr Stephen C Gibson
## 1748                                        
## 1749                      Mr Micheal Collins
## 1750                        Mrs Shonda Stone
## 1751                              Paul Young
## 1752                           David Matlock
## 1753                 Mr Stephen Steve Prator
## 1754                          Mr Gary Loftin
## 1755               Mr Charles R Henington Jr
## 1756                         Mr Todd G Thoma
## 1757                        Mr Doug Dominick
## 1758                     Mr Lyndon B Johnson
## 1759                     Mr Michael Williams
## 1760                            Matthew Linn
## 1761                        Mrs Joyce Bowman
## 1762                     Mrs Lindora L Baker
## 1763                     Mrs Stephanie Lynch
## 1764                          Mr John Escude
## 1765              Mr Michael Mike Thibodeaux
## 1766                          Mr David F Cox
## 1767                            Mr Jim Smith
## 1768                      Mr Ken Epperson Sr
## 1769                             Steve Riall
## 1770                     Mrs Jasmine R Green
## 1771                    Mr Carl A Pierson Sr
## 1772                   Mrs Charlotte Crawley
## 1773                       Mr Curtis L Hooks
## 1774                      Mrs Mary A Trammel
## 1775                      Mrs Lillian Priest
## 1776                     Mrs Bonita Crawford
## 1777                         Mr Barry Rachal
## 1778                         Mr Larry Ramsey
## 1779                    Mrs Ginger Armstrong
## 1780                         Mrs Dottie Bell
## 1781                      Mrs Barbara Douget
## 1782                     Mrs Ruth W Johnston
## 1783                            Joe Caldwell
## 1784                       Carl W Pete Copes
## 1785                           Mr Tom Bryson
## 1786                Mrs Glenda Ennis Britton
## 1787                       Mrs Susan Waddell
## 1788                     Mr Gregory M Taylor
## 1789                        Mr Dale A Hopper
## 1790                  Mr Melvin Gene Presley
## 1791                            Mr Paul Sapp
## 1792                         Mr H P Johnston
## 1793                   Mr Tommy E Poindexter
## 1794                          Mr Mike Lowery
## 1795                           Mr Dale G Nix
## 1796                           Mr Don Majure
## 1797                         Mr T A Tom Hyer
## 1798                          Mr John McGrew
## 1799                        Mr Eric Hatfield
## 1800                         Mr J Perry Hart
## 1801                   Mr Johnny V Digilormo
## 1802                        Mr Frank Stawasz
## 1803                    Mrs Ann Holt Dearing
## 1804                  Mr Charles Chip Dickey
## 1805                          Stephen Taylor
## 1806                     Mrs Jennifer C Fant
## 1807                         Mrs Helen Adger
## 1808                         Mrs Susie Giles
## 1809                   Mr Kenneth Kenny Shaw
## 1810                       Mr Paul W Lockard
## 1811                       Mr Gary Presswood
## 1812                          Mr Dale Nix Jr
## 1813                          Mr Ryan Nelson
## 1814                           Mr Major Fant
## 1815                         Mr John D Stone
## 1816                           Mr Whit Giles
## 1817                    Mr David C Austin Jr
## 1818                     Mr Travis McCracken
## 1819                         Mr Belton Moore
## 1820                         Mr Robbin Haley
## 1821                        Mr William Moore
## 1822                    Mr Phillip A Sparaco
## 1823                           Donny Jackson
## 1824                         Mr James T Sims
## 1825                       Mrs Sharon Emmons
## 1826                     Mr James Clifton Sr
## 1827                          Mr Gary V Cook
## 1828                        Mrs Jewel Jaudon
## 1829                        Mr Thomas Newsom
## 1830                        Mr Brad Edwardes
## 1831                         Mr Nathan Ashby
## 1832                     Mrs Allison A Jones
## 1833                         Mrs Patsy A Lee
## 1834                      Ross V Prewett III
## 1835                       Jimmy Whittington
## 1836                        Mrs Sandy Duncan
## 1837                       Mrs Kathy Jackson
## 1838                      Mr David L Strahan
## 1839                     Mrs Estelle Holemon
## 1840                         Mrs Karen Logan
## 1841                      Mrs Ginger R Stone
## 1842                Mrs Ramona EubanksAnders
## 1843                  Mrs Lydia Born Stewart
## 1844                        Mrs Susan Tinney
## 1845                   Mrs Betty Biddie Dial
## 1846                    Mr Joseph Arien Gott
## 1847                            Mr Tom Tebbe
## 1848                      Mrs Penny Harville
## 1849                       Mr Chad R Perkins
## 1850                       Mr Carroll Slaton
## 1851                    Mr John Pete Shepard
## 1852                  Mr Michael Van Schoick
## 1853                         Mrs Judy Wilson
## 1854                Mr Raymond Earl Williams
## 1855                       Mrs Jane H Player
## 1856                      Mr Phillip J Green
## 1857               Mr Elmer H Sonny Cates Jr
## 1858                     Mr Maurice Griffith
## 1859                Mrs Diana Handy Hamilton
## 1860                          Mr Frank Hyatt
## 1861                   Mr Claude Buddy Leach
## 1862                        George A Navarro
## 1863                   Mrs Mary Leach Werner
## 1864                      Maurice A Griffith
## 1865                           Mary L Morris
## 1866                       Ellaweena G Woods
## 1867                                        
## 1868               Mrs Dorothy DurrettRomero
## 1869                                        
## 1870                         Lewis R Mefford
## 1871                        Mr David Darbone
## 1872                               Neva Nash
## 1873                                        
## 1874                                        
## 1875                                        
## 1876                                        
## 1877                                        
## 1878                                        
## 1879                        Mr R A Bob Dewey
## 1880                      Mr Charles Enright
## 1881                       Mr Vaughn Peltier
## 1882               Mrs Tiffany Nabours Pence
## 1883                      Mr Michael M Kurth
## 1884                                        
## 1885                     Mr Frank D Pellerin
## 1886                                        
## 1887                      Mr Tore J Carlberg
## 1888                                        
## 1889                                        
## 1890                       Mrs Karen Drewett
## 1891                                        
## 1892                                        
## 1893                                        
## 1894                                        
## 1895                                        
## 1896                                        
## 1897                     Mr David A Johnston
## 1898                         Mr Tony Mancuso
## 1899                           Mr Lynn Jones
## 1900              Mrs Wendy Curphy Aguillard
## 1901                          Mr Terry Welke
## 1902                        Mr Shannon Spell
## 1903                           Mr James Mayo
## 1904      Mrs Elizabeth Conway T Bet Griffin
## 1905                        Mr Tony Guillory
## 1906                  Mr Nicholas Nic Hunter
## 1907                     Mr Dennis Ray Scott
## 1908                         Mr Chris Landry
## 1909                            Mr Guy Brame
## 1910                         Mr Kevin Guidry
## 1911                          Mr Tony Stelly
## 1912                         Mrs Sandy Treme
## 1913                           Mr Ray Taylor
## 1914                    Mr Francis Andrepont
## 1915                         Mr Hal McMillin
## 1916                           Mr Les Farnum
## 1917                     Mr Charlie Schrumpf
## 1918                       Mr Thomas P Quirk
## 1919                          Mr John S Hood
## 1920                          Mr Joey Alcede
## 1921                         Mr Billy Guidry
## 1922                          Mr R L Webb Jr
## 1923                   Mr Fredman Fred Hardy
## 1924                       Mrs Clara F Duhon
## 1925                     Mrs Annette Ballard
## 1926                         Mr Dale Bernard
## 1927                       Mr Bill Jongbloed
## 1928                   Mr Mack Dellafosse Jr
## 1929                         Mr Jim Schooler
## 1930               Mr Randall Randy Burleigh
## 1931                       Mr James Jim Karr
## 1932                          Mr Chad Guidry
## 1933                        Mr Joe Andrepont
## 1934                         Mr Billy Breaux
## 1935                     Mr Roman L Thompson
## 1936                       Mr Bryan Larocque
## 1937                       Mr Ashton Richard
## 1938                         Mr Percy Aucoin
## 1939                    Mr Gerald A Fountain
## 1940                     Mrs Darlene Nortman
## 1941                         Mr Danny Landry
## 1942                    Mr Norman Butch Ryan
## 1943                       Mr Louis Michiels
## 1944                Mr Roland Perch Bertrand
## 1945                       Mr Arnold L Smith
## 1946                      Mr Rickey Brummett
## 1947                       Mr Wayne Doucette
## 1948                     Mr Orgy J Broussard
## 1949                    Mr William L Henagan
## 1950                  Mr Randall Randy Roach
## 1951                          Mr Randy Roach
## 1952             Mr Christopher Chris Duncan
## 1953                 Mr Daniel W Danny Cupit
## 1954             Mrs Carol Hilburn Ponthieux
## 1955                   Mr Kenneth  O Stinson
## 1956                    Mr Kenneth O Stinson
## 1957                    Mr Michael Dickerson
## 1958                 Mr Howard Keith Vincent
## 1959                            Mr Ricky Fox
## 1960                       Mrs Denise Maddox
## 1961                   Mrs Jeannie Guillotte
## 1962                        Mr Larry J Hardy
## 1963                       Mr Errol Marshall
## 1964                        Mr Thomas Talbot
## 1965                        Mr Gerald Guidry
## 1966                       Mr John M Cradure
## 1967                 Mrs Lori Ellis Peterson
## 1968                       Mr Wally Anderson
## 1969                     Mr Daniel Dan Racca
## 1970                    Mr Robert Bob Hardey
## 1971                  Mr Mark James Peloquin
## 1972               Mrs Drusilla Dru Ellender
## 1973                        Mrs Ronda Jacobs
## 1974                  Mr Michael Mike Koonce
## 1975                         Mrs Judy Landry
## 1976                    Mrs Veronica Allison
## 1977                    Mrs Andrea D Coleman
## 1978                   Mr Joseph Randy Favre
## 1979                          Mr Stuart Moss
## 1980                   Mr Marshall Simien Jr
## 1981                     Mrs Luvertha August
## 1982                         Mr Rodney Geyen
## 1983                         Mr Rodney Geyen
## 1984                          Mr John Ieyoub
## 1985                          Mr John Ieyoub
## 1986                   Mr Stuart Weatherford
## 1987                   Mr Stuart Weatherford
## 1988                    Mr Dana Carl Jackson
## 1989                    Mr Dana Carl Jackson
## 1990                          Mr Mark Eckard
## 1991                         Mr Bliss Bujard
## 1992                       Mr Harold R Douga
## 1993                             Mr B B Loyd
## 1994                       Mr Kevin Merchant
## 1995                           Mr Paul Patin
## 1996                    Mrs Betty J Robinson
## 1997                        Mrs Jane Roberts
## 1998                                        
## 1999                                        
## 2000                                        
## 2001                                        
## 2002                                        
## 2003                                        
## 2004                        Mr James E Mixon
## 2005                                        
## 2006                                        
## 2007                                        
## 2008                                        
## 2009                                        
## 2010                                        
## 2011                                        
## 2012                         Mr Steven E May
## 2013                          Mr Eugene Dunn
## 2014                       Mr Scott Meredith
## 2015                  Mr Charles Chuck Clack
## 2016                            Mr Gary Mott
## 2017                           Mr Lanny Dark
## 2018                     Mrs Bobbie Harrison
## 2019                         Mr Eddie Hearns
## 2020                Mr Archie Lloyd Williams
## 2021                       Mr Glenn Barnhill
## 2022              Mr Charles Flukie Braddock
## 2023                            Mr David May
## 2024                       Mrs Jodi B Kenney
## 2025                  Mr John Frank Robinson
## 2026                        Mr Baron D Glass
## 2027                   Mr Clarence CR Martin
## 2028                    Mr Jack McKeithen Jr
## 2029                    Mr Hershel Volentine
## 2030                      Mrs Debbie Westrup
## 2031                         Mrs Mary Taylor
## 2032                     Mr J N Buddy Bailes
## 2033                      Mr Larry Adkins Jr
## 2034                      Mrs Phyllis Holmes
## 2035                     Mr Charles D Simons
## 2036                       Mrs Carmen M Head
## 2037                         Mr Clay Bennett
## 2038               Mr Mitchell Mitch Bratton
## 2039                         Mrs Ann Breland
## 2040                    Mrs Crystal Buckalew
## 2041                          Mr Gary Holmes
## 2042                Mrs Kristen Krissy Jolly
## 2043                   Mrs Crystal Weeks Lee
## 2044              Mr Thomas Wesley Wes Burns
## 2045                        Mr Raymond Cruse
## 2046              Mrs Sandra Hillestad Evans
## 2047                 Mr Kenneth Ken Brockner
## 2048                   Mrs Bonnie M Crockett
## 2049                        Mr Bruce Frazier
## 2050                     Mr Richard Meredith
## 2051                    Mr Melvin D Robinson
## 2052                         Mrs Hilda Crain
## 2053                       Mr Lee J Harrison
## 2054                         Mr Garner Nunez
## 2055                                        
## 2056                                        
## 2057                                        
## 2058                                        
## 2059                                        
## 2060                                        
## 2061                                        
## 2062                                        
## 2063                                        
## 2064                                        
## 2065                                        
## 2066                                        
## 2067                                        
## 2068                                        
## 2069                                        
## 2070                          Mr Ron Johnson
## 2071                       Mr Carl Broussard
## 2072                  Mrs Romona Mona Kelley
## 2073                      Mr Richard Sanders
## 2074                      Mr Curtis Fountain
## 2075                   Mr Anthony Dino Hicks
## 2076                           Mr Kirk Quinn
## 2077                        Mr Terry M Beard
## 2078                        Mr Kirk Burleigh
## 2079                         Mr Joe B Dupont
## 2080                        Mr Darryl Farque
## 2081                       Mrs Marsha Trahan
## 2082                        Mr Dwayne Sanner
## 2083                        Mr R Scott Nunez
## 2084                 Mrs Dorothy Dot Theriot
## 2085                        Mrs Tracy Carter
## 2086                    Mr James N Boudreaux
## 2087                   Mrs Karen Faulk Nunez
## 2088                  Mrs Carrie J Broussard
## 2089                      Mrs Nadine Richard
## 2090                                        
## 2091                Mr Mckinley Wayne Guidry
## 2092                     Mrs Connie A Trahan
## 2093                     Mr Brian Desormeaux
## 2094                    Mr Nolan J Broussard
## 2095                    Mr Freddie A Theriot
## 2096                           Mr Davy Doxey
## 2097                 Mr John Buck Stephenson
## 2098                           Mr Tim Trahan
## 2099                Mr Gwen Sanner Constance
## 2100                      Mr Jack F Owens Jr
## 2101                        Mr John C Reeves
## 2102                        Mr James H Terry
## 2103                                        
## 2104                                        
## 2105                                        
## 2106                                        
## 2107                                        
## 2108                                        
## 2109                                        
## 2110                                        
## 2111                                        
## 2112                         Mr Paul A Lemke
## 2113                                        
## 2114                                        
## 2115                                        
## 2116                                        
## 2117                                        
## 2118                                        
## 2119                                        
## 2120                                        
## 2121                                        
## 2122                     Mr James Glen Kelly
## 2123                       Mrs Janet T Payne
## 2124                          Mr Matt Taylor
## 2125                        Mr Raymond Rouse
## 2126                  Mr Billy D Fletcher Sr
## 2127                 Mr Albert Kaline Patten
## 2128                       Mr Raymond Nugent
## 2129                        Mr J D Alexander
## 2130                    Mrs Delores McEntyre
## 2131                          Mrs Libby Ford
## 2132                       Mr Benny Vault Jr
## 2133                        Mr Joe Barber Sr
## 2134                         Mr Jackie Paulk
## 2135                 Mrs Dorothy Jean Watson
## 2136                         Mrs Jane Martin
## 2137                     Mr Dewey W Stockman
## 2138                     Mrs Lillian S Aplin
## 2139                     Mrs Cynthia F Brown
## 2140                   Mr Michael Mike Davis
## 2141                     Mrs Josephine Jones
## 2142                    Mrs Letishia Hatcher
## 2143                       Mrs Katie T Adams
## 2144                        Mr Richard Price
## 2145             Mr Robert T Bobby Alexander
## 2146                        Mrs TeRan S Book
## 2147                    Mr H C Trey Peck III
## 2148                        Mr Rickey Morris
## 2149                     Mr Albert L Coleman
## 2150                          Mr Hiram Evans
## 2151                        Mr Michael Tubre
## 2152                      Mrs Margie F Price
## 2153                       Mr Lyndell Atkins
## 2154                     Mr Benny L Vault Sr
## 2155                    Mr Stephen R Mophett
## 2156                      Mrs Josie Bullitts
## 2157                     Mrs Catina R Branch
## 2158                         Mr Tommy Branch
## 2159                   Mr Louis FiveO Hatten
## 2160                         Mr Harold Sones
## 2161                           Mr Greg Terry
## 2162                      Mr Derrick Frazier
## 2163                       Mrs Linda J Kerry
## 2164                    Mr Walter Pot Krause
## 2165                         Mrs Tara Hollis
## 2166              Mrs Cynthia Gladney Steele
## 2167                                        
## 2168                                        
## 2169                                        
## 2170                                        
## 2171                                        
## 2172                                        
## 2173                                        
## 2174                                        
## 2175                                        
## 2176                                        
## 2177                        Mr Kenneth White
## 2178                                        
## 2179                                        
## 2180                                        
## 2181                                        
## 2182                                        
## 2183                                        
## 2184                                        
## 2185                                        
## 2186                                        
## 2187                                        
## 2188                           Mr Ken Bailey
## 2189                Mr James Patrick Gladney
## 2190                         Mr Bob Robinson
## 2191                      Mr Donald K Haynes
## 2192                  Mr D'Arcy R Stevens Jr
## 2193                          Mr Mark Furlow
## 2194                    Mr Robert E McDaniel
## 2195                        Mr Joe A Sturges
## 2196                        Mr Lavelle Penix
## 2197                       Mr Scott Davidson
## 2198                            Mr Roy Lewis
## 2199                           Mr Roy Mardis
## 2200                       Mr Jerry A Adkins
## 2201                         Mr Willie Young
## 2202                        Mr Danny Doc Lee
## 2203                     Mr William H Maddox
## 2204                          Mrs Linda Knox
## 2205                   Mrs Yolanda L Coleman
## 2206                        Mr Robert Haynes
## 2207                    Mr Thomas E Davidson
## 2208               Mrs Vera R Walker Meadors
## 2209                    Mrs Almeter H Willis
## 2210                           Mr Joey White
## 2211                    Mr B Stewart Griffin
## 2212                    Mr Charles F Clawson
## 2213                      Mr Ronnie McKenzie
## 2214                       Mrs Amanda Verdin
## 2215                  Mr William Earl Maddox
## 2216                         Mr James A Pike
## 2217                          Mr Frank Speer
## 2218                        Mr Sherman Brown
## 2219                Mrs Alecia Nychole Smith
## 2220                        Mr Hubie D James
## 2221                         Mr Wayne Tanner
## 2222                  Mr Anthony Craig Smith
## 2223                        Mr Jack Spurlock
## 2224                        Mr Russell Mills
## 2225                      Mrs Melver Stassen
## 2226                   Mr Prentis Washington
## 2227                       Mr Ardis Willhite
## 2228                     Mr Jerry W Clements
## 2229                Mrs Marilyn Lowrey Myers
## 2230                         Mr Andy Roberts
## 2231                   Mrs Valinda Faye Webb
## 2232                       Mr Herbert Taylor
## 2233          Mrs Barbara Beene Net Torrence
## 2234                          Mr Brian Bogle
## 2235                 Mrs Carla Frasier Smith
## 2236                Mrs Linda Ferrell Mozeke
## 2237                       Mr Michael J Wade
## 2238                         Mr Don McCalman
## 2239                    Mrs Carlette Sanford
## 2240                  Mrs Patricia K Jenkins
## 2241                           Mr Don W Tate
## 2242                                        
## 2243               Mr William H Billy Rucker
## 2244                                        
## 2245                                        
## 2246                                        
## 2247                                        
## 2248                                        
## 2249                                        
## 2250                      Mr Ray F Routon Jr
## 2251                                        
## 2252                                        
## 2253              Mrs Elizabeth Liz Brooking
## 2254                                        
## 2255                                        
## 2256                          Mrs Susan Rabb
## 2257                      Mr Ronnie Bradford
## 2258                                        
## 2259                                        
## 2260                                        
## 2261                      Mr Kenneth Hedrick
## 2262                     Mr Clyde Ray Webber
## 2263                          Mr Jerry Clark
## 2264                         Mr Daryle Price
## 2265                           Mr Carey Cook
## 2266                      Mr Joe Bear Parker
## 2267                      Mr Willie J Dunbar
## 2268                         Mr Randy Temple
## 2269                        Mr Whest Shirley
## 2270                         Mr Jerry Beatty
## 2271                    Mr Melvin Ferrington
## 2272                       Mr Jimmy Jernigan
## 2273                     Mr Tommy Red Tiffee
## 2274                   Mr George C Murray Jr
## 2275                            Mr Jim Boren
## 2276                       Mr Fred T Butcher
## 2277                     Mrs Mary H Campbell
## 2278                      Mr Raymond T Riley
## 2279                         Mr Gary Parnham
## 2280                       Mrs Cheryl Probst
## 2281                      Mr Charles E Minor
## 2282                      Mr Jeffery Goodman
## 2283                    Mr Warren S Enterkin
## 2284                       Mrs Darlene Baker
## 2285                      Mr Benja R Fussell
## 2286                       Mr Frank Duson Jr
## 2287                      Mr Russell Wagoner
## 2288                      Mr Jerry Stallings
## 2289              Mr Charles E Charlie White
## 2290                         Mr Tim Charrier
## 2291                       Mrs Rosa W Elaine
## 2292                       Mr Rickey Hollins
## 2293                          Mrs Susan Rabb
## 2294                   Mr Ferris Bull Durham
## 2295                         Mr John H Cowan
## 2296                         Mr Jerry Lipsey
## 2297                        Mr Rydell Turner
## 2298                           Mr Gene Allen
## 2299                       Mr Dwayne T Sikes
## 2300                       Mr Hyram Copeland
## 2301                Mr Clarence PaPa Skipper
## 2302                 Mr Edwin Larry Lawrence
## 2303                    Mr Arthur K Lewis Sr
## 2304                           Mr Tron McCoy
## 2305                       Mr Vernon Stevens
## 2306                            Mr Jon Betts
## 2307                Mr Richard S Ricky Knapp
## 2308                 Mrs Maureen Mo Saunders
## 2309                         Mrs Somer Lance
## 2310                 Mr Elijah Stepper Banks
## 2311                   Mrs Sandra Gail Pryor
## 2312                        Mr Johnnie Brown
## 2313                        Mrs Gloria Lloyd
## 2314                       Mr Floyd L Barber
## 2315                       Mr Houston Holmes
## 2316                     Mrs Irene Jefferson
## 2317                          Mr Leroy Kelly
## 2318               Mrs Shannon Burns Madison
## 2319                      Mrs Jamie Harrison
## 2320                        Mr Robert Maples
## 2321                    Mr Bobby Sheppard Sr
## 2322                         Mrs Wanda Smith
## 2323                   Mrs Courtney Thompson
## 2324                   Mr Thomas Bryce Alger
## 2325                      Mr George L Thomas
## 2326                                        
## 2327                                        
## 2328                                        
## 2329                                        
## 2330                                        
## 2331                       Mr Richard Fuller
## 2332                        Mrs Jeri Burrell
## 2333                                        
## 2334                    Mrs Cynthia Williams
## 2335                                        
## 2336                                        
## 2337                                        
## 2338                                        
## 2339                                        
## 2340                                        
## 2341                                        
## 2342                                        
## 2343                                        
## 2344                                        
## 2345                                        
## 2346                   Mr Bryan B Norwood Jr
## 2347                                        
## 2348                                        
## 2349                    Mr Rodney G Arbuckle
## 2350                         Mr Jeremy Evans
## 2351                         Mrs Anne Gannon
## 2352                      Mr Jeffrey L Evans
## 2353                      Mr Charlie Roberts
## 2354                     Mr Dewayne Mitchell
## 2355                      Mr Jarrell O Burch
## 2356                         Mr A W McDonald
## 2357                   Mr Gregory Greg Baker
## 2358                       Mr Richard Fuller
## 2359                         Mr Jeff L Heard
## 2360                          Mr Ernel Jones
## 2361                      Mr Thomas Jones Jr
## 2362                           Mr Reggie Roe
## 2363                     Mr Ricky McPhearson
## 2364                       Mr Dudley M Glenn
## 2365                       Mr Neil Henderson
## 2366                 Mr McLawrence Fuller Sr
## 2367               Mr Donald B Donnie Dufour
## 2368                         Mr Steavy Clark
## 2369                       Mr Coday Johnston
## 2370                         Mr Coach Haynes
## 2371                      Mr Larry Mark Ross
## 2372                          Mr Tommy Craig
## 2373                          Garland Spivey
## 2374                    Mr L J Mayweather Jr
## 2375                        Mrs Helen Holmes
## 2376                 Mrs Gloria J McPhearson
## 2377                     Mr S Phillip Joyner
## 2378                   Mr Wilbur T Purvis Jr
## 2379                                        
## 2380                         Mr Jerry L Lowe
## 2381                        Mr Hollis Holmes
## 2382                  Mr Troy Bubba Yopp III
## 2383                         Mr Billy Murphy
## 2384              Mr Travis Bubba English Jr
## 2385              Mrs Linda Wilburn Davidson
## 2386                           Mr E J Barber
## 2387                       Mr Curtis W McCoy
## 2388                     Mr Travis Whitfield
## 2389                   Mrs Katherine Freeman
## 2390                       Mr Charles Waldon
## 2391               Mrs Marsha Lea Richardson
## 2392              Mrs Wanda Sue Lewis Fields
## 2393                  Mrs Euricka Mayweather
## 2394                    Mrs Altheaon H Burch
## 2395                         Mr Scotty Liles
## 2396              Mr Thomas Henry Dufrene Jr
## 2397                  Mr David Glen Burch Sr
## 2398                  Mr David Glen Burch Sr
## 2399                    Mr GB Sonny Hall III
## 2400                       Mr Troy N Terrell
## 2401                       Mr Mitchell Lewis
## 2402                       Mr Joseph Hall Jr
## 2403                         Cynthia T Cruse
## 2404                  Mr William H Bill Cook
## 2405                  Mrs Rhonda Hughes Meek
## 2406                    Mr Albert M Rives IV
## 2407                       Mrs Ola Mae Evans
## 2408                       Mrs Dianne Hudson
## 2409                        Mr Kevin Vanzant
## 2410                         Mrs Dwena Henry
## 2411                       Mrs Dwena M Henry
## 2412                     Mrs Clemmie P McCoy
## 2413             Mrs Clemmie Permenter McCoy
## 2414                      Mr Mark A Murphrey
## 2415                      Mr Mark A Murphrey
## 2416                      Mr Norman Arbuckle
## 2417                   Mr Judge S Cordray Jr
## 2418                  Mrs Martha P Guillotte
## 2419                          Mr Dale Morvan
## 2420               Mrs Edith Duncan Williams
## 2421                Mrs Margaret A Dickerson
## 2422                 Mr Nicholas Nick Gasper
## 2423                    Mr Patrick Loftus Jr
## 2424                        Mr Curtis McCune
## 2425                     Mrs Dorothy Simmons
## 2426                      Mrs Connie Jackson
## 2427                          Mr Billy G Lee
## 2428                    Mrs Queenie V Rogers
## 2429                 Mrs Jeanette Pons Avila
## 2430                         Mr Chad Burford
## 2431                       Mrs Lorice Pipkin
## 2432                       Mrs Audrey Rachal
## 2433                        Mrs Angela Toney
## 2434                    Mr Donald C Hodge Jr
## 2435          Mrs Charlotte McDaniel McGehee
## 2436                        Mr Larry Selders
## 2437               Mr Dean Deaneaux Vicknair
## 2438                         Mr W T Winfield
## 2439                     Mrs Brenda B Carter
## 2440                       Mrs Linda Perkins
## 2441                        Mr Brett Jackson
## 2442                        Mrs Dawn Collins
## 2443                      Mrs Ronnie Edwards
## 2444                Mrs Verna BradleyJackson
## 2445                       Mr Anthony Nelson
## 2446                      Mrs Tinicia Turner
## 2447                       Mrs Tawanda Green
## 2448                   Mrs Carolyn R Coleman
## 2449              Mrs Elizabeth Betty Powers
## 2450                     Mr Brandon J DeCuir
## 2451                      Mrs Elizabeth Dent
## 2452                         Mr Tommy French
## 2453                  Mr Louis Woody Jenkins
## 2454                             Mr Dan Kyle
## 2455                        Mr Darrell White
## 2456                         Mr John Coghlan
## 2457                           Mr Ryan Cross
## 2458                       Mr Richie Edmonds
## 2459                           Mr Jr Shelton
## 2460                      Mr Harold Williams
## 2461                           Mr Dan Richey
## 2462           Mr Philemon APhil St Amant II
## 2463                  Mrs Linda Price Thomas
## 2464                          Mr Jay Lindsey
## 2465                        Mrs Karla Doucet
## 2466                         Mr Jerry Arbour
## 2467                      Mrs Connie Bernard
## 2468             Mrs Kathleen Stewart Richey
## 2469                  Mrs Pam Taylor Johnson
## 2470                  Mrs Lisa WoodruffWhite
## 2471                Mrs Charlene Charlet Day
## 2472                           Mrs Pam Baker
## 2473                    Mrs Annette Lassalle
## 2474                  Mr Sid J Gautreaux III
## 2475                         Mr Doug Welborn
## 2476                         Mr Brian Wilson
## 2477                   Mr William Beau Clark
## 2478                    Mr Melvin Kip Holden
## 2479                           Mr Trae Welch
## 2480                  Mrs Chauna BanksDaniel
## 2481                       Mr Chandler Loupe
## 2482                         Mr Scott Wilson
## 2483                      Mrs Ronnie Edwards
## 2484                  Mrs Donna CollinsLewis
## 2485                   Mrs C Denise Marcelle
## 2486                        Mr Buddy Amoroso
## 2487                            Mr Joel Boe'
## 2488                         Mrs Tara Wicker
## 2489                     Mr Ryan Eugene Heck
## 2490                         Mr John Delgado
## 2491                      Mr Kirk A Williams
## 2492                        Mr Lonny A Myles
## 2493                Mrs Kelli Terrell Temple
## 2494          Mrs Yvette Mansfield Alexander
## 2495                 Mrs Laura Prosser Davis
## 2496                      Mr Alex Brick Wall
## 2497                      Mrs Suzan S Ponder
## 2498                  Mr Reginald R Brown Sr
## 2499                       Mrs Gaynell Young
## 2500                      Mr J Scott Swilley
## 2501                       Mrs Sharon Samuel
## 2502                     Mr Kenneth R Mackie
## 2503                           Mr Hubie Owen
## 2504                       Mrs Jannie Rogers
## 2505                       Mr Boyce Smith Jr
## 2506           Mr Reginald D Donnie Dykes Jr
## 2507                         Mr David Dayton
## 2508                         Mr David Tatman
## 2509                          Mr James Lloyd
## 2510                      Mrs Elaine G Davis
## 2511                          Mrs Vereta Lee
## 2512                    Mrs Roxanne Atkinson
## 2513                       Mr Dana Carpenter
## 2514                Mrs Kenyetta NelsonSmith
## 2515                       Mr G David Walker
## 2516                         Mrs Troy Watson
## 2517                        Mr Tarvald Smith
## 2518                  Mr Willard Will Easley
## 2519                         Mrs Shona Boxie
## 2520                  Mrs Evelyn WareJackson
## 2521                          Mr Jim Gardner
## 2522                     Mrs Doris Alexander
## 2523                        Mr Craig Freeman
## 2524                  Mrs Ruby Wallette Foil
## 2525              Mrs Barbara Reich Freiberg
## 2526                     Mrs Sharon Browning
## 2527                      Mrs Connie Bernard
## 2528                         Mr Jerry Arbour
## 2529                       Mrs Jill C Dyason
## 2530                         Mr Randy Lamana
## 2531                     Mrs Virginia Forbes
## 2532                         Mrs Brooke Peay
## 2533                     Mr Moses M Evans Jr
## 2534                           Mr Mark Miley
## 2535                     Mr Steven E Sanders
## 2536                                        
## 2537                     Mr Jimmy Santangelo
## 2538                          Mr Darin David
## 2539                      Mr Donald Shelmire
## 2540                         Mr Don Thompson
## 2541                        Mr Carey Jenkins
## 2542                         Mr David L Wade
## 2543                        Mr Harold Rideau
## 2544                            Mr Mac Watts
## 2545                        Mr David Amrhein
## 2546                Mr Michael Snapper Knaps
## 2547                        Mr Doug Browning
## 2548                        Mr David McDavid
## 2549                      Mr Louis DeJohn Jr
## 2550                           Mr Tony LoBue
## 2551                        Mr Wayne Messina
## 2552                           Mr Aaron Moak
## 2553                     Mr Ralph Washington
## 2554                      Mr Charles Vincent
## 2555                     Mr Francis Nezianya
## 2556                    Mr Norman Pete Heine
## 2557                         Mr Brandon Noel
## 2558                        Mrs Joyce Burges
## 2559                         Mr John Coghlan
## 2560                         Mr Robert Young
## 2561                            Robert Young
## 2562                           Mr Dan Wallis
## 2563                          Mr John Givens
## 2564                         Mr Tommy Womack
## 2565                                        
## 2566                                        
## 2567                     Mr Wydette Williams
## 2568                                        
## 2569                                        
## 2570                    Mr Nemia Nate Madere
## 2571                                        
## 2572                                        
## 2573                                        
## 2574                                        
## 2575                                        
## 2576                                        
## 2577                                        
## 2578                                        
## 2579                                        
## 2580                                        
## 2581                                        
## 2582                                        
## 2583                                        
## 2584                                        
## 2585                     Mr Wydette Williams
## 2586               Mrs Beatrice Allen Carter
## 2587                       Mrs Geneva F Odom
## 2588                       Mr James Jim Holt
## 2589                        Mr Ralph Coleman
## 2590                  Mrs Kofi DardenHawkins
## 2591                    Mr Joseph BB Jackson
## 2592                   Mr Kendall L Thompson
## 2593                     Mr Sidney Lee Denny
## 2594                 Mrs Shirley F Fairchild
## 2595                     Mrs Harriet Bridges
## 2596                        Mrs Jackie Folks
## 2597                       Mr Gene Edmondson
## 2598                   Mr Roger Shoemaker Sr
## 2599                      Mr Marion Carraway
## 2600                    Mrs Georjean Jackson
## 2601                      Mrs Arlean Hampton
## 2602                  Mrs Carolyn Davis Ward
## 2603                       Mrs Debra Hopkins
## 2604                        Mr Gregory Jones
## 2605              Mr Robert Bobby Amacker Jr
## 2606                   Mr Aaron Rudy Threats
## 2607                         Mr John Frantom
## 2608                    Mr Nemia Nate Madere
## 2609                           Mr Karl Magee
## 2610                  Mrs Barbara A McDaniel
## 2611                       Mr Donnie Meadows
## 2612                          Mr Jimmy McCaa
## 2613                                        
## 2614                            Mr Ed Parker
## 2615                                        
## 2616                                        
## 2617                      Mr Jim Mack Parker
## 2618                                        
## 2619                                        
## 2620                                        
## 2621                                        
## 2622                            Mr Ron Smith
## 2623                                        
## 2624                                        
## 2625                                        
## 2626                                        
## 2627                                        
## 2628                                        
## 2629                                        
## 2630                                        
## 2631                                        
## 2632                       Mr Talmadge Bunch
## 2633                           Mr David Dart
## 2634                    Mr Jeffrey D Gardner
## 2635                       Mr Michael DeJohn
## 2636                      Mr Dennis R Aucoin
## 2637                           Mr Chris Hall
## 2638                   Mr Edward L Brooks Sr
## 2639                       Mr Jason H McCray
## 2640                          Mr Keith Mills
## 2641                          Mr Dwight Hill
## 2642              Mr E L Larry Beauchamp III
## 2643                    Mr Karl Bubba Chaney
## 2644                           Mr Louis Kent
## 2645                  Mr Rufus Coach Nesbitt
## 2646                     Mr Melvin L Hollins
## 2647                Mr Broderick D Brooks Sr
## 2648                        Mr Mitch Harrell
## 2649                       Mrs Beth L Dawson
## 2650                     Mrs Rhonda Matthews
## 2651                      Mr Ben Coach Cupit
## 2652                       Mrs Olivia Harris
## 2653               Mrs Debra Spurlock Haynes
## 2654                    Mr Richard W Terrell
## 2655                 Mr Michael Ray Bradford
## 2656                          Mr Paul S Kent
## 2657               Mr Raymond D Ray Williams
## 2658                                        
## 2659                      Marilyn Meeks Goff
## 2660                     Mrs Nellie A Thomas
## 2661                 Mr C Bernard Maglone Jr
## 2662                          Clifton Morris
## 2663                  Mr James Bubba Bradham
## 2664                    Mrs Marcy T Robinson
## 2665                       Mrs Lori Ann Bell
## 2666                      Mr Charles Coleman
## 2667                Mr Robert Robbie Jackson
## 2668                Mrs Rebecca Becky Bellue
## 2669                    Mrs Marilyn Broadway
## 2670                         Mr Walter Smith
## 2671                           Mr Fred Allen
## 2672                     Mr Johnny Beauchamp
## 2673                     Mr George Kilbourne
## 2674                 Mr Clovis L Matthews Sr
## 2675               Mrs Lisa Davis Washington
## 2676                    Mrs Kim Wilson Young
## 2677                 Mrs Elizabeth Liz Aaron
## 2678                        Mrs Aimee Bellue
## 2679                       Mrs LaTrelle Cart
## 2680                       Mr Ashby Schwartz
## 2681                      Mr Nick St Germain
## 2682                      Mr Willie R Duncan
## 2683                 Mr Anthony C Andy Jelks
## 2684                         Mr Jim Reynolds
## 2685                        Mrs Yvonne Allen
## 2686                      Mrs Georgia Honore
## 2687                      Mrs Georgia Honore
## 2688                    Mrs Harriett Sensley
## 2689                  Mrs Harriett T Sensley
## 2690                     Mrs Eunice N Smiley
## 2691                    Mr Michael O Harrell
## 2692                           Mr Don Havard
## 2693                   Mr John Henry McCrory
## 2694                      Mr Jim Mack Parker
## 2695                         Mr Rafe Stewart
## 2696                Mr James Henry Berthelot
## 2697                          Mr Marty Fruge
## 2698                     Mrs Chasity Vidrine
## 2699                                        
## 2700                                        
## 2701                                        
## 2702                                        
## 2703                                        
## 2704                                        
## 2705                                        
## 2706                                        
## 2707                                        
## 2708                        Mr Larry Lachney
## 2709                        Mr Jimmy LaFleur
## 2710                         Mr Bob McDaniel
## 2711                      Mrs Cathy McDaniel
## 2712              Mr Warren James LaFleur Jr
## 2713                                        
## 2714                                        
## 2715                                        
## 2716                                        
## 2717                                        
## 2718                                        
## 2719                                        
## 2720                                        
## 2721                        Mr Eddie Soileau
## 2722             Mr Randall M Randy Deshotel
## 2723                         Mr Dirk Deville
## 2724                   Mr Charles E Fontenot
## 2725                        Mr Rocky B Rider
## 2726                      Mr Kenny A Burgess
## 2727                          Mr Ryan Ardoin
## 2728                  Mr Billy Lamar Johnson
## 2729                        Mr Kevin Veillon
## 2730                       Mr Eric B Soileau
## 2731                      Mr Bryan K Vidrine
## 2732                  Mr Ryan LeDay Williams
## 2733                 Mr Richard Blood Thomas
## 2734                   Mr Donald J Launey Jr
## 2735                      Mr Ronald T Doucet
## 2736                       Mr Lonnie Sonnier
## 2737                       Mr Bobby Deshotel
## 2738                     Mr Jerry L Thompson
## 2739                      Mr Wayne N Dardeau
## 2740                      Mrs Peggy J Forman
## 2741                     Mr David Landreneau
## 2742                          Mr Buck Dupuis
## 2743              Mrs Wanda Anderson Skinner
## 2744                        Mr Scott Limoges
## 2745                         Mr Arthur Savoy
## 2746                      Mrs Nancy A Hamlin
## 2747                    Mr Ellis Guillory Sr
## 2748                 Mrs Georgianna L Wilson
## 2749                           Mr Dave McGee
## 2750                     Mrs Charlotte Smith
## 2751                     Mrs Hope Landreneau
## 2752                           Mr Wade Riley
## 2753                  Mr A C Robin Tatman Jr
## 2754                         Mr Earlin Fruge
## 2755               Mr Michael Mike Stockwell
## 2756                      Mr Joe Deshotel Jr
## 2757                           Mr Tim Causey
## 2758                Mr J Michael Mike Causey
## 2759                    Mrs Jennifer Vidrine
## 2760                       Mr Ricky Fontenot
## 2761              Mrs Jackie Malveaux Thomas
## 2762                         Mr Terry Savant
## 2763                 Mrs Heather Miley Cloud
## 2764                        Mr Neal Lartigue
## 2765                          Mr Greg Dupuis
## 2766                        Mr Paul Allen Jr
## 2767                         Mr L C Deshotel
## 2768                          Mr Brad Wilson
## 2769                      Mrs Leisa Deshotel
## 2770                      Mr Freddie Matthew
## 2771                 Mr Richard Scott Christ
## 2772                       Mr Charles L Reed
## 2773                        Mr Robin L Young
## 2774                          Mr C J Dardeau
## 2775                         Mr Jerry Joseph
## 2776                          Mr Mike Perron
## 2777                     Mr Freddie Rev Jack
## 2778                           Mr Donald Sam
## 2779                      Mr Taranza M Arvie
## 2780                    Mrs Lucy Jones Green
## 2781                   Mr Nicholas Papillion
## 2782                      Mr Joseph H Simien
## 2783                     Mrs Tammy M Hammond
## 2784                          Mrs Debbie Oge
## 2785                           Mr Quint West
## 2786                          Mr Joey Ducote
## 2787                      Mr Kenneth Johnson
## 2788                 Mr Louis Dale Marcantel
## 2789                       Mrs Christy Allen
## 2790                         Mr Woodrow Bell
## 2791                       Mr David Tolliver
## 2792                                        
## 2793                                        
## 2794                                        
## 2795                                        
## 2796                                        
## 2797                                        
## 2798                                        
## 2799                        John Henry Baker
## 2800                     Alyssa Leann Bonner
## 2801                            Craig G Gill
## 2802                     Mr Henry Herford Jr
## 2803                    Samuel Clinton Noble
## 2804                          Sherryll Beach
## 2805                      Kevin Paul Carroll
## 2806                                        
## 2807                            Mike Collins
## 2808                                        
## 2809                    Jonathan Aaron Black
## 2810                                        
## 2811                           Mr Kevin Cobb
## 2812                         Mrs Ann Johnson
## 2813                            Mr Rod Elrod
## 2814                        Mr Joel Eldridge
## 2815                       Mr Ricky Campbell
## 2816                       Mr KW Buddy Parks
## 2817                       Mr James H Harris
## 2818                          Mr Troy Hendry
## 2819                          Mr Roy L Scott
## 2820                 Mr W H Rawhide Robinson
## 2821                         Mr Joe Lewis Jr
## 2822                      Mrs Ann B McIntyre
## 2823                       Mr Bruce McCarthy
## 2824                      Mr Edwin Ray Bryan
## 2825                        Mr Ronnie Hatton
## 2826                          Mr Jesse Young
## 2827                        Mr Richard Kelly
## 2828                    Mrs Louise J Johnson
## 2829                        Mr Tim W Eubanks
## 2830                     Mrs Dorothy W Brown
## 2831                   Mr Errol P Pat Guyton
## 2832                     Mr Carl Williams Jr
## 2833                      Mrs Sharon T Boone
## 2834                           Mr R V Arnold
## 2835                         Mr Bill Carroll
## 2836                     Mr Lawrence Roberts
## 2837                   Mr Jimmie R Spears Sr
## 2838                     Mr Johnnie Marshall
## 2839                   Mr Carl Trey Williams
## 2840                          Mr Glynn R Day
## 2841                      Mr Stacy Thomas Jr
## 2842                     Mr Danny Richardson
## 2843                           Mr Dale Mason
## 2844                   Mr Timothy Washington
## 2845                       Mr Jackie Johnson
## 2846                  Mrs Allyn Jean Luckett
## 2847                  Mrs Jean Simmons Clark
## 2848                        Mr Mike Stephens
## 2849                        Mr Lester Thomas
## 2850                     Mr Billy Cureington
## 2851                         Mr Danny Barber
## 2852                             Mr Ty Britt
## 2853                      Mrs Nettie B Brown
## 2854                       Mr Roger Hilliard
## 2855                         Mr Thomas Lemle
## 2856                         Mr Marc McCarty
## 2857                         Mr Thomas Moore
## 2858                        Mrs Marie Barber
## 2859                            Mr Joe Chase
## 2860                        Mr Larry Laborde
## 2861                         Mrs Kay Dunaway
## 2862                     Mrs Christine Ezell
## 2863                  Mr Randell Randy Lloyd
## 2864                                Kay Cupp
## 2865                     Mr John Sonny Dumas
## 2866                       Mrs Betty Johnson
## 2867                         Mr Craig G Gill
## 2868                         Mr Rex McCarthy
## 2869                    Mr Brandon Henderson
## 2870                                        
## 2871                                        
## 2872                                        
## 2873                                        
## 2874                                        
## 2875                                        
## 2876                                        
## 2877                                        
## 2878                           Mr Sam Brimer
## 2879                            Trevor S Fry
## 2880                                        
## 2881                                        
## 2882                       Tony L Bo Vets II
## 2883                                        
## 2884                                        
## 2885                                        
## 2886                                        
## 2887                                        
## 2888                        Mr Steven McCain
## 2889                      Mr J ElRay Lemoine
## 2890                        Mr Walker Wright
## 2891                      Mr Roy Dean Nugent
## 2892                     Mr Brandon J DuBois
## 2893                  Mr Robert Bobby Martin
## 2894                         Mr Tom Hamilton
## 2895                     Mr Arnold R Murrell
## 2896                      Mr Britton Carroll
## 2897                    Mr Winston K Roberts
## 2898                 Mr Herman Buddy Collins
## 2899                  Mr Donald G Don Arnold
## 2900                   Mr A J Tony Lavespere
## 2901                      Mr Marvin P Delong
## 2902                      Mrs Karen Y Layton
## 2903                         Mr Eddie Baxley
## 2904              Mr Randolph Randy Browning
## 2905                          Mr A D Futrell
## 2906                   Mr R L Buddy Pennison
## 2907                       Mr Terry W Oliver
## 2908                           Mr Doug James
## 2909                                        
## 2910               Mrs Karen Holston Edwards
## 2911                  Mrs Judy Guynes Brimer
## 2912                Mr Charles E Chuck Evans
## 2913             Mr John Timothy Tim Coolman
## 2914                       Mr Willie R Peavy
## 2915                       Mr Dewayne Briggs
## 2916                    Mr R Duran Armstrong
## 2917                      Mr F H Bubba Dykes
## 2918                      Mr Gerald Hamilton
## 2919                   Mrs Vera Susie Waters
## 2920                       Mr Jerome F Scott
## 2921                            Kelly Sommer
## 2922                          Mr John Landry
## 2923                          Mr Danny Olden
## 2924                     Mr Christopher Paul
## 2925                        Mr Brian Edwards
## 2926                 Mr Billy Ray Prince III
## 2927                       Mr Alan D Futrell
## 2928               Mrs Lourain Colson LaCour
## 2929                         Mrs Cora L Reed
## 2930                     Mrs Lorraine G Sapp
## 2931                    Mr Gayle Sonny Tyler
## 2932                        Mrs Alena Aycock
## 2933                           Linda Gammons
## 2934                          Jonathan Ramos
## 2935                        Mrs Della Barbee
## 2936                   Mrs Sandra Garlington
## 2937                    Mrs Belinda Gauthier
## 2938                         Mr Jim Bradford
## 2939                        Mrs Dorothy Self
## 2940                       Mr Ray Williamson
## 2941                            Mr Joe Allen
## 2942                         Mr Von Gilrease
## 2943              Mrs Lasonya Denise Pearson
## 2944                         Mr Jack Rushing
## 2945                          Mr John Savant
## 2946                  Mr Gregory Greg Decker
## 2947                          June P Johnson
## 2948                    Carol Denise Weidner
## 2949                   Mr Ronald Ron Wilkins
## 2950                        Mrs Sharon L Zeh
## 2951                      Mr Zaphany E Banks
## 2952                          Mr Larry Rader
## 2953                         Mr Perry Segura
## 2954                                        
## 2955                                        
## 2956                                        
## 2957                                        
## 2958                                        
## 2959                 Mr Sanders J Butler III
## 2960                                        
## 2961                                        
## 2962                                        
## 2963                                        
## 2964                                        
## 2965                                        
## 2966                                        
## 2967                                        
## 2968                          Mrs Kyla Magar
## 2969                 Mrs JoAnn Hooper Parker
## 2970                                        
## 2971                      Mr James Wyche III
## 2972                                        
## 2973                      Mr Oneal Jones III
## 2974                                        
## 2975             Mr Gerald Beau Beaullieu IV
## 2976                                        
## 2977                                        
## 2978                                        
## 2979                      Mr Irvin Vaughn Jr
## 2980                    Mrs Simone Champagne
## 2981                                        
## 2982                                        
## 2983                                        
## 2984                          Mr Louis Ackal
## 2985                      Mr Mike Thibodeaux
## 2986                         Mr Rickey Huval
## 2987                      Mr Carl M MD Ditch
## 2988                    Mr Errol Romo Romero
## 2989                    Mrs Maggie F Daniels
## 2990                   Mr Curtis Joe Boudoin
## 2991                      Mr Thomas J Landry
## 2992                          Mr Lloyd Brown
## 2993                         Mr Troy Comeaux
## 2994                  Mr Bernard E Broussard
## 2995                        Mr David M Ditch
## 2996                    Mr Ricky J Gonsoulin
## 2997                       Mr Glenn P Romero
## 2998                         Mr Roger Duncan
## 2999                       Mr Jerome W Fitch
## 3000              Mrs Aquicline Rener Arnold
## 3001                         Mr Marty Trahan
## 3002                   Mr David Wayne Romero
## 3003                    Mr Cameron B Simmons
## 3004                      Mr Robert L Segura
## 3005                Mr Fernest Pacman Martin
## 3006                 Mr Victor Vic Delcambre
## 3007                 Mrs Clara Degay Carrier
## 3008                     Mr Elvin Dee Pradia
## 3009                         Mr Jay McDonald
## 3010                         Zebulon A Simon
## 3011                     Mr Robbie J LeBlanc
## 3012                   Mr Kenneth Lockett Sr
## 3013                       Mr Dan LeBlanc Sr
## 3014                      Mr Edwin Ed Buford
## 3015                         Mr Dana P Dugas
## 3016                       Mrs Rachel Segura
## 3017                   Mrs Kathleen Rosamond
## 3018                   Mr Arthur L Alexander
## 3019                       Mr Danny D Segura
## 3020                  Mr Kenric Mushy Fremin
## 3021                 Mr John N Johnny Hebert
## 3022                    Mr Henry Charpentier
## 3023                    Mrs Veronica B Ferry
## 3024                     Mr Lynn P Guillotte
## 3025                     Mr Mark Charpentier
## 3026                 Mr Benjamin J Hoffpauir
## 3027                         Mr Tim Declouet
## 3028                  Mrs Hilda Daigre Curry
## 3029                  Mr Albert Al Broussard
## 3030             Mrs Aprill Francis Foulcard
## 3031                           Mr Dan Doerle
## 3032                         Mr Brad Clifton
## 3033                          Mr Mark Landry
## 3034                        Mr Sandy Sonnier
## 3035                      Mr Zaphany E Banks
## 3036       Mr Charles Charlie Brown Williams
## 3037                 Mr Sanders Sandy Derise
## 3038                         Mr Kenneth Kern
## 3039                 Mrs Natalie Lopez Robin
## 3040                   Mrs Peggy Lewis Gerac
## 3041                         Mr Robert Suire
## 3042                   Mr David John Merrill
## 3043                 Mr Raymond ShoeDo Lewis
## 3044                       Mr Calvin Begnaud
## 3045                   Mr Jessel M Ourso III
## 3046              Mr Edward A Lucky Songy Jr
## 3047                                        
## 3048                                        
## 3049                                        
## 3050                                        
## 3051                                        
## 3052                                        
## 3053                                        
## 3054                                        
## 3055                                        
## 3056                                        
## 3057                                        
## 3058                                        
## 3059                                        
## 3060                 Mrs Vanessa Banta Moore
## 3061                                        
## 3062                                        
## 3063                                        
## 3064                                        
## 3065                                        
## 3066                                        
## 3067                                        
## 3068                    Mrs Karen Fitzgerald
## 3069                                        
## 3070                                        
## 3071                                        
## 3072                                        
## 3073                                        
## 3074                       Mr Brett M Stassi
## 3075                 Mr J G Bubbie Dupont Jr
## 3076                         Mr Randy Sexton
## 3077                        Mr James E Grace
## 3078             Mr Jessel Mitchell Ourso Jr
## 3079               Mr Warren TNotchie Taylor
## 3080                      Mr Mitchel J Ourso
## 3081                   Mr Henry Bucket Scott
## 3082                 Mr Leonard Buck Jackson
## 3083                 Mr Edwin M Ed Reeves Jr
## 3084                   Mr Salaris Sal Butler
## 3085                      Mr Howard Oubre Jr
## 3086                       Mr Hunter Markins
## 3087                     Mr Terry J Bradford
## 3088                    Mr Louis Pete Kelley
## 3089                           Mr Tim Vallet
## 3090                          Mr Matt Jewell
## 3091                          Mr Bart Morgan
## 3092               Mr Michael M Distefano Sr
## 3093                    Mr SJ Bronco Wilbert
## 3094                 Mr Donald Ray Patterson
## 3095                       Mrs Pamela George
## 3096                      Mrs Glyna M Kelley
## 3097                  Mr Michael J Hebert Jr
## 3098              Mrs Pauline D Polly Higdon
## 3099                 Mr Michael Chief Barbee
## 3100                  Mr Thomas Tom Delahaye
## 3101                   Mrs Dorothy R Sansoni
## 3102                 Mrs Yolanda Butler Laws
## 3103                       Mr Brian S Willis
## 3104                   Mrs Nancy T Broussard
## 3105               Mr Freddie Sam Molden III
## 3106                         Mr Melvin Lodge
## 3107                      Mr John Morris III
## 3108                     Mrs Darlene M Ourso
## 3109                  Mr Roland Roach Fremin
## 3110                      Mr Jimmy Green III
## 3111                   Mr Steve C Pine Smith
## 3112                     Mr Darryl J Crowson
## 3113                  Mr Justin Kane Mendoza
## 3114                       Mrs Jackie Wesley
## 3115                   Mr Joseph Joe Richard
## 3116                Mr Lloyd Big Red Snowten
## 3117                         Mr Tommy Tucker
## 3118                       Mr John JB Barker
## 3119                 Mr Ronald Ronnie Hebert
## 3120                        Mr Larry Johnson
## 3121                    Mr Mark Tony Gulotta
## 3122                    Mr Lionel Johnson Jr
## 3123                       Mr John F Overton
## 3124              Mr Gerald Jermarr Williams
## 3125                Mr Michael  D Chauffe Sr
## 3126         Mr Lawrence Football Badeaux Sr
## 3127                        Mr Orian Gulotta
## 3128              Mr Kevin Butchie Ambeau Sr
## 3129                        Mr John E Simien
## 3130                        Mr Mario D Brown
## 3131                       Mr Tommy Dardenne
## 3132                          Mr Mike Sparks
## 3133                          Mr Kevin Gantt
## 3134                      Mr John Tim Doiron
## 3135                    Mrs Dana N Alexander
## 3136                 Mr Kirkland Anderson Sr
## 3137                      Mr Edward James Jr
## 3138                         Mrs Demi Vorise
## 3139                         Mr Sam W Watson
## 3140                  Mr Clarence DDot Wiley
## 3141                     Mr John Plug Barlow
## 3142              Mr Jonathan JonKris Greene
## 3143                  Mrs Dionne Bambi Lewis
## 3144                   Mrs Barbara Bo O'Bear
## 3145                        Mr Garnell Young
## 3146                          Mr Kyle Booksh
## 3147                Mrs Barbara Jeanie David
## 3148                     Mr Marcus D Hill Sr
## 3149            Mrs Deborah Debbie Alexander
## 3150              Mrs Flora Jean Danielfield
## 3151              Mr Freddie Carl Frazier Sr
## 3152                     Mr Melvin Hasten Sr
## 3153             Mr Ralph Big Guy Johnson Sr
## 3154                    Mr Lindon A Rivet Jr
## 3155                      Mr Oscar S Mellion
## 3156                         Mr Ralph Stassi
## 3157                 Mr Michael Mickey Rivet
## 3158             Mr Timothy L Timmy Martinez
## 3159             Mr Jimmie Fat Boy Randle Jr
## 3160                      Mr Bobby Culpepper
## 3161                                        
## 3162                                        
## 3163                                        
## 3164                    Mr Nathaniel Zeno Jr
## 3165                                        
## 3166                                        
## 3167                                        
## 3168                        Mr Dusty Hampton
## 3169                                        
## 3170                                        
## 3171                                        
## 3172                                        
## 3173                                        
## 3174                                        
## 3175                                        
## 3176                           Mr Andy Brown
## 3177                     Mrs Ann B Walsworth
## 3178                       Mr Eddie G Gatlin
## 3179                         WW Bill Staples
## 3180                       Mr Todd Culpepper
## 3181                  Mr Eddie Mack Langston
## 3182                      Mr Joshua Peterson
## 3183                         Mr Billy Bryant
## 3184                   Mrs Maxie Faye Monroe
## 3185                Mr Charles Chuck Garrett
## 3186                        Mr Lynn Treadway
## 3187                        Mr Bart Waggoner
## 3188                 Mrs Melissa Watts Perry
## 3189                   Mrs Mary May Saulters
## 3190                         Mr Gerry W Mims
## 3191                 Mr Harvey Troy Robinson
## 3192                         Mr Dennis Clary
## 3193                         Mr Wade McBride
## 3194                          Mr David Smith
## 3195                      Mr Milton S Bryant
## 3196                    Mrs Martha Chambless
## 3197                         Mrs Paula Magee
## 3198                    Mrs Sharon L Satcher
## 3199                      Mr Claude McMillan
## 3200                          Mrs Emma Jones
## 3201                         Mr Wayne Mosley
## 3202                       Mr Wilfred Foster
## 3203                      Mr John R Williams
## 3204                        Mr Herman Lenard
## 3205                         Mr Bill Wheelis
## 3206                      Mr Leslie Thompson
## 3207                             Mr Hal Mims
## 3208                       Mr Quenton Causey
## 3209                    Mrs Geraldine Causey
## 3210                             Mr Joe Vail
## 3211                          Mr Mike Wilson
## 3212                                        
## 3213                        Mr Wesley Horton
## 3214                  Mr Simmie T Slim Brown
## 3215                       Mr Johnny Shively
## 3216                      Mr Phillip Moffett
## 3217                         Mr Curtis Greer
## 3218                   Mr Lastevic Cottonham
## 3219                           Mr Sam Lamkin
## 3220                      Mrs Renee Stringer
## 3221               Mrs Charla Mason Thompson
## 3222                        Mr Devin Flowers
## 3223                 Mrs Claudean Cartwright
## 3224                       Mr Gregory Harris
## 3225                   Mrs Tonja Toni Malone
## 3226              Mrs Sue Richardson Proffer
## 3227                    Mrs Carline Thompson
## 3228                      Mrs Melba J Creech
## 3229                         Mrs Alisha Ford
## 3230                    Mr John David Howard
## 3231                     Mr Robert L Bradley
## 3232                     Mrs Dorothy F Jones
## 3233                  Mr Johnny Will Mathews
## 3234                            Mr Steve Fox
## 3235                      Mr Paul F Robinson
## 3236                       Mr Willard Willis
## 3237                        Mr Eric D Hinton
## 3238                          Mrs Ann Wigley
## 3239                        Mr Douglas Woods
## 3240                        Mrs Kristi Greer
## 3241                      Mrs Sylvia J Pagan
## 3242                          Mr James Trull
## 3243                    Mr Perry L Alexis Jr
## 3244                          Mr Donald Blum
## 3245                        Mr Kyle Green Jr
## 3246                   Mr Remy Voisin Starns
## 3247                         Mr Rudy S Smith
## 3248                                        
## 3249                   Mr Keith M Hutchinson
## 3250                         Mr Paul Johnson
## 3251           Mrs Sharlayne Jackson Prevost
## 3252                 Mrs Malinda HillsHolmes
## 3253                          Mrs Gilda Reed
## 3254                      Mr Michael M Davis
## 3255                      Mr David Gereighty
## 3256                     Mrs Dwan S Hilferty
## 3257                                        
## 3258                           Mr Tom Arnold
## 3259                           Mr Ben Bagert
## 3260                        Mrs Betty Bonura
## 3261                         Mrs Marie Clesi
## 3262                       Mr Allen Al Leone
## 3263                  Mr Joseph P Lopinto Jr
## 3264                           Mr Keith Rush
## 3265                        Mrs Polly Thomas
## 3266                         Mr John S Treen
## 3267                   Mr Raymond Waguespack
## 3268                         Mr Billy Arnold
## 3269                   Mr Don Carmardelle Jr
## 3270                         Mr Timothy Hand
## 3271                      Mr Stephen Leonard
## 3272                       Mr Tripp Rabalais
## 3273                      Mrs Melinda Doucet
## 3274                      Mr Paul D Johnston
## 3275                    Mr Bert C LeBlanc Jr
## 3276                  Mr Provino Vinny Mosca
## 3277                           Mr Tim Walker
## 3278                           Mr Paul Besse
## 3279                      Mr Charles Gennaro
## 3280                       Mr Nicholas Muniz
## 3281                      Mr Michael O'Brien
## 3282                Mr James H Jimmy Stevens
## 3283                        Mr Vincent Bruno
## 3284               Mr Philip Phil L Capitano
## 3285                 Mr Kevin S Delahoussaye
## 3286                   Mr Dominick Impastato
## 3287                         Mr Jack Rizzuto
## 3288                  Mr Frank John LaBruzzo
## 3289                  Mr John Frank LaBruzzo
## 3290                            Mr Ray Muniz
## 3291                        Mr Eric Skrmetta
## 3292        Mr Robert A Coach Bob Stevens Sr
## 3293                                        
## 3294                   Mrs Rebecca M Olivier
## 3295                    Mr George W Giacobbe
## 3296                         Mr Roy M Cascio
## 3297                                        
## 3298                    Mrs Ann Murry Keller
## 3299                 Mrs Andrea Price Janzen
## 3300                  Mrs Nancy Amato Konrad
## 3301                       Mr Newell Normand
## 3302                    Mr Jon A Gegenheimer
## 3303                     Mr Thomas J Capella
## 3304                    Mr Gerry Cvitanovich
## 3305                           Mr John Young
## 3306            Mr Christopher Chris Roberts
## 3307                      Mr Elton M Lagasse
## 3308                        Mr Ricky Templet
## 3309                      Mr Paul D Johnston
## 3310                          Mr Mark Spears
## 3311                  Mr Earl B Ben Zahn III
## 3312                    Mrs Cynthia LeeSheng
## 3313                        Mr Mark C Morgan
## 3314                    Mrs Etta S Licciardi
## 3315                Mr Raymond Ray St Pierre
## 3316                       Mr Patrick Tovrea
## 3317                         Mr Cedric Floyd
## 3318                         Mr Larry N Dale
## 3319                          Mr Mark Jacobs
## 3320          Mr Michael Mike R Delesdernier
## 3321                     Mrs Sandy Denapolis
## 3322                   Mr Vernon J Wilty III
## 3323                       Mr Patrick DeJean
## 3324                     Mr Charlie R Kerner
## 3325                  Mr Leon F Bradberry Jr
## 3326          Mr Charles V Chuck Cusimano II
## 3327                     Mr Kevin J Centanni
## 3328                       Mr Eugene Fitchue
## 3329                    Mr Roscoe W Lewis Sr
## 3330                     Mr Jonathan Liberto
## 3331             Mr Antoine J Tony Thomassie
## 3332                  Mr Albert T Creppel Sr
## 3333                  Mr Leon F Bradberry Sr
## 3334                        Mr Dan E Civello
## 3335                     Mr EJ Joe Bourgeois
## 3336                    Mr James D Cooper Sr
## 3337                       Mr Charles Wilson
## 3338                      Mr Ronnie C Harris
## 3339                  Mr Provino Vinny Mosca
## 3340                      Mr Michael S Yenni
## 3341          Mr John I Johnny Shaddinger Jr
## 3342                   Mr David J Camardelle
## 3343                       Mr Timothy Kerner
## 3344                        Mr Arthur Lawson
## 3345                   Mr Arthur S Lawson Jr
## 3346                  Mr Jacob Mac Dickinson
## 3347                        Mr Steve Caraway
## 3348                  Mr Dwayne Poncho Munch
## 3349                  Mr Dwayne Poncho Munch
## 3350                       Mr Euris A Dubois
## 3351             Mrs Michele Pietri Branigan
## 3352                     Mrs Jeannie M Black
## 3353                     Mr Milton Crosby Sr
## 3354                      Mr Milton L Crosby
## 3355                          Mr Glenn Green
## 3356                          Mr Glenn Green
## 3357             Mrs Belinda Cambre Constant
## 3358                          Mr Ted J Munch
## 3359                    Mr Vincent E Cox III
## 3360                           Mr Ivy Rogers
## 3361                      Mrs Raylyn Beevers
## 3362                      Mrs Raylyn Beevers
## 3363                        Mr Melvin Guidry
## 3364                       Mr Larry J Warino
## 3365                        Mr Ray A Santiny
## 3366                           Mr Jay LaFont
## 3367          Mr Clifford A Dixie Santiny Jr
## 3368             Mr Stephen Scooter Resweber
## 3369                    Mrs Leoda Bladsacker
## 3370                          Mr Wayne A Rau
## 3371                  Mr Timothy Tim Baudier
## 3372                     Mr Eric M Chatelain
## 3373                          Mrs Dana Huete
## 3374                      Mr Lawrence Landry
## 3375                        Mrs Cindy Murray
## 3376                    Mr Gregory W Carroll
## 3377                           Mr Joe Stagni
## 3378                      Mr Keith M Reynaud
## 3379                 Mrs Maria C Defrancesch
## 3380                       Mr Kent Denapolis
## 3381                    Mr Barry Bartholomew
## 3382               Mrs Christy Nunez Creppel
## 3383                   Mrs Shirley M Guillie
## 3384                  Mr Calvin Butch LeBeau
## 3385                    Mrs Verna Teta Smith
## 3386                                        
## 3387                                        
## 3388                                        
## 3389                            Johnny Adams
## 3390                                        
## 3391                                        
## 3392                                        
## 3393                                        
## 3394                                        
## 3395                                        
## 3396                                        
## 3397                                        
## 3398                                        
## 3399                                        
## 3400                                        
## 3401                                        
## 3402                                        
## 3403                                        
## 3404                                        
## 3405                                        
## 3406                                        
## 3407                                        
## 3408                                        
## 3409                                        
## 3410                                        
## 3411                                        
## 3412                                        
## 3413                                        
## 3414                            Mr Ivy Woods
## 3415             Mr Richard M Rick Arceneaux
## 3416                     Mr Donald G Kratzer
## 3417                        Mr Charles Deese
## 3418                         Mr Donald Woods
## 3419                      Mr John P Marceaux
## 3420                    Mr Milford H Reed Jr
## 3421                    Mr Bradley W Eastman
## 3422                       Mr Tom Kilpatrick
## 3423                     Mr Melvin Moe Adams
## 3424                 Mr Joseph Steve Eastman
## 3425                          Mr Wayne Fruge
## 3426                 Mr Ruffin Curt Guillory
## 3427                         Mr Byron Buller
## 3428                         Mr Mark Pousson
## 3429                  Mr William H Bill Wild
## 3430                 Mr Leonard Lenny Dupuis
## 3431                     Mr Daniel Stretcher
## 3432                Mr Clarence L Cormier Jr
## 3433                        Mr Greg Bordelon
## 3434                         Mr Malon Dobson
## 3435                    Mr Phillip Arceneaux
## 3436                  Mr Robert W Rob Menard
## 3437                          Mr Donn E Dees
## 3438               Mr David S Cap Capdeville
## 3439                   Mr James Jimmy Segura
## 3440                          Mr David Doise
## 3441                    Mr Charles Bruchhaus
## 3442                       Mr Richard McNabb
## 3443                         Mr Bobby Miller
## 3444                         Mr Jason Bouley
## 3445                 Mr Julius Bubba Caraway
## 3446                      Mrs Debbie Abshire
## 3447                     Mrs Linda G Langley
## 3448                       Mrs Tammie Miller
## 3449                     Mr Robert B Ramagos
## 3450           Mrs Jennifer Courville Landry
## 3451                      Mr George Gotreaux
## 3452                   Mr C H Brandy Hammond
## 3453              Mr Cursey Junior Marcantel
## 3454                                        
## 3455                       Mrs Robyn Leblanc
## 3456                      Mr Joseph W Guidry
## 3457                      Mr Lee Adam Landry
## 3458                        Mr Terry W Duhon
## 3459                 Mrs Cathy Hollingsworth
## 3460                      Mr Robbie Bertrand
## 3461                    Mrs Carolyn Louviere
## 3462                    Mr Eddie B Alfred Jr
## 3463                        Mr Bruce Lemelle
## 3464                      Mrs Cheryl Vincent
## 3465                       Mr Marcus Crochet
## 3466                    Mr Luther Sam Alfred
## 3467                         Mr Allen Ardoin
## 3468                        Mr Charles Drake
## 3469                           Mr Hugh Fruge
## 3470                        Mrs Becky Hudson
## 3471                     Mr Robert Bob Owens
## 3472                   Mr Curtis Red Dickens
## 3473                          Mrs Mary Jones
## 3474                 Mr Clifford Brian Leday
## 3475                        Mr Tony Guillory
## 3476             Mrs Shirley LaFleur Johnson
## 3477                  Mrs Margaret G Langley
## 3478                       Mr Marcus Lemoine
## 3479                        Mrs Brenda Moore
## 3480                   Mrs Dorothy L Charles
## 3481                Mrs Sherry Hymel Crochet
## 3482                      Mr Ellsworth Duhon
## 3483                          Mr David Hanks
## 3484                          Mr Troy Trahan
## 3485                      Mr Rogeous Lawdins
## 3486                      Mr Johnny Armentor
## 3487                           Mr Trey Myers
## 3488            Mr Anthony Philip LeBlanc Jr
## 3489                       Mr Stevie VanHook
## 3490                        Mrs Ann L Ardoin
## 3491            Mr Alfred F Freddie Boustany
## 3492                      Mr Elroy Broussard
## 3493                   Mr Earl Nickey Picard
## 3494                        Mr Michael Stagg
## 3495                     Mr Stephen Handwerk
## 3496          Mrs Susannah Johnson Malbreaux
## 3497                    Mr Jolan H Jolivette
## 3498                       Mr James D Thomas
## 3499                     Mrs Theresa Rohloff
## 3500                     Mr John D Bernhardt
## 3501                       Mr Richard Miller
## 3502                       Mr Glenn Armentor
## 3503               Mrs Denise Tauzin D'Amato
## 3504                  Mr W Thomas Tom Angers
## 3505                       Mr Ward F Lafleur
## 3506                         Mr Brian L Pope
## 3507                         Mr Tim Reynolds
## 3508                     Mr J Hunter Simmons
## 3509                 Mr Michael Louis Hebert
## 3510                 Mr Raymond LaLa LaLonde
## 3511            Merle Elizabeth Betsy Arabie
## 3512                     Mrs Deborah R Young
## 3513                   Mr Nathan G Broussard
## 3514                    Mrs Denice C Skinner
## 3515                    Mr William H Goforth
## 3516             Mr Matthew D Matt McConnell
## 3517                  Mr Randal Randy Menard
## 3518                Mr Michael Mike Neustrom
## 3519                       Mr Louis J Perret
## 3520                     Mr Conrad T Comeaux
## 3521               Mr Lester Joseph Durel Jr
## 3522                         Mr Kevin Naquin
## 3523               Mr Joseph Jay Castille Jr
## 3524                      Mr Brandon Shelvin
## 3525                  Mr Kenneth P Boudreaux
## 3526                        Mr Jared Bellard
## 3527                   Mr Andr'e Andy Naquin
## 3528                Mr Donald L Don Bertrand
## 3529                        Mr Keith J Patin
## 3530                      Mr William Theriot
## 3531                   Mrs Francie Bouillion
## 3532                     Mr Douglas J Saloom
## 3533                   Mr Earl Nickey Picard
## 3534                       Mr Mark Babineaux
## 3535                        Mr Tommy Angelle
## 3536                       Mr Shelton J Cobb
## 3537                       Mr Tehmi Chassion
## 3538                   Mr Kermit J Bouillion
## 3539                          Mr Greg Awbrey
## 3540                       Mr Mark Cockerham
## 3541                       Mr Hunter Beasley
## 3542                        Mrs Rae B Trahan
## 3543                      Mr Preston J Leger
## 3544                      Mr Kermit J Guidry
## 3545                  Mr Lynwood J Broussard
## 3546                   Mrs Barbara Broussard
## 3547                Mr Michael Chalk Angelle
## 3548            Mr Kevin C Chee Chee Credeur
## 3549                    Mr Donald Don Garber
## 3550             Mr Weston J Bruce Broussard
## 3551                     Mrs Nancy L Poirier
## 3552                 Mrs Judy Lantier Menard
## 3553                        Mr Aldon L Duhon
## 3554                           Mr Jay Hebert
## 3555                        Mrs Laura Menard
## 3556                      Mr Russell Comeaux
## 3557                            Mr Pat Dugas
## 3558                       Mr Darrell Menard
## 3559                Mr Harold Harry Domingue
## 3560                 Mr Sanford Butch Landry
## 3561                    Mr Glenn L Brasseaux
## 3562               Mr Purvis Joseph Morrison
## 3563                   Mr Wilson B Viator Jr
## 3564                         Mr Carlos Stout
## 3565                           Mr Chad Leger
## 3566                          Mr Earl Menard
## 3567                     Mr JanScott Richard
## 3568                 Mr Antoine Babineaux Jr
## 3569                        Mr L J Boudreaux
## 3570                          Mrs Kim Guidry
## 3571                          Mr J L Richard
## 3572                    Mr Alfred Al Sinegal
## 3573                           Mr Bill Young
## 3574                      Mr Terry Montoucet
## 3575                      Mr Danny T Hollier
## 3576                          Mr Mark Moreau
## 3577                           Mr Ken Ritter
## 3578                     Mrs Brenda J Burley
## 3579                       Mr A J Bernard Jr
## 3580                          Mr Tim Barbier
## 3581                 Mrs Dianne W McClelland
## 3582                       Mr Lawrence Autin
## 3583                          Mr Jerry Jones
## 3584                       Charles A LeBlanc
## 3585                            Rita Rivault
## 3586                     Mr Nelson Taylor Sr
## 3587                         Mr David Hebert
## 3588                            Sandy Arabie
## 3589                         Preston J Roddy
## 3590                 Mrs Marlene M Blanchard
## 3591                                        
## 3592                     Mrs Carol R Leblanc
## 3593                                        
## 3594                      Mr Albert J Guidry
## 3595                          Kenneth Doucet
## 3596                        Mrs Jane Griffin
## 3597                                        
## 3598                                        
## 3599                                        
## 3600                                        
## 3601                                        
## 3602                                        
## 3603                                        
## 3604                                        
## 3605                       Mr Joseph Orgeron
## 3606                          Mr Craig Webre
## 3607                    Mr Vernon H Rodrigue
## 3608                     Mr Michael H Martin
## 3609                          Mr John C King
## 3610                Mrs Charlotte A Randolph
## 3611                          Mr Jerry Jones
## 3612                      Mr Michael Delatte
## 3613                      Mr Aaron Caillouet
## 3614                  Mr Joseph Joe Fertitta
## 3615                          Mr John Arnold
## 3616                         Mr Lindel Toups
## 3617                       Mr Phillip Gouaux
## 3618                         Mr Jerry LaFont
## 3619                      Mr Daniel Lorraine
## 3620                      Mr Mark D Chiasson
## 3621                        Mr Harley J Gros
## 3622                      Mr Louis Thibodaux
## 3623                      Mrs Rhoda Caldwell
## 3624                    Mr Richmond Rev Boyd
## 3625                   Mrs Marian B Fertitta
## 3626           Mrs Stella Chiasson Lasseigne
## 3627                          Mr Gregg Stall
## 3628                         Mr Gary J Foret
## 3629                       Mr Ronald J Pere'
## 3630                        Mrs Julie Breaux
## 3631                 Mr Dennis Jean Chiasson
## 3632             Mr Clyde Joey Duplantis III
## 3633                  Mrs Ann Bouvier Sanamo
## 3634                            Mr Al Archer
## 3635                        Mr Larry P Pitre
## 3636                      Mr Lawrence Mounic
## 3637           Mr Harris Chuckie Cheramie Jr
## 3638                       Mr Perry Gisclair
## 3639                          Mr Kris Gaudet
## 3640                      Mr Donald J Vizier
## 3641                   Mr Wilbert Collins Sr
## 3642                      Mr Larry J Griffin
## 3643                        Mr John Melancon
## 3644                         Mr Jimmy Guidry
## 3645                      Mr Ervin Vin Bruce
## 3646                  Mr Jean Denis Rodrigue
## 3647                        Mrs Mary U Foret
## 3648                    Mr Bennett Arceneaux
## 3649                    Mrs Lois L Gautreaux
## 3650                       Mr Benny J Percle
## 3651                        Mr Dwain LeBouef
## 3652                Mr John Johnny Detillier
## 3653                        Mr Carl A Doucet
## 3654                        Mr Tommy Eschete
## 3655                         Mr Joey Bouziga
## 3656                       Mr Paul Champagne
## 3657                         Mr Reggie Pitre
## 3658                        Mr Warren Vedros
## 3659                   Mr Lloyd Chip Badeaux
## 3660                            Mr Chad Mire
## 3661                       Mr Donovan Barker
## 3662             Mrs Sharon Robichaux Guidry
## 3663                       Mr Craig M Rogers
## 3664                       Mr Rodney Hartman
## 3665                 Mr Weldon Chunky Triche
## 3666                         Mr Eddie Hebert
## 3667                         Mr Gene Richard
## 3668          Mrs Constance Thompson Johnson
## 3669                     Mr David Dave Adams
## 3670                      Mr Jody P Cheramie
## 3671             Mr Lindberg Bap Lorraine Jr
## 3672                    Mrs Priscilla Mounic
## 3673                       Mr Willis P Toups
## 3674                      Mrs Margie D Cruse
## 3675                     Mr Sammy J Franklin
## 3676                                        
## 3677                                        
## 3678                                        
## 3679                                        
## 3680                                        
## 3681                                        
## 3682                                        
## 3683                                        
## 3684                                        
## 3685                                        
## 3686                       Mr Blake Phillips
## 3687                 Mrs Catherine W Roberts
## 3688                   Mrs Marsheela Walters
## 3689                         Mr Reed Walters
## 3690                                        
## 3691                                        
## 3692                    Mr Kevin Coda Salter
## 3693                                        
## 3694                       Mrs Gladys Denton
## 3695                         Mrs Jaime Brock
## 3696                                        
## 3697                                        
## 3698                      Mrs Patricia Dobbs
## 3699                                        
## 3700                       Mr Scott Franklin
## 3701                        Mr Steve Andrews
## 3702              Mr Thomas Houston Kendrick
## 3703                       Mr I C Turnley Jr
## 3704                        Mr Eddie Coolman
## 3705                  Mr Charles Buddy Poole
## 3706                       Mr Jerry M Harris
## 3707                       Mr Larkin Jackson
## 3708                      Mr Clifton Jackson
## 3709                         Mr Jack Zeagler
## 3710                          Mr Mike Crooks
## 3711                         Mr Bard Lambeth
## 3712                      Mr Bobby R Francis
## 3713                       Mr Ben Chuck Reid
## 3714                        Mrs Dawn B Stott
## 3715                 Mr Howard Coach McCarty
## 3716                        Mrs Maple T Book
## 3717                       Mrs Virgie Wilson
## 3718                   Mrs D'Juana McCartney
## 3719                        Mr Buddy Bethard
## 3720                       Mr Walter P Creel
## 3721                      Mr Dolan Pendarvis
## 3722                     Mr Charlie Anderson
## 3723               Mr Melvin Roy Worthington
## 3724            Mrs Shana Westbrooks DeVille
## 3725                    Mrs Debbie W Chisolm
## 3726                     Mr Charles Flaherty
## 3727                       Mr Don R Smith Sr
## 3728                          Mr F C Thaxton
## 3729                     Mr Leroy Westbrooks
## 3730                        Mr Sammy Chisolm
## 3731                       Mr J Clyde Crooks
## 3732                          Mr June Fowler
## 3733                  Mr L V Pete Breithaupt
## 3734                    Mr Murphy R McMillin
## 3735                      Mr Jason D Chisolm
## 3736                       Mr Charles Newsom
## 3737                      Mrs Terri B Corley
## 3738                         Mr Paul M Smith
## 3739                           Mr John Stott
## 3740                          Mr Leland Guin
## 3741                         Mr Wayne Corley
## 3742                           Mr Al Cassels
## 3743                Mrs Rhonda Gough Elliott
## 3744                      Mr Jeffrey Lasiter
## 3745                        Mr L J Rachal Jr
## 3746                     Mrs Samantha J Wood
## 3747                      Mr Lance B Coleman
## 3748                   Mr Danny Boy Ferguson
## 3749                   Cynthia Renee Langley
## 3750                    Mr Q F Fritz Sagdahl
## 3751                      Mrs Martha H Smith
## 3752                           Mrs Dawn Book
## 3753                 Mr William P Bill Brown
## 3754                    Mr Patrick McDougald
## 3755                      Mr Jesse Powers Jr
## 3756                     Mrs Stacie P Strain
## 3757                  Mr David Paul Jones Jr
## 3758                      Mr Donnie Kendrick
## 3759                         Mr Carl Newburg
## 3760                     Mr Donny Richardson
## 3761                     Mr Tommy D Sandifer
## 3762                                        
## 3763                     Mr Shawn H Robinson
## 3764                      Mrs Annie H Hamlin
## 3765           Mrs Felecia Cockerham Johnson
## 3766                                        
## 3767                                        
## 3768                                        
## 3769                                        
## 3770                                        
## 3771                                        
## 3772                                        
## 3773                                        
## 3774                                        
## 3775                           Mr John Buske
## 3776                        Mrs Laura Farrar
## 3777                         Mr Wayne Harris
## 3778                   Mr William Bill Hogan
## 3779                        Mrs Celia Napper
## 3780                                        
## 3781                                        
## 3782                                        
## 3783                   Mrs Mary Jane Stearns
## 3784                                        
## 3785                                        
## 3786                                        
## 3787                                        
## 3788                                        
## 3789                                        
## 3790                                        
## 3791                      Mrs Alice Herrmann
## 3792                           Mr Mike Stone
## 3793                          Mrs Linda Cook
## 3794              Mrs Sheila Glover Bordelon
## 3795             Mr James Michael Mike Belue
## 3796                       Mrs Theresa Wyatt
## 3797                      Mrs Hazel D Hunter
## 3798                        Mr Bobby Bennett
## 3799                     Mr Randy C Roberson
## 3800                        Mr David Hammons
## 3801                      Mr Walter D Pullen
## 3802                          Mr Jody Backus
## 3803                         Mr Skip Russell
## 3804                        Mr Joe Henderson
## 3805                        Mrs Nancy Wilson
## 3806                    Mrs Sharyon Mayfield
## 3807                         Mr Ronny Walker
## 3808                        Mr Danny W Tatum
## 3809                       Mr Michael Hilton
## 3810               Mrs Mattie Perry Harrison
## 3811                          Mr Eddie Jones
## 3812                       Mr Curtis Dowling
## 3813                    Mr Michael J Barmore
## 3814                        Mr Danny Hancock
## 3815                     Mr Joe E Mitcham Jr
## 3816                           Mr Trott Hunt
## 3817                           Mrs Lisa Best
## 3818                     Mrs Lynda Henderson
## 3819                          Mr Otha Anders
## 3820                       Mr George Mack Jr
## 3821                       Mrs Debbie Abrahm
## 3822                     Mr Richard J Gallot
## 3823                       Mr Heath Hattaway
## 3824                      Mrs Barbra Barmore
## 3825                          Mr Steve Moore
## 3826             Mr Ta'Darren Smokey Jackson
## 3827                           Mr David Kent
## 3828                      Mr Prentis Barmore
## 3829                         Mr Jack C Pipes
## 3830                       Mr Edward R Jones
## 3831                    Mr Dan Hollingsworth
## 3832                  Mr Robert W Bob Jensen
## 3833                     Mr Walter Carpenter
## 3834                       Mr Bill Sanderson
## 3835                     Mr Willie Hendricks
## 3836                      Mr Russell Croxton
## 3837                         Mr Bobby Milner
## 3838                         Mr Billy Foster
## 3839                         Mr Joe R Aswell
## 3840                          Mr Ricky Maier
## 3841                     Mr Brandon Williams
## 3842                        Mrs Tiffany Cole
## 3843                         Mr Doug Durrett
## 3844                         Mrs Pam Durrett
## 3845                Mrs Glenda Braggs Howard
## 3846                      Mr Elmore Mayfield
## 3847                           Mr Jedd Lewis
## 3848                           Mr Jim Pearce
## 3849                       Mrs Marie S Riggs
## 3850                   Mr Birdex Copeland Jr
## 3851                       Mrs Yanise N Days
## 3852                        Mrs Cathy Holmes
## 3853                       Mr Cullen Jackson
## 3854                        Mr Roy L Jackson
## 3855                    Mrs Vallie C Carrico
## 3856              Mrs Primadonna Donna Lewis
## 3857                Mr Robert Skeeter Colvin
## 3858                       Mr Davie H Powell
## 3859                       Mrs Hattie Graham
## 3860                       Mr Keith Brasuell
## 3861                        Mrs Linda Graham
## 3862                         Mr Billy Talton
## 3863                  Mr Randall Randy Albin
## 3864                 Mrs Sonya Bankston Hull
## 3865                       Mr Malcolm Sibley
## 3866                        Mr Gene Williams
## 3867                                        
## 3868                      Mr Daniel H Landry
## 3869                                        
## 3870                                        
## 3871                                        
## 3872                        Mr Aaron Varnado
## 3873                    Mrs Cassandra Butler
## 3874                         Mr Jerry Denton
## 3875                Mrs Donna Carlisle Erdey
## 3876                    Mr Timothy Tim Grant
## 3877                      Mr Mickey McMorris
## 3878                        Mr James Tullier
## 3879                        Mr Jeffery S Ard
## 3880                           Mr Gene Baker
## 3881              Mrs Julie LaLonde Robinson
## 3882                  Mr Robert W Bob Morgan
## 3883                    Mr Gary E Varnado Sr
## 3884                        Mr Derek Babcock
## 3885                  Mrs Claire Peak Coburn
## 3886                 Mr Robert Bob Scivicque
## 3887                        Mr George Slaght
## 3888                     Mr Jason Gerald Ard
## 3889               Mr Thomas Tom Sullivan Jr
## 3890                  Mr Jeffrey Jeff Taylor
## 3891                              Mr Ron Coe
## 3892                         Mr Layton Ricks
## 3893                        Mr Chance Parent
## 3894                  Mr James Jim Norred Jr
## 3895                          Mrs Cindy Wale
## 3896                      Mr Marshall Harris
## 3897                         Mrs Joan Landry
## 3898                 Mrs Sonya Ohmer Collins
## 3899                           Mr Ricky Goff
## 3900                       Mr Ronald L Sharp
## 3901                      Mr Delos Blackwell
## 3902             Mr Charles W Chuck Borde Jr
## 3903                    Mr Jerry L Denton Jr
## 3904                       Mr Malcolm Sibley
## 3905           Mrs Kellee Hennessy Dickerson
## 3906                      Mr Milton D Hughes
## 3907                   Mrs Karen Wax Schmitt
## 3908                      Mr Buddy Mincey Jr
## 3909                             Mr Jeff Cox
## 3910                 Mr James V Jimmy Watson
## 3911                         Mr Keith Martin
## 3912                          Mr Sid Kinchen
## 3913                          Mr Jeff Sachse
## 3914                   Mrs Rhonda Dale Wheat
## 3915                          Mr Max C Owens
## 3916                 Mrs Lena Bitsy Balfantz
## 3917               Mrs Mary Vicknair Bennett
## 3918                 Mrs Sandra Allen Causey
## 3919                         Mr Lance Radley
## 3920                        Mrs Rita Stewart
## 3921                   Mrs Judith Judy White
## 3922                 Mrs Cindy Strange Small
## 3923               Mr Richard Ricky Chandler
## 3924                       Mr M Warren Watts
## 3925                        Mr Bruce Bennett
## 3926                  Mr Carroll Wayne Bates
## 3927                         Mr Glenn Hoover
## 3928                        Mr Ronnie Causey
## 3929                   Mr James Jimmy Alford
## 3930                          Mr Leroy Owens
## 3931                       Mr Barry White Sr
## 3932                        Mr Bobby R Smith
## 3933                 Mr James E Jimmy Durbin
## 3934                          Mr Rick Ramsey
## 3935               Mr Thomas Dillard Stewart
## 3936                       Mr Gillis Windham
## 3937                         Mr Derral Jones
## 3938                       Mr Charles Martin
## 3939             Mr Charles E Charlie Martin
## 3940                        Mrs Toni Guitrau
## 3941                         Mr David Carter
## 3942                          Mr Marliam Lee
## 3943                 Mr Russell D Hutchinson
## 3944                   Mr Randy M Dufrene Sr
## 3945                        Mr Harry Brignac
## 3946                       Mr Jonathan Davis
## 3947                 Mr Tracy J Girlinghouse
## 3948                            Mr Jim Goins
## 3949                         Mr Gary Griffin
## 3950               Mrs Scarlett Milton Major
## 3951                      Mr Paul Roberts Jr
## 3952                   Mr Jerry JJ Barnum Jr
## 3953                   Mr Jerry JJ Barnum Jr
## 3954                         Mr Peter W Bock
## 3955                         Mr J Paul Canik
## 3956                         Mr J Paul Canik
## 3957                   Mr Vince Deliberto Jr
## 3958                Mr Vince  T Deliberto Jr
## 3959                        Mr Craig McGehee
## 3960                       Mr Gillis Windham
## 3961                       Mr Roy Winston Jr
## 3962                       Mr David McCreary
## 3963                 Mr Randall Randy Morgan
## 3964                 Mr James H  Jimmy Nesom
## 3965                        Mr Joey H Sibley
## 3966                          Mr Wade Wilson
## 3967                       Mr Thomas R Abels
## 3968                     Mrs Mary Ann Bissel
## 3969             Mrs Mildred Ratcliff Cowsar
## 3970           Mrs Marsha Threeton Sherburne
## 3971                      Mr Johnny Vicknair
## 3972                      Mrs Danette Aydell
## 3973                       Mrs Teresa Miller
## 3974                        Mr Glen G Newell
## 3975                    Mr Milton Gary Brady
## 3976               Mr Jeffrey Scotty Martone
## 3977                      Mr Johnnie JJ Page
## 3978                          Mr Chris Davis
## 3979                  Mrs Ann M Annie Fugler
## 3980                   Mrs Lori LammWilliams
## 3981                  Mr Arthur L Perkins Sr
## 3982                          Mr John Wascom
## 3983                        Mr Gene Glascock
## 3984                      Mr Edmond C Harris
## 3985                     Mr Lloyd Bee Martin
## 3986                             Janet Clark
## 3987                       Eddie Fountain Sr
## 3988                         Linda Shoemaker
## 3989                           Debra Whitney
## 3990                                        
## 3991                               Billy Dew
## 3992                            Tommy Watson
## 3993                          Oscar Hamilton
## 3994                           Gloria Hayden
## 3995                          Mr Fred B Wyly
## 3996                                        
## 3997                                        
## 3998                                        
## 3999                                        
## 4000                                        
## 4001                          Mr Larry G Cox
## 4002                      Mrs Marion Hopkins
## 4003                         Mr Jim D Sevier
## 4004                     Mr Thomas A Neumann
## 4005            Mr Robert Dalton Fortenberry
## 4006                        Mr Stanley Ogden
## 4007               Mrs Patricia Pat Buchanan
## 4008                             Mr C J Oney
## 4009                 Mrs Jane Gladys Sanders
## 4010                  Mrs Jerry S Richardson
## 4011                       Mr Randy J Morgan
## 4012                       Mr Eddie Fountain
## 4013               Mrs Jann WilliamsBuchanan
## 4014                    Mrs Paula E Hamilton
## 4015                     Mr Oscar W Hamilton
## 4016                        Mrs Vera L Davis
## 4017                       Mrs Rita Hargrave
## 4018                         Mrs Beth Thomas
## 4019                       Mrs Kathy C Grady
## 4020                     Mr Andrew W Claxton
## 4021                   Mrs Afriena Stevenson
## 4022                      Mr Tilford M Watts
## 4023                     Mr Charles Roberson
## 4024                   Mr Charlie Trimble Jr
## 4025                           Mr Gene M Cox
## 4026                    Mr Eddie Beckwith Jr
## 4027                           Mr Robert Ott
## 4028                     Mrs Margaret Yerger
## 4029                     Mr Robert Kivett Sr
## 4030                 Mr James Earl Vaughn Jr
## 4031                        Mr Mark Federick
## 4032                          Mr Jimmy Lopez
## 4033                        Mr Marvin Ashley
## 4034                     Mrs Katherine Davis
## 4035                       Mr Donald L Frith
## 4036                    Mrs Margaret F Crews
## 4037                    Mr Walter S Crews Jr
## 4038                      Mr Andrew Federick
## 4039                         Mrs Olga Butler
## 4040                    Mr Donnie Ray Remore
## 4041                         Mr Tommy Wixson
## 4042            Mr Charles Michael Finlayson
## 4043                      Mrs Lisa D Houston
## 4044                         Mr Tommy Watson
## 4045                        Mrs Marjorie Day
## 4046                 Mrs Gloria Owens Hayden
## 4047                        Mr Roy Armstrong
## 4048              Mrs Joann Kennedy Bradford
## 4049                       Mr Donald Britton
## 4050                         Mr Marvin Moore
## 4051                       Mrs Rose Thompson
## 4052                                        
## 4053                     Mr Charles Bradford
## 4054                                        
## 4055                       Mr Michael Atkins
## 4056                 Mr Roosevelt Doug Payne
## 4057                       Mr Terry Matthews
## 4058                           Mr Issac Gray
## 4059                   Mr Cloyd Boots Farrar
## 4060                                        
## 4061                                        
## 4062                                        
## 4063                                        
## 4064                                        
## 4065                                        
## 4066                                        
## 4067                          Mr 'Mike Tubbs
## 4068                         Mrs Carol Jones
## 4069                            Mr John Hill
## 4070                      Mr Edward Chorette
## 4071                        Mr Floyd Tomboli
## 4072                          Mr Harry Reese
## 4073                        Mr Mark Sistrunk
## 4074                        Mr Jack Cockrell
## 4075                       Mr Jason Crockett
## 4076                       Mr Terry Matthews
## 4077                           Mr Issac Gray
## 4078                     Mr Phillip M Lester
## 4079                       Mrs Lisa Chafford
## 4080                   Mrs Karen Travis Diel
## 4081                   Mr Louis E Ike Melton
## 4082                     Mr Ronald R Vollmar
## 4083                      Mr Jeff Churchwell
## 4084                        Mr Mike Stephens
## 4085                  Mrs Tamika GrayFarrell
## 4086              Mr Robert Squeeze Fenceroy
## 4087                    Mr Robert P Deblieux
## 4088                       Mrs Glennis Lewis
## 4089                           Mr Joel Fitch
## 4090                           Mary C Hayden
## 4091                          Mr Ben L White
## 4092                          Mr John Sawyer
## 4093                           Mrs ZZ Wilson
## 4094                     Mrs Kitty R Johnson
## 4095                 Mr Vernon Butch Bostick
## 4096                        Mr Jackie Swartz
## 4097                    Mr Ben E Sonny Baker
## 4098                       Mr David G Thomas
## 4099                        Mrs Ruthie Moore
## 4100                    Mr Brandon Gilbreath
## 4101                      Mrs Donna J Atkins
## 4102                       Mr Derl R Johnson
## 4103                   Mrs Betty AlfordOlive
## 4104                          Mr Floyd Baker
## 4105                 Mr Mitchell MJ Jeselink
## 4106                       Mr Johnny McAdams
## 4107                          Mr Andy Barham
## 4108                         Mr Marvin Moore
## 4109                         Mr Marvin Moore
## 4110                        Mr Obbie Johnson
## 4111                  Mr William Sonny Nason
## 4112                          Mr Robert Shaw
## 4113                        Mr Roy Armstrong
## 4114                        Mr Roy Armstrong
## 4115                         Mr Howard Loche
## 4116                       Mr Howard D Loche
## 4117                  Mr Ezekiel Anderson Jr
## 4118             Mrs Margarite Sampson Brown
## 4119                  Mr Richard D Rick Polk
## 4120                                        
## 4121                      Mrs Dawn Gilbreath
## 4122                       Mrs Betty H Jones
## 4123                         Mr Frank Miller
## 4124                    Mr Richard Blackwell
## 4125                 Mr Timothy Tim Mitchell
## 4126                      Mr Allen Spires Jr
## 4127                       Mr Eugene H Allen
## 4128                        Mr Neil Mott III
## 4129                        Mr Clint Shepard
## 4130         Mrs Cynthia Niecy Carter French
## 4131                      Mr Lamarr McGaskey
## 4132                             Larry Paige
## 4133                                        
## 4134                                        
## 4135                                        
## 4136                                        
## 4137                                        
## 4138                                        
## 4139                                        
## 4140                            Mozella Bell
## 4141                                        
## 4142                                        
## 4143                           Rickey LaCour
## 4144                                        
## 4145                                        
## 4146                                        
## 4147                                        
## 4148                                        
## 4149                                        
## 4150                                        
## 4151                                        
## 4152                                        
## 4153                                        
## 4154                                        
## 4155                                        
## 4156                         Mr Victor Jones
## 4157                        Mr Louie Bernard
## 4158              Mrs Dollie Charles Mahoney
## 4159                            Roy L Ceaser
## 4160                          Mr Rick Nowlin
## 4161                          Mr Chris Paige
## 4162                         Mr Ricky LaCour
## 4163                     Mr Aaron AJ Johnson
## 4164                     Mr Rodney L Bedgood
## 4165                        Mr John D Salter
## 4166                       Mr Fred S Gahagan
## 4167                         Mr Alton Rachal
## 4168                      Mr George C Rhymes
## 4169                       Mr Harry D Graham
## 4170                         Mr Ralph Wilson
## 4171                  Mr Michael Mike Hilton
## 4172                       Mrs Joella Wilson
## 4173                  Mr Thomas Tommy Melder
## 4174                         Mr Cecil Walker
## 4175                        Mr Carl Means Sr
## 4176                    Mr Carroll E Daniels
## 4177                           Mr Russ Danzy
## 4178                      Mrs Donna M Masson
## 4179                    Mrs Patrice T Harper
## 4180               Mrs Shelia Pleasant Cagle
## 4181                      Mrs Rhonda Sanders
## 4182                        Mr Monty Trichel
## 4183                       Mr Kenneth Dowden
## 4184                         Mr Bobby Carter
## 4185                            Mr Lee Posey
## 4186                Mrs Oneary Thompson Bobb
## 4187                        Mr W Gahagan Lee
## 4188                        Mr Bobby Braxton
## 4189                Mrs Verna Martin Bedgood
## 4190                          Mrs Edna Jones
## 4191                      Mrs Johnnie Taylor
## 4192                         Mr Randy Dupree
## 4193                          Mr Tommy O'Con
## 4194                     Mr Gregory Eldridge
## 4195                         Mr Fred Holland
## 4196                      Mr Darrell Fredieu
## 4197                        Mr Johnny Rowell
## 4198                  Mr McKindley Hoover Sr
## 4199                       Mrs Alida D Blake
## 4200                  Mr Harry Max Voight Jr
## 4201                          Mr Mike Marbut
## 4202                          Mr Don Mims Jr
## 4203               Mrs Jamie Ragan Alexander
## 4204                    Mr Frank Mitchell Jr
## 4205               Mrs Natonya Grayson Pikes
## 4206                           Mr Ben Dupree
## 4207                           Mr Dan Dupree
## 4208                        Mr Reed Franklin
## 4209                    Mrs Shelia F Braxton
## 4210                      Mrs Henrietta Byrd
## 4211                        Mr Joe Walker Jr
## 4212                       Mr Jessie Redford
## 4213                      Mr Hardrick Rivers
## 4214                        Mr Patrick Sweet
## 4215                      Mr Fred Ballard Jr
## 4216                Mr Cecil E Buddy Boswell
## 4217                        Mr Richard Luman
## 4218                        Mr Bobby A Behan
## 4219                        Mr Ronnie French
## 4220                           Mrs Ann Moran
## 4221                         Mr Vincent Bown
## 4222                   Mrs Juanita R Calhoun
## 4223                         Mrs Carol Doyle
## 4224                         Mr David Stamey
## 4225                         Mr Dale Nielsen
## 4226                       Mrs Sylvia Morrow
## 4227                        Mr Larry D Payne
## 4228                Mrs Mary Donaway Collins
## 4229             Mr Triventies Trent Johnson
## 4230                          Mr Cliff Jones
## 4231                   Mr Edwin E Kirkendoll
## 4232                      Mrs Bence Nicholas
## 4233                       Mr H Jamon Barrow
## 4234                  Mrs Elizabeth Brusseau
## 4235                 Mrs Desiree Cook Calvin
## 4236                        Mr Jason Coleman
## 4237                      Mrs Sylvia M Crier
## 4238                Mrs Lisa Gagliano Dawson
## 4239               Mrs Maple Richmond Gaines
## 4240                    Mr George M Gates IV
## 4241                      Mr Alan J Langhoff
## 4242                    Mrs Deborah Langhoff
## 4243                      Mrs Megan Langhoff
## 4244                       Mr Nolan Marshall
## 4245                        Mrs Tania Tetlow
## 4246                       Mrs Lynda Woolard
## 4247                Mr Samson Skip Alexander
## 4248                      Mrs Diana E Bajoie
## 4249                  Mr Olander P Bajoie Jr
## 4250                  Mrs Charmaine BakerFox
## 4251                          Mr Jay H Banks
## 4252                          Mrs Avis Brock
## 4253             Mrs Margaret Maggie Carroll
## 4254                       Mr Ronald Coleman
## 4255                        Mr Julius Feltus
## 4256                        Mrs Felicia Kahn
## 4257                       Mr Walt Leger III
## 4258                       Mrs Helena Moreno
## 4259                        Mr Dana Peterson
## 4260                     Mr Jeffrey J Thomas
## 4261                  Mr Joseph Broussard Jr
## 4262                        Mr Troy C Carter
## 4263                  Mrs Germaine Davillier
## 4264                       Mr John Davillier
## 4265                      Mrs Lisa Ray Diggs
## 4266                 Mrs Ericka EdwardsJones
## 4267              Mr Kenneth Paul Garrett Sr
## 4268                           Ron Guidry Sr
## 4269            Mrs Angela Theresa Henderson
## 4270                     Mr Steven M Jupiter
## 4271                       Mr Darren Lombard
## 4272                       Mr Morris Reed Jr
## 4273                      Mr Edward Robinson
## 4274                      Mrs Marie Williams
## 4275                      Mr Wesley T Bishop
## 4276                   Mrs Elaine BoutteYost
## 4277                     Mr Sidney H Cates V
## 4278                      Mr Royce Duplessis
## 4279                Mrs Letitia Clark George
## 4280                      Mrs Louella Givens
## 4281                      Mr Randy D Greenup
## 4282                Mrs Cynthia HedgeMorrell
## 4283                Mrs Charlene LarcheMason
## 4284                         Mr Mike McKenna
## 4285                     Mr Arthur A Morrell
## 4286                           Mr JP Morrell
## 4287                          Mr James Perry
## 4288                       Mrs Angele Wilson
## 4289                     Mrs Cynthia G Banks
## 4290                     Mr Frederick M Bell
## 4291                       Mr Ronald Carrere
## 4292               Mrs Carolyn CollinsDebose
## 4293            Mrs Shelia CollinsStallworth
## 4294                      Mrs Michon Copelin
## 4295                   Mrs Lena CraigStewart
## 4296              Mrs Yolanda Gullette Evans
## 4297                         Mr James A Gray
## 4298                     Mrs Terrie C Guerin
## 4299                        Mr Carl A Haydel
## 4300                         Mr Willie Jones
## 4301                    Mrs Barbara R Keller
## 4302                 Mrs Sabrina MaysMontana
## 4303                     Mr John Jay Batt Jr
## 4304                    Mrs Virginia Blanque
## 4305                        Mr Brett A Bonin
## 4306                       Mr Adrian Bruneau
## 4307           Mrs Christine Chrissy Bruneau
## 4308                          Mr Jeb Bruneau
## 4309                     Mr Robert Bob Ellis
## 4310                     Mr John Fenn French
## 4311                      Mrs Michele Gaudin
## 4312                     Mr Louis Gurvich Jr
## 4313                        Mr Murray Nelson
## 4314           Mr Salvador Sal Palmisano III
## 4315                 Mr Nathaniel M Phillips
## 4316                         Mrs Cecile Tebo
## 4317                           Mr Marc Behar
## 4318                      Mr Randy Boudreaux
## 4319                           Mr Tony Clesi
## 4320                       Mr Beau  L Crouch
## 4321                  Mrs Monica Sanusi Gele
## 4322                       Mr Stephen M Gele
## 4323                Mr Medlock M Harbison Jr
## 4324                         Mrs Sarah E Roy
## 4325                     Mr Kenneth Steudler
## 4326                       Mr J Bryan Wagner
## 4327                      Mr George White Jr
## 4328                   Mr David R M Williams
## 4329                       Mr Andre Guichard
## 4330                            Mr Ed Markle
## 4331                       Mr James Pfeiffer
## 4332                  Mr Patrick T Phillpott
## 4333                 Mr Darrell Doc Richards
## 4334                      Mr Stephen M Swain
## 4335              Mr Damiano Zach Tamburrino
## 4336                    Mr Alexander Gerhold
## 4337                  Mr Eustis Guillemet Jr
## 4338                       Mr Lloyd A Harsch
## 4339                          Mr Steve Lemke
## 4340                      Mr Andre J Menzies
## 4341                     Mr Gary P Sarrat Jr
## 4342                 Mrs Claire DiRosa Simno
## 4343              Mrs Elizabeth Betsy Stoner
## 4344                           Mr Joseph Cao
## 4345                        Mr Max R Johnson
## 4346                    Mrs Ernestine S Gray
## 4347                       Mrs Tammy Stewart
##  [ reached getOption("max.print") -- omitted 2518 rows ]

Saving Cleaned File

write.csv(dfrElected, file = "C:/Users/Acer/Documents/WeSchool_R&BA/Trim 4/R/newfile.csv",row.names = FALSE)