[r-cran-matchit] 20/45: Import Upstream version 2.4-10

Andreas Tille tille at debian.org
Fri Oct 20 06:17:20 UTC 2017


This is an automated email from the git hooks/post-receive script.

tille pushed a commit to branch master
in repository r-cran-matchit.

commit fc24d4d10b58f8bff35a12dbee067bc040d67d2d
Author: Andreas Tille <tille at debian.org>
Date:   Fri Oct 20 07:40:56 2017 +0200

    Import Upstream version 2.4-10
---
 DESCRIPTION                     |   33 +-
 NAMESPACE                       |    1 +
 R/discard.R                     |    6 +-
 R/hist.pscore.R                 |   41 +
 R/jitter.pscore.R               |   14 +-
 R/match.qoi.R                   |   33 +-
 R/matchit.R                     |   16 +-
 R/matchit.qqplot.R              |   21 +-
 R/matchit2cem.R                 |   57 +
 R/matchit2full.R                |    5 +-
 R/matchit2genetic.R             |    6 +-
 R/matchit2nearest.R             |    8 +-
 R/matchit2subclass.R            |   23 +-
 R/plot.matchit.R                |    2 +
 R/plot.matchit.subclass.R       |    2 +
 R/plot.summary.matchit.R        |   42 +
 R/print.summary.matchit.exact.R |    8 +-
 R/summary.matchit.R             |   16 +-
 R/summary.matchit.exact.R       |    9 +-
 R/summary.matchit.full.R        |    1 +
 R/summary.matchit.subclass.R    |    6 +-
 demo/00Index                    |    1 +
 demo/analysis.R                 |   21 +-
 demo/cem.R                      |   47 +
 demo/exact.R                    |    4 +-
 demo/full.R                     |    8 +-
 demo/genetic.R                  |    7 +-
 demo/nearest.R                  |   34 +-
 demo/optimal.R                  |    9 +-
 demo/subclass.R                 |    7 +-
 inst/doc/.latex2html-init       |  244 ++
 inst/doc/Makefile               |   16 +
 inst/doc/balance.tex            |  137 +
 inst/doc/faq.tex                |  194 +
 inst/doc/figs/f2figb.ps         | 4081 +++++++++++++++++++++
 inst/doc/figs/hist.pdf          |  363 ++
 inst/doc/figs/jitterplotnn.eps  | 4085 +++++++++++++++++++++
 inst/doc/figs/jitterplotnn.pdf  | 3484 ++++++++++++++++++
 inst/doc/figs/qqplotnn.eps      | 7710 +++++++++++++++++++++++++++++++++++++++
 inst/doc/figs/qqplotnn.pdf      | 3007 +++++++++++++++
 inst/doc/figs/qqplotnn1.eps     | 1594 ++++++++
 inst/doc/figs/qqplotnn1.pdf     | 1555 ++++++++
 inst/doc/figs/qqplotnn2.eps     | 1604 ++++++++
 inst/doc/figs/qqplotnn2.pdf     | 1557 ++++++++
 inst/doc/graphics.R             |   48 +
 inst/doc/index.shtml            |   76 +
 inst/doc/intro.tex              |   85 +
 inst/doc/makematchH             |   18 +
 inst/doc/matchit.aux            |  188 +
 inst/doc/matchit.bbl            |  118 +
 inst/doc/matchit.blg            |   52 +
 inst/doc/matchit.log            |  636 ++++
 inst/doc/matchit.out            |   62 +
 inst/doc/matchit.pdf            |  Bin 0 -> 430354 bytes
 inst/doc/matchit.tex            |  196 +
 inst/doc/matchit.toc            |   70 +
 inst/doc/matchit2zelig.tex      |  285 ++
 inst/doc/matchitref.tex         |  389 ++
 inst/doc/mdataref.tex           |  103 +
 inst/doc/notation.tex           |  151 +
 inst/doc/overview.tex           |  199 +
 inst/doc/plotref.tex            |  105 +
 inst/doc/preprocess.tex         |  233 ++
 inst/doc/summaryref.tex         |  127 +
 man/help.matchit.Rd             |    2 +-
 man/lalonde.Rd                  |    6 +-
 man/match.data.Rd               |   32 +-
 man/matchit.Rd                  |  102 +-
 man/user.prompt.Rd              |    2 +-
 69 files changed, 33202 insertions(+), 202 deletions(-)

diff --git a/DESCRIPTION b/DESCRIPTION
index f610c96..c71d404 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,21 +1,20 @@
 Package: MatchIt
-Version: 2.2-11
-Date: 2006-06-12
-Title: MatchIt: Nonparametric Preprocessing for Parametric Casual Inference
+Version: 2.4-10
+Date: 2009-02-02
+Title: MatchIt
 Author: Daniel Ho <daniel.e.ho at gmail.com>,
+        Elizabeth Stuart <stuart at stat.harvard.edu>,
         Kosuke Imai <kimai at Princeton.Edu>, 
-        Gary King <king at harvard.edu>,
-        Elizabeth Stuart <stuart at stat.harvard.edu>
+        Gary King <king at harvard.edu>
 Maintainer: Kosuke Imai <kimai at Princeton.Edu>
-Depends: R (>= 2.2), MASS
-Suggests: optmatch, Matching, WhatIf
-Description:  MatchIt selects matched samples of the
-  the original treated and control groups with similar
-  covariate distributions -- can be used to match exactly
-  on covariates, to match on propensity scores, or perform 
-  a variety of other matching procedures.
-LazyLoad: yes
-LazyData: yes
-License: GPL version 2 or newer
-URL: http://gking.harvard.edu/matchit
-Packaged: Thu Jul 13 16:25:02 2006; estuart
+Depends: R (>= 2.7), MASS
+Description: MatchIt preprocesses data by selecting approximate matched samples
+  of the treated and control groups with similar covariate
+  distributions, drawing on a large variety of matching methods.
+  After preprocessing data with MatchIt, whatever standard parametric
+  technique one might have used without preprocessing can be used, but
+  the results will be far less model dependent.
+License: GPL (>= 2)
+URL: http://gking.harvard.edu/matchit/
+Suggests: cem, optmatch, Matching, WhatIf, nnet, rpart, mgcv
+Packaged: Mon Feb  2 09:44:18 2009; king
diff --git a/NAMESPACE b/NAMESPACE
index c6afeb7..d6f4433 100644
--- a/NAMESPACE
+++ b/NAMESPACE
@@ -11,6 +11,7 @@ S3method(print, summary.matchit)
 S3method(print, summary.matchit.exact)
 S3method(print, summary.matchit.subclass)
 S3method(plot, matchit)
+S3method(plot, summary.matchit)
 S3method(plot, matchit.subclass)
 S3method(summary, matchit)
 S3method(summary, matchit.exact)
diff --git a/R/discard.R b/R/discard.R
index a7c9527..ef1eb05 100644
--- a/R/discard.R
+++ b/R/discard.R
@@ -19,10 +19,10 @@ discard <- function(treat, pscore, option, X) {
     ## convext hull stuff
     if (!("WhatIf" %in% .packages(all = TRUE)))
       install.packages("WhatIf")
-    if (!("lpSolve" %in% .packages(all = TRUE)))
-      install.packages("lpSolve")
+#    if (!("lpSolve" %in% .packages(all = TRUE)))
+#      install.packages("lpSolve")
     require(WhatIf)
-    require(lpSolve)
+#    require(lpSolve)
     discarded <- rep(FALSE, n.obs)
     if (option == "hull.control"){ # discard units not in T convex hull
       wif <- whatif(cfact = X[treat==0,], data = X[treat==1,])
diff --git a/R/hist.pscore.R b/R/hist.pscore.R
new file mode 100644
index 0000000..ddc245b
--- /dev/null
+++ b/R/hist.pscore.R
@@ -0,0 +1,41 @@
+hist.pscore <- function(x, numdraws=5000){
+  treat <- x$treat
+  pscore <- x$distance
+  weights <- x$weights
+  matched <- weights!=0
+  q.cut <- x$q.cut
+  cwt <- sqrt(weights)
+  ratio <- x$call$ratio
+  if(is.null(ratio)){ratio <- 1}
+  
+  ## For full or ratio matching, sample numdraws observations using the weights
+  if(identical(x$call$method,"full") | (ratio!=1)) {
+    pscore.treated.matched <- sample(names(treat)[treat==1],
+                                     numdraws/2, replace=TRUE,
+                                     prob=x$weights[treat==1])
+    pscore.treated.matched <- pscore[pscore.treated.matched]
+    pscore.control.matched <- sample(names(treat)[treat==0],
+                                     numdraws/2, replace=TRUE,
+                                     prob=x$weights[treat==0])
+    pscore.control.matched <- pscore[pscore.control.matched]
+    
+  } else {
+    pscore.treated.matched <- pscore[treat==1 & weights!=0]
+    pscore.control.matched <- pscore[treat==0 & weights!=0]
+  }
+  par(mfrow=c(2,2))
+  hist(pscore[treat==1],xlim=range(na.omit(pscore)),
+       xlab="Propensity Score", freq=F,
+       main="Raw Treated")
+  hist(pscore.treated.matched,xlim=range(na.omit(pscore)),
+       xlab="Propensity Score", freq=F,
+       main="Matched Treated")
+  if(!is.null(q.cut)){abline(v=q.cut,col="grey",lty=1)}
+  hist(pscore[treat==0],xlim=range(na.omit(pscore)),
+       xlab="Propensity Score", freq=F,
+       main="Raw Control")
+  hist(pscore.control.matched,xlim=range(na.omit(pscore)),
+       xlab="Propensity Score", freq=F,
+       main="Matched Control")
+  if(!is.null(q.cut)){abline(v=q.cut,col="grey",lty=1)}
+}
diff --git a/R/jitter.pscore.R b/R/jitter.pscore.R
index 60ffc2b..f8340ea 100644
--- a/R/jitter.pscore.R
+++ b/R/jitter.pscore.R
@@ -4,9 +4,11 @@ jitter.pscore <- function(x, interactive){
   weights <- x$weights
   matched <- weights!=0
   q.cut <- x$q.cut
-  jitp <- jitter(rep(1,length(treat)),factor=6)-(treat==0)
+  jitp <- jitter(rep(1,length(treat)),factor=6)+(treat==1)*(weights==0)-(treat==0)-(weights==0)*(treat==0)
   cwt <- sqrt(weights)
-  plot(pscore,xlim=range(na.omit(pscore)),ylim=c(-1,2),
+  minp <- min(pscore,na.rm=T)
+  maxp <- max(pscore,na.rm=T)
+  plot(pscore,xlim=c(minp,maxp+0.1*(maxp-minp)),ylim=c(-1.5,2.5),
        type="n",ylab="",xlab="Propensity Score",
        axes=F,main="Distribution of Propensity Scores")
   if(!is.null(q.cut)){abline(v=q.cut,col="grey",lty=1)}
@@ -19,11 +21,13 @@ jitter.pscore <- function(x, interactive){
   points(pscore[treat==0&weights==0],jitp[treat==0&weights==0],
          pch=5,col="grey",cex=0.5)
   axis(1)
-  text(sum(range(na.omit(pscore)))/2,1.5,"Treatment Units")
-  text(sum(range(na.omit(pscore)))/2,-0.5,"Control Units")
+  text(sum(range(na.omit(pscore)))/2,2.5,"Unmatched Treatment Units")
+  text(sum(range(na.omit(pscore)))/2,1.5,"Matched Treatment Units")
+  text(sum(range(na.omit(pscore)))/2,0.5,"Matched Control Units")
+  text(sum(range(na.omit(pscore)))/2,-0.5,"Unmatched Control Units")
   box()
   if(interactive==TRUE) {
 	print("To identify the units, use first mouse button; to stop, use second.")
-  	identify(pscore,jitp,names(treat))
+  	identify(pscore,jitp,names(treat),atpen=T)
   }
 }
diff --git a/R/match.qoi.R b/R/match.qoi.R
index 4658dbf..2d08362 100644
--- a/R/match.qoi.R
+++ b/R/match.qoi.R
@@ -1,51 +1,58 @@
 ## Function to calculate summary stats
 qoi <- function(xx,tt,ww, t.plot=NULL, c.plot=NULL, sds=NULL,
-                standardize = FALSE){
+                standardize = FALSE, std=F){
   weighted.var <- function(x, w) {
     sum(w * (x - weighted.mean(x,w))^2)/(sum(w) - 1)}
-  xsum <- matrix(NA,2,6)
+  xsum <- matrix(NA,2,7)
   xsum <- as.data.frame(xsum)
   row.names(xsum) <- c("Full","Matched")
   if (standardize)
-    names(xsum) <- c("Means Treated","Means Control", "Std. Mean Diff.",
+    names(xsum) <- c("Means Treated","Means Control",
+                     "SD Control", "Std. Mean Diff.",
                      "eCDF Med", "eCDF Mean", "eCDF Max")
   else
-    names(xsum) <- c("Means Treated","Means Control","Mean Diff", "eQQ Med",
-                     "eQQ Mean", "eQQ Max")
+    names(xsum) <- c("Means Treated","Means Control",
+                     "SD Control", "Mean Diff",
+                     "eQQ Med", "eQQ Mean", "eQQ Max")
   x1 <- xx[tt==1]
   x0 <- xx[tt==0]
   ww1 <- ww[tt==1]
   ww0 <- ww[tt==0]
   xsum[1,1] <- mean(x1,na.rm=T)
   xsum[1,2] <- mean(x0,na.rm=T)
+  xsum[1,3] <- sd(x0,na.rm=T)
   X.t.m <- xx[tt==1][ww1>0]
   X.c.m <- xx[tt==0][ww0>0]
   xsum[2,1] <- weighted.mean(X.t.m, ww1[ww1>0])
   xsum[2,2] <- weighted.mean(X.c.m, ww0[ww0>0])
+  xsum[2,3] <- sqrt(weighted.var(X.c.m, ww0[ww0>0]))
   if(!(sum(tt==1)<2|(sum(tt==0)<2))){ 
     xsd <- sd(x1,na.rm=T)
     qqall <- qqsum(x1,x0,standardize=standardize)
-    xsum[1,4:6] <- c(qqall$meddiff,qqall$meandiff,qqall$maxdiff)
+    xsum[1,5:7] <- c(qqall$meddiff,qqall$meandiff,qqall$maxdiff)
     if (standardize)
       if (!is.null(sds))
-        xsum[1,3] <- (mean(x1,na.rm=T)-mean(x0,na.rm=T))/sds
+        xsum[1,4] <- (mean(x1,na.rm=T)-mean(x0,na.rm=T))/sds
       else
-        xsum[1,3] <- (mean(x1,na.rm=T)-mean(x0,na.rm=T))/xsd
+        xsum[1,4] <- (mean(x1,na.rm=T)-mean(x0,na.rm=T))/xsd
     else
-      xsum[1,3] <- mean(x1,na.rm=T)-mean(x0,na.rm=T)
+      xsum[1,4] <- mean(x1,na.rm=T)-mean(x0,na.rm=T)
     if(!is.null(t.plot))
       qqmat <- qqsum(xx[t.plot],xx[c.plot],standardize=standardize)
     else
       qqmat <- qqsum(x1[ww1>0],x0[ww0>0],standardize=standardize)
-    xsum[2,4:6] <- c(qqmat$meddiff,qqmat$meandiff,qqmat$maxdiff)
+    xsum[2,5:7] <- c(qqmat$meddiff,qqmat$meandiff,qqmat$maxdiff)
     if (standardize)
       if (!is.null(sds))
-        xsum[2,3] <- (xsum[2,1]-xsum[2,2])/sds
+        xsum[2,4] <- (xsum[2,1]-xsum[2,2])/sds
       else
-        xsum[2,3] <- (xsum[2,1]-xsum[2,2])/xsd
+        xsum[2,4] <- (xsum[2,1]-xsum[2,2])/xsd
     else
-      xsum[2,3] <- xsum[2,1]-xsum[2,2]
+      xsum[2,4] <- xsum[2,1]-xsum[2,2]
   } 
+  if(!std){
+    xsum <- xsum[,c(1:2,4:7)]
+  }
   xsum
 }
 
diff --git a/R/matchit.R b/R/matchit.R
index 254de57..2747883 100644
--- a/R/matchit.R
+++ b/R/matchit.R
@@ -4,12 +4,17 @@ matchit <- function(formula, data, method = "nearest", distance = "logit",
 
   #Checking input format
   #data input
+  mcall <- match.call()
   if(is.null(data)) stop("Dataframe must be specified",call.=FALSE)
   if(!is.data.frame(data)){
     stop("Data must be a dataframe",call.=FALSE)}
   if(sum(is.na(data))>0)
     stop("Missing values exist in the data")
-
+  # list-wise deletion
+  # allvars <- all.vars(mcall)
+  # varsindata <- colnames(data)[colnames(data) %in% all.vars(mcall)]
+  # data <- na.omit(subset(data, select = varsindata))
+  
   ## 7/13/06: Convert character variables to factors as necessary
   ischar <- rep(0, dim(data)[2])
   for (i in 1:dim(data)[2]) 
@@ -37,12 +42,10 @@ matchit <- function(formula, data, method = "nearest", distance = "logit",
     distance <- out1 <- discarded <- NULL
     if (!is.null(distance))
       warning("distance is set to `NULL' when exact matching is used.")
-  } 
-  else if (is.numeric(distance)){
+  } else if (is.numeric(distance)){
     out1 <- NULL
     discarded <- discard(treat, distance, discard, X)
-  }
-  else {
+  } else {
     if (is.null(distance.options$formula))
       distance.options$formula <- formula
     if (is.null(distance.options$data))
@@ -51,6 +54,7 @@ matchit <- function(formula, data, method = "nearest", distance = "logit",
     discarded <- discard(treat, out1$distance, discard, X)
     if (reestimate) {
       distance.options$data <- data[!discarded,]
+      distance.options$weights <- distance.options$weights[!discarded]
       tmp <- out1
       out1 <- do.call(fn1, distance.options)
       tmp$distance[!discarded] <- out1$distance
@@ -63,7 +67,7 @@ matchit <- function(formula, data, method = "nearest", distance = "logit",
   out2 <- do.call(fn2, list(treat, X, data, distance=distance, discarded, ...)) 
   
   ## putting all the results together
-  out2$call <- match.call()
+  out2$call <- mcall
   out2$model <- out1$model
   out2$formula <- formula
   out2$treat <- treat
diff --git a/R/matchit.qqplot.R b/R/matchit.qqplot.R
index 1c7ab6d..5fd52fb 100644
--- a/R/matchit.qqplot.R
+++ b/R/matchit.qqplot.R
@@ -22,9 +22,12 @@ matchit.qqplot <- function(x,discrete.cutoff,
   }
   treat <- x$treat
   matched <- x$weights!=0
+
+  ratio <- x$call$ratio
+  if(is.null(ratio)){ratio <- 1}
   
-  ## For full matching, sample numdraws observations using the weights
-  if(x$call$method=="full") {
+  ## For full or ratio matching, sample numdraws observations using the weights
+  if(identical(x$call$method,"full") | (ratio!=1)) {
     t.plot <- sample(names(treat)[treat==1], numdraws/2, replace=TRUE, prob=x$weights[treat==1])
     c.plot <- sample(names(treat)[treat==0], numdraws/2, replace=TRUE, prob=x$weights[treat==0])
     
@@ -52,11 +55,7 @@ matchit.qqplot <- function(x,discrete.cutoff,
   nc <- length(nn)
   covariates <- data.matrix(covariates)
   oma <- c(4, 4, 6, 4)
-  if(interactive){
-    opar <- par(mfrow = c(3, 3), mar = rep.int(1/2, 4), oma = oma, ask=T)
-  } else {
-    opar <- par(mfrow = c(3, 3), mar = rep.int(1/2, 4), oma = oma, ask=F)
-  }
+  opar <- par(mfrow = c(3, 3), mar = rep.int(1/2, 4), oma = oma)
   on.exit(par(opar))
   for (i in 1:nc){
     xi <- covariates[,i]
@@ -94,5 +93,11 @@ matchit.qqplot <- function(x,discrete.cutoff,
     abline(a=(rr[2]-rr[1])*0.1,b=1,lty=2)
     abline(a=-(rr[2]-rr[1])*0.1,b=1,lty=2)
     box()
-  }  
+    if(interactive){
+      par(ask=T)
+    } else {
+      par(ask=F)
+    }
+  }
+  par(ask=F)
 }
diff --git a/R/matchit2cem.R b/R/matchit2cem.R
new file mode 100644
index 0000000..6b7dee4
--- /dev/null
+++ b/R/matchit2cem.R
@@ -0,0 +1,57 @@
+# matchit2cem - matchit wrapper for cem matching algorithm
+#
+# 06/10/2008 - m.blackwell
+#
+# this function takes inputs from matchit() and returns the
+# strata for each observation in the subclass entry and the
+# weight for each observation in the weight entry. No match
+# matrix is returned since matches are not unique within
+# strata. 
+#
+matchit2cem <- function(treat, X, data, distance, discarded,
+                            ratio = 1, verbose = FALSE, k2k.method=NULL, ...) {
+
+  
+  if (!("cem" %in% .packages(all = TRUE)))
+    install.packages("cem",repos="http://gking.harvard.edu/")
+  require(cem)
+
+  if (verbose)
+    cat("Coarsened exact matching...\n")
+  
+  n <- length(treat)
+  
+  # cem takes the data all together and wants the treatment specified
+  # with the column name of the data frame. Here we massage the matchit
+  # inputs to this format. Note that X has its proper columnames, but
+  # treat does not have the original column name. 
+  cem.data <- as.data.frame(cbind(treat,X))
+  
+  mat <-
+    cem(treatment="treat",data=cem.data,verbose=as.integer(verbose)+1,
+        method=k2k.method,...)
+
+  # here we create a column vector where the matched entry get its stratum
+  # and the unmatched entry gets an NA.
+  strat <- rep(NA,n)
+  names(strat) <- names(treat)
+  strat[mat$matched] <- mat$strata[mat$matched]
+
+  # here we just add the names onto the wieght from the cem output
+  wh <- mat$w
+  names(wh) <- names(treat)
+
+  # weighting functions in matchit error-out on these conditions,
+  # so we should too.
+ 
+  if (sum(wh)==0) 
+    stop("No units were matched")
+  else if (sum(wh[treat==1])==0)
+    stop("No treated units were matched")
+  else if (sum(wh[treat==0])==0)
+    stop("No control units were matched")
+  
+  res <- list(subclass = strat, weights = mat$w)
+  class(res) <- "matchit"
+  return(res)
+}
diff --git a/R/matchit2full.R b/R/matchit2full.R
index 7b297cf..896c7b9 100644
--- a/R/matchit2full.R
+++ b/R/matchit2full.R
@@ -9,10 +9,11 @@ matchit2full <- function(treat, X, data, distance, discarded,
   
   ## full matching for undiscarded units
   ttt <- treat[!discarded]
+  ddd <- distance[!discarded]
   n0 <- length(ttt[ttt==0])
   n1 <- length(ttt[ttt==1])
-  d1 <- distance[ttt==1]
-  d0 <- distance[ttt==0]
+  d1 <- ddd[ttt==1]
+  d0 <- ddd[ttt==0]
   d <- matrix(0, ncol=n0, nrow=n1)
   rownames(d) <- names(ttt[ttt==1])
   colnames(d) <- names(ttt[ttt==0])
diff --git a/R/matchit2genetic.R b/R/matchit2genetic.R
index 9aedf33..1b11283 100644
--- a/R/matchit2genetic.R
+++ b/R/matchit2genetic.R
@@ -1,8 +1,8 @@
 matchit2genetic <- function(treat, X, data, distance, discarded,
                             ratio = 1, verbose = FALSE, ...) {
-  if (!("rgenoud" %in% .packages(all = TRUE)))
-    install.packages("rgenoud")
-  require(rgenoud)
+  #if (!("rgenoud" %in% .packages(all = TRUE)))
+  #  install.packages("rgenoud")
+  #require(rgenoud)
 
   if (!("Matching" %in% .packages(all = TRUE)))
     install.packages("Matching")
diff --git a/R/matchit2nearest.R b/R/matchit2nearest.R
index 9a3460f..dc873a4 100644
--- a/R/matchit2nearest.R
+++ b/R/matchit2nearest.R
@@ -45,7 +45,13 @@ matchit2nearest <-  function(treat, X, data, distance, discarded,
   clabels <- names(treat[treat==0])
   in.sample <- !discarded
   names(in.sample) <- labels
-  
+
+  ## 10/1/07: Warning for if fewer control than ratio*treated and matching without replacement
+  if (n0 < ratio*n1 & replace==FALSE) {
+	if (ratio > 1)  warning(paste("Not enough control units for ", ratio, " matches for each treated unit when matching without replacement.  Not all treated units will receive", ratio, "matches"))
+	else warning(paste("Fewer control than treated units and matching without replacement.  Not all treated units will receive a match.  Treated units will be matched in the order specified by m.order:", m.order))
+  }
+
   ## Generating match matrix
   match.matrix <- matrix(0, nrow=n1, ncol=ratio, dimnames=list(tlabels, 1:ratio))
   
diff --git a/R/matchit2subclass.R b/R/matchit2subclass.R
index b36f891..30fea01 100644
--- a/R/matchit2subclass.R
+++ b/R/matchit2subclass.R
@@ -59,12 +59,18 @@ matchit2subclass <- function(treat, X, data, distance, discarded,
     if(subclass<=0){stop("Subclass must be a positive vector",call.=FALSE)}
     sprobs <- seq(0,1,length=(round(subclass)+1))
     sprobs <- sprobs[2:(length(sprobs)-1)]
-    if(sub.by=="treat")   
-      q <- c(0,quantile(p1,probs=sprobs,na.rm=TRUE),1)
+    min.dist <- min(distance,na.rm=TRUE)-0.01 
+    max.dist <- max(distance,na.rm=TRUE)+0.01
+    if(sub.by=="treat")
+      q <- c(min.dist,quantile(p1,probs=sprobs,na.rm=TRUE),
+             max.dist)
     else if(sub.by=="control") 
-      q <- c(0,quantile(p0,probs=sprobs,na.rm=TRUE),1)
+      q <- c(min.dist,quantile(p0,probs=sprobs,na.rm=TRUE),
+             max.dist)
     else if(sub.by=="all") 
-      q <- c(0,quantile(distance,probs=sprobs,na.rm=TRUE),1)
+      q <- c(min.dist,
+             quantile(distance,probs=sprobs,na.rm=TRUE),
+             max.dist)
     else 
       stop("Must specify a valid sub.by",call.=FALSE)
   }
@@ -77,7 +83,7 @@ matchit2subclass <- function(treat, X, data, distance, discarded,
     q2 <- q[i+1]
     psclass <- psclass+i*as.numeric(distance<q2 & distance>=q1)
   }
-  
+
   ## No subclass for discarded or unmatched units
   psclass[in.sample==0] <- NA
   psclass[!matched] <- NA
@@ -85,6 +91,13 @@ matchit2subclass <- function(treat, X, data, distance, discarded,
   res <- list(subclass = psclass, q.cut = q,
               weights = weights.subclass(psclass, treat))
 
+  #warning for discrete data
+  unique.classes <- unique(psclass)
+  unique.classes <- unique.classes[!is.na (unique.classes)]
+  if(length(unique.classes)!=subclass){
+    warning("Due to discreteness in data, fewer subclasses generated",call.=F)
+  }
+ 
   class(res) <- c("matchit.subclass", "matchit")
   return(res)
 }
diff --git a/R/plot.matchit.R b/R/plot.matchit.R
index 8213cf9..1ecea83 100644
--- a/R/plot.matchit.R
+++ b/R/plot.matchit.R
@@ -11,6 +11,8 @@ plot.matchit <- function(x, discrete.cutoff=5, type="QQ",
                    which.xs = which.xs)
   } else if(type=="jitter"){
     jitter.pscore(x, interactive=interactive)
+  } else if(type=="hist"){
+    hist.pscore(x)
   } else {
     stop("Invalid type")
   }
diff --git a/R/plot.matchit.subclass.R b/R/plot.matchit.subclass.R
index 01b9912..7be455a 100644
--- a/R/plot.matchit.subclass.R
+++ b/R/plot.matchit.subclass.R
@@ -37,6 +37,8 @@ plot.matchit.subclass <- function(x, discrete.cutoff=5,
     }
   } else if(type=="jitter"){
     jitter.pscore(x, interactive=interactive)
+  } else if(type=="hist"){
+    hist.pscore(x)
   } else {
     stop("Invalid type")
   }
diff --git a/R/plot.summary.matchit.R b/R/plot.summary.matchit.R
new file mode 100644
index 0000000..601f87a
--- /dev/null
+++ b/R/plot.summary.matchit.R
@@ -0,0 +1,42 @@
+plot.summary.matchit <- function(x, interactive = TRUE, ...) {
+  if ("matchit.exact" %in% class(x)){
+    stop("Not appropriate for exact matching.  No plots generated.")
+  }
+
+  if (!"Std. Mean Diff."%in%names(x$sum.all)){ 
+	stop("Not appropriate for unstandardized summary.  Run summary() with the standardize=TRUE option, and then plot.")
+	}
+	
+	sd.pre <- abs(x$sum.all$"Std. Mean Diff.")
+	sd.post <- abs(x$sum.matched$"Std. Mean Diff.")
+
+	if (!is.null(x$q.table)) sd.post <- abs(x$sum.subclass$"Std. Mean Diff") 
+
+	ases.dat <- data.frame(es.unw = sd.pre, es.w = sd.post)
+	par(mfrow=c(1,1))
+        plot(c(0.85, 2.15), c(0, min(3, max(unlist(ases.dat[, 
+            1:2]), na.rm = TRUE))), type = "n", xaxt = "n", ylab = "Absolute Standardized Diff in Means", 
+            xlab = "", main = "")
+        abline(h = c(0.2, 0.4, 0.6, 0.8, 1.0))
+        axis(side = 1, at = 1:2, labels = c("All Data", "Matched Data"))
+        for (i in 1:nrow(ases.dat)) {
+            points(1:2, abs(ases.dat[i, c("es.unw", "es.w")]), 
+                type = "b", col = "grey", pch=19)
+        }
+        temp1 <- ases.dat[abs(ases.dat$es.unw) < abs(ases.dat$es.w),]
+        for (i in 1:nrow(temp1)) {
+            points(1:2, abs(temp1[i, c("es.unw", "es.w")]), type = "b", 
+                col = "black", lwd = 2, pch=19)
+        }
+        if (max(ases.dat$es.w, na.rm = TRUE) > 3) 
+            mtext(text = "Some standardized diffs in means > 3 after matching!", side = 3, 
+                col = "red")
+
+  if(interactive==TRUE) {
+        print("To identify the variables, use first mouse button; to stop, use second.")
+        identify(rep(1, length(sd.pre)),sd.pre,rownames(x$sum.all),atpen=T)
+	identify(rep(2, length(sd.post)),sd.post,rownames(x$sum.all),atpen=T)
+  }
+}
+
+
diff --git a/R/print.summary.matchit.exact.R b/R/print.summary.matchit.exact.R
index b48cae9..85ab5d6 100644
--- a/R/print.summary.matchit.exact.R
+++ b/R/print.summary.matchit.exact.R
@@ -3,13 +3,7 @@ print.summary.matchit.exact <- function(x, digits = max(3,
                                         ...){  
   cat("\nCall:", deparse(x$call), sep = "\n")
   cat("\nSample sizes:\n")
-  ntab <- table(factor(!is.na(x$subclass),
-                      levels=c("TRUE","FALSE")), x$treat)
-  nn <- rbind(table(x$treat),
-             ntab[c("TRUE","FALSE"),])
-  dimnames(nn) <- list(c("All","Matched","Discarded"),
-                       c("Control","Treated"))
-  print.table(nn,digits=digits)
+  print.table(x$nn,digits=digits)
   cat("\nMatched sample sizes by subclass:\n")
   print.data.frame(x$q.table, digits = digits)
   cat("\n")
diff --git a/R/summary.matchit.R b/R/summary.matchit.R
index 7df6881..73d2974 100644
--- a/R/summary.matchit.R
+++ b/R/summary.matchit.R
@@ -19,12 +19,16 @@ summary.matchit <- function(object, interactions = FALSE,
   treat <- object$treat
   weights <- object$weights
   nam <- dimnames(XX)[[2]]
+  dupnam <- duplicated(nam)
+  if(sum(dupnam)>0){
+    nam[dupnam] <- paste(nam[dupnam],".1",sep="")
+  }
   kk <- ncol(XX)
 
   ## Summary Stats
-  aa <- apply(XX,2,qoi,tt=treat,ww=weights,standardize=standardize)
-  sum.all <- as.data.frame(matrix(0,kk,6))
-  sum.matched <- as.data.frame(matrix(0,kk,6))
+  aa <- apply(XX,2,qoi,tt=treat,ww=weights,standardize=standardize,std=T)
+  sum.all <- as.data.frame(matrix(0,kk,7))
+  sum.matched <- as.data.frame(matrix(0,kk,7))
   row.names(sum.all) <- row.names(sum.matched) <- nam
   names(sum.all) <- names(sum.matched) <- names(aa[[1]])
   sum.all.int <- sum.matched.int <- NULL
@@ -34,7 +38,7 @@ summary.matchit <- function(object, interactions = FALSE,
     if(interactions){
       for(j in i:kk){
         x2 <- XX[,i]*as.matrix(XX[,j])
-        jqoi <- qoi(x2,tt=treat,ww=weights,standardize=standardize)
+        jqoi <- qoi(x2,tt=treat,ww=weights,standardize=standardize,std=T)
         sum.all.int <- rbind(sum.all.int,jqoi[1,])
         sum.matched.int <- rbind(sum.matched.int,jqoi[2,])
         row.names(sum.all.int)[nrow(sum.all.int)] <-
@@ -49,9 +53,9 @@ summary.matchit <- function(object, interactions = FALSE,
 
   ## Imbalance Reduction
   stat0 <- abs(cbind(sum.all[,2]-sum.all[,1],
-                     sum.all[,4:6]))
+                     sum.all[,5:7]))
   stat1 <- abs(cbind(sum.matched[,2]-sum.matched[,1],
-                     sum.matched[,4:6]))
+                     sum.matched[,5:7]))
   reduction <- as.data.frame(100*(stat0-stat1)/stat0)
   if(sum(stat0==0 & stat1==0, na.rm=T)>0){
     reduction[stat0==0 & stat1==0] <- 0
diff --git a/R/summary.matchit.exact.R b/R/summary.matchit.exact.R
index ed94a96..8c66243 100644
--- a/R/summary.matchit.exact.R
+++ b/R/summary.matchit.exact.R
@@ -20,9 +20,14 @@ summary.matchit.exact <- function(object, covariates = FALSE, ...) {
                        length(treat[qi & !is.na(qi)]),as.numeric(XX[qi,,drop=F][1,])) 
     }
   }
-
+  ntab <- table(factor(!is.na(object$subclass),
+                       levels=c("TRUE","FALSE")), treat)
+  nn <- rbind(table(treat),
+             ntab[c("TRUE","FALSE"),])
+  dimnames(nn) <- list(c("All","Matched","Discarded"),
+                       c("Control","Treated"))
   ## output
-  res <- list(q.table = q.table, subclass = object$subclass,
+  res <- list(q.table = q.table, nn = nn, subclass = object$subclass,
               treat = object$treat, call = object$call)
   class(res) <- c("summary.matchit.exact", "summary.matchit")
   return(res)
diff --git a/R/summary.matchit.full.R b/R/summary.matchit.full.R
index 578b4e0..6652f5f 100644
--- a/R/summary.matchit.full.R
+++ b/R/summary.matchit.full.R
@@ -29,6 +29,7 @@ summary.matchit.full <- function(object, interactions = FALSE,
     if(interactions){
       for(j in i:kk){
         x2 <- XX[,i]*as.matrix(XX[,j])
+	names(x2) <- names(XX[,1])
         jqoi <- qoi(x2,tt=treat,ww=weights, t.plot=t.plot,
                     c.plot=c.plot, standardize=standardize)
         sum.all.int <- rbind(sum.all.int,jqoi[1,])
diff --git a/R/summary.matchit.subclass.R b/R/summary.matchit.subclass.R
index 96c59a6..3a9351f 100644
--- a/R/summary.matchit.subclass.R
+++ b/R/summary.matchit.subclass.R
@@ -4,7 +4,7 @@ summary.matchit.subclass <- function(object, interactions = FALSE,
 
   X <- object$X
   ## Fix X matrix so that it doesn't have any factors
-  varnames <- colnames(X)
+ varnames <- colnames(X)
   for(var in varnames) {
         if(is.factor(X[,var])) {
                 tempX <- X[,!colnames(X)%in%c(var)]
@@ -83,9 +83,9 @@ summary.matchit.subclass <- function(object, interactions = FALSE,
   }
   if(object$call$sub.by=="treat") {
     wsub <- qn[1,]/sum(qn[1,])
-  } else if(sub.by=="control") {
+  } else if(object$call$sub.by=="control") {
     wsub <- qn[2,]/sum(qn[2,])
-  } else if(sub.by=="all") {
+  } else if(object$call$sub.by=="all") {
     wsub <- qn[3,]/sum(qn[3,])
   }
   sum.subclass <- sum.all
diff --git a/demo/00Index b/demo/00Index
index 5440f3e..dc64ad4 100644
--- a/demo/00Index
+++ b/demo/00Index
@@ -6,3 +6,4 @@ nearest		Demos of nearest neighbor matching, using Lalonde dataset
 subclass	Demo of subclassification, using Lalonde dataset
 optimal		Demo of optimal matching, using Lalonde dataset
 analysis        Demo of using Zelig with MatchIt for parametric causal inference after matching
+cem             Demo of coarsened exact matching
diff --git a/demo/analysis.R b/demo/analysis.R
index 61cb677..988caf5 100644
--- a/demo/analysis.R
+++ b/demo/analysis.R
@@ -4,11 +4,9 @@
 
 ## load the Lalonde data
 data(lalonde)
-user.prompt()
 
 ## load Zelig package: if not already installed, try install.package("Zelig")
 library(Zelig)
-user.prompt()
 
 ## propensity score matching
 m.out1 <- matchit(treat ~ age + educ + black + hispan + nodegree + married + re74 + re75, 
@@ -31,7 +29,7 @@ s.out1 <- sim(z.out1, x = x.out1)
 user.prompt()
 
 ## obtain a summary
-summary(s.out1)
+print(summary(s.out1))
 user.prompt()
 
 
@@ -42,7 +40,7 @@ user.prompt()
 ## fit the linear model to the treatment group controlling for propensity score and 
 ## other covariates
 z.out2 <- zelig(re78 ~ age + educ + black + hispan + nodegree + married + re74 + re75 +
-                       distance, data = match.data(m.out1, "control"), model = "ls")
+                       distance, data = match.data(m.out1, "treat"), model = "ls")
 user.prompt()
 
 ## conducting the simulation procedure for the control group
@@ -63,13 +61,13 @@ user.prompt()
 
 ## some summaries
 ## point estimate
-mean(ate.all)
+print(mean(ate.all))
 user.prompt()
 ## standard error
-sd(ate.all)
+print(sd(ate.all))
 user.prompt()
 ## 95% confidence interval
-quantile(ate.all, c(0.025, 0.975))
+print(quantile(ate.all, c(0.025, 0.975)))
 user.prompt()
 
 
@@ -97,17 +95,16 @@ s.out3 <- sim(z.out3, x = x.out3, num = 100)
 user.prompt()
 
 ## overall results
-summary(s.out3) 
+print(summary(s.out3)) 
 user.prompt()
 
 ## summary for each subclass
-summary(s.out3, subset = 1) 
+print(summary(s.out3, subset = 1))
 user.prompt()
 
-summary(s.out3, subset = 2) 
+print(summary(s.out3, subset = 2))
 user.prompt()
 
-summary(s.out3, subset = 3) 
-user.prompt()
+print(summary(s.out3, subset = 3))
 
 
diff --git a/demo/cem.R b/demo/cem.R
new file mode 100644
index 0000000..fc473fb
--- /dev/null
+++ b/demo/cem.R
@@ -0,0 +1,47 @@
+###
+### An Example Script for Coarsened Exact Matching
+###
+
+## load the Lalonde data
+data(lalonde)
+
+## coarsened exact matching with automatic coarsening
+m.out <- matchit(treat ~ age + educ + black + hispan + married + nodegree 
+                 + re74 + re75, data = lalonde, method = "cem")
+user.prompt()
+
+## print a short summary
+print(m.out)
+user.prompt()
+
+## balance diagnostics through statistics; standardize = T for plotting
+s.out <- summary(m.out, covariates = T, standardize = T)
+print(s.out)
+user.prompt()
+
+## graphical balance checks
+plot(m.out)
+plot(s.out)
+
+
+## create some cutpoints for continuous variables
+re74cut <- hist(lalonde$re74, br=seq(0,max(lalonde$re74)+1000, by=1000),plot=FALSE)$breaks
+re75cut <- hist(lalonde$re75, br=seq(0,max(lalonde$re75)+1000, by=1000),plot=FALSE)$breaks
+agecut <- hist(lalonde$age, br=seq(15,55, length=14),plot=FALSE)$breaks
+mycp <- list(re75=re75cut, re74=re74cut, age=agecut)
+
+## coarsened exact matching with user-given cutpoints
+m.out2 <- matchit(treat ~ age + educ + black + hispan + married + nodegree 
+                  + re74 + re75, data = lalonde, method = "cem",
+                  cutpoints = mycp)
+user.prompt()
+
+## print a short summary
+print(m.out2)
+user.prompt()
+
+## balance diagnostics through statistics
+s.out2 <- summary(m.out2, covariates = T)
+print(s.out2)
+user.prompt()
+
diff --git a/demo/exact.R b/demo/exact.R
index 94dfd7e..3b625db 100644
--- a/demo/exact.R
+++ b/demo/exact.R
@@ -4,7 +4,6 @@
 
 ## laod the Lalonde data
 data(lalonde)
-user.prompt()
 
 ## exact matching
 m.out <- matchit(treat ~ educ + black + hispan, data = lalonde,
@@ -16,6 +15,5 @@ print(m.out)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out, covariates = T)
-user.prompt()
+print(summary(m.out, covariates = T))
 
diff --git a/demo/full.R b/demo/full.R
index 3b8f1c2..fe01767 100644
--- a/demo/full.R
+++ b/demo/full.R
@@ -4,21 +4,23 @@
 
 ## load the Lalonde data
 data(lalonde)
-user.prompt()
 
 ## conduct full matching using the propensity score based on logistic regression
 m.out <- matchit(treat ~ age + educ + black + hispan + married +
                  nodegree + re74 + re75, data = lalonde,
                  method = "full", distance = "logit")
-user.prompt()
 
 ## print a short summary
 print(m.out)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out)
+s.out <- summary(m.out)
+print(s.out)
+s.out <- summary(m.out, standardize=TRUE)
+print(s.out)
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out)
+plot(s.out)
diff --git a/demo/genetic.R b/demo/genetic.R
index 67262b6..d04b171 100644
--- a/demo/genetic.R
+++ b/demo/genetic.R
@@ -7,12 +7,17 @@ data(lalonde)
 
 ## using logistic propensity score as one of the covariates
 m.out <- matchit(treat ~ age + educ + black + hispan + married + nodegree + re74 + re75, data = lalonde, method = "genetic", distance = "logit")
+user.prompt()
 
 ## printing a short summary
 print(m.out)
+user.prompt()
 
 ## numerical balance diagonstics
-summary(m.out)
+s.out <- summary(m.out, standardize=TRUE)
+print(s.out)
+user.prompt()
 
 ## graphical balance diagnostics
 plot(m.out)
+plot(s.out)
diff --git a/demo/nearest.R b/demo/nearest.R
index 1368aeb..a0b7d07 100644
--- a/demo/nearest.R
+++ b/demo/nearest.R
@@ -7,18 +7,24 @@ user.prompt()
 ## 1:1 Nearest neighbor matching
 m.out <- matchit(treat ~ re74 + re75 + educ + black + hispan + age,
                  data = lalonde, method = "nearest")
-user.prompt()
 
 ## print a short summary
 print(m.out)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out)
+s.out <- summary(m.out, standardize=TRUE)
+print(s.out)
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out)
+user.prompt()
+plot(m.out, type="jitter")
+user.prompt()
+plot(m.out, type="hist")
+user.prompt()
+plot(s.out)
 
 ## 2:1 Nearest neighbor matching
 m.out1 <- matchit(treat ~ re74+re75+age+educ, data=lalonde,
@@ -30,11 +36,13 @@ print(m.out1)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out1)
+print(summary(m.out1))
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out)
+user.prompt()
+plot(m.out, type="jitter")
 
 ## 1:1 Nearest neighbor matching with Mahalanobis matching on re74 and re75 and exact matching on married
 m.out2 <- matchit(treat ~ re74+re75+age+educ, data=lalonde,
@@ -46,11 +54,16 @@ print(m.out2)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out2)
+s.out2 <- summary(m.out2, standardize=TRUE)
+print(s.out2)
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out2)
+user.prompt()
+plot(m.out2, type="jitter")
+user.prompt()
+plot(s.out2)
 
 ## 1:1 Nearest neighbor matching with units outside the common support discarded
 m.out3 <- matchit(treat ~ re74+re75+age+educ, data=lalonde,
@@ -62,11 +75,12 @@ print(m.out3)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out3)
+print(summary(m.out3))
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out3)
+plot(m.out3, type="jitter")
 
 ## 2:1 Nearest neighbor matching with replacement
 m.out4 <- matchit(treat ~ re74+re75+age+educ, data=lalonde,
@@ -78,11 +92,13 @@ print(m.out4)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out4)
+print(summary(m.out4))
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out4)
+plot(m.out4, type="jitter")
+plot(m.out4, type="hist")
 
 ## 1:1 Nearest neighbor matching followed by subclassification
 m.out5 <- matchit(treat ~ re74+re75+age+educ, data=lalonde,
@@ -94,8 +110,12 @@ print(m.out5)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out5)
+print(summary(m.out5))
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out5)
+user.prompt()
+
+s.out5 <- summary(m.out5, standardize=TRUE)
+plot(s.out5)
diff --git a/demo/optimal.R b/demo/optimal.R
index 6d5eadc..98d79db 100644
--- a/demo/optimal.R
+++ b/demo/optimal.R
@@ -4,7 +4,6 @@
 
 ## load the Lalonde data
 data(lalonde)
-user.prompt()
 
 ## optimal ratio matching using the propensity score based on logistic regression
 m.out <- matchit(treat ~ re74 + re75 + age + educ, data = lalonde,
@@ -16,8 +15,14 @@ print(m.out)
 user.prompt()
 
 ## balance diagnostics through statistics
-summary(m.out)
+print(summary(m.out))
 user.prompt()
 
 ## balance diagnostics through graphics
 plot(m.out)
+user.prompt()
+plot(m.out, type="jitter")
+
+s.out <- summary(m.out, standardize=TRUE)
+plot(s.out)
+
diff --git a/demo/subclass.R b/demo/subclass.R
index c968a9c..1dfd4a9 100644
--- a/demo/subclass.R
+++ b/demo/subclass.R
@@ -4,7 +4,6 @@
 
 ## load the Lalonde data
 data(lalonde)
-user.prompt()
 
 ## sublclassification
 m.out <-  matchit(treat ~ re74 + re75 + educ + black + hispan + age,
@@ -16,9 +15,13 @@ print(m.out)
 user.prompt()
 
 ## balance diagnostics
-summary(m.out)
+print(summary(m.out))
 user.prompt()
 
 ## balance diagnostics through plots
 plot(m.out)
+user.prompt()
 plot(m.out, type="jitter")
+
+s.out <- summary(m.out, standardize=TRUE)
+plot(s.out)
diff --git a/inst/doc/.latex2html-init b/inst/doc/.latex2html-init
new file mode 100644
index 0000000..f044168
--- /dev/null
+++ b/inst/doc/.latex2html-init
@@ -0,0 +1,244 @@
+#LaTeX2HTML Version 96.1 : dot.latex2html-init
+#
+### Command Line Argument Defaults #######################################
+
+$MAX_SPLIT_DEPTH = 8;	# Stop making separate files at this depth
+
+$MAX_LINK_DEPTH = 4;    # Stop showing child nodes at this depth   
+
+$NOLATEX = 0;           # 1 = do not pass unknown environments to Latex
+
+$EXTERNAL_IMAGES = 0;   # 1 = leave the images outside the document 
+
+$ASCII_MODE = 0;        # 1 = do not use any icons or internal images
+
+# 1 =  use links to external postscript images rather than inlined bitmap
+# images.
+$PS_IMAGES = 0;
+
+$TITLE = $default_title;      # The default is "No Title" 
+
+# $STYLESHEET_CASCADE = "<link rel='stylesheet' href='/gking.css' MEDIA='screen' TYPE='text/css'>";
+
+# add new UI Javascript to HEAD section. -rmesard 30-nov-2005
+# $LATEX2HTML_META = "<script language='Javascript' src='/gking.js'></script>";
+
+$DESTDIR = '';         # Put the result in this directory 
+
+# When this is set, the generated HTML files will be placed in the 
+# current directory. If set to 0 the default behaviour is to create (or reuse)
+# another file directory.
+$NO_SUBDIR = 0;
+
+
+# Supply your own string if you don't like the default <Name> <Date>
+$ADDRESS = "Gary King \n$address_data[1]<script language='Javascript'>displayFooter()</script>";
+
+$NO_NAVIGATION = 0;	# 1 = do not put a navigation panel at the top of each page
+
+# Put navigation links at the top of each  page.  If  the page  exceeds
+# $WORDS_IN_PAGE  number of words then put one at the bottom of the page.
+$AUTO_NAVIGATION = 0;
+
+# Put a link to the index page in  the  navigation  panel
+$INDEX_IN_NAVIGATION = 1;
+
+# Put a link to the table of contents  in  the  navigation  panel
+$CONTENTS_IN_NAVIGATION = 1;
+
+# Put a link to the next logical page  in  the  navigation  panel
+$NEXT_PAGE_IN_NAVIGATION = 1;
+
+# Put a link to the previous logical page  in  the  navigation  panel
+$PREVIOUS_PAGE_IN_NAVIGATION = 1;
+
+$INFO = 1;              # 0 = do not make a "About this document..." section 
+
+# Reuse images generated during previous runs
+$REUSE = 2;
+
+# When this is 1, the section numbers are shown. The section numbers should 
+# then match those that would have bee produced by LaTeX.
+# The correct section numbers are obtained from the $FILE.aux file generated 
+# by LaTeX.
+# Hiding the seciton numbers encourages use of particular sections 
+# as standalone documents. In this case the cross reference to a section 
+# is shown using the default symbol rather than the section number.
+$SHOW_SECTION_NUMBERS = 0;
+
+### Other global variables ###############################################
+$CHILDLINE = "<BR> <HR>\n";
+
+# This is the line width measured in pixels and it is used to right justify
+# equations and equation arrays; 
+$LINE_WIDTH = 500;		
+
+# Used in conjunction with AUTO_NAVIGATION
+$WORDS_IN_PAGE = 300;	
+
+# Affects ONLY the way accents are processed 
+$default_language = 'english';	
+#$default_language = 'japanese';	
+
+# The value of this variable determines how many words to use in each 
+# title that is added to the navigation panel (see below)
+# 
+$WORDS_IN_NAVIGATION_PANEL_TITLES = 4;
+
+# This number will determine the size of the equations, special characters,
+# and anything which will be converted into an inlined image
+# *except* "image generating environments" such as "figure", "table" 
+# or "minipage".
+# Effective values are those greater than 0.
+# Sensible values are between 0.1 - 4.
+$MATH_SCALE_FACTOR = 1.6;
+
+# This number will determine the size of 
+# image generating environments such as "figure", "table" or "minipage".
+# Effective values are those greater than 0.
+# Sensible values are between 0.1 - 4.
+$FIGURE_SCALE_FACTOR = 1.6;
+
+
+#  If this is set then intermediate files are left for later inspection.
+#  This includes $$_images.tex and $$_images.log created during image
+#  conversion.
+#  Caution: Intermediate files can be *enormous*.
+$DEBUG = 0;
+
+#  If both of the following two variables are set then the "Up" button
+#  of the navigation panel in the first node/page of a converted document
+#  will point to $EXTERNAL_UP_LINK. $EXTERNAL_UP_TITLE should be set
+#  to some text which describes this external link.
+$EXTERNAL_UP_LINK = "";
+$EXTERNAL_UP_TITLE = "";
+
+# If this is set then the resulting HTML will look marginally better if viewed 
+# with Netscape.
+$NETSCAPE_HTML = 0;
+
+# Valid paper sizes are "letter", "legal", "a4","a3","a2" and "a0"
+# Paper sizes has no effect other than in the time it takes to create inlined
+# images and in whether large images can be created at all ie
+#  - larger paper sizes *MAY* help with large image problems 
+#  - smaller paper sizes are quicker to handle
+$PAPERSIZE = "a4";
+
+# Replace "english" with another language in order to tell LaTeX2HTML that you 
+# want some generated section titles (eg "Table of Contents" or "References")
+# to appear in a different language. Currently only "english" and "french"
+# is supported but it is very easy to add your own. See the example in the
+# file "latex2html.config" 
+$TITLES_LANGUAGE = "english";
+
+### Navigation Panel ##########################################################
+#
+# The navigation panel is constructed out of buttons and section titles.
+# These can be configured in any combination with arbitrary text and 
+# HTML tags interspersed between them. 
+# The buttons available are:
+# $PREVIOUS - points to the previous section
+# $UP  - points up to the "parent" section
+# $NEXT - points to the next section
+# $NEXT_GROUP - points to the next "group" section
+# $PREVIOUS_GROUP - points to the previous "group" section
+# $CONTENTS - points to the contents page if there is one
+# $INDEX - points to the index page if there is one
+#
+# If the corresponding section exists the button will contain an
+# active link to that section. If the corresponding section does
+# not exist the button will be inactive.
+#
+# Also for each of the $PREVIOUS $UP $NEXT $NEXT_GROUP and $PREVIOUS_GROUP
+# buttons there are equivalent $PREVIOUS_TITLE, $UP_TITLE, etc variables
+# which contain the titles of their corresponding sections. 
+# Each title is empty if there is no corresponding section.
+#
+# The subroutine below constructs the navigation panels in each page.
+# Feel free to mix and match buttons, titles, your own text, your logos,
+# and arbitrary HTML (the "." is the Perl concatenation operator).
+sub top_navigation_panel {
+
+    # call script func from gking.js to open new UI 
+    # this should be the 1st thing after BODY tag -rmesard 30-nov-2005
+    "<script language='Javascript'>displayHeader()</script>\n" .
+
+    # Now add a few buttons with a space between them
+    # "$NEXT $UP $PREVIOUS $CONTENTS $INDEX $CUSTOM_BUTTONS" .
+    
+    # "<BR>\n" .		# Line break
+      "<table border='0' cellpadding='0' cellspacing='0' class='latexnav'>" .
+      "<tr><td class='latexnavhome'>" .
+      "<a href='/'>" .
+      "<img src='/images/gking_name_sm.gif' height='30' width='119' border='0' alt='Gary King Homepage' />" .
+      "</a></td>" .
+	
+   # try for the contents link
+   # ($CONTENTS_TITLE ? "<td>c: $CONTENTS_TITLE </td>\n" : undef) .
+     
+   # ... and the ``previous'' title
+    ($PREVIOUS_TITLE ? "<td> Previous: $PREVIOUS_TITLE </td>\n" : undef) .
+
+    # Similarly with the ``up'' title ...
+    ($UP_TITLE ? "<td> Up: $UP_TITLE </td>\n" : undef) . 
+
+    # If ``next'' section exists, add its title to the navigation panel
+    ($NEXT_TITLE ? "<td> Next: $NEXT_TITLE </td>\n" : undef) . 
+    
+ 
+   
+    #  Line Break, horizontal rule (3-d dividing line) and new paragraph  
+    "</tr></table>\n" .
+    "<BR> <P>\n"		
+}
+
+sub bot_navigation_panel {
+
+    #  Start with a horizontal rule (3-d dividing line)
+    "<HR>"			
+    
+    # Now add a few buttons with a space between them
+    # "$NEXT $UP $PREVIOUS $CONTENTS $INDEX $CUSTOM_BUTTONS" .
+    
+    # "<BR>\n" .		# Line break
+	
+    # If ``next'' section exists, add its title to the navigation panel
+    # ($NEXT_TITLE ? "<B> Next:</B> $NEXT_TITLE\n" : undef) . 
+    
+    # Similarly with the ``up'' title ...
+    # ($UP_TITLE ? "<B>Up:</B> $UP_TITLE\n" : undef) . 
+ 
+    # ... and the ``previous'' title
+    # ($PREVIOUS_TITLE ? "<B> Previous:</B> $PREVIOUS_TITLE\n" : undef)
+
+}
+
+sub meta_information {
+    local($_) = @_;
+    # Cannot have nested HTML tags...
+    do { s/<[^>]*>//g;
+        "<SCRIPT LANGUAGE=\"Javascript\" SRC=\"/gking.js\"></SCRIPT>\n" .
+        "<META NAME=\"description\" CONTENT=\"$_\">\n" .
+        "<META NAME=\"keywords\" CONTENT=\"$FILE\">\n" .
+        "<META NAME=\"resource-type\" CONTENT=\"document\">\n" .
+        "<META NAME=\"distribution\" CONTENT=\"global\">\n"
+    } if $_;
+} 
+
+ our(%custom_filenames);
+ sub custom_title_hook {
+ my($sec_name) = shift;
+   $sec_name=~tr/[a-z][A-Z][0-9] /_/sc;
+   my(@words)= split(/\s+/,$sec_name);
+   my($fn)= join("_", at words[0..2]);
+   $fn=substr($fn,0,22);
+   $fn=~s/(.*?)_*$/$1/;
+   $custom_filenames{"$fn"}++;
+   if ($custom_filenames{"$fn"}>1) {
+        $fn=$fn . $custom_filenames{"$fn"};
+   }
+   return($fn);
+ }
+ $CUSTOM_TITLES=1;
+
+1;	# This must be the last line
diff --git a/inst/doc/Makefile b/inst/doc/Makefile
new file mode 100644
index 0000000..66f2fb9
--- /dev/null
+++ b/inst/doc/Makefile
@@ -0,0 +1,16 @@
+    
+# stub makefile, does nothing, but causes R CMD build not to force rebuild pdf file
+
+REVAL=TRUE
+
+all:	MatchIt/inst/doc/matchit.pdf
+
+%.tex:	%.Rnw
+	echo "Sweave("$<", debug=TRUE, eval=$(REVAL))" | R --slave
+
+%.pdf:	%.tex
+	pdflatex $*
+	bibtex $*
+	pdflatex $*
+	pdflatex $*
+	pdflatex $*
diff --git a/inst/doc/balance.tex b/inst/doc/balance.tex
new file mode 100644
index 0000000..c78c7dd
--- /dev/null
+++ b/inst/doc/balance.tex
@@ -0,0 +1,137 @@
+\section{Checking Balance}
+\label{sec:balance}
+
+\subsection{Quick Overview}
+
+To check balance, use \texttt{summary(m.out)} for numerical summaries
+and \texttt{plot(m.out)} for graphical summaries.
+
+\subsection{Details}
+
+\subsubsection{The {\tt summary()} Command}
+
+The \texttt{summary()} command gives measures of the balance between
+the treated and control groups in the full (original) data set, and
+then in the matched data set.  If the matching worked well, the
+measures of balance should be smaller in the matched data set (smaller
+values of the measures indicate better balance).
+
+The \texttt{summary()} output for subclassification is the same as
+that for other types of matching, except that the balance statistics
+are shown separately for each subclass, and the overall balance in the
+matched samples is calculated by aggregating across the subclasses,
+where each subclass is weighted by the number of units in the
+subclass.  For exact matching, the covariate values within each
+subclass are guaranteed to be the same, and so the measures of balance
+are not output for exact matching; only the sample sizes in each
+subclass are shown.
+
+\begin{itemize}
+\item {\bf Balance statistics:} The statistics the \texttt{summary()}
+  command provides include means, the original control group standard deviation (where applicable), 
+  mean differences, standardized mean
+  differences, and (median, mean and maximum) Quantile-Quantile (Q-Q)
+  plot differences.  In addition, the \texttt{summary()} command will
+  report (a) the matched call, (b) how many units were matched,
+  unmatched, or discarded due to the \texttt{discard} option
+  (described below), and (c) the percent improvement in balance for
+  each of the balance measures, defined as $100((|a|-|b|)/|a|)$, where
+  $a$ is the balance before and $b$ is the balance after matching.
+  For each set of units (original and matched data sets, with weights
+  used as appropriate in the matched data sets), the
+  following statistics are provided:
+\begin{enumerate}
+  \item ``Means Treated'' and ``Means Control'' show the weighted
+    means in the treated and control groups
+  \item ``SD Control" is the standard deviation calculated in the control group (where applicable)
+  \item ``Mean Diff'' is the difference in means between the groups
+  \item The final three columns of the summary output give summary
+    statistics of a Q-Q plot (see below for more information on these
+    plots). Those columns give the median, mean, and maximum distance
+    between the two empirical quantile functions (treated and control
+    groups).  Values greater than 0 indicate deviations between the
+    groups in some part of the empirical distributions.  The plots of
+    the two empirical quantile functions themselves, described below,
+    can provide further insight into which part of the covariate
+    distribution has differences between the two groups.
+\end{enumerate}
+
+\item {\bf Additional options:} Three options to the \texttt{summary()}
+  command can also help with assessing balance and respecifying the
+  propensity score model, as necessary.  First, the {\tt interactions
+    = TRUE} option with {\tt summary()} shows the balance of all
+  squares and interactions of the covariates used in the matching
+  procedure.  Large differences in higher order interactions usually
+  are a good indication that the propensity score model (the distance measure) needs to be
+  respecified.  Similarly, the {\tt addlvariables} option with {\tt
+    summary()} will provide balance measures on additional variables
+  not included in the original matching procedure.  If a variable (or
+  interaction of variables) not included in the original propensity score model
+  has large imbalances in the matched groups, including that
+  variable in the next model specification may improve the resulting
+  balance on that variable.  Because the outcome variable is not used
+  in the matching procedure, a variety of matching methods can be
+  tried, and the one that leads to the best resulting balance chosen.  Finally,
+  the {\tt standardize = TRUE} option will print out standardized versions of the
+  balance measures, where the mean difference is standardized (divided) by the standard deviation
+  in the original treated group.
+\end{itemize}
+
+\subsubsection{The \texttt{plot()} Command}
+
+We can also examine the balance graphically using the \texttt{plot()}
+command, which provides three types of plots: jitter plots of the
+distance measure, Q-Q plots of each covariate, and histograms of the 
+distance measure.  For subclassification, separate Q-Q plots are
+printed for each subclass.  The jitter plot for subclassification is
+the same as that for other types of matching, with the addition of
+vertical lines indicating the subclass cut-points.  With the histogram option,
+4 histograms are provided: the original treated and control groups and the matched
+treated and control groups.  For the Q-Q plots and the histograms, the weights that result
+after matching are used to create the plots.
+
+%\begin{figure}[tbp]
+%  \begin{center}
+%    \includegraphics{figs/qqplotnn1}
+%    \includegraphics{figs/qqplotnn2}
+%    \hfill
+%    \caption{Sample diagnostic QQ plots with nearest neighbor matching}
+%    \label{diagqqnn}
+%  \end{center}
+%\end{figure}
+
+%\begin{figure}[tbp]
+%  \begin{center}
+%    \includegraphics{figs/jitterplotnn}
+%    \hfill
+%    \caption{Sample diagnostic jitter plot: Matched units shown in
+%      black, unmatched units shown in grey.}
+%    \label{diagjitternn}
+%  \end{center}
+%\end{figure}
+
+Three examples of the output from the {\tt plot()} command are shown
+below.  If the empirical distributions are the same in the treated and
+control groups, the points in the Q-Q plots would all lie on the 45 degree line.
+Deviations from the 45 degree line indicate differences in the
+empirical distribution.  The jitter plot shows the overall
+distribution of propensity scores in the treated and control groups.
+In the jitter plot, the size of each diamond is proportional to the
+weight given to that unit; matched units are in black while unmatched
+units are in grey. In the jitter
+plot, which can be created by setting \texttt{type = "jitter"}, you
+may identify units by observation name by clicking the first mouse
+button near the units.  The histograms can be plotted by setting \texttt{type = "hist"}. 
+
+
+\hspace{-0.75in}
+\begin{center}
+\includegraphics[height=3in]{figs/jitterplotnn}\\
+\includegraphics[height=3in]{figs/qqplotnn1}
+\includegraphics[height=3in]{figs/hist}
+\end{center}
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/inst/doc/faq.tex b/inst/doc/faq.tex
new file mode 100644
index 0000000..2202806
--- /dev/null
+++ b/inst/doc/faq.tex
@@ -0,0 +1,194 @@
+\chapter{Frequently Asked Questions}
+
+\section{How do I Cite this Work?}
+
+If you use \MatchIt, please cite\nocite{HoImaKin07,HoImaKin07a}
+\begin{verse}
+  Daniel Ho; Kosuke Imai; Gary King; and Elizabeth Stuart (2007),
+  ``Matching as Nonparametric Preprocessing for Reducing Model
+  Dependence in Parametric Causal Inference,'' \emph{Political
+    Analysis} 15(3): 199-236,
+  \url{http://gking.harvard.edu/files/abs/matchp-abs.shtml}.
+
+and 
+
+Daniel Ho; Kosuke Imai; Gary King; and Elizabeth Stuart (2007b)
+``Matchit: Nonparametric Preprocessing for Parametric Causal
+Inference,'' \emph{Journal of Statistical Software},
+\url{http://gking.harvard.edu/matchit/}.
+\end{verse}
+
+In addition, the {\tt convex.hull} discard option is implemented via
+the {\tt WhatIf} package \citep{KinZen06,KinZen07,StoKinZen05}.
+Generalized linear distance measures are implemented via the {\tt
+  stats} package \citep{VenRip02}.  Generalized additive distance
+measures are implemented via the {\tt mcgv} package \citep{HasTib90}.
+The neural network distance measure is implemented via the {\tt nnet}
+package \citep{Ripley96}.  The classification trees distance measure
+is implemented via the {\tt rpart} package \citep{BreFriOls84}.  Full
+and optimal matching are implemented via the {\tt optmatch} package
+\citep{Hansen04}.  Genetic matching is implemented via the {\tt
+  Matching} package \citep{DiaSek05}.  Coarsened exact matching is
+implemented via the \texttt{cem} package
+\citep{IacKinPor08,IacKinPor08b}.
+
+\section{What if My datasets Are Big and Are Taking Up
+  Too Much Memory?}
+
+{\tt matchit()} does not save the data set in its output object, but
+it does save a matrix of the covariates.  {\tt match.data()} will
+create a matched data set. One can eliminate the original data set to
+save memory in R by {\tt rm(name)}, where {\tt name} is the name of
+the data set, after calling {\tt match.data()}.
+
+%\section{Can I use a Difference-in-Difference Estimator for Matched
+%  Data?}
+%
+%A difference-in-differences (DID) analysis can be easily conducted
+%with \MatchIt.  If we were interested in the DID matching estimate in
+%the Lalonde data, we could simply include {\texttt re75} as a
+%covariate in the preprocessing step.  Then the analysis can be
+%performed on the change in income from 1975 to 1978: {\tt re78}-{\tt
+%  re75}.  Time-varying covariates (of which none exist in the Lalonde
+%data) should of course also be differenced for the DID estimator.
+%** we should show how to do this with zelig
+
+\section{How Exactly are the Weights Created?}
+\label{subsec:weights}
+
+Each type of matching method can be thought of as creating groups of
+units with at least one treated unit and at least one control unit in
+each.  In exact matching, subclassification, or full matching, these
+groups are the subclasses formed, and the number of treated and
+control units will vary quite a bit across subclasses.  In nearest
+neighbor or optimal matching, the groups are the pairs (or sets) of
+treated and control units matched.  In 1:1 nearest neighbor matching
+there will be one treated unit and one control unit in each group.  In
+2:1 nearest neighbor matching there will be one treated unit and two
+control units in each group.  Unmatched units receive a weight of 0.
+All matched treated units receive a weight of 1.  These weights are constructed
+to estimate the average treatment effect on the treated, with the control group
+essentially weighted to look like the treated group.
+
+The weights for matched control units are formed as follows:
+\begin{enumerate}
+\item Within each group, each control unit is given a preliminary
+  weight of $n_{ti}/n_{ci}$, where $n_{ti}$ and $n_{ci}$ are the
+  number of treated and control units in group $i$, respectively.
+\item If matching is done with replacement, each control unit's weight
+  is added up across the groups in which it was matched.
+\item The control group weights are scaled to sum to the number of
+  uniquely matched control units.
+\end{enumerate}
+
+With subclassification, when the analysis is done separately within
+each subclass and then aggregated up across the subclasses, these
+weights will generally not be used, but they may be used for full
+matching or nearest neighbor matching if the number of control units
+matched to each treated unit varies.
+
+
+
+\section{How Do I Create Observation Names?}
+\label{rnames}
+
+Since the diagnostics often make use of the observation names of the
+data frame, you may find it helpful to specify observation names for
+the data input.  Use the \texttt{row.names} command to achieve this.
+For example, to assign the names ``Dan'', ``Kosuke'', ``Liz'' and
+``Gary'' to a data frame with the first four observations in the
+Lalonde data, type:
+
+
+\begin{verbatim}
+> test <- lalonde[1:4, ]
+> row.names(test) <- c("Dan", "Kosuke", "Liz", "Gary")
+> print(test)
+       age educ black hisp married nodegr re74 re75  re78 u74 u75 treat
+Dan     37   11     1    0       1      1    0    0  9930   1   1     1
+Kosuke  22    9     0    1       0      1    0    0  3596   1   1     1
+Liz     30   12     1    0       0      0    0    0 24910   1   1     1
+Gary    27   11     1    0       0      1    0    0  7506   1   1     1
+\end{verbatim}
+
+\section{How Can I See Outcomes of Matched Pairs?}
+
+To obtain outcomes of matched pairs, recall that the original dataset has unique row names corresponding to each of
+the observations.  The row names of \texttt{match.matrix} correspond to the names of the treated, and each
+of the cells corresponds to a name of matched controls.  So to obtain matched outcomes, you can use:
+
+\begin{verbatim}
+cbind(lalonde[row.names(foo$match.matrix),"re78"], lalonde[foo$match.matrix,"re78"])
+\end{verbatim}
+
+\section{How Do I Ensure Replicability As \MatchIt\ Versions Develop?}
+\label{subsec:vercontrol}
+
+As the literature on matching techniques is rapidly evolving,
+\MatchIt\ will strive to incorporate new developments. \MatchIt\ is
+thereby an evolving program.  Users may be concerned that analysis
+written in a particular version may not be compatible with newer
+versions of the program.  The primary way to ensure that replication
+archives remain valid is to record the version of \MatchIt\ that was
+used in the analysis.  Our website maintains binaries of all public
+release versions, so that researchers can replicate results exactly
+with the appropriate version (for Unix-based platforms, see
+\hlink{http://gking.harvard.edu/src/contrib/}{http://gking.harvard.edu/src/contrib/};
+for windows, see
+\hlink{http://gking.harvard.edu/bin/windows/contrib/}{http://gking.harvard.edu/bin/windows/contrib/}).
+
+In addition, users may find it helpful to install packages with
+version control, using the {\tt installWithVers} command with {\tt
+install.packages}.  So for example, in the windows R console, users
+may download the appropriate version from our website and install the
+package with version control by:
+
+\begin{verbatim}
+install.packages(choose.files('',filters=Filters[c('zip','All'),]),
+                 .libPaths()[1],installWithVers=T,CRAN=NULL)
+\end{verbatim}
+
+{\tt R CMD INSTALL} similarly permits users to specify this version
+using the \\ {\tt --with-package-versions} option.  After having
+specified version control, different versions of the program may be
+called as necessary.  Similar advice may also be appropriate for
+version control for R more generally.
+
+\section{How Do I Use My Own Distance Measure with \MatchIt\,?}
+
+A vector of your own distance measure can be used by specifying it as
+the input for {\tt distance} option in {\tt matchit()}.
+
+\section{What Do I Do about Missing Data?}
+
+\MatchIt\ requires complete data sets, with no missing values (other
+than potential outcomes of course).  If there are missing values in
+the data set, imputation techniques should be used first to fill in
+(``impute'') the missing values (both covariates and outcomes), or the
+analysis should be done using only complete cases (which we do not in
+general recommend).  For imputation software, see Amelia at
+(\hlink{http://gking.harvard.edu/stats.shtml}{http://gking.harvard.edu/stats.shtml})
+or other programs at
+\hlink{http://www.multiple-imputation.com}{http://www.multiple-imputation.com}.
+For more information on missing data and imputation methods, see
+\cite{KinHonJos01}.
+
+\section{Why Preprocessing?}
+
+The purpose of matching is to approximate an experimental template,
+where the matching procedure approximates blocking prior to random
+treatment assignment in order to balance covariates between treatment
+and control groups.  Separation of the estimation procedure into two
+steps simulates the research design of an experiment, where no
+information on outcomes is known at the point of experimental design
+and randomization.  The separation of the balancing process in
+\MatchIt\ from the analysis process afterward helps keep clear the
+goal of balancing control and treatment groups and makes it less
+likely that the user will inadvertently cook the books in his or her
+favor.
+
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: t
+%%% End: 
diff --git a/inst/doc/figs/f2figb.ps b/inst/doc/figs/f2figb.ps
new file mode 100644
index 0000000..38d8200
--- /dev/null
+++ b/inst/doc/figs/f2figb.ps
@@ -0,0 +1,4081 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: a4 595 841 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%Orientation: Landscape
+%%BoundingBox: 18 18 577 824
+%%EndComments
+%%BeginProlog
+/bp  { gs 595.00 0 translate 90 rotate gs } def
+% begin .ps.prolog
+/gs  { gsave } def
+/gr  { grestore } def
+/ep  { showpage gr gr } def
+/m   { moveto } def
+/l  { rlineto } def
+/np  { newpath } def
+/cp  { closepath } def
+/f   { fill } def
+/o   { stroke } def
+/c   { newpath 0 360 arc } def
+/r   { 4 2 roll moveto 1 copy 3 -1 roll exch 0 exch rlineto 0 rlineto -1 mul 0 exch rlineto closepath } def
+/p1  { stroke } def
+/p2  { gsave bg setrgbcolor fill grestore newpath } def
+/p3  { gsave bg setrgbcolor fill grestore stroke } def
+/t   { 6 -2 roll moveto gsave rotate
+       ps mul neg 0 2 1 roll rmoveto
+       1 index stringwidth pop
+       mul neg 0 rmoveto show grestore } def
+/cl  { grestore gsave newpath 3 index 3 index moveto 1 index
+       4 -1 roll lineto  exch 1 index lineto lineto
+       closepath clip newpath } def
+/rgb { setrgbcolor } def
+/s   { scalefont setfont } def
+/R   { /Font1 findfont } def
+/B   { /Font2 findfont } def
+/I   { /Font3 findfont } def
+/BI  { /Font4 findfont } def
+/S   { /Font5 findfont } def
+1 setlinecap 1 setlinejoin
+% end   .ps.prolog
+%%IncludeResource: font Helvetica
+/Helvetica findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font1 exch definefont pop
+%%IncludeResource: font Helvetica-Bold
+/Helvetica-Bold findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font2 exch definefont pop
+%%IncludeResource: font Helvetica-Oblique
+/Helvetica-Oblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font3 exch definefont pop
+%%IncludeResource: font Helvetica-BoldOblique
+/Helvetica-BoldOblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font4 exch definefont pop
+%%IncludeResource: font Symbol
+/Symbol findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  currentdict
+  end
+/Font5 exch definefont pop
+%%EndProlog
+%%Page: 1 1
+bp
+18.00 18.00 823.89 577.28 cl
+/ps 14 def B 14 s
+0 0 0 rgb
+435.34 542.73 (Distribution of Propensity Scores) .5 0 0 t
+/ps 12 def R 12 s
+435.34 36.72 (Propensity Score) .5 0 0 t
+77.04 91.44 793.65 518.24 cl
+/bg { 0 0 0 } def
+np
+ 686.16 374.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 379.59 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.87 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.91 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 365.17 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 358.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 376.18 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 372.00 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 374.84 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 364.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 367.12 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 352.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.78 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 383.53 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 355.10 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 380.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 369.92 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 357.47 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 365.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 374.54 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 377.11 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 355.50 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 369.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 374.04 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 362.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 353.08 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 379.09 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 383.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 369.77 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 363.06 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 360.15 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 353.08 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 354.19 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 357.91 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 369.65 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 356.34 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 364.46 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 366.23 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 359.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 379.40 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 356.53 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 376.46 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 366.89 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 359.83 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 364.14 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 375.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 363.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 367.65 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 381.47 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 373.20 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 379.02 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 364.48 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 357.62 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 360.52 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 369.10 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 353.58 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 364.62 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 376.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 357.03 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.67 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 365.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 359.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 363.86 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 375.73 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 356.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 366.79 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 383.16 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 352.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 356.55 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.74 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.22 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 379.48 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 360.44 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 355.23 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 381.91 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 366.85 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 364.02 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 357.50 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 361.42 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 382.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 356.24 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.72 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.69 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 366.38 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 376.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 355.06 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 370.41 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.13 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 368.57 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 357.21 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 369.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 380.52 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 376.41 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 356.33 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 376.04 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 372.85 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 374.56 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 354.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 373.91 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 362.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 353.79 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 371.60 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 374.95 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 382.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 594.59 359.66 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 435.92 357.69 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 666.17 366.76 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 642.10 355.89 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 648.48 353.72 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 528.50 358.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 528.50 379.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 592.56 380.61 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 689.55 361.08 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 689.62 368.24 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 459.68 367.20 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 692.27 362.79 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 693.34 352.60 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 693.34 362.06 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 339.83 363.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 532.74 370.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.56 378.57 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 459.10 370.18 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.58 372.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 341.08 364.91 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 536.73 358.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 618.85 360.26 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 697.71 363.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 698.69 378.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 204.61 360.59 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 662.79 357.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 701.45 377.92 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 701.59 364.67 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 604.50 372.50 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 306.38 363.42 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 706.23 374.95 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 353.65 362.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 236.39 375.59 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 521.35 379.65 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 567.21 364.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 709.72 367.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 604.41 378.61 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 710.14 374.70 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 609.15 371.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 711.03 354.60 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 494.53 373.63 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 711.77 352.51 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 249.61 373.14 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 592.66 368.51 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 449.83 380.01 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 713.79 371.67 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 278.42 356.07 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 715.87 382.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 444.61 367.01 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 671.32 354.54 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 673.16 375.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 619.73 374.81 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 382.04 369.54 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 297.28 377.02 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 726.02 353.38 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 350.96 382.04 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 734.50 379.75 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 498.26 377.81 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 328.21 370.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 667.82 362.22 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 463.21 365.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 677.83 357.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 395.95 362.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.41 356.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 555.00 371.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 129.53 383.34 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 657.96 373.94 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 726.87 381.74 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 757.97 382.58 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 469.64 364.17 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 767.11 377.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 178.43 377.61 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 103.58 359.59 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 296.66 371.52 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.51 371.33 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 323.70 357.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 444.08 241.86 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 751.86 234.00 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 342.94 245.30 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 236.39 224.51 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 435.74 222.67 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 280.79 248.49 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 328.47 242.72 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 300.29 245.22 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.28 244.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 304.82 251.63 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 554.69 237.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 735.22 250.36 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 129.65 224.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 323.37 230.74 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 594.04 225.57 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 205.14 220.61 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 313.28 234.77 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 730.40 250.23 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 567.49 231.78 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 699.75 220.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 693.60 231.14 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 381.91 238.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 593.71 235.99 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 722.47 229.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 396.21 247.79 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 498.76 223.59 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 718.34 233.47 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 469.33 251.15 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 526.35 240.02 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 687.47 221.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 535.91 245.34 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 715.32 236.42 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 710.10 244.57 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 712.22 243.35 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 661.71 251.81 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 180.44 220.94 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 693.02 220.87 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 672.56 242.01 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 605.38 251.01 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 707.38 223.07 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 657.71 229.91 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 692.11 225.34 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 250.19 233.98 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 704.93 234.50 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 677.41 236.30 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 703.18 224.24 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 647.74 246.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 594.66 229.09 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 701.41 247.09 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 619.17 225.58 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 673.36 223.94 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 699.70 221.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 698.56 235.23 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 698.47 237.02 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 533.68 229.55 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 697.71 227.06 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 696.85 242.47 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 696.48 232.78 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.54 250.84 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 696.17 225.13 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.98 221.68 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.93 223.87 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.53 239.75 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.27 246.52 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 694.01 226.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 689.47 238.31 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 693.87 228.51 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 666.39 235.15 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 693.40 236.18 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 683.02 225.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 462.69 231.13 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 691.82 221.04 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 691.82 222.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 691.82 241.29 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 667.49 249.77 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.53 229.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 690.98 221.52 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 690.52 230.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 349.72 237.52 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 690.21 231.97 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 451.99 227.67 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 689.63 228.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 689.04 242.76 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 688.83 230.31 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 683.77 232.05 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 688.65 243.04 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 680.56 250.66 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 682.00 236.01 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 688.11 236.88 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 688.06 233.53 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 681.79 222.00 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 687.86 250.37 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 687.80 227.87 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 687.70 244.31 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.10 224.78 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 687.53 223.97 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 687.19 248.23 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 619.10 248.90 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.56 233.78 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 681.61 224.64 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.55 237.28 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 494.57 221.33 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 123.75 249.10 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 338.23 229.22 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 350.38 247.70 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 455.61 248.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 460.97 240.29 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 517.08 233.41 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 522.68 225.79 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 603.57 238.17 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 609.77 249.68 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 641.81 231.63 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 671.23 247.98 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 672.68 229.70 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 674.68 226.68 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 680.96 242.70 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 683.88 237.16 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 683.97 244.75 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 237.61 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 249.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 245.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 248.77 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 247.36 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 247.50 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 240.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 234.71 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 228.93 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 232.26 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 232.44 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 225.40 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 247.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 231.13 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 235.17 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 234.01 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 234.94 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 244.07 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 236.82 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 225.75 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 222.21 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 246.69 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 231.42 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 222.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 226.87 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 231.25 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 246.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 221.88 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 240.39 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 236.59 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 221.66 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 225.87 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 229.32 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 225.03 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 236.45 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 245.43 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 238.38 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 233.13 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 224.09 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 245.42 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 232.72 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 251.75 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 223.27 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 236.96 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 223.12 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 231.54 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 243.17 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 240.89 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 245.53 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 239.51 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 228.88 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 224.83 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 243.75 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 231.48 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 234.55 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 240.81 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 243.57 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 234.88 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 233.62 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 246.63 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 239.33 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 225.70 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 242.11 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 240.73 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 238.40 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 233.83 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 686.16 229.57 m
+2.70 2.70 l
+-2.70 2.70 l
+-2.70 -2.70 l
+cp p2
+0.7451 0.7451 0.7451 rgb
+0.75 setlinewidth
+[] 0 setdash
+np
+194.61 225.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+140.20 239.35 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+137.15 236.03 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+167.59 238.31 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+267.85 228.57 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+288.17 249.91 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+194.62 244.57 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+472.31 238.12 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+225.31 242.59 m
+1.91 1.90 l
+1.90 -1.90 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+226.23 227.17 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+358.33 244.41 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+208.63 236.06 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+258.95 240.37 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+651.96 242.15 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+533.85 241.15 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+611.46 251.14 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+325.95 254.36 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+131.63 230.14 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+383.51 234.34 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+167.73 248.98 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+618.55 231.41 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+279.45 242.67 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+329.48 246.87 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+476.80 247.32 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+268.79 225.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+150.91 228.75 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+643.15 237.47 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+362.19 224.07 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+318.88 233.58 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+471.55 224.14 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+431.72 226.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+363.21 245.88 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+420.18 234.50 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+314.51 236.68 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+267.15 244.33 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+366.53 245.21 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+234.33 252.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+582.97 239.64 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+395.31 224.28 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+178.67 230.34 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+146.76 236.14 m
+1.90 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+327.90 246.24 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+373.96 244.37 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+331.07 231.02 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+140.11 235.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+494.38 232.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+329.19 223.49 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+490.64 238.00 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+588.83 223.33 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+323.39 244.38 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+375.07 254.71 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+321.17 251.48 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+193.10 230.85 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+334.35 228.00 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+238.43 227.26 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+395.73 242.90 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+195.16 241.12 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+537.35 253.70 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+403.89 249.76 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.90 l
+-1.91 1.90 l
+o
+np
+429.95 247.92 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+145.65 251.15 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+298.71 227.48 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+377.51 224.92 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+420.68 248.94 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+184.26 239.12 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+477.19 239.42 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+262.75 238.34 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+383.24 247.01 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+608.79 236.40 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+583.70 231.26 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+375.30 245.06 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+197.46 247.16 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+262.14 243.41 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+619.00 226.04 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+149.84 235.38 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+601.39 223.28 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+204.47 249.70 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+395.56 231.57 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+334.30 236.60 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+619.73 225.83 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+347.26 234.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+135.83 242.95 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+470.37 227.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+429.81 223.84 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+490.31 250.12 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+271.07 225.49 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+384.84 243.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+240.54 234.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+239.43 248.26 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+715.72 236.30 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+239.67 226.47 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+206.67 250.21 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+151.97 226.13 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+507.40 241.99 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+124.65 236.92 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+395.70 225.24 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+395.82 253.63 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+165.00 248.03 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+214.56 238.71 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+155.37 250.11 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+471.98 240.54 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+571.15 246.75 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+581.00 241.59 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+385.67 242.14 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+540.54 248.95 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+599.05 235.65 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+621.82 243.39 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+494.52 240.44 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+640.66 223.23 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+667.35 235.14 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+180.42 236.35 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+502.07 254.01 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+156.58 228.42 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+408.18 229.19 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+575.29 239.78 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+335.14 226.14 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+442.06 234.66 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+629.61 253.48 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+563.35 246.83 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+208.16 237.68 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+405.16 239.03 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+565.97 233.93 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+290.63 231.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+136.59 237.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+697.50 240.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+389.78 249.22 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+577.31 241.98 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+592.22 242.21 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+322.25 234.76 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+604.51 237.71 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+392.47 244.97 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+639.21 236.49 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+697.67 228.05 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+384.81 238.14 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+642.47 230.88 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+697.33 245.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+697.28 245.45 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+255.49 232.16 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+624.39 248.71 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+668.75 229.07 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+481.85 224.88 m
+1.91 1.90 l
+1.90 -1.90 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+393.51 227.45 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+625.40 253.02 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+366.52 227.07 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+576.10 237.13 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+168.86 244.36 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+550.13 237.06 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+198.88 247.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+647.74 227.65 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+657.09 231.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+279.34 238.78 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+668.13 230.94 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+299.52 228.50 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+579.39 245.36 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+481.86 227.02 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+648.23 253.06 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+190.90 228.82 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+670.13 226.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+655.13 231.05 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+194.31 240.49 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+286.97 225.37 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+653.12 224.45 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+582.64 227.86 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+271.79 241.92 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+613.05 237.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+507.90 239.83 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+654.48 241.72 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+497.09 238.01 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+327.95 250.20 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+568.02 251.45 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+163.62 240.23 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+666.40 236.77 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+262.43 228.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+658.04 233.31 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+640.98 249.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+271.52 224.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+344.14 223.49 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+504.28 246.61 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+658.22 239.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+179.94 236.62 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+668.73 241.80 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+669.82 247.66 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+667.41 253.19 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+649.38 244.71 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+636.72 246.39 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+507.02 226.68 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+637.53 244.08 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+615.80 224.47 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+223.80 223.65 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+223.03 231.25 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+418.63 246.68 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+597.72 236.61 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+656.52 247.22 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+121.84 235.49 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+121.84 226.29 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+141.83 245.12 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+190.61 237.67 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+210.10 234.38 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+219.02 229.24 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+221.10 246.62 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+245.85 234.24 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+255.06 230.26 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+329.42 246.61 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+342.47 228.08 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+343.22 243.24 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+346.29 248.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+360.40 249.77 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+368.75 249.86 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+372.06 232.76 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+431.54 231.20 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+443.98 242.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+464.33 243.56 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+487.37 239.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+511.92 232.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+533.39 239.29 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+536.57 227.54 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+539.05 235.92 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+550.75 244.87 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+560.56 231.49 m
+1.90 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+566.91 233.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+569.65 230.07 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+578.58 251.10 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+584.80 230.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+595.84 223.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+608.89 253.59 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+608.98 225.56 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+612.62 232.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+613.05 227.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+615.66 229.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+615.83 245.63 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+619.75 225.97 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+620.10 224.93 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+625.26 238.29 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+628.25 252.70 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+628.86 247.92 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+629.13 250.51 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+635.65 235.98 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+641.86 232.25 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+654.36 237.47 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.90 l
+-1.91 1.90 l
+o
+np
+658.04 234.11 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+659.21 246.23 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+665.16 225.36 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+666.43 234.12 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+668.05 241.67 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+18.00 18.00 823.89 577.28 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+np
+89.35 91.44 m
+608.50 0 l
+o
+np
+89.35 91.44 m
+0 -7.20 l
+o
+np
+241.48 91.44 m
+0 -7.20 l
+o
+np
+393.60 91.44 m
+0 -7.20 l
+o
+np
+545.73 91.44 m
+0 -7.20 l
+o
+np
+697.85 91.44 m
+0 -7.20 l
+o
+/ps 12 def R 12 s
+89.35 65.52 (0.0) .5 0 0 t
+241.48 65.52 (0.1) .5 0 0 t
+393.60 65.52 (0.2) .5 0 0 t
+545.73 65.52 (0.3) .5 0 0 t
+697.85 65.52 (0.4) .5 0 0 t
+77.04 91.44 793.65 518.24 cl
+/ps 12 def R 12 s
+0 0 0 rgb
+435.34 432.37 (Treatment Units) .5 0 0 t
+435.34 168.80 (Control Units) .5 0 0 t
+18.00 18.00 823.89 577.28 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+np
+77.04 91.44 m
+716.61 0 l
+0 426.80 l
+-716.61 0 l
+0 -426.80 l
+o
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/doc/figs/hist.pdf b/inst/doc/figs/hist.pdf
new file mode 100644
index 0000000..33c2f42
--- /dev/null
+++ b/inst/doc/figs/hist.pdf
@@ -0,0 +1,363 @@
+%PDF-1.1
+%���ρ�\r
+1 0 obj
+<<
+/CreationDate (D:20071010113947)
+/ModDate (D:20071010113947)
+/Title (R Graphics Output)
+/Producer (R 2.4.1)
+/Creator (R)
+>>
+endobj
+2 0 obj
+<<
+/Type /Catalog
+/Pages 3 0 R
+>>
+endobj
+5 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F1
+/BaseFont /ZapfDingbats
+>>
+endobj
+6 0 obj
+<<
+/Type /Page
+/Parent 3 0 R
+/Contents 7 0 R
+/Resources 4 0 R
+>>
+endobj
+7 0 obj
+<<
+/Length 8 0 R
+>>
+stream
+q
+Q q 0.00 216.00 216.00 216.00 re W n
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 12.00 0.00 -0.00 12.00 85.45 403.19 Tm (Raw Treated) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 81.88 231.54 Tm (Propensity Score) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 10.76 313.31 Tm (Density) Tj
+ET
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+53.03 276.96 m 183.11 276.96 l S
+53.03 276.96 m 53.03 270.98 l S
+85.55 276.96 m 85.55 270.98 l S
+118.07 276.96 m 118.07 270.98 l S
+150.59 276.96 m 150.59 270.98 l S
+183.11 276.96 m 183.11 270.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 10.00 0.00 -0.00 10.00 46.08 255.44 Tm (0.0) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 78.60 255.44 Tm (0.2) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 111.12 255.44 Tm (0.4) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 143.64 255.44 Tm (0.6) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 176.16 255.44 Tm (0.8) Tj
+ET
+49.00 280.88 m 49.00 381.80 l S
+49.00 280.88 m 43.03 280.88 l S
+49.00 295.30 m 43.03 295.30 l S
+49.00 309.72 m 43.03 309.72 l S
+49.00 324.13 m 43.03 324.13 l S
+49.00 338.55 m 43.03 338.55 l S
+49.00 352.96 m 43.03 352.96 l S
+49.00 367.38 m 43.03 367.38 l S
+49.00 381.80 m 43.03 381.80 l S
+BT
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 273.93 Tm (0.0) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 302.77 Tm (1.0) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 331.60 Tm (2.0) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 360.43 Tm (3.0) Tj
+ET
+Q q 49.00 276.96 141.90 106.04 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+53.03 280.88 16.26 12.47 re S
+69.29 280.88 16.26 28.05 re S
+85.55 280.88 16.26 4.68 re S
+101.81 280.88 16.26 6.23 re S
+118.07 280.88 16.26 12.47 re S
+134.33 280.88 16.26 38.96 re S
+150.59 280.88 16.26 85.72 re S
+166.85 280.88 16.26 98.19 re S
+183.11 280.88 16.26 1.56 re S
+Q q 265.00 276.96 141.90 106.04 re W n
+Q q 216.00 216.00 216.00 216.00 re W n
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 12.00 0.00 -0.00 12.00 289.42 403.19 Tm (Matched Treated) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 297.88 231.54 Tm (Propensity Score) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 226.76 313.31 Tm (Density) Tj
+ET
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+269.03 276.96 m 399.11 276.96 l S
+269.03 276.96 m 269.03 270.98 l S
+301.55 276.96 m 301.55 270.98 l S
+334.07 276.96 m 334.07 270.98 l S
+366.59 276.96 m 366.59 270.98 l S
+399.11 276.96 m 399.11 270.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 10.00 0.00 -0.00 10.00 262.08 255.44 Tm (0.0) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 294.60 255.44 Tm (0.2) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 327.12 255.44 Tm (0.4) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 359.64 255.44 Tm (0.6) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 392.16 255.44 Tm (0.8) Tj
+ET
+265.00 280.88 m 265.00 374.15 l S
+265.00 280.88 m 259.03 280.88 l S
+265.00 299.54 m 259.03 299.54 l S
+265.00 318.19 m 259.03 318.19 l S
+265.00 336.84 m 259.03 336.84 l S
+265.00 355.49 m 259.03 355.49 l S
+265.00 374.15 m 259.03 374.15 l S
+BT
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 278.10 Tm (0) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 296.76 Tm (1) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 315.41 Tm (2) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 334.06 Tm (3) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 352.71 Tm (4) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 371.37 Tm (5) Tj
+ET
+Q q 265.00 276.96 141.90 106.04 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+269.03 280.88 8.13 3.73 re S
+277.16 280.88 8.13 12.68 re S
+285.29 280.88 8.13 29.55 re S
+293.42 280.88 8.13 8.51 re S
+301.55 280.88 8.13 6.71 re S
+309.68 280.88 8.13 0.00 re S
+317.81 280.88 8.13 7.61 re S
+325.94 280.88 8.13 0.00 re S
+334.07 280.88 8.13 3.58 re S
+342.20 280.88 8.13 13.13 re S
+350.33 280.88 8.13 32.38 re S
+358.46 280.88 8.13 18.35 re S
+366.59 280.88 8.13 24.77 re S
+374.72 280.88 8.13 89.38 re S
+382.85 280.88 8.13 98.19 re S
+390.98 280.88 8.13 22.98 re S
+399.11 280.88 8.13 1.49 re S
+Q q 49.00 60.96 141.90 106.04 re W n
+Q q 0.00 0.00 216.00 216.00 re W n
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 12.00 0.00 -0.00 12.00 84.83 187.19 Tm (Raw Control) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 81.88 15.54 Tm (Propensity Score) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 10.76 97.31 Tm (Density) Tj
+ET
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+53.03 60.96 m 183.11 60.96 l S
+53.03 60.96 m 53.03 54.98 l S
+85.55 60.96 m 85.55 54.98 l S
+118.07 60.96 m 118.07 54.98 l S
+150.59 60.96 m 150.59 54.98 l S
+183.11 60.96 m 183.11 54.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 10.00 0.00 -0.00 10.00 46.08 39.44 Tm (0.0) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 78.60 39.44 Tm (0.2) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 111.12 39.44 Tm (0.4) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 143.64 39.44 Tm (0.6) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 176.16 39.44 Tm (0.8) Tj
+ET
+49.00 64.88 m 49.00 160.25 l S
+49.00 64.88 m 43.03 64.88 l S
+49.00 80.78 m 43.03 80.78 l S
+49.00 96.67 m 43.03 96.67 l S
+49.00 112.57 m 43.03 112.57 l S
+49.00 128.46 m 43.03 128.46 l S
+49.00 144.36 m 43.03 144.36 l S
+49.00 160.25 m 43.03 160.25 l S
+BT
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 62.10 Tm (0) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 78.00 Tm (1) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 93.89 Tm (2) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 109.79 Tm (3) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 125.68 Tm (4) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 141.58 Tm (5) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 34.66 157.47 Tm (6) Tj
+ET
+Q q 49.00 60.96 141.90 106.04 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+53.03 64.88 16.26 98.19 re S
+69.29 64.88 16.26 23.34 re S
+85.55 64.88 16.26 5.19 re S
+101.81 64.88 16.26 1.48 re S
+118.07 64.88 16.26 5.56 re S
+134.33 64.88 16.26 3.71 re S
+150.59 64.88 16.26 13.34 re S
+166.85 64.88 16.26 8.15 re S
+Q q 265.00 60.96 141.90 106.04 re W n
+Q q 216.00 0.00 216.00 216.00 re W n
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 12.00 0.00 -0.00 12.00 288.80 187.19 Tm (Matched Control) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 297.88 15.54 Tm (Propensity Score) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 226.76 97.31 Tm (Density) Tj
+ET
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+269.03 60.96 m 399.11 60.96 l S
+269.03 60.96 m 269.03 54.98 l S
+301.55 60.96 m 301.55 54.98 l S
+334.07 60.96 m 334.07 54.98 l S
+366.59 60.96 m 366.59 54.98 l S
+399.11 60.96 m 399.11 54.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 10.00 0.00 -0.00 10.00 262.08 39.44 Tm (0.0) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 294.60 39.44 Tm (0.2) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 327.12 39.44 Tm (0.4) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 359.64 39.44 Tm (0.6) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 392.16 39.44 Tm (0.8) Tj
+ET
+265.00 64.88 m 265.00 159.15 l S
+265.00 64.88 m 259.03 64.88 l S
+265.00 83.74 m 259.03 83.74 l S
+265.00 102.59 m 259.03 102.59 l S
+265.00 121.44 m 259.03 121.44 l S
+265.00 140.29 m 259.03 140.29 l S
+265.00 159.15 m 259.03 159.15 l S
+BT
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 62.10 Tm (0) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 80.96 Tm (1) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 99.81 Tm (2) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 118.66 Tm (3) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 137.51 Tm (4) Tj
+/F2 1 Tf 0.00 10.00 -10.00 0.00 250.66 156.37 Tm (5) Tj
+ET
+Q q 265.00 60.96 141.90 106.04 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+269.03 64.88 8.13 3.77 re S
+277.16 64.88 8.13 15.08 re S
+285.29 64.88 8.13 27.60 re S
+293.42 64.88 8.13 7.69 re S
+301.55 64.88 8.13 6.79 re S
+309.68 64.88 8.13 0.30 re S
+317.81 64.88 8.13 6.33 re S
+325.94 64.88 8.13 3.47 re S
+334.07 64.88 8.13 1.66 re S
+342.20 64.88 8.13 18.85 re S
+350.33 64.88 8.13 30.16 re S
+358.46 64.88 8.13 17.80 re S
+366.59 64.88 8.13 29.26 re S
+374.72 64.88 8.13 84.46 re S
+382.85 64.88 8.13 98.19 re S
+390.98 64.88 8.13 25.64 re S
+Q
+endstream
+endobj
+8 0 obj
+7555
+endobj
+3 0 obj
+<<
+/Type /Pages
+/Kids [
+6 0 R
+]
+/Count 1
+/MediaBox [0 0 432 432]
+>>
+endobj
+4 0 obj
+<<
+/ProcSet [/PDF /Text]
+/Font << /F1 5 0 R /F2 10 0 R /F3 11 0 R >>
+/ExtGState << >>
+>>
+endobj
+9 0 obj
+<<
+/Type /Encoding
+/BaseEncoding /WinAnsiEncoding
+/Differences [ 45/minus 96/quoteleft
+144/dotlessi /grave /acute /circumflex /tilde /macron /breve /dotaccent
+/dieresis /.notdef /ring /cedilla /.notdef /hungarumlaut /ogonek /caron /space]
+>>
+endobj
+10 0 obj <<
+/Type /Font
+/Subtype /Type1
+/Name /F2
+/BaseFont /Helvetica
+/Encoding 9 0 R
+>> endobj
+11 0 obj <<
+/Type /Font
+/Subtype /Type1
+/Name /F3
+/BaseFont /Helvetica-Bold
+/Encoding 9 0 R
+>> endobj
+xref
+0 12
+0000000000 65535 f 
+0000000021 00000 n 
+0000000163 00000 n 
+0000008003 00000 n 
+0000008086 00000 n 
+0000000212 00000 n 
+0000000295 00000 n 
+0000000375 00000 n 
+0000007983 00000 n 
+0000008190 00000 n 
+0000008447 00000 n 
+0000008544 00000 n 
+trailer
+<<
+/Size 12
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+8646
+%%EOF
diff --git a/inst/doc/figs/jitterplotnn.eps b/inst/doc/figs/jitterplotnn.eps
new file mode 100644
index 0000000..096be80
--- /dev/null
+++ b/inst/doc/figs/jitterplotnn.eps
@@ -0,0 +1,4085 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 396 252 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 396 252
+%%EndComments
+%%BeginProlog
+/bp  { gs gs } def
+% begin .ps.prolog
+/gs  { gsave } def
+/gr  { grestore } def
+/ep  { showpage gr gr } def
+/m   { moveto } def
+/l  { rlineto } def
+/np  { newpath } def
+/cp  { closepath } def
+/f   { fill } def
+/o   { stroke } def
+/c   { newpath 0 360 arc } def
+/r   { 4 2 roll moveto 1 copy 3 -1 roll exch 0 exch rlineto 0 rlineto -1 mul 0 exch rlineto closepath } def
+/p1  { stroke } def
+/p2  { gsave bg setrgbcolor fill grestore newpath } def
+/p3  { gsave bg setrgbcolor fill grestore stroke } def
+/t   { 6 -2 roll moveto gsave rotate
+       ps mul neg 0 2 1 roll rmoveto
+       1 index stringwidth pop
+       mul neg 0 rmoveto show grestore } def
+/cl  { grestore gsave newpath 3 index 3 index moveto 1 index
+       4 -1 roll lineto  exch 1 index lineto lineto
+       closepath clip newpath } def
+/rgb { setrgbcolor } def
+/s   { scalefont setfont } def
+% end   .ps.prolog
+%%IncludeResource: font Helvetica
+/Helvetica findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font1 exch definefont pop
+%%IncludeResource: font Helvetica-Bold
+/Helvetica-Bold findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font2 exch definefont pop
+%%IncludeResource: font Helvetica-Oblique
+/Helvetica-Oblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font3 exch definefont pop
+%%IncludeResource: font Helvetica-BoldOblique
+/Helvetica-BoldOblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font4 exch definefont pop
+%%IncludeResource: font Symbol
+/Symbol findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  currentdict
+  end
+/Font5 exch definefont pop
+%%EndProlog
+%%Page: 1 1
+bp
+/bg { 1 1 1 } def
+0.00 0.00 396.00 252.00 r p2
+0.00 0.00 396.00 252.00 cl
+/ps 10 def /Font2 findfont 10 s
+0 0 0 rgb
+198.00 233.29 (Distribution of Propensity Scores) .5 0 0 t
+/ps 8 def /Font1 findfont 8 s
+198.00 4.32 (Propensity Score) .5 0 0 t
+30.24 30.24 365.76 221.76 cl
+/bg { 0 0 0 } def
+np
+ 311.89 159.34 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 109.03 150.24 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.59 149.05 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.23 151.91 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.50 160.57 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.91 160.04 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.82 151.13 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.06 158.14 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 342.53 155.95 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.13 162.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.02 157.88 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 325.13 162.63 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.06 151.49 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.57 156.55 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 284.94 157.74 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.85 149.51 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 324.94 159.63 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.71 159.94 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.26 151.63 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.72 154.06 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.36 160.04 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.38 161.61 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 65.21 154.37 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.33 151.07 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.89 154.42 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.16 154.90 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.30 158.13 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 113.62 150.31 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.92 149.02 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.33 148.86 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.92 148.77 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 261.49 156.88 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.30 154.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.92 149.93 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.75 149.89 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 330.52 159.67 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 269.91 161.74 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.82 148.61 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.02 158.34 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.68 157.23 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.88 148.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 65.41 158.73 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.09 153.83 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 104.64 155.19 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.47 158.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.30 152.89 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.09 157.15 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.09 149.07 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 269.91 161.47 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.82 149.76 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.69 153.75 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.09 156.08 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.53 162.19 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.75 148.86 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.12 156.84 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.92 161.18 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.37 153.41 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 261.76 151.17 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 330.52 148.82 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 69.83 151.99 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.09 154.92 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.65 156.93 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.29 159.23 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.23 162.55 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 262.23 159.24 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.70 151.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.23 160.39 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 61.47 160.35 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 269.14 157.19 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 324.88 156.50 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.73 161.01 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 324.33 151.65 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 277.60 158.39 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.75 162.15 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 336.77 159.36 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 69.79 156.64 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.85 159.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.95 159.25 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.78 150.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.40 149.71 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.75 162.20 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.98 160.73 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.06 161.07 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 324.94 154.94 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.72 155.58 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.85 154.17 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 104.53 162.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.26 157.20 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.29 159.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.80 155.88 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.09 156.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.92 150.65 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.30 152.21 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.88 156.86 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.65 161.91 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.23 160.09 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.06 159.36 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.19 151.96 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.64 154.86 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 108.82 156.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.68 158.61 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.61 154.64 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.30 160.28 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.53 159.23 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.50 160.25 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.16 156.58 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 324.94 153.10 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.09 154.48 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.12 160.55 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 290.50 156.12 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 250.93 160.65 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 107.11 153.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.48 151.85 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 306.98 158.79 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 293.07 154.92 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 63.75 160.49 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 304.48 157.67 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 319.85 149.90 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 306.86 153.73 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 279.50 162.58 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 332.48 155.60 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 307.98 159.18 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 301.17 154.10 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 55.44 156.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 62.28 157.40 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 301.25 159.36 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 280.00 153.40 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 308.16 149.89 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 83.26 161.22 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 288.93 158.61 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 289.58 152.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 315.45 148.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 315.79 154.50 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 187.15 154.31 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 310.78 159.70 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 303.14 154.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 64.68 150.12 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 294.84 155.16 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 239.49 158.93 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 71.89 155.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 232.28 149.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 212.21 160.41 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 280.18 157.85 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 273.67 154.99 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 74.81 157.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 302.77 155.32 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.27 161.49 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 303.34 150.46 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 319.19 155.62 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 275.38 151.40 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.89 150.51 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 218.96 158.32 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 279.88 156.81 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 280.75 153.50 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 306.35 153.64 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 238.93 150.19 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 307.78 149.38 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 280.06 152.28 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 307.66 156.72 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 294.62 155.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.92 151.32 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 204.21 149.57 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 224.29 150.46 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 316.80 154.34 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 257.97 149.76 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.51 152.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 101.64 151.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 228.78 161.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 309.79 158.41 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 265.23 154.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.74 155.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 271.62 151.98 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 71.35 152.75 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.58 161.05 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 127.58 158.25 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 316.16 154.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 136.17 154.94 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 331.20 152.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 63.45 152.13 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 131.58 160.19 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 189.84 151.03 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 107.99 151.62 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 229.74 160.70 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 233.42 152.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 270.12 150.35 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 219.86 101.82 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 225.75 103.09 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.29 99.00 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 350.63 89.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 79.55 92.19 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 101.35 101.77 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 75.11 97.54 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 79.40 101.54 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 241.45 95.79 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 61.45 96.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 216.47 93.59 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 109.96 99.15 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 73.33 94.74 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 265.76 92.75 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 73.20 93.87 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 266.32 91.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 333.34 98.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 74.61 100.02 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 251.11 103.27 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 78.44 102.32 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 99.74 97.77 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 231.74 99.11 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 93.99 99.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 93.94 97.29 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 90.40 93.61 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 65.18 93.50 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 124.39 97.10 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 69.75 94.91 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 78.76 96.05 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 211.14 99.04 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 119.97 101.71 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 146.37 100.90 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 265.98 101.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.31 92.55 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 198.96 99.92 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 55.44 103.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 73.56 97.00 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.15 90.47 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 73.00 97.11 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.65 98.46 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 321.17 96.74 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 91.05 98.38 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 63.84 91.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.99 92.38 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 75.28 103.33 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 278.83 103.07 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 109.45 102.42 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.76 90.51 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 90.20 94.36 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.59 102.23 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 89.17 91.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 73.92 95.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 76.20 91.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.46 97.86 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 283.20 100.75 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 309.61 91.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 278.20 94.05 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 129.90 93.59 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 103.84 95.41 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 79.58 90.82 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 295.16 90.95 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 301.90 100.57 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 82.01 94.25 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 307.89 96.14 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 116.65 103.06 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 322.28 95.96 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.58 94.28 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 74.60 92.76 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 316.00 97.59 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 98.13 98.42 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 111.41 94.95 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 80.34 90.21 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 75.22 101.58 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 73.45 96.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 93.54 101.83 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 216.16 96.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 301.73 96.42 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 62.24 99.26 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 80.01 102.07 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 106.19 94.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 301.34 90.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 120.56 95.99 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 271.98 92.60 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 81.56 100.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 310.54 103.48 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 78.60 91.04 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 315.53 95.06 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 249.16 96.43 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 120.04 91.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 115.09 102.91 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 125.27 100.11 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 74.03 93.73 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.49 90.99 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 80.81 95.62 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 293.34 103.17 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 288.86 89.92 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 103.34 90.53 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 103.41 99.54 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.89 102.80 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.67 101.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.88 96.61 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 324.58 96.47 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 64.74 92.39 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 115.01 89.57 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 124.28 98.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.65 90.01 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 284.52 98.64 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 83.59 91.00 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 277.81 90.05 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.66 92.18 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 115.62 93.17 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 157.57 101.46 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 241.76 89.36 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 265.07 99.41 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 112.63 93.33 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.74 91.71 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 326.61 99.87 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 302.09 93.00 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 71.37 94.04 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 261.88 101.77 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 100.53 102.82 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 307.17 101.84 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 307.35 95.94 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 101.54 91.51 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 101.96 100.48 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 289.87 98.67 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 118.08 102.89 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 63.45 92.79 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 314.88 103.12 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 265.62 97.38 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 296.15 91.15 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 236.11 96.56 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 99.13 94.74 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 71.95 95.35 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 123.48 102.22 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 71.91 103.13 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 109.18 91.71 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.89 98.10 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.78 101.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 299.13 90.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.60 100.47 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 298.99 101.70 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.92 97.96 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.53 90.76 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.58 98.79 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.09 103.03 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 65.44 97.51 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 123.56 93.58 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.45 90.17 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 325.13 90.65 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.31 91.57 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 88.62 89.94 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 123.94 102.21 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.92 101.78 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 261.21 94.63 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.50 90.71 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 312.53 101.91 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 74.52 95.25 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 109.18 96.86 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.92 99.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.06 92.37 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.28 97.95 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 292.09 96.51 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 330.98 92.34 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 291.36 96.57 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.92 97.90 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 71.93 94.36 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 80.63 94.66 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.96 96.45 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.26 99.44 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 311.58 91.43 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 83.42 98.50 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.89 96.97 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 317.83 92.59 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 318.45 99.48 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 104.69 102.83 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 72.21 94.89 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 261.37 91.73 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 246.57 96.85 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 305.57 100.99 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 77.62 102.52 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 69.87 94.75 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 79.06 95.85 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 90.62 103.30 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+np
+ 269.64 97.93 m
+2.70 2.70 l
+2.70 -2.70 l
+-2.70 -2.70 l
+cp p2
+0.7451 0.7451 0.7451 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+49.58 101.50 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+44.89 100.70 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+46.88 102.94 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+46.09 91.57 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+48.63 92.33 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.25 101.93 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+48.80 92.99 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+50.09 97.65 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.43 96.50 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.98 95.80 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.69 100.19 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+53.45 91.75 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.48 96.10 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.65 92.83 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+43.20 94.72 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+45.42 100.40 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+65.02 95.93 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.53 89.86 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.03 102.36 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+50.47 95.31 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+54.33 101.04 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+42.71 94.88 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+57.92 94.11 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.75 98.08 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.47 94.46 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+57.08 99.42 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.90 l
+-1.91 1.90 l
+o
+np
+71.00 100.69 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.47 96.08 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.17 97.15 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+52.41 89.61 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.41 94.48 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+50.32 102.52 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+70.24 99.88 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+47.41 93.19 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+44.08 98.37 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+43.25 98.76 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+55.65 93.35 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.85 97.82 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+54.56 94.31 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+43.72 97.57 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+56.40 90.05 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.90 90.77 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.28 92.30 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+59.69 102.76 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+47.85 98.42 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.51 93.66 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+48.07 91.44 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+53.27 96.62 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.25 95.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.13 95.97 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+65.36 102.41 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+62.92 92.77 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.96 92.30 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.68 97.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.18 89.51 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.57 92.36 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+53.69 95.86 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+46.73 89.91 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.90 98.64 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+47.00 101.32 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+58.34 99.72 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+64.33 94.67 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.37 102.61 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+46.16 90.98 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+57.14 95.58 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+44.56 98.32 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+71.27 90.52 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+42.70 92.91 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.57 102.95 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+62.82 99.37 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.14 90.36 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+66.29 99.05 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+65.76 98.39 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+55.58 98.56 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.75 102.70 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+50.08 101.69 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+50.04 93.64 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.75 92.29 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.95 102.54 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+48.89 91.74 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+44.38 98.24 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+43.95 93.94 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.95 89.43 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.95 98.51 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+58.58 91.52 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+45.21 93.57 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+46.92 92.27 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+44.53 91.98 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+63.85 92.94 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+57.97 97.18 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+70.70 90.26 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+54.51 101.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.61 102.44 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+63.69 91.94 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+71.62 99.58 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+43.84 101.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+47.55 99.64 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.38 98.74 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+44.55 94.70 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+67.98 94.15 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.13 94.37 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+61.31 102.25 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+72.19 96.64 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.56 92.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+45.06 96.84 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+58.68 90.06 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+62.50 102.69 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.18 102.48 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.60 101.56 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+41.86 92.34 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+70.06 103.36 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.38 95.95 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+67.76 98.02 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.78 98.08 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+70.95 92.74 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+72.26 99.82 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+54.28 100.57 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.58 98.62 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+57.92 94.63 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.88 95.11 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.34 102.58 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.71 96.94 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.69 96.89 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+45.04 92.95 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.14 99.31 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.06 91.34 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+58.07 99.63 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.70 96.97 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.59 89.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+56.76 92.16 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+42.71 93.29 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+47.18 89.65 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+67.03 91.72 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+72.10 100.43 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+67.22 91.20 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+68.05 94.63 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+62.54 95.71 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+64.98 95.34 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.08 100.42 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+65.56 93.39 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+58.91 95.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+71.86 100.04 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+46.87 90.40 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+47.41 101.92 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+71.27 101.90 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+67.76 100.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.39 100.32 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+64.27 97.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+63.64 99.02 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.04 102.90 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+62.85 93.85 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+57.06 99.25 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.25 89.62 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+42.43 102.77 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+61.75 102.90 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.22 91.51 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+56.22 99.45 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.81 95.34 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.63 95.69 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+61.40 98.24 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+51.30 98.04 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+54.62 99.37 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.70 96.48 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.09 99.98 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.50 94.60 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+63.13 99.75 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+43.61 101.75 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+60.19 98.89 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.83 95.37 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+70.53 95.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.55 98.46 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.52 95.68 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+68.55 91.25 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.54 94.35 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+68.53 94.18 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+64.20 92.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+48.55 91.79 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.51 93.19 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+45.49 90.13 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+55.93 98.81 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+64.12 101.73 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+67.13 90.45 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+63.97 96.22 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.89 98.51 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+41.68 97.52 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+42.42 94.89 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+40.76 90.49 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+52.85 93.54 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+47.74 93.62 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+46.70 102.55 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+48.27 99.34 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.70 102.42 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+65.54 102.41 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.90 l
+-1.91 1.90 l
+o
+np
+55.49 103.15 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+54.47 93.19 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+54.98 101.31 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+53.85 100.41 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+49.47 91.85 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+58.79 95.80 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.20 97.08 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.09 93.43 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.42 93.56 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.16 90.59 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+57.42 102.80 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.78 89.45 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.46 101.26 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+55.97 92.41 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+61.67 102.08 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+63.80 102.03 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.40 94.16 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+59.35 98.87 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+61.23 99.77 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+68.27 92.72 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+71.17 94.33 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+56.31 92.02 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.17 92.98 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.90 l
+-1.91 1.90 l
+o
+np
+65.13 98.11 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+67.05 103.54 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.51 97.82 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+53.98 91.60 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+61.69 94.39 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.32 102.69 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.87 94.45 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.30 97.29 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+69.86 89.36 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+70.01 94.19 m
+1.90 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.90 1.91 l
+o
+np
+60.02 96.77 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+72.65 94.59 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+64.22 101.64 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+64.22 101.14 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+68.23 94.33 m
+1.91 1.90 l
+1.91 -1.90 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+70.53 89.80 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+64.03 94.59 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+72.66 89.88 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.23 95.52 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+64.22 94.01 m
+1.91 1.91 l
+1.90 -1.91 l
+-1.90 -1.91 l
+-1.91 1.91 l
+o
+np
+61.96 90.53 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.38 95.40 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+68.38 94.39 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.56 103.27 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+60.33 99.75 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+63.82 99.94 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.23 98.54 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+np
+66.23 102.13 m
+1.91 1.91 l
+1.91 -1.91 l
+-1.91 -1.91 l
+-1.91 1.91 l
+o
+0.00 0.00 396.00 252.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+39.09 30.24 m
+318.45 0 l
+o
+np
+39.09 30.24 m
+0 -7.20 l
+o
+np
+118.71 30.24 m
+0 -7.20 l
+o
+np
+198.32 30.24 m
+0 -7.20 l
+o
+np
+277.93 30.24 m
+0 -7.20 l
+o
+np
+357.54 30.24 m
+0 -7.20 l
+o
+/ps 6 def /Font1 findfont 6 s
+39.09 11.52 (0.0) .5 0 0 t
+118.71 11.52 (0.2) .5 0 0 t
+198.32 11.52 (0.4) .5 0 0 t
+277.93 11.52 (0.6) .5 0 0 t
+357.54 11.52 (0.8) .5 0 0 t
+30.24 30.24 365.76 221.76 cl
+/ps 12 def /Font1 findfont 12 s
+0 0 0 rgb
+198.00 180.92 (Treatment Units) .5 0 0 t
+198.00 62.58 (Control Units) .5 0 0 t
+0.00 0.00 396.00 252.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+30.24 30.24 m
+335.52 0 l
+0 191.52 l
+-335.52 0 l
+0 -191.52 l
+o
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/doc/figs/jitterplotnn.pdf b/inst/doc/figs/jitterplotnn.pdf
new file mode 100644
index 0000000..b46d926
--- /dev/null
+++ b/inst/doc/figs/jitterplotnn.pdf
@@ -0,0 +1,3484 @@
+%PDF-1.1
+%���ρ�\r
+1 0 obj
+<<
+/CreationDate (D:20071010113930)
+/ModDate (D:20071010113930)
+/Title (R Graphics Output)
+/Producer (R 2.4.1)
+/Creator (R)
+>>
+endobj
+2 0 obj
+<<
+/Type /Catalog
+/Pages 3 0 R
+>>
+endobj
+5 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F1
+/BaseFont /ZapfDingbats
+>>
+endobj
+6 0 obj
+<<
+/Type /Page
+/Parent 3 0 R
+/Contents 7 0 R
+/Resources 4 0 R
+>>
+endobj
+7 0 obj
+<<
+/Length 8 0 R
+>>
+stream
+q
+Q q
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 14.00 0.00 -0.00 14.00 335.44 397.45 Tm (Distribution of Propensity Scores) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 400.72 18.72 Tm (Propensity Score) Tj
+ET
+Q q 59.04 73.44 774.72 299.52 re W n
+0.000 0.000 0.000 rg
+  514.63 255.74 m
+  517.33 258.44 l
+  520.03 255.74 l
+  517.33 253.04 l
+h f
+  251.70 266.09 m
+  254.40 268.79 l
+  257.10 266.09 l
+  254.40 263.39 l
+h f
+  667.02 255.03 m
+  669.72 257.73 l
+  672.42 255.03 l
+  669.72 252.33 l
+h f
+  662.54 254.11 m
+  665.24 256.81 l
+  667.94 254.11 l
+  665.24 251.41 l
+h f
+  671.45 263.21 m
+  674.15 265.91 l
+  676.85 263.21 l
+  674.15 260.51 l
+h f
+  654.97 253.47 m
+  657.67 256.17 l
+  660.37 253.47 l
+  657.67 250.77 l
+h f
+  656.50 254.14 m
+  659.20 256.84 l
+  661.90 254.14 l
+  659.20 251.44 l
+h f
+  669.98 251.81 m
+  672.68 254.51 l
+  675.38 251.81 l
+  672.68 249.11 l
+h f
+  654.97 257.14 m
+  657.67 259.84 l
+  660.37 257.14 l
+  657.67 254.44 l
+h f
+  117.85 256.99 m
+  120.55 259.69 l
+  123.25 256.99 l
+  120.55 254.29 l
+h f
+  650.37 255.76 m
+  653.07 258.46 l
+  655.77 255.76 l
+  653.07 253.06 l
+h f
+  653.44 258.57 m
+  656.14 261.27 l
+  658.84 258.57 l
+  656.14 255.87 l
+h f
+  648.82 251.74 m
+  651.52 254.44 l
+  654.22 251.74 l
+  651.52 249.04 l
+h f
+  496.50 261.73 m
+  499.20 264.43 l
+  501.90 261.73 l
+  499.20 259.03 l
+h f
+  647.27 265.97 m
+  649.97 268.67 l
+  652.67 265.97 l
+  649.97 263.27 l
+h f
+  650.37 259.25 m
+  653.07 261.95 l
+  655.77 259.25 l
+  653.07 256.55 l
+h f
+  662.54 249.90 m
+  665.24 252.60 l
+  667.94 249.90 l
+  665.24 247.20 l
+h f
+  656.50 255.27 m
+  659.20 257.97 l
+  661.90 255.27 l
+  659.20 252.57 l
+h f
+  681.58 263.26 m
+  684.28 265.96 l
+  686.98 263.26 l
+  684.28 260.56 l
+h f
+  661.04 260.97 m
+  663.74 263.67 l
+  666.44 260.97 l
+  663.74 258.27 l
+h f
+  656.50 259.63 m
+  659.20 262.33 l
+  661.90 259.63 l
+  659.20 256.93 l
+h f
+  172.77 258.91 m
+  175.47 261.61 l
+  178.17 258.91 l
+  175.47 256.21 l
+h f
+  170.56 252.22 m
+  173.26 254.92 l
+  175.96 252.22 l
+  173.26 249.52 l
+h f
+  658.02 256.33 m
+  660.72 259.03 l
+  663.42 256.33 l
+  660.72 253.63 l
+h f
+  648.82 256.17 m
+  651.52 258.87 l
+  654.22 256.17 l
+  651.52 253.47 l
+h f
+  500.13 257.81 m
+  502.83 260.51 l
+  505.53 257.81 l
+  502.83 255.11 l
+h f
+  659.53 266.09 m
+  662.23 268.79 l
+  664.93 266.09 l
+  662.23 263.39 l
+h f
+  257.83 258.80 m
+  260.53 261.50 l
+  263.23 258.80 l
+  260.53 256.10 l
+h f
+  647.27 263.63 m
+  649.97 266.33 l
+  652.67 263.63 l
+  649.97 260.93 l
+h f
+  658.02 250.85 m
+  660.72 253.55 l
+  663.42 250.85 l
+  660.72 248.15 l
+h f
+  647.27 262.95 m
+  649.97 265.65 l
+  652.67 262.95 l
+  649.97 260.25 l
+h f
+  692.81 251.41 m
+  695.51 254.11 l
+  698.21 251.41 l
+  695.51 248.71 l
+h f
+  492.87 255.77 m
+  495.57 258.47 l
+  498.27 255.77 l
+  495.57 253.07 l
+h f
+  651.91 260.15 m
+  654.61 262.85 l
+  657.31 260.15 l
+  654.61 257.45 l
+h f
+  659.53 249.93 m
+  662.23 252.63 l
+  664.93 249.93 l
+  662.23 247.23 l
+h f
+  684.42 259.47 m
+  687.12 262.17 l
+  689.82 259.47 l
+  687.12 256.77 l
+h f
+  659.53 265.14 m
+  662.23 267.84 l
+  664.93 265.14 l
+  662.23 262.44 l
+h f
+  489.24 251.17 m
+  491.94 253.87 l
+  494.64 251.17 l
+  491.94 248.47 l
+h f
+  530.87 256.46 m
+  533.57 259.16 l
+  536.27 256.46 l
+  533.57 253.76 l
+h f
+  658.02 264.63 m
+  660.72 267.33 l
+  663.42 264.63 l
+  660.72 261.93 l
+h f
+  653.44 250.18 m
+  656.14 252.88 l
+  658.84 250.18 l
+  656.14 247.48 l
+h f
+  157.61 258.30 m
+  160.31 261.00 l
+  163.01 258.30 l
+  160.31 255.60 l
+h f
+  647.27 259.55 m
+  649.97 262.25 l
+  652.67 259.55 l
+  649.97 256.85 l
+h f
+  158.86 250.53 m
+  161.56 253.23 l
+  164.26 250.53 l
+  161.56 247.83 l
+h f
+  651.91 264.54 m
+  654.61 267.24 l
+  657.31 264.54 l
+  654.61 261.84 l
+h f
+  492.87 260.74 m
+  495.57 263.44 l
+  498.27 260.74 l
+  495.57 258.04 l
+h f
+  647.27 264.70 m
+  649.97 267.40 l
+  652.67 264.70 l
+  649.97 262.00 l
+h f
+  647.27 262.53 m
+  649.97 265.23 l
+  652.67 262.53 l
+  649.97 259.83 l
+h f
+  659.53 260.90 m
+  662.23 263.60 l
+  664.93 260.90 l
+  662.23 258.20 l
+h f
+  656.50 261.46 m
+  659.20 264.16 l
+  661.90 261.46 l
+  659.20 258.76 l
+h f
+  664.04 253.69 m
+  666.74 256.39 l
+  669.44 253.69 l
+  666.74 250.99 l
+h f
+  503.76 261.62 m
+  506.46 264.32 l
+  509.16 261.62 l
+  506.46 258.92 l
+h f
+  648.82 266.09 m
+  651.52 268.79 l
+  654.22 266.09 l
+  651.52 263.39 l
+h f
+  659.53 264.72 m
+  662.23 267.42 l
+  664.93 264.72 l
+  662.23 262.02 l
+h f
+  501.94 260.50 m
+  504.64 263.20 l
+  507.34 260.50 l
+  504.64 257.80 l
+h f
+  647.27 262.63 m
+  649.97 265.33 l
+  652.67 262.63 l
+  649.97 259.93 l
+h f
+  677.27 254.15 m
+  679.97 256.85 l
+  682.67 254.15 l
+  679.97 251.45 l
+h f
+  521.86 253.16 m
+  524.56 255.86 l
+  527.26 253.16 l
+  524.56 250.46 l
+h f
+  523.66 251.04 m
+  526.36 253.74 l
+  529.06 251.04 l
+  526.36 248.34 l
+h f
+  159.54 263.74 m
+  162.24 266.44 l
+  164.94 263.74 l
+  162.24 261.04 l
+h f
+  647.27 252.10 m
+  649.97 254.80 l
+  652.67 252.10 l
+  649.97 249.40 l
+h f
+  665.53 266.17 m
+  668.23 268.87 l
+  670.93 266.17 l
+  668.23 263.47 l
+h f
+  674.37 264.00 m
+  677.07 266.70 l
+  679.77 264.00 l
+  677.07 261.30 l
+h f
+  662.54 262.28 m
+  665.24 264.98 l
+  667.94 262.28 l
+  665.24 259.58 l
+h f
+  665.53 252.64 m
+  668.23 255.34 l
+  670.93 252.64 l
+  668.23 249.94 l
+h f
+  664.04 260.60 m
+  666.74 263.30 l
+  669.44 260.60 l
+  666.74 257.90 l
+h f
+  662.54 253.04 m
+  665.24 255.74 l
+  667.94 253.04 l
+  665.24 250.34 l
+h f
+  160.20 260.35 m
+  162.90 263.05 l
+  165.60 260.35 l
+  162.90 257.65 l
+h f
+  529.07 260.26 m
+  531.77 262.96 l
+  534.47 260.26 l
+  531.77 257.56 l
+h f
+  665.53 265.42 m
+  668.23 268.12 l
+  670.93 265.42 l
+  668.23 262.72 l
+h f
+  662.54 256.98 m
+  665.24 259.68 l
+  667.94 256.98 l
+  665.24 254.28 l
+h f
+  690.03 257.35 m
+  692.73 260.05 l
+  695.43 257.35 l
+  692.73 254.65 l
+h f
+  648.82 251.11 m
+  651.52 253.81 l
+  654.22 251.11 l
+  651.52 248.41 l
+h f
+  659.53 256.10 m
+  662.23 258.80 l
+  664.93 256.10 l
+  662.23 253.40 l
+h f
+  664.04 251.74 m
+  666.74 254.44 l
+  669.44 251.74 l
+  666.74 249.04 l
+h f
+  161.52 261.10 m
+  164.22 263.80 l
+  166.92 261.10 l
+  164.22 258.40 l
+h f
+  654.97 251.41 m
+  657.67 254.11 l
+  660.37 251.41 l
+  657.67 248.71 l
+h f
+  653.44 251.96 m
+  656.14 254.66 l
+  658.84 251.96 l
+  656.14 249.26 l
+h f
+  681.58 265.53 m
+  684.28 268.23 l
+  686.98 265.53 l
+  684.28 262.83 l
+h f
+  654.97 251.99 m
+  657.67 254.69 l
+  660.37 251.99 l
+  657.67 249.29 l
+h f
+  659.53 251.78 m
+  662.23 254.48 l
+  664.93 251.78 l
+  662.23 249.08 l
+h f
+  648.82 252.85 m
+  651.52 255.55 l
+  654.22 252.85 l
+  651.52 250.15 l
+h f
+  170.56 259.22 m
+  173.26 261.92 l
+  175.96 259.22 l
+  173.26 256.52 l
+h f
+  662.54 257.02 m
+  665.24 259.72 l
+  667.94 257.02 l
+  665.24 254.32 l
+h f
+  662.54 259.13 m
+  665.24 261.83 l
+  667.94 259.13 l
+  665.24 256.43 l
+h f
+  678.71 259.77 m
+  681.41 262.47 l
+  684.11 259.77 l
+  681.41 257.07 l
+h f
+  252.92 263.33 m
+  255.62 266.03 l
+  258.32 263.33 l
+  255.62 260.63 l
+h f
+  661.04 254.11 m
+  663.74 256.81 l
+  666.44 254.11 l
+  663.74 251.41 l
+h f
+  158.89 265.38 m
+  161.59 268.08 l
+  164.29 265.38 l
+  161.59 262.68 l
+h f
+  659.53 252.56 m
+  662.23 255.26 l
+  664.93 252.56 l
+  662.23 249.86 l
+h f
+  503.76 252.52 m
+  506.46 255.22 l
+  509.16 252.52 l
+  506.46 249.82 l
+h f
+  647.27 259.46 m
+  649.97 262.16 l
+  652.67 259.46 l
+  649.97 256.76 l
+h f
+  659.53 253.39 m
+  662.23 256.09 l
+  664.93 253.39 l
+  662.23 250.69 l
+h f
+  653.44 254.16 m
+  656.14 256.86 l
+  658.84 254.16 l
+  656.14 251.46 l
+h f
+  687.24 249.71 m
+  689.94 252.41 l
+  692.64 249.71 l
+  689.94 247.01 l
+h f
+  161.52 264.35 m
+  164.22 267.05 l
+  166.92 264.35 l
+  164.22 261.65 l
+h f
+  648.82 250.45 m
+  651.52 253.15 l
+  654.22 250.45 l
+  651.52 247.75 l
+h f
+  684.42 261.72 m
+  687.12 264.42 l
+  689.82 261.72 l
+  687.12 259.02 l
+h f
+  659.53 256.34 m
+  662.23 259.04 l
+  664.93 256.34 l
+  662.23 253.64 l
+h f
+  262.84 262.20 m
+  265.54 264.90 l
+  268.24 262.20 l
+  265.54 259.50 l
+h f
+  658.02 264.06 m
+  660.72 266.76 l
+  663.42 264.06 l
+  660.72 261.36 l
+h f
+  661.04 260.95 m
+  663.74 263.65 l
+  666.44 260.95 l
+  663.74 258.25 l
+h f
+  659.53 259.88 m
+  662.23 262.58 l
+  664.93 259.88 l
+  662.23 257.18 l
+h f
+  648.82 263.88 m
+  651.52 266.58 l
+  654.22 263.88 l
+  651.52 261.18 l
+h f
+  650.37 261.51 m
+  653.07 264.21 l
+  655.77 261.51 l
+  653.07 258.81 l
+h f
+  685.83 255.51 m
+  688.53 258.21 l
+  691.23 255.51 l
+  688.53 252.81 l
+h f
+  662.54 251.93 m
+  665.24 254.63 l
+  667.94 251.93 l
+  665.24 249.23 l
+h f
+  647.27 253.07 m
+  649.97 255.77 l
+  652.67 253.07 l
+  649.97 250.37 l
+h f
+  667.02 260.72 m
+  669.72 263.42 l
+  672.42 260.72 l
+  669.72 258.02 l
+h f
+  465.30 251.56 m
+  468.00 254.26 l
+  470.70 251.56 l
+  468.00 248.86 l
+h f
+  571.66 258.84 m
+  574.36 261.54 l
+  577.06 258.84 l
+  574.36 256.14 l
+h f
+  242.12 257.16 m
+  244.82 259.86 l
+  247.52 257.16 l
+  244.82 254.46 l
+h f
+  641.24 262.68 m
+  643.94 265.38 l
+  646.64 262.68 l
+  643.94 259.98 l
+h f
+  640.23 250.55 m
+  642.93 253.25 l
+  645.63 250.55 l
+  642.93 247.85 l
+h f
+  447.25 256.49 m
+  449.95 259.19 l
+  452.65 256.49 l
+  449.95 253.79 l
+h f
+  142.91 265.52 m
+  145.61 268.22 l
+  148.31 265.52 l
+  145.61 262.82 l
+h f
+  639.66 251.52 m
+  642.36 254.22 l
+  645.06 251.52 l
+  642.36 248.82 l
+h f
+  655.57 265.19 m
+  658.27 267.89 l
+  660.97 265.19 l
+  658.27 262.49 l
+h f
+  654.11 260.15 m
+  656.81 262.85 l
+  659.51 260.15 l
+  656.81 257.45 l
+h f
+  590.30 255.69 m
+  593.00 258.39 l
+  595.70 255.69 l
+  593.00 252.99 l
+h f
+  671.89 254.30 m
+  674.59 257.00 l
+  677.29 254.30 l
+  674.59 251.60 l
+h f
+  656.58 265.15 m
+  659.28 267.85 l
+  661.98 265.15 l
+  659.28 262.45 l
+h f
+  658.10 258.19 m
+  660.80 260.89 l
+  663.50 258.19 l
+  660.80 255.49 l
+h f
+  98.66 263.38 m
+  101.36 266.08 l
+  104.06 263.38 l
+  101.36 260.68 l
+h f
+  143.25 258.83 m
+  145.95 261.53 l
+  148.65 258.83 l
+  145.95 256.13 l
+h f
+  507.23 264.96 m
+  509.93 267.66 l
+  512.63 264.96 l
+  509.93 262.26 l
+h f
+  591.94 258.57 m
+  594.64 261.27 l
+  597.34 258.57 l
+  594.64 255.87 l
+h f
+  500.00 262.77 m
+  502.70 265.47 l
+  505.40 262.77 l
+  502.70 260.07 l
+h f
+  184.18 250.08 m
+  186.88 252.78 l
+  189.58 250.08 l
+  186.88 247.38 l
+h f
+  617.95 249.91 m
+  620.65 252.61 l
+  623.35 249.91 l
+  620.65 247.21 l
+h f
+  638.20 261.31 m
+  640.90 264.01 l
+  643.60 261.31 l
+  640.90 258.61 l
+h f
+  676.01 257.62 m
+  678.71 260.32 l
+  681.41 257.62 l
+  678.71 254.92 l
+h f
+  510.67 255.39 m
+  513.37 258.09 l
+  516.07 255.39 l
+  513.37 252.69 l
+h f
+  441.58 262.45 m
+  444.28 265.15 l
+  446.98 262.45 l
+  444.28 259.75 l
+h f
+  498.24 263.39 m
+  500.94 266.09 l
+  503.64 263.39 l
+  500.94 260.69 l
+h f
+  684.07 250.55 m
+  686.77 253.25 l
+  689.47 250.55 l
+  686.77 247.85 l
+h f
+  118.14 251.69 m
+  120.84 254.39 l
+  123.54 251.69 l
+  120.84 248.99 l
+h f
+  639.70 262.82 m
+  642.40 265.52 l
+  645.10 262.82 l
+  642.40 260.12 l
+h f
+  540.12 258.46 m
+  542.82 261.16 l
+  545.52 258.46 l
+  542.82 255.76 l
+h f
+  172.10 264.56 m
+  174.80 267.26 l
+  177.50 264.56 l
+  174.80 261.86 l
+h f
+  561.05 262.29 m
+  563.75 264.99 l
+  566.45 262.29 l
+  563.75 259.59 l
+h f
+  488.49 261.61 m
+  491.19 264.31 l
+  493.89 261.61 l
+  491.19 258.91 l
+h f
+  628.86 257.63 m
+  631.56 260.33 l
+  634.26 257.63 l
+  631.56 254.93 l
+h f
+  677.46 257.67 m
+  680.16 260.37 l
+  682.86 257.67 l
+  680.16 254.97 l
+h f
+  177.72 265.65 m
+  180.42 268.35 l
+  183.12 265.65 l
+  180.42 262.95 l
+h f
+  647.48 259.47 m
+  650.18 262.17 l
+  652.88 259.47 l
+  650.18 256.77 l
+h f
+  675.56 265.00 m
+  678.26 267.70 l
+  680.96 265.00 l
+  678.26 262.30 l
+h f
+  661.41 263.30 m
+  664.11 266.00 l
+  666.81 263.30 l
+  664.11 260.60 l
+h f
+  526.25 261.52 m
+  528.95 264.22 l
+  531.65 261.52 l
+  528.95 258.82 l
+h f
+  616.17 264.67 m
+  618.87 267.37 l
+  621.57 264.67 l
+  618.87 261.97 l
+h f
+  689.97 259.80 m
+  692.67 262.50 l
+  695.37 259.80 l
+  692.67 257.10 l
+h f
+  501.24 252.95 m
+  503.94 255.65 l
+  506.64 252.95 l
+  503.94 250.25 l
+h f
+  646.54 262.27 m
+  649.24 264.97 l
+  651.94 262.27 l
+  649.24 259.57 l
+h f
+  607.16 256.71 m
+  609.86 259.41 l
+  612.56 256.71 l
+  609.86 254.01 l
+h f
+  558.26 251.57 m
+  560.96 254.27 l
+  563.66 251.57 l
+  560.96 248.87 l
+h f
+  526.16 250.38 m
+  528.86 253.08 l
+  531.56 250.38 l
+  528.86 247.68 l
+h f
+  679.87 259.39 m
+  682.57 262.09 l
+  685.27 259.39 l
+  682.57 256.69 l
+h f
+  604.18 263.42 m
+  606.88 266.12 l
+  609.58 263.42 l
+  606.88 260.72 l
+h f
+  683.67 255.17 m
+  686.37 257.87 l
+  689.07 255.17 l
+  686.37 252.47 l
+h f
+  676.53 259.20 m
+  679.23 261.90 l
+  681.93 259.20 l
+  679.23 256.50 l
+h f
+  665.18 263.81 m
+  667.88 266.51 l
+  670.58 263.81 l
+  667.88 261.11 l
+h f
+  600.89 263.64 m
+  603.59 266.34 l
+  606.29 263.64 l
+  603.59 260.94 l
+h f
+  371.61 259.85 m
+  374.31 262.55 l
+  377.01 259.85 l
+  374.31 257.15 l
+h f
+  589.99 258.12 m
+  592.69 260.82 l
+  595.39 258.12 l
+  592.69 255.42 l
+h f
+  181.80 263.53 m
+  184.50 266.23 l
+  187.20 263.53 l
+  184.50 260.83 l
+h f
+  153.98 255.73 m
+  156.68 258.43 l
+  159.38 255.73 l
+  156.68 253.03 l
+h f
+  587.09 251.99 m
+  589.79 254.69 l
+  592.49 251.99 l
+  589.79 249.29 l
+h f
+  530.22 258.82 m
+  532.92 261.52 l
+  535.62 258.82 l
+  532.92 256.12 l
+h f
+  630.08 251.18 m
+  632.78 253.88 l
+  635.48 251.18 l
+  632.78 248.48 l
+h f
+  686.33 253.45 m
+  689.03 256.15 l
+  691.73 253.45 l
+  689.03 250.75 l
+h f
+  439.57 261.65 m
+  442.27 264.35 l
+  444.97 261.65 l
+  442.27 258.95 l
+h f
+  187.62 257.85 m
+  190.32 260.55 l
+  193.02 257.85 l
+  190.32 255.15 l
+h f
+  658.63 260.08 m
+  661.33 262.78 l
+  664.03 260.08 l
+  661.33 257.38 l
+h f
+  376.79 253.19 m
+  379.49 255.89 l
+  382.19 253.19 l
+  379.49 250.49 l
+h f
+  192.67 251.25 m
+  195.37 253.95 l
+  198.07 251.25 l
+  195.37 248.55 l
+h f
+  159.22 263.54 m
+  161.92 266.24 l
+  164.62 263.54 l
+  161.92 260.84 l
+h f
+  339.81 254.43 m
+  342.51 257.13 l
+  345.21 254.43 l
+  342.51 251.73 l
+h f
+  345.41 261.44 m
+  348.11 264.14 l
+  350.81 261.44 l
+  348.11 258.74 l
+h f
+  193.80 261.87 m
+  196.50 264.57 l
+  199.20 261.87 l
+  196.50 259.17 l
+h f
+  472.67 263.20 m
+  475.37 265.90 l
+  478.07 263.20 l
+  475.37 260.50 l
+h f
+  518.37 264.28 m
+  521.07 266.98 l
+  523.77 264.28 l
+  521.07 261.58 l
+h f
+  582.11 262.07 m
+  584.81 264.77 l
+  587.51 262.07 l
+  584.81 259.37 l
+h f
+0.745 0.745 0.745 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+705.56 332.19 m
+707.47 334.10 l
+709.38 332.19 l
+707.47 330.28 l
+705.56 332.19 l
+S
+704.55 321.14 m
+706.46 323.05 l
+708.37 321.14 l
+706.46 319.24 l
+704.55 321.14 l
+S
+737.95 328.02 m
+739.85 329.93 l
+741.76 328.02 l
+739.85 326.11 l
+737.95 328.02 l
+S
+  436.39 183.32 m
+  439.09 186.02 l
+  441.79 183.32 l
+  439.09 180.62 l
+h f
+  462.78 195.55 m
+  465.48 198.25 l
+  468.18 195.55 l
+  465.48 192.85 l
+h f
+  680.72 183.77 m
+  683.42 186.47 l
+  686.12 183.77 l
+  683.42 181.07 l
+h f
+  601.39 183.46 m
+  604.09 186.16 l
+  606.79 183.46 l
+  604.09 180.76 l
+h f
+  217.38 192.57 m
+  220.08 195.27 l
+  222.78 192.57 l
+  220.08 189.87 l
+h f
+  285.77 190.21 m
+  288.47 192.91 l
+  291.17 190.21 l
+  288.47 187.51 l
+h f
+  161.38 181.26 m
+  164.08 183.96 l
+  166.78 181.26 l
+  164.08 178.56 l
+h f
+  496.46 184.61 m
+  499.16 187.31 l
+  501.86 184.61 l
+  499.16 181.91 l
+h f
+  418.49 195.90 m
+  421.19 198.60 l
+  423.89 195.90 l
+  421.19 193.20 l
+h f
+  250.17 188.60 m
+  252.87 191.30 l
+  255.57 188.60 l
+  252.87 185.90 l
+h f
+  164.50 183.96 m
+  167.20 186.66 l
+  169.90 183.96 l
+  167.20 181.26 l
+h f
+  431.42 189.36 m
+  434.12 192.06 l
+  436.82 189.36 l
+  434.12 186.66 l
+h f
+  98.75 196.77 m
+  101.45 199.47 l
+  104.15 196.77 l
+  101.45 194.07 l
+h f
+  426.78 196.08 m
+  429.48 198.78 l
+  432.18 196.08 l
+  429.48 193.38 l
+h f
+  567.45 195.82 m
+  570.15 198.52 l
+  572.85 195.82 l
+  570.15 193.12 l
+h f
+  424.76 188.20 m
+  427.46 190.90 l
+  430.16 188.20 l
+  427.46 185.50 l
+h f
+  176.27 194.34 m
+  178.97 197.04 l
+  181.67 194.34 l
+  178.97 191.64 l
+h f
+  271.65 189.90 m
+  274.35 192.60 l
+  277.05 189.90 l
+  274.35 187.20 l
+h f
+  484.29 186.59 m
+  486.99 189.29 l
+  489.69 186.59 l
+  486.99 183.89 l
+h f
+  143.80 183.89 m
+  146.50 186.59 l
+  149.20 183.89 l
+  146.50 181.19 l
+h f
+  220.94 196.31 m
+  223.64 199.01 l
+  226.34 196.31 l
+  223.64 193.61 l
+h f
+  163.87 191.06 m
+  166.57 193.76 l
+  169.27 191.06 l
+  166.57 188.36 l
+h f
+  182.74 187.23 m
+  185.44 189.93 l
+  188.14 187.23 l
+  185.44 184.53 l
+h f
+  304.83 186.11 m
+  307.53 188.81 l
+  310.23 186.11 l
+  307.53 183.41 l
+h f
+  161.32 189.09 m
+  164.02 191.79 l
+  166.72 189.09 l
+  164.02 186.39 l
+h f
+  167.39 187.84 m
+  170.09 190.54 l
+  172.79 187.84 l
+  170.09 185.14 l
+h f
+  392.18 183.97 m
+  394.88 186.67 l
+  397.58 183.97 l
+  394.88 181.27 l
+h f
+  170.16 189.41 m
+  172.86 192.11 l
+  175.56 189.41 l
+  172.86 186.71 l
+h f
+  441.99 194.47 m
+  444.69 197.17 l
+  447.39 194.47 l
+  444.69 191.77 l
+h f
+  416.82 184.12 m
+  419.52 186.82 l
+  422.22 184.12 l
+  419.52 181.42 l
+h f
+  494.48 195.45 m
+  497.18 198.15 l
+  499.88 195.45 l
+  497.18 192.75 l
+h f
+  481.84 184.08 m
+  484.54 186.78 l
+  487.24 184.08 l
+  484.54 181.38 l
+h f
+  162.73 184.17 m
+  165.43 186.87 l
+  168.13 184.17 l
+  165.43 181.47 l
+h f
+  160.91 194.75 m
+  163.61 197.45 l
+  166.31 194.75 l
+  163.61 192.05 l
+h f
+  625.95 184.75 m
+  628.65 187.45 l
+  631.35 184.75 l
+  628.65 182.05 l
+h f
+  200.82 184.72 m
+  203.52 187.42 l
+  206.22 184.72 l
+  203.52 182.02 l
+h f
+  684.46 191.52 m
+  687.16 194.22 l
+  689.86 191.52 l
+  687.16 188.82 l
+h f
+  176.95 182.98 m
+  179.65 185.68 l
+  182.35 182.98 l
+  179.65 180.28 l
+h f
+  170.87 180.34 m
+  173.57 183.04 l
+  176.27 180.34 l
+  173.57 177.64 l
+h f
+  170.77 195.28 m
+  173.47 197.98 l
+  176.17 195.28 l
+  173.47 192.58 l
+h f
+  609.46 194.10 m
+  612.16 196.80 l
+  614.86 194.10 l
+  612.16 191.40 l
+h f
+  244.41 184.37 m
+  247.11 187.07 l
+  249.81 184.37 l
+  247.11 181.67 l
+h f
+  160.66 184.85 m
+  163.36 187.55 l
+  166.06 184.85 l
+  163.36 182.15 l
+h f
+  664.88 191.52 m
+  667.58 194.22 l
+  670.28 191.52 l
+  667.58 188.82 l
+h f
+  174.64 188.52 m
+  177.34 191.22 l
+  180.04 188.52 l
+  177.34 185.82 l
+h f
+  159.85 190.87 m
+  162.55 193.57 l
+  165.25 190.87 l
+  162.55 188.17 l
+h f
+  163.55 190.27 m
+  166.25 192.97 l
+  168.95 190.27 l
+  166.25 187.57 l
+h f
+  205.69 184.98 m
+  208.39 187.68 l
+  211.09 184.98 l
+  208.39 182.28 l
+h f
+  166.46 191.13 m
+  169.16 193.83 l
+  171.86 191.13 l
+  169.16 188.43 l
+h f
+  191.76 184.41 m
+  194.46 187.11 l
+  197.16 184.41 l
+  194.46 181.71 l
+h f
+  117.61 189.73 m
+  120.31 192.43 l
+  123.01 189.73 l
+  120.31 187.03 l
+h f
+  168.32 188.99 m
+  171.02 191.69 l
+  173.72 188.99 l
+  171.02 186.29 l
+h f
+  656.57 194.59 m
+  659.27 197.29 l
+  661.97 194.59 l
+  659.27 191.89 l
+h f
+  666.97 191.81 m
+  669.67 194.51 l
+  672.37 191.81 l
+  669.67 189.11 l
+h f
+  607.01 188.33 m
+  609.71 191.03 l
+  612.41 188.33 l
+  609.71 185.63 l
+h f
+  164.33 182.08 m
+  167.03 184.78 l
+  169.73 182.08 l
+  167.03 179.38 l
+h f
+  176.44 187.54 m
+  179.14 190.24 l
+  181.84 187.54 l
+  179.14 184.84 l
+h f
+  261.80 191.44 m
+  264.50 194.14 l
+  267.20 191.44 l
+  264.50 188.74 l
+h f
+  166.51 191.37 m
+  169.21 194.07 l
+  171.91 191.37 l
+  169.21 188.67 l
+h f
+  164.18 187.87 m
+  166.88 190.57 l
+  169.58 187.87 l
+  166.88 185.17 l
+h f
+  652.03 192.84 m
+  654.73 195.54 l
+  657.43 192.84 l
+  654.73 190.14 l
+h f
+  164.71 191.13 m
+  167.41 193.83 l
+  170.11 191.13 l
+  167.41 188.43 l
+h f
+  639.04 184.65 m
+  641.74 187.35 l
+  644.44 184.65 l
+  641.74 181.95 l
+h f
+  159.62 194.47 m
+  162.32 197.17 l
+  165.02 194.47 l
+  162.32 191.77 l
+h f
+  162.53 180.79 m
+  165.23 183.49 l
+  167.93 180.79 l
+  165.23 178.09 l
+h f
+  163.15 188.91 m
+  165.85 191.61 l
+  168.55 188.91 l
+  165.85 186.21 l
+h f
+  226.03 180.36 m
+  228.73 183.06 l
+  231.43 180.36 l
+  228.73 177.66 l
+h f
+  648.58 181.50 m
+  651.28 184.20 l
+  653.98 181.50 l
+  651.28 178.80 l
+h f
+  256.84 185.02 m
+  259.54 187.72 l
+  262.24 185.02 l
+  259.54 182.32 l
+h f
+  674.61 183.07 m
+  677.31 185.77 l
+  680.01 183.07 l
+  677.31 180.37 l
+h f
+  643.06 189.39 m
+  645.76 192.09 l
+  648.46 189.39 l
+  645.76 186.69 l
+h f
+  162.87 183.15 m
+  165.57 185.85 l
+  168.27 183.15 l
+  165.57 180.45 l
+h f
+  662.03 186.48 m
+  664.73 189.18 l
+  667.43 186.48 l
+  664.73 183.78 l
+h f
+  234.87 182.31 m
+  237.57 185.01 l
+  240.27 182.31 l
+  237.57 179.61 l
+h f
+  165.64 182.67 m
+  168.34 185.37 l
+  171.04 182.67 l
+  168.34 179.97 l
+h f
+  182.29 181.69 m
+  184.99 184.39 l
+  187.69 181.69 l
+  184.99 178.99 l
+h f
+  160.54 196.69 m
+  163.24 199.39 l
+  165.94 196.69 l
+  163.24 193.99 l
+h f
+  163.03 186.45 m
+  165.73 189.15 l
+  168.43 186.45 l
+  165.73 183.75 l
+h f
+  160.23 196.50 m
+  162.93 199.20 l
+  165.63 196.50 l
+  162.93 193.80 l
+h f
+  167.47 192.67 m
+  170.17 195.37 l
+  172.87 192.67 l
+  170.17 189.97 l
+h f
+  446.24 193.10 m
+  448.94 195.80 l
+  451.64 193.10 l
+  448.94 190.40 l
+h f
+  656.82 192.03 m
+  659.52 194.73 l
+  662.22 192.03 l
+  659.52 189.33 l
+h f
+  159.66 181.40 m
+  162.36 184.10 l
+  165.06 181.40 l
+  162.36 178.70 l
+h f
+  167.85 186.54 m
+  170.55 189.24 l
+  173.25 186.54 l
+  170.55 183.84 l
+h f
+  175.70 182.54 m
+  178.40 185.24 l
+  181.10 182.54 l
+  178.40 179.84 l
+h f
+  253.78 188.22 m
+  256.48 190.92 l
+  259.18 188.22 l
+  256.48 185.52 l
+h f
+  678.55 185.84 m
+  681.25 188.54 l
+  683.95 185.84 l
+  681.25 183.14 l
+h f
+  252.35 181.70 m
+  255.05 184.40 l
+  257.75 181.70 l
+  255.05 179.00 l
+h f
+  654.56 183.43 m
+  657.26 186.13 l
+  659.96 183.43 l
+  657.26 180.73 l
+h f
+  166.59 190.75 m
+  169.29 193.45 l
+  171.99 190.75 l
+  169.29 188.05 l
+h f
+  649.79 186.66 m
+  652.49 189.36 l
+  655.19 186.66 l
+  652.49 183.96 l
+h f
+  636.71 186.48 m
+  639.41 189.18 l
+  642.11 186.48 l
+  639.41 183.78 l
+h f
+  470.45 196.36 m
+  473.15 199.06 l
+  475.85 196.36 l
+  473.15 193.66 l
+h f
+  251.69 196.24 m
+  254.39 198.94 l
+  257.09 196.24 l
+  254.39 193.54 l
+h f
+  249.28 186.73 m
+  251.98 189.43 l
+  254.68 186.73 l
+  251.98 184.03 l
+h f
+  251.69 194.42 m
+  254.39 197.12 l
+  257.09 194.42 l
+  254.39 191.72 l
+h f
+  153.94 187.67 m
+  156.64 190.37 l
+  159.34 187.67 l
+  156.64 184.97 l
+h f
+  158.61 189.89 m
+  161.31 192.59 l
+  164.01 189.89 l
+  161.31 187.19 l
+h f
+  645.32 185.47 m
+  648.02 188.17 l
+  650.72 185.47 l
+  648.02 182.77 l
+h f
+  651.68 190.64 m
+  654.38 193.34 l
+  657.08 190.64 l
+  654.38 187.94 l
+h f
+  433.71 187.59 m
+  436.41 190.29 l
+  439.11 187.59 l
+  436.41 184.89 l
+h f
+  244.29 184.22 m
+  246.99 186.92 l
+  249.69 184.22 l
+  246.99 181.52 l
+h f
+  246.87 185.02 m
+  249.57 187.72 l
+  252.27 185.02 l
+  249.57 182.32 l
+h f
+  650.18 195.57 m
+  652.88 198.27 l
+  655.58 195.57 l
+  652.88 192.87 l
+h f
+  159.54 188.65 m
+  162.24 191.35 l
+  164.94 188.65 l
+  162.24 185.95 l
+h f
+  648.44 186.59 m
+  651.14 189.29 l
+  653.84 186.59 l
+  651.14 183.89 l
+h f
+  657.02 184.36 m
+  659.72 187.06 l
+  662.42 184.36 l
+  659.72 181.66 l
+h f
+  240.10 185.54 m
+  242.80 188.24 l
+  245.50 185.54 l
+  242.80 182.84 l
+h f
+  171.23 187.46 m
+  173.93 190.16 l
+  176.63 187.46 l
+  173.93 184.76 l
+h f
+  163.07 186.19 m
+  165.77 188.89 l
+  168.47 186.19 l
+  165.77 183.49 l
+h f
+  639.22 191.27 m
+  641.92 193.97 l
+  644.62 191.27 l
+  641.92 188.57 l
+h f
+  646.08 188.93 m
+  648.78 191.63 l
+  651.48 188.93 l
+  648.78 186.23 l
+h f
+  646.15 187.08 m
+  648.85 189.78 l
+  651.55 187.08 l
+  648.85 184.38 l
+h f
+  504.25 192.55 m
+  506.95 195.25 l
+  509.65 192.55 l
+  506.95 189.85 l
+h f
+  240.22 189.82 m
+  242.92 192.52 l
+  245.62 189.82 l
+  242.92 187.12 l
+h f
+  267.73 184.84 m
+  270.43 187.54 l
+  273.13 184.84 l
+  270.43 182.14 l
+h f
+  360.69 192.94 m
+  363.39 195.64 l
+  366.09 192.94 l
+  363.39 190.24 l
+h f
+  141.91 185.69 m
+  144.61 188.39 l
+  147.31 185.69 l
+  144.61 182.99 l
+h f
+  649.82 187.78 m
+  652.52 190.48 l
+  655.22 187.78 l
+  652.52 185.08 l
+h f
+  223.28 190.20 m
+  225.98 192.90 l
+  228.68 190.20 l
+  225.98 187.50 l
+h f
+  622.60 188.86 m
+  625.30 191.56 l
+  628.00 188.86 l
+  625.30 186.16 l
+h f
+  456.97 187.69 m
+  459.67 190.39 l
+  462.37 187.69 l
+  459.67 184.99 l
+h f
+  625.64 184.48 m
+  628.34 187.18 l
+  631.04 184.48 l
+  628.34 181.78 l
+h f
+  231.41 185.73 m
+  234.11 188.43 l
+  236.81 185.73 l
+  234.11 183.03 l
+h f
+  629.18 196.59 m
+  631.88 199.29 l
+  634.58 196.59 l
+  631.88 193.89 l
+h f
+  629.51 185.16 m
+  632.21 187.86 l
+  634.91 185.16 l
+  632.21 182.46 l
+h f
+  241.66 188.79 m
+  244.36 191.49 l
+  247.06 188.79 l
+  244.36 186.09 l
+h f
+  235.38 182.20 m
+  238.08 184.90 l
+  240.78 182.20 l
+  238.08 179.50 l
+h f
+  631.85 186.49 m
+  634.55 189.19 l
+  637.25 186.49 l
+  634.55 183.79 l
+h f
+  176.04 190.95 m
+  178.74 193.65 l
+  181.44 190.95 l
+  178.74 188.25 l
+h f
+  238.25 185.34 m
+  240.95 188.04 l
+  243.65 185.34 l
+  240.95 182.64 l
+h f
+  651.10 193.90 m
+  653.80 196.60 l
+  656.50 193.90 l
+  653.80 191.20 l
+h f
+  532.15 182.22 m
+  534.85 184.92 l
+  537.55 182.22 l
+  534.85 179.52 l
+h f
+  645.61 189.33 m
+  648.31 192.03 l
+  651.01 189.33 l
+  648.31 186.63 l
+h f
+  671.76 186.61 m
+  674.46 189.31 l
+  677.16 186.61 l
+  674.46 183.91 l
+h f
+  241.86 192.01 m
+  244.56 194.71 l
+  247.26 192.01 l
+  244.56 189.31 l
+h f
+  169.56 187.69 m
+  172.26 190.39 l
+  174.96 187.69 l
+  172.26 184.99 l
+h f
+  163.92 190.36 m
+  166.62 193.06 l
+  169.32 190.36 l
+  166.62 187.66 l
+h f
+  244.56 184.50 m
+  247.26 187.20 l
+  249.96 184.50 l
+  247.26 181.80 l
+h f
+  648.82 187.10 m
+  651.52 189.80 l
+  654.22 187.10 l
+  651.52 184.40 l
+h f
+  520.05 188.52 m
+  522.75 191.22 l
+  525.45 188.52 l
+  522.75 185.82 l
+h f
+  645.71 185.62 m
+  648.41 188.32 l
+  651.11 185.62 l
+  648.41 182.92 l
+h f
+  162.18 180.81 m
+  164.88 183.51 l
+  167.58 180.81 l
+  164.88 178.11 l
+h f
+  651.91 183.64 m
+  654.61 186.34 l
+  657.31 183.64 l
+  654.61 180.94 l
+h f
+  651.91 188.14 m
+  654.61 190.84 l
+  657.31 188.14 l
+  654.61 185.44 l
+h f
+  648.82 186.71 m
+  651.52 189.41 l
+  654.22 186.71 l
+  651.52 184.01 l
+h f
+  530.87 186.72 m
+  533.57 189.42 l
+  536.27 186.72 l
+  533.57 184.02 l
+h f
+  647.27 188.20 m
+  649.97 190.90 l
+  652.67 188.20 l
+  649.97 185.50 l
+h f
+  169.08 186.16 m
+  171.78 188.86 l
+  174.48 186.16 l
+  171.78 183.46 l
+h f
+  509.20 180.81 m
+  511.90 183.51 l
+  514.60 180.81 l
+  511.90 178.11 l
+h f
+  653.44 189.26 m
+  656.14 191.96 l
+  658.84 189.26 l
+  656.14 186.56 l
+h f
+  157.61 192.32 m
+  160.31 195.02 l
+  163.01 192.32 l
+  160.31 189.62 l
+h f
+  262.84 191.29 m
+  265.54 193.99 l
+  268.24 191.29 l
+  265.54 188.59 l
+h f
+  248.10 187.84 m
+  250.80 190.54 l
+  253.50 187.84 l
+  250.80 185.14 l
+h f
+  651.91 196.30 m
+  654.61 199.00 l
+  657.31 196.30 l
+  654.61 193.60 l
+h f
+  702.32 182.18 m
+  705.02 184.88 l
+  707.72 182.18 l
+  705.02 179.48 l
+h f
+  650.37 188.46 m
+  653.07 191.16 l
+  655.77 188.46 l
+  653.07 185.76 l
+h f
+  648.82 181.83 m
+  651.52 184.53 l
+  654.22 181.83 l
+  651.52 179.13 l
+h f
+  647.27 185.56 m
+  649.97 188.26 l
+  652.67 185.56 l
+  649.97 182.86 l
+h f
+  118.19 194.14 m
+  120.89 196.84 l
+  123.59 194.14 l
+  120.89 191.44 l
+h f
+  182.05 185.23 m
+  184.75 187.93 l
+  187.45 185.23 l
+  184.75 182.53 l
+h f
+  647.27 183.71 m
+  649.97 186.41 l
+  652.67 183.71 l
+  649.97 181.01 l
+h f
+  662.54 196.25 m
+  665.24 198.95 l
+  667.94 196.25 l
+  665.24 193.55 l
+h f
+  677.27 183.69 m
+  679.97 186.39 l
+  682.67 183.69 l
+  679.97 180.99 l
+h f
+  647.27 188.01 m
+  649.97 190.71 l
+  652.67 188.01 l
+  649.97 185.31 l
+h f
+  183.67 195.58 m
+  186.37 198.28 l
+  189.07 195.58 l
+  186.37 192.88 l
+h f
+  158.89 187.28 m
+  161.59 189.98 l
+  164.29 187.28 l
+  161.59 184.58 l
+h f
+  645.71 186.51 m
+  648.41 189.21 l
+  651.11 186.51 l
+  648.41 183.81 l
+h f
+  160.20 184.51 m
+  162.90 187.21 l
+  165.60 184.51 l
+  162.90 181.81 l
+h f
+  530.87 180.46 m
+  533.57 183.16 l
+  536.27 180.46 l
+  533.57 177.76 l
+h f
+  173.51 186.55 m
+  176.21 189.25 l
+  178.91 186.55 l
+  176.21 183.85 l
+h f
+  648.82 180.31 m
+  651.52 183.01 l
+  654.22 180.31 l
+  651.52 177.61 l
+h f
+  699.63 184.43 m
+  702.33 187.13 l
+  705.03 184.43 l
+  702.33 181.73 l
+h f
+  672.91 184.02 m
+  675.61 186.72 l
+  678.31 184.02 l
+  675.61 181.32 l
+h f
+  244.56 186.25 m
+  247.26 188.95 l
+  249.96 186.25 l
+  247.26 183.55 l
+h f
+  696.92 187.57 m
+  699.62 190.27 l
+  702.32 187.57 l
+  699.62 184.87 l
+h f
+  518.25 185.36 m
+  520.95 188.06 l
+  523.65 185.36 l
+  520.95 182.66 l
+h f
+  662.54 183.08 m
+  665.24 185.78 l
+  667.94 183.08 l
+  665.24 180.38 l
+h f
+  161.52 188.93 m
+  164.22 191.63 l
+  166.92 188.93 l
+  164.22 186.23 l
+h f
+  162.82 191.65 m
+  165.52 194.35 l
+  168.22 191.65 l
+  165.52 188.95 l
+h f
+  158.89 190.25 m
+  161.59 192.95 l
+  164.29 190.25 l
+  161.59 187.55 l
+h f
+  505.57 193.67 m
+  508.27 196.37 l
+  510.97 193.67 l
+  508.27 190.97 l
+h f
+105.13 126.82 m
+107.04 128.73 l
+108.95 126.82 l
+107.04 124.91 l
+105.13 126.82 l
+S
+95.26 112.43 m
+97.17 114.34 l
+99.08 112.43 l
+97.17 110.52 l
+95.26 112.43 l
+S
+92.95 121.77 m
+94.86 123.68 l
+96.77 121.77 l
+94.86 119.86 l
+92.95 121.77 l
+S
+99.60 119.61 m
+101.51 121.52 l
+103.41 119.61 l
+101.51 117.70 l
+99.60 119.61 l
+S
+99.85 114.37 m
+101.76 116.28 l
+103.66 114.37 l
+101.76 112.47 l
+99.85 114.37 l
+S
+138.03 125.25 m
+139.93 127.16 l
+141.84 125.25 l
+139.93 123.34 l
+138.03 125.25 l
+S
+104.25 111.64 m
+106.16 113.55 l
+108.07 111.64 l
+106.16 109.73 l
+104.25 111.64 l
+S
+117.88 112.60 m
+119.79 114.51 l
+121.70 112.60 l
+119.79 110.69 l
+117.88 112.60 l
+S
+100.25 118.33 m
+102.16 120.24 l
+104.07 118.33 l
+102.16 116.42 l
+100.25 118.33 l
+S
+121.79 124.85 m
+123.70 126.76 l
+125.61 124.85 l
+123.70 122.94 l
+121.79 124.85 l
+S
+104.34 120.97 m
+106.25 122.88 l
+108.16 120.97 l
+106.25 119.06 l
+104.34 120.97 l
+S
+110.11 112.48 m
+112.02 114.39 l
+113.93 112.48 l
+112.02 110.57 l
+110.11 112.48 l
+S
+136.27 112.75 m
+138.18 114.65 l
+140.09 112.75 l
+138.18 110.84 l
+136.27 112.75 l
+S
+109.54 127.39 m
+111.45 129.30 l
+113.36 127.39 l
+111.45 125.48 l
+109.54 127.39 l
+S
+128.68 115.64 m
+130.59 117.55 l
+132.50 115.64 l
+130.59 113.73 l
+128.68 115.64 l
+S
+89.71 124.39 m
+91.62 126.30 l
+93.53 124.39 l
+91.62 122.48 l
+89.71 124.39 l
+S
+94.77 116.55 m
+96.68 118.46 l
+98.59 116.55 l
+96.68 114.64 l
+94.77 116.55 l
+S
+127.22 118.56 m
+129.13 120.47 l
+131.04 118.56 l
+129.13 116.65 l
+127.22 118.56 l
+S
+141.34 120.92 m
+143.25 122.83 l
+145.16 120.92 l
+143.25 119.01 l
+141.34 120.92 l
+S
+105.20 116.59 m
+107.10 118.50 l
+109.01 116.59 l
+107.10 114.69 l
+105.20 116.59 l
+S
+106.46 121.36 m
+108.37 123.27 l
+110.28 121.36 l
+108.37 119.45 l
+106.46 121.36 l
+S
+100.96 118.06 m
+102.87 119.97 l
+104.78 118.06 l
+102.87 116.15 l
+100.96 118.06 l
+S
+103.51 126.32 m
+105.42 128.23 l
+107.33 126.32 l
+105.42 124.41 l
+103.51 126.32 l
+S
+92.81 118.22 m
+94.72 120.13 l
+96.63 118.22 l
+94.72 116.32 l
+92.81 118.22 l
+S
+126.85 115.98 m
+128.76 117.89 l
+130.67 115.98 l
+128.76 114.07 l
+126.85 115.98 l
+S
+107.84 118.53 m
+109.75 120.43 l
+111.66 118.53 l
+109.75 116.62 l
+107.84 118.53 l
+S
+104.43 113.34 m
+106.34 115.25 l
+108.25 113.34 l
+106.34 111.43 l
+104.43 113.34 l
+S
+104.29 126.53 m
+106.20 128.44 l
+108.11 126.53 l
+106.20 124.62 l
+104.29 126.53 l
+S
+122.70 124.91 m
+124.61 126.82 l
+126.52 124.91 l
+124.61 123.00 l
+122.70 124.91 l
+S
+110.98 113.03 m
+112.89 114.94 l
+114.80 113.03 l
+112.89 111.12 l
+110.98 113.03 l
+S
+103.77 116.94 m
+105.68 118.85 l
+107.59 116.94 l
+105.68 115.04 l
+103.77 116.94 l
+S
+139.31 120.48 m
+141.22 122.39 l
+143.13 120.48 l
+141.22 118.57 l
+139.31 120.48 l
+S
+117.23 119.96 m
+119.14 121.87 l
+121.05 119.96 l
+119.14 118.05 l
+117.23 119.96 l
+S
+98.23 113.40 m
+100.14 115.31 l
+102.05 113.40 l
+100.14 111.49 l
+98.23 113.40 l
+S
+119.19 125.75 m
+121.10 127.66 l
+123.01 125.75 l
+121.10 123.84 l
+119.19 125.75 l
+S
+150.55 119.42 m
+152.46 121.33 l
+154.37 119.42 l
+152.46 117.51 l
+150.55 119.42 l
+S
+92.68 122.70 m
+94.59 124.61 l
+96.50 122.70 l
+94.59 120.79 l
+92.68 122.70 l
+S
+88.64 113.01 m
+90.55 114.92 l
+92.46 113.01 l
+90.55 111.10 l
+88.64 113.01 l
+S
+90.92 115.08 m
+92.83 116.99 l
+94.74 115.08 l
+92.83 113.17 l
+90.92 115.08 l
+S
+105.56 112.09 m
+107.47 114.00 l
+109.38 112.09 l
+107.47 110.18 l
+105.56 112.09 l
+S
+107.76 118.99 m
+109.67 120.90 l
+111.58 118.99 l
+109.67 117.08 l
+107.76 118.99 l
+S
+103.00 126.99 m
+104.91 128.90 l
+106.82 126.99 l
+104.91 125.08 l
+103.00 126.99 l
+S
+89.16 126.39 m
+91.07 128.30 l
+92.98 126.39 l
+91.07 124.48 l
+89.16 126.39 l
+S
+114.11 111.45 m
+116.02 113.36 l
+117.93 111.45 l
+116.02 109.54 l
+114.11 111.45 l
+S
+105.81 120.30 m
+107.72 122.21 l
+109.63 120.30 l
+107.72 118.39 l
+105.81 120.30 l
+S
+112.90 124.38 m
+114.81 126.29 l
+116.71 124.38 l
+114.81 122.47 l
+112.90 124.38 l
+S
+106.38 113.63 m
+108.29 115.54 l
+110.20 113.63 l
+108.29 111.72 l
+106.38 113.63 l
+S
+112.12 111.77 m
+114.03 113.68 l
+115.94 111.77 l
+114.03 109.86 l
+112.12 111.77 l
+S
+106.56 115.13 m
+108.47 117.04 l
+110.38 115.13 l
+108.47 113.22 l
+106.56 115.13 l
+S
+125.01 126.09 m
+126.92 128.00 l
+128.83 126.09 l
+126.92 124.18 l
+125.01 126.09 l
+S
+103.97 122.99 m
+105.88 124.89 l
+107.79 122.99 l
+105.88 121.08 l
+103.97 122.99 l
+S
+100.24 116.57 m
+102.15 118.48 l
+104.06 116.57 l
+102.15 114.66 l
+100.24 116.57 l
+S
+114.44 116.73 m
+116.35 118.64 l
+118.26 116.73 l
+116.35 114.82 l
+114.44 116.73 l
+S
+115.43 119.70 m
+117.34 121.61 l
+119.25 119.70 l
+117.34 117.79 l
+115.43 119.70 l
+S
+104.21 123.54 m
+106.11 125.45 l
+108.02 123.54 l
+106.11 121.63 l
+104.21 123.54 l
+S
+106.17 117.81 m
+108.08 119.72 l
+109.99 117.81 l
+108.08 115.90 l
+106.17 117.81 l
+S
+116.03 125.83 m
+117.94 127.74 l
+119.85 125.83 l
+117.94 123.92 l
+116.03 125.83 l
+S
+99.88 116.57 m
+101.79 118.48 l
+103.70 116.57 l
+101.79 114.66 l
+99.88 116.57 l
+S
+140.80 124.19 m
+142.71 126.10 l
+144.62 124.19 l
+142.71 122.29 l
+140.80 124.19 l
+S
+107.77 120.94 m
+109.68 122.85 l
+111.59 120.94 l
+109.68 119.03 l
+107.77 120.94 l
+S
+93.93 126.20 m
+95.84 128.11 l
+97.75 126.20 l
+95.84 124.29 l
+93.93 126.20 l
+S
+148.43 117.30 m
+150.34 119.21 l
+152.25 117.30 l
+150.34 115.40 l
+148.43 117.30 l
+S
+102.06 115.06 m
+103.97 116.97 l
+105.88 115.06 l
+103.97 113.15 l
+102.06 115.06 l
+S
+136.78 111.26 m
+138.69 113.17 l
+140.60 111.26 l
+138.69 109.35 l
+136.78 111.26 l
+S
+125.61 121.11 m
+127.52 123.02 l
+129.43 121.11 l
+127.52 119.20 l
+125.61 121.11 l
+S
+104.05 117.95 m
+105.96 119.86 l
+107.87 117.95 l
+105.96 116.04 l
+104.05 117.95 l
+S
+111.37 126.03 m
+113.28 127.94 l
+115.18 126.03 l
+113.28 124.12 l
+111.37 126.03 l
+S
+152.48 120.97 m
+154.39 122.88 l
+156.30 120.97 l
+154.39 119.06 l
+152.48 120.97 l
+S
+107.65 124.01 m
+109.56 125.92 l
+111.47 124.01 l
+109.56 122.10 l
+107.65 124.01 l
+S
+132.03 120.04 m
+133.94 121.95 l
+135.85 120.04 l
+133.94 118.13 l
+132.03 120.04 l
+S
+89.19 124.27 m
+91.10 126.18 l
+93.01 124.27 l
+91.10 122.36 l
+89.19 124.27 l
+S
+128.59 127.03 m
+130.50 128.94 l
+132.41 127.03 l
+130.50 125.12 l
+128.59 127.03 l
+S
+108.11 117.51 m
+110.02 119.42 l
+111.93 117.51 l
+110.02 115.60 l
+108.11 117.51 l
+S
+109.96 120.50 m
+111.87 122.40 l
+113.78 120.50 l
+111.87 118.59 l
+109.96 120.50 l
+S
+106.31 124.54 m
+108.21 126.45 l
+110.12 124.54 l
+108.21 122.63 l
+106.31 124.54 l
+S
+152.82 117.99 m
+154.73 119.90 l
+156.64 117.99 l
+154.73 116.08 l
+152.82 117.99 l
+S
+122.34 110.95 m
+124.25 112.86 l
+126.16 110.95 l
+124.25 109.04 l
+122.34 110.95 l
+S
+140.76 118.59 m
+142.67 120.50 l
+144.57 118.59 l
+142.67 116.68 l
+140.76 118.59 l
+S
+107.73 116.91 m
+109.64 118.82 l
+111.55 116.91 l
+109.64 115.00 l
+107.73 116.91 l
+S
+96.01 115.20 m
+97.92 117.11 l
+99.83 115.20 l
+97.92 113.29 l
+96.01 115.20 l
+S
+95.02 115.43 m
+96.93 117.34 l
+98.84 115.43 l
+96.93 113.52 l
+95.02 115.43 l
+S
+117.42 121.02 m
+119.32 122.93 l
+121.23 121.02 l
+119.32 119.11 l
+117.42 121.02 l
+S
+98.20 120.16 m
+100.11 122.07 l
+102.01 120.16 l
+100.11 118.25 l
+98.20 120.16 l
+S
+113.01 120.80 m
+114.92 122.71 l
+116.83 120.80 l
+114.92 118.89 l
+113.01 120.80 l
+S
+88.56 113.71 m
+90.47 115.62 l
+92.38 113.71 l
+90.47 111.80 l
+88.56 113.71 l
+S
+147.79 119.74 m
+149.70 121.65 l
+151.61 119.74 l
+149.70 117.83 l
+147.79 119.74 l
+S
+86.14 112.69 m
+88.05 114.60 l
+89.96 112.69 l
+88.05 110.78 l
+86.14 112.69 l
+S
+112.99 122.31 m
+114.90 124.22 l
+116.81 122.31 l
+114.90 120.40 l
+112.99 122.31 l
+S
+104.34 125.29 m
+106.25 127.20 l
+108.16 125.29 l
+106.25 123.38 l
+104.34 125.29 l
+S
+104.12 115.01 m
+106.03 116.92 l
+107.94 115.01 l
+106.03 113.10 l
+104.12 115.01 l
+S
+92.40 125.93 m
+94.31 127.84 l
+96.22 125.93 l
+94.31 124.02 l
+92.40 125.93 l
+S
+93.11 111.16 m
+95.02 113.07 l
+96.93 111.16 l
+95.02 109.25 l
+93.11 111.16 l
+S
+91.45 122.04 m
+93.36 123.94 l
+95.27 122.04 l
+93.36 120.13 l
+91.45 122.04 l
+S
+112.67 114.00 m
+114.58 115.91 l
+116.49 114.00 l
+114.58 112.09 l
+112.67 114.00 l
+S
+134.23 113.73 m
+136.14 115.64 l
+138.05 113.73 l
+136.14 111.82 l
+134.23 113.73 l
+S
+127.71 117.30 m
+129.62 119.21 l
+131.53 117.30 l
+129.62 115.39 l
+127.71 117.30 l
+S
+109.05 122.07 m
+110.96 123.97 l
+112.87 122.07 l
+110.96 120.16 l
+109.05 122.07 l
+S
+121.25 114.89 m
+123.16 116.80 l
+125.07 114.89 l
+123.16 112.98 l
+121.25 114.89 l
+S
+92.70 112.63 m
+94.61 114.54 l
+96.52 112.63 l
+94.61 110.72 l
+92.70 112.63 l
+S
+91.78 121.60 m
+93.69 123.51 l
+95.60 121.60 l
+93.69 119.69 l
+91.78 121.60 l
+S
+109.47 126.61 m
+111.37 128.52 l
+113.28 126.61 l
+111.37 124.70 l
+109.47 126.61 l
+S
+108.53 116.49 m
+110.44 118.40 l
+112.35 116.49 l
+110.44 114.58 l
+108.53 116.49 l
+S
+154.87 115.93 m
+156.78 117.84 l
+158.69 115.93 l
+156.78 114.02 l
+154.87 115.93 l
+S
+128.30 127.24 m
+130.21 129.15 l
+132.12 127.24 l
+130.21 125.33 l
+128.30 127.24 l
+S
+120.69 122.03 m
+122.60 123.94 l
+124.51 122.03 l
+122.60 120.12 l
+120.69 122.03 l
+S
+95.42 113.51 m
+97.33 115.42 l
+99.24 113.51 l
+97.33 111.60 l
+95.42 113.51 l
+S
+105.00 121.38 m
+106.91 123.29 l
+108.82 121.38 l
+106.91 119.48 l
+105.00 121.38 l
+S
+120.42 111.08 m
+122.33 112.99 l
+124.24 111.08 l
+122.33 109.17 l
+120.42 111.08 l
+S
+111.59 116.90 m
+113.50 118.81 l
+115.41 116.90 l
+113.50 114.99 l
+111.59 116.90 l
+S
+97.66 127.46 m
+99.57 129.36 l
+101.48 127.46 l
+99.57 125.55 l
+97.66 127.46 l
+S
+86.52 122.50 m
+88.43 124.41 l
+90.34 122.50 l
+88.43 120.59 l
+86.52 122.50 l
+S
+140.93 118.84 m
+142.84 120.75 l
+144.75 118.84 l
+142.84 116.93 l
+140.93 118.84 l
+S
+112.76 123.37 m
+114.67 125.28 l
+116.58 123.37 l
+114.67 121.46 l
+112.76 123.37 l
+S
+112.13 126.78 m
+114.04 128.69 l
+115.95 126.78 l
+114.04 124.87 l
+112.13 126.78 l
+S
+153.39 124.08 m
+155.30 125.99 l
+157.21 124.08 l
+155.30 122.17 l
+153.39 124.08 l
+S
+124.52 116.50 m
+126.43 118.41 l
+128.34 116.50 l
+126.43 114.59 l
+124.52 116.50 l
+S
+156.96 123.85 m
+158.87 125.75 l
+160.78 123.85 l
+158.87 121.94 l
+156.96 123.85 l
+S
+102.44 111.28 m
+104.35 113.19 l
+106.26 111.28 l
+104.35 109.37 l
+102.44 111.28 l
+S
+157.46 127.12 m
+159.37 129.03 l
+161.28 127.12 l
+159.37 125.21 l
+157.46 127.12 l
+S
+97.05 114.87 m
+98.96 116.78 l
+100.87 114.87 l
+98.96 112.96 l
+97.05 114.87 l
+S
+140.02 123.23 m
+141.92 125.14 l
+143.83 123.23 l
+141.92 121.33 l
+140.02 123.23 l
+S
+103.17 115.09 m
+105.08 117.00 l
+106.99 115.09 l
+105.08 113.18 l
+103.17 115.09 l
+S
+121.34 121.15 m
+123.25 123.06 l
+125.16 121.15 l
+123.25 119.25 l
+121.34 121.15 l
+S
+119.73 121.33 m
+121.64 123.24 l
+123.55 121.33 l
+121.64 119.42 l
+119.73 121.33 l
+S
+128.62 121.39 m
+130.53 123.29 l
+132.44 121.39 l
+130.53 119.48 l
+128.62 121.39 l
+S
+157.80 124.87 m
+159.71 126.78 l
+161.62 124.87 l
+159.71 122.96 l
+157.80 124.87 l
+S
+91.23 126.75 m
+93.14 128.66 l
+95.05 126.75 l
+93.14 124.84 l
+91.23 126.75 l
+S
+113.81 119.94 m
+115.72 121.85 l
+117.63 119.94 l
+115.72 118.03 l
+113.81 119.94 l
+S
+93.66 118.65 m
+95.57 120.56 l
+97.48 118.65 l
+95.57 116.74 l
+93.66 118.65 l
+S
+156.23 120.38 m
+158.13 122.29 l
+160.04 120.38 l
+158.13 118.47 l
+156.23 120.38 l
+S
+158.47 119.78 m
+160.38 121.69 l
+162.29 119.78 l
+160.38 117.87 l
+158.47 119.78 l
+S
+158.33 115.48 m
+160.24 117.39 l
+162.15 115.48 l
+160.24 113.57 l
+158.33 115.48 l
+S
+124.19 118.19 m
+126.10 120.10 l
+128.01 118.19 l
+126.10 116.28 l
+124.19 118.19 l
+S
+116.29 112.56 m
+118.20 114.47 l
+120.11 112.56 l
+118.20 110.65 l
+116.29 112.56 l
+S
+110.57 123.50 m
+112.48 125.41 l
+114.39 123.50 l
+112.48 121.59 l
+110.57 123.50 l
+S
+109.38 112.76 m
+111.29 114.66 l
+113.20 112.76 l
+111.29 110.85 l
+109.38 112.76 l
+S
+158.14 111.24 m
+160.05 113.15 l
+161.96 111.24 l
+160.05 109.33 l
+158.14 111.24 l
+S
+92.46 119.52 m
+94.37 121.43 l
+96.28 119.52 l
+94.37 117.61 l
+92.46 119.52 l
+S
+100.76 116.68 m
+102.67 118.59 l
+104.58 116.68 l
+102.67 114.77 l
+100.76 116.68 l
+S
+149.95 112.60 m
+151.86 114.51 l
+153.77 112.60 l
+151.86 110.69 l
+149.95 112.60 l
+S
+116.04 123.58 m
+117.95 125.49 l
+119.86 123.58 l
+117.95 121.67 l
+116.04 123.58 l
+S
+94.66 117.34 m
+96.57 119.24 l
+98.48 117.34 l
+96.57 115.43 l
+94.66 117.34 l
+S
+116.69 112.65 m
+118.60 114.56 l
+120.51 112.65 l
+118.60 110.74 l
+116.69 112.65 l
+S
+108.29 116.53 m
+110.20 118.44 l
+112.11 116.53 l
+110.20 114.62 l
+108.29 116.53 l
+S
+157.20 111.92 m
+159.11 113.83 l
+161.01 111.92 l
+159.11 110.01 l
+157.20 111.92 l
+S
+122.84 122.08 m
+124.74 123.99 l
+126.65 122.08 l
+124.74 120.17 l
+122.84 122.08 l
+S
+113.85 126.33 m
+115.76 128.23 l
+117.67 126.33 l
+115.76 124.42 l
+113.85 126.33 l
+S
+89.83 123.45 m
+91.74 125.36 l
+93.65 123.45 l
+91.74 121.54 l
+89.83 123.45 l
+S
+157.52 125.31 m
+159.42 127.21 l
+161.33 125.31 l
+159.42 123.40 l
+157.52 125.31 l
+S
+124.92 117.12 m
+126.83 119.03 l
+128.74 117.12 l
+126.83 115.21 l
+124.92 117.12 l
+S
+115.19 121.67 m
+117.10 123.57 l
+119.01 121.67 l
+117.10 119.76 l
+115.19 121.67 l
+S
+95.71 122.38 m
+97.61 124.28 l
+99.52 122.38 l
+97.61 120.47 l
+95.71 122.38 l
+S
+158.44 118.79 m
+160.35 120.70 l
+162.26 118.79 l
+160.35 116.89 l
+158.44 118.79 l
+S
+155.13 116.91 m
+157.04 118.82 l
+158.95 116.91 l
+157.04 115.00 l
+155.13 116.91 l
+S
+94.72 114.90 m
+96.62 116.81 l
+98.53 114.90 l
+96.62 112.99 l
+94.72 114.90 l
+S
+126.81 124.10 m
+128.72 126.01 l
+130.62 124.10 l
+128.72 122.19 l
+126.81 124.10 l
+S
+103.54 121.95 m
+105.45 123.86 l
+107.36 121.95 l
+105.45 120.04 l
+103.54 121.95 l
+S
+159.33 114.53 m
+161.24 116.44 l
+163.15 114.53 l
+161.24 112.62 l
+159.33 114.53 l
+S
+98.79 120.98 m
+100.70 122.89 l
+102.60 120.98 l
+100.70 119.07 l
+98.79 120.98 l
+S
+157.78 122.18 m
+159.69 124.09 l
+161.60 122.18 l
+159.69 120.27 l
+157.78 122.18 l
+S
+113.54 122.62 m
+115.45 124.53 l
+117.35 122.62 l
+115.45 120.72 l
+113.54 122.62 l
+S
+108.36 111.45 m
+110.27 113.36 l
+112.18 111.45 l
+110.27 109.54 l
+108.36 111.45 l
+S
+155.47 124.89 m
+157.37 126.80 l
+159.28 124.89 l
+157.37 122.98 l
+155.47 124.89 l
+S
+108.90 125.19 m
+110.81 127.10 l
+112.72 125.19 l
+110.81 123.28 l
+108.90 125.19 l
+S
+157.98 114.32 m
+159.88 116.23 l
+161.79 114.32 l
+159.88 112.41 l
+157.98 114.32 l
+S
+114.25 111.87 m
+116.16 113.78 l
+118.07 111.87 l
+116.16 109.96 l
+114.25 111.87 l
+S
+112.93 118.12 m
+114.84 120.03 l
+116.74 118.12 l
+114.84 116.21 l
+112.93 118.12 l
+S
+157.26 124.89 m
+159.17 126.80 l
+161.08 124.89 l
+159.17 122.98 l
+157.26 124.89 l
+S
+157.86 126.70 m
+159.77 128.61 l
+161.68 126.70 l
+159.77 124.79 l
+157.86 126.70 l
+S
+157.82 122.32 m
+159.73 124.23 l
+161.64 122.32 l
+159.73 120.41 l
+157.82 122.32 l
+S
+115.63 116.39 m
+117.54 118.30 l
+119.44 116.39 l
+117.54 114.48 l
+115.63 116.39 l
+S
+92.66 115.84 m
+94.57 117.75 l
+96.48 115.84 l
+94.57 113.93 l
+92.66 115.84 l
+S
+157.74 117.14 m
+159.65 119.05 l
+161.56 117.14 l
+159.65 115.23 l
+157.74 117.14 l
+S
+95.33 115.94 m
+97.24 117.85 l
+99.15 115.94 l
+97.24 114.03 l
+95.33 115.94 l
+S
+101.56 118.13 m
+103.47 120.04 l
+105.37 118.13 l
+103.47 116.22 l
+101.56 118.13 l
+S
+121.34 117.80 m
+123.25 119.71 l
+125.16 117.80 l
+123.25 115.89 l
+121.34 117.80 l
+S
+149.48 115.37 m
+151.39 117.28 l
+153.30 115.37 l
+151.39 113.46 l
+149.48 115.37 l
+S
+150.79 125.06 m
+152.70 126.97 l
+154.61 125.06 l
+152.70 123.15 l
+150.79 125.06 l
+S
+114.89 120.92 m
+116.80 122.83 l
+118.71 120.92 l
+116.80 119.01 l
+114.89 120.92 l
+S
+105.00 111.13 m
+106.91 113.04 l
+108.82 111.13 l
+106.91 109.22 l
+105.00 111.13 l
+S
+86.03 115.74 m
+87.94 117.65 l
+89.85 115.74 l
+87.94 113.83 l
+86.03 115.74 l
+S
+85.96 115.37 m
+87.87 117.28 l
+89.78 115.37 l
+87.87 113.46 l
+85.96 115.37 l
+S
+85.82 111.71 m
+87.73 113.62 l
+89.64 111.71 l
+87.73 109.80 l
+85.82 111.71 l
+S
+99.41 112.55 m
+101.32 114.46 l
+103.22 112.55 l
+101.32 110.64 l
+99.41 112.55 l
+S
+91.45 120.48 m
+93.36 122.39 l
+95.27 120.48 l
+93.36 118.57 l
+91.45 120.48 l
+S
+92.38 117.77 m
+94.29 119.68 l
+96.20 117.77 l
+94.29 115.86 l
+92.38 117.77 l
+S
+95.54 124.99 m
+97.45 126.90 l
+99.36 124.99 l
+97.45 123.08 l
+95.54 124.99 l
+S
+95.94 126.25 m
+97.85 128.16 l
+99.76 126.25 l
+97.85 124.34 l
+95.94 126.25 l
+S
+116.03 118.42 m
+117.94 120.33 l
+119.84 118.42 l
+117.94 116.51 l
+116.03 118.42 l
+S
+127.36 114.30 m
+129.27 116.21 l
+131.17 114.30 l
+129.27 112.39 l
+127.36 114.30 l
+S
+102.06 126.30 m
+103.97 128.21 l
+105.88 126.30 l
+103.97 124.40 l
+102.06 126.30 l
+S
+98.11 123.32 m
+100.02 125.23 l
+101.93 123.32 l
+100.02 121.41 l
+98.11 123.32 l
+S
+98.44 116.12 m
+100.35 118.03 l
+102.26 116.12 l
+100.35 114.21 l
+98.44 116.12 l
+S
+105.00 116.15 m
+106.91 118.06 l
+108.82 116.15 l
+106.91 114.24 l
+105.00 116.15 l
+S
+127.36 125.41 m
+129.27 127.32 l
+131.17 125.41 l
+129.27 123.50 l
+127.36 125.41 l
+S
+131.72 111.76 m
+133.63 113.67 l
+135.54 111.76 l
+133.63 109.85 l
+131.72 111.76 l
+S
+127.02 124.01 m
+128.93 125.92 l
+130.84 124.01 l
+128.93 122.10 l
+127.02 124.01 l
+S
+137.62 124.34 m
+139.52 126.25 l
+141.43 124.34 l
+139.52 122.43 l
+137.62 124.34 l
+S
+133.33 123.53 m
+135.24 125.44 l
+137.14 123.53 l
+135.24 121.62 l
+133.33 123.53 l
+S
+103.97 117.20 m
+105.88 119.11 l
+107.79 117.20 l
+105.88 115.29 l
+103.97 117.20 l
+S
+107.05 113.48 m
+108.95 115.39 l
+110.86 113.48 l
+108.95 111.57 l
+107.05 113.48 l
+S
+103.61 113.97 m
+105.52 115.88 l
+107.43 113.97 l
+105.52 112.07 l
+103.61 113.97 l
+S
+105.40 125.44 m
+107.31 127.35 l
+109.21 125.44 l
+107.31 123.53 l
+105.40 125.44 l
+S
+109.65 116.64 m
+111.56 118.54 l
+113.47 116.64 l
+111.56 114.73 l
+109.65 116.64 l
+S
+146.53 126.55 m
+148.44 128.46 l
+150.35 126.55 l
+148.44 124.64 l
+146.53 126.55 l
+S
+107.91 118.13 m
+109.82 120.04 l
+111.73 118.13 l
+109.82 116.22 l
+107.91 118.13 l
+S
+142.31 122.58 m
+144.22 124.49 l
+146.13 122.58 l
+144.22 120.67 l
+142.31 122.58 l
+S
+110.62 111.57 m
+112.53 113.48 l
+114.44 111.57 l
+112.53 109.66 l
+110.62 111.57 l
+S
+147.07 115.25 m
+148.98 117.16 l
+150.89 115.25 l
+148.98 113.34 l
+147.07 115.25 l
+S
+148.39 112.18 m
+150.30 114.09 l
+152.21 112.18 l
+150.30 110.28 l
+148.39 112.18 l
+S
+150.93 113.27 m
+152.83 115.18 l
+154.74 113.27 l
+152.83 111.36 l
+150.93 113.27 l
+S
+112.49 111.90 m
+114.40 113.81 l
+116.31 111.90 l
+114.40 109.99 l
+112.49 111.90 l
+S
+153.43 126.96 m
+155.34 128.87 l
+157.25 126.96 l
+155.34 125.05 l
+153.43 126.96 l
+S
+152.08 124.28 m
+153.99 126.19 l
+155.89 124.28 l
+153.99 122.37 l
+152.08 124.28 l
+S
+115.94 122.90 m
+117.85 124.81 l
+119.76 122.90 l
+117.85 120.99 l
+115.94 122.90 l
+S
+117.21 117.88 m
+119.12 119.79 l
+121.03 117.88 l
+119.12 115.97 l
+117.21 117.88 l
+S
+113.96 124.69 m
+115.87 126.59 l
+117.78 124.69 l
+115.87 122.78 l
+113.96 124.69 l
+S
+117.40 126.39 m
+119.31 128.30 l
+121.22 126.39 l
+119.31 124.48 l
+117.40 126.39 l
+S
+111.13 117.13 m
+113.04 119.04 l
+114.95 117.13 l
+113.04 115.22 l
+111.13 117.13 l
+S
+153.95 115.49 m
+155.85 117.40 l
+157.76 115.49 l
+155.85 113.58 l
+153.95 115.49 l
+S
+155.69 122.60 m
+157.60 124.51 l
+159.51 122.60 l
+157.60 120.69 l
+155.69 122.60 l
+S
+156.15 115.77 m
+158.06 117.68 l
+159.97 115.77 l
+158.06 113.86 l
+156.15 115.77 l
+S
+114.15 126.15 m
+116.06 128.06 l
+117.97 126.15 l
+116.06 124.24 l
+114.15 126.15 l
+S
+126.43 124.62 m
+128.34 126.53 l
+130.25 124.62 l
+128.34 122.71 l
+126.43 124.62 l
+S
+126.39 116.28 m
+128.30 118.19 l
+130.21 116.28 l
+128.30 114.37 l
+126.39 116.28 l
+S
+124.81 123.00 m
+126.72 124.91 l
+128.63 123.00 l
+126.72 121.09 l
+124.81 123.00 l
+S
+156.51 119.49 m
+158.42 121.40 l
+160.32 119.49 l
+158.42 117.58 l
+156.51 119.49 l
+S
+156.51 123.30 m
+158.42 125.21 l
+160.32 123.30 l
+158.42 121.39 l
+156.51 123.30 l
+S
+156.51 117.09 m
+158.42 119.00 l
+160.32 117.09 l
+158.42 115.18 l
+156.51 117.09 l
+S
+117.63 122.74 m
+119.54 124.65 l
+121.45 122.74 l
+119.54 120.83 l
+117.63 122.74 l
+S
+117.30 122.82 m
+119.21 124.73 l
+121.12 122.82 l
+119.21 120.91 l
+117.30 122.82 l
+S
+124.04 116.31 m
+125.95 118.22 l
+127.86 116.31 l
+125.95 114.40 l
+124.04 116.31 l
+S
+158.37 116.21 m
+160.28 118.12 l
+162.18 116.21 l
+160.28 114.30 l
+158.37 116.21 l
+S
+120.37 125.24 m
+122.28 127.15 l
+124.19 125.24 l
+122.28 123.33 l
+120.37 125.24 l
+S
+124.04 127.04 m
+125.95 128.95 l
+127.86 127.04 l
+125.95 125.13 l
+124.04 127.04 l
+S
+156.51 111.66 m
+158.42 113.57 l
+160.32 111.66 l
+158.42 109.76 l
+156.51 111.66 l
+S
+156.51 111.20 m
+158.42 113.11 l
+160.32 111.20 l
+158.42 109.29 l
+156.51 111.20 l
+S
+124.04 121.70 m
+125.95 123.61 l
+127.86 121.70 l
+125.95 119.80 l
+124.04 121.70 l
+S
+157.13 116.34 m
+159.04 118.25 l
+160.95 116.34 l
+159.04 114.43 l
+157.13 116.34 l
+S
+113.54 115.25 m
+115.45 117.15 l
+117.36 115.25 l
+115.45 113.34 l
+113.54 115.25 l
+S
+157.13 110.96 m
+159.04 112.87 l
+160.95 110.96 l
+159.04 109.05 l
+157.13 110.96 l
+S
+122.17 116.78 m
+124.08 118.69 l
+125.99 116.78 l
+124.08 114.87 l
+122.17 116.78 l
+S
+116.65 119.87 m
+118.56 121.78 l
+120.47 119.87 l
+118.56 117.96 l
+116.65 119.87 l
+S
+126.79 114.70 m
+128.70 116.61 l
+130.61 114.70 l
+128.70 112.79 l
+126.79 114.70 l
+S
+156.51 114.32 m
+158.42 116.23 l
+160.32 114.32 l
+158.42 112.41 l
+156.51 114.32 l
+S
+157.76 117.28 m
+159.67 119.19 l
+161.58 117.28 l
+159.67 115.37 l
+157.76 117.28 l
+S
+156.51 122.77 m
+158.42 124.68 l
+160.32 122.77 l
+158.42 120.86 l
+156.51 122.77 l
+S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+79.95 73.44 m 741.01 73.44 l S
+79.95 73.44 m 79.95 66.24 l S
+245.22 73.44 m 245.22 66.24 l S
+410.48 73.44 m 410.48 66.24 l S
+575.74 73.44 m 575.74 66.24 l S
+741.01 73.44 m 741.01 66.24 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 12.00 0.00 -0.00 12.00 71.61 47.52 Tm (0.0) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 236.88 47.52 Tm (0.2) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 402.14 47.52 Tm (0.4) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 567.40 47.52 Tm (0.6) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 732.67 47.52 Tm (0.8) Tj
+ET
+Q q 59.04 73.44 774.72 299.52 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 12.00 0.00 -0.00 12.00 339.79 357.67 Tm (Unmatched Treatment Units) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 347.46 288.34 Tm (Matched Treatment Units) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 354.44 218.89 Tm (Matched Control Units) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 346.77 149.56 Tm (Unmatched Control Units) Tj
+ET
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+59.04 73.44 m
+833.76 73.44 l
+833.76 372.96 l
+59.04 372.96 l
+59.04 73.44 l
+S
+Q
+endstream
+endobj
+8 0 obj
+49310
+endobj
+3 0 obj
+<<
+/Type /Pages
+/Kids [
+6 0 R
+]
+/Count 1
+/MediaBox [0 0 864 432]
+>>
+endobj
+4 0 obj
+<<
+/ProcSet [/PDF /Text]
+/Font << /F1 5 0 R /F2 10 0 R /F3 11 0 R >>
+/ExtGState << >>
+>>
+endobj
+9 0 obj
+<<
+/Type /Encoding
+/BaseEncoding /WinAnsiEncoding
+/Differences [ 45/minus 96/quoteleft
+144/dotlessi /grave /acute /circumflex /tilde /macron /breve /dotaccent
+/dieresis /.notdef /ring /cedilla /.notdef /hungarumlaut /ogonek /caron /space]
+>>
+endobj
+10 0 obj <<
+/Type /Font
+/Subtype /Type1
+/Name /F2
+/BaseFont /Helvetica
+/Encoding 9 0 R
+>> endobj
+11 0 obj <<
+/Type /Font
+/Subtype /Type1
+/Name /F3
+/BaseFont /Helvetica-Bold
+/Encoding 9 0 R
+>> endobj
+xref
+0 12
+0000000000 65535 f 
+0000000021 00000 n 
+0000000163 00000 n 
+0000049759 00000 n 
+0000049842 00000 n 
+0000000212 00000 n 
+0000000295 00000 n 
+0000000375 00000 n 
+0000049738 00000 n 
+0000049946 00000 n 
+0000050203 00000 n 
+0000050300 00000 n 
+trailer
+<<
+/Size 12
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+50402
+%%EOF
diff --git a/inst/doc/figs/qqplotnn.eps b/inst/doc/figs/qqplotnn.eps
new file mode 100644
index 0000000..b1eb9bf
--- /dev/null
+++ b/inst/doc/figs/qqplotnn.eps
@@ -0,0 +1,7710 @@
+%!PS-Adobe-3.0
+%%Creator: xpdf/pdftops 2.02
+%%LanguageLevel: 2
+%%DocumentSuppliedResources: (atend)
+%%DocumentMedia: plain 612 792 0 () ()
+%%Pages: 1
+%%EndComments
+%%BeginDefaults
+%%PageMedia: plain
+%%EndDefaults
+%%BeginProlog
+%%BeginResource: procset xpdf 2.02 0
+/xpdf 75 dict def xpdf begin
+% PDF special state
+/pdfDictSize 14 def
+/pdfSetup {
+  3 1 roll 2 array astore
+  /setpagedevice where {
+    pop 3 dict begin
+      /PageSize exch def
+      /ImagingBBox null def
+      /Policies 1 dict dup begin /PageSize 3 def end def
+      { /Duplex true def } if
+    currentdict end setpagedevice
+  } {
+    pop pop
+  } ifelse
+} def
+/pdfStartPage {
+  pdfDictSize dict begin
+  /pdfFill [0] def
+  /pdfStroke [0] def
+  /pdfLastFill false def
+  /pdfLastStroke false def
+  /pdfTextMat [1 0 0 1 0 0] def
+  /pdfFontSize 0 def
+  /pdfCharSpacing 0 def
+  /pdfTextRender 0 def
+  /pdfTextRise 0 def
+  /pdfWordSpacing 0 def
+  /pdfHorizScaling 1 def
+} def
+/pdfEndPage { end } def
+% separation convention operators
+/findcmykcustomcolor where {
+  pop
+}{
+  /findcmykcustomcolor { 5 array astore } def
+} ifelse
+/setcustomcolor where {
+  pop
+}{
+  /setcustomcolor {
+    exch
+    [ exch /Separation exch dup 4 get exch /DeviceCMYK exch
+      0 4 getinterval cvx
+      [ exch /dup load exch { mul exch dup } /forall load
+        /pop load dup ] cvx
+    ] setcolorspace setcolor
+  } def
+} ifelse
+/customcolorimage where {
+  pop
+}{
+  /customcolorimage {
+    gsave
+    [ exch /Separation exch dup 4 get exch /DeviceCMYK exch
+      0 4 getinterval
+      [ exch /dup load exch { mul exch dup } /forall load
+        /pop load dup ] cvx
+    ] setcolorspace
+    10 dict begin
+      /ImageType 1 def
+      /DataSource exch def
+      /ImageMatrix exch def
+      /BitsPerComponent exch def
+      /Height exch def
+      /Width exch def
+      /Decode [1 0] def
+    currentdict end
+    image
+    grestore
+  } def
+} ifelse
+% PDF color state
+/sCol {
+  pdfLastStroke not {
+    pdfStroke aload length
+    dup 1 eq {
+      pop setgray
+    }{
+      dup 3 eq {
+        pop setrgbcolor
+      }{
+        4 eq {
+          setcmykcolor
+        }{
+          findcmykcustomcolor exch setcustomcolor
+        } ifelse
+      } ifelse
+    } ifelse
+    /pdfLastStroke true def /pdfLastFill false def
+  } if
+} def
+/fCol {
+  pdfLastFill not {
+    pdfFill aload length
+    dup 1 eq {
+      pop setgray
+    }{
+      dup 3 eq {
+        pop setrgbcolor
+      }{
+        4 eq {
+          setcmykcolor
+        }{
+          findcmykcustomcolor exch setcustomcolor
+        } ifelse
+      } ifelse
+    } ifelse
+    /pdfLastFill true def /pdfLastStroke false def
+  } if
+} def
+% build a font
+/pdfMakeFont {
+  4 3 roll findfont
+  4 2 roll matrix scale makefont
+  dup length dict begin
+    { 1 index /FID ne { def } { pop pop } ifelse } forall
+    /Encoding exch def
+    currentdict
+  end
+  definefont pop
+} def
+/pdfMakeFont16 {
+  exch findfont
+  dup length dict begin
+    { 1 index /FID ne { def } { pop pop } ifelse } forall
+    /WMode exch def
+    currentdict
+  end
+  definefont pop
+} def
+/pdfMakeFont16L3 {
+  1 index /CIDFont resourcestatus {
+    pop pop 1 index /CIDFont findresource /CIDFontType known
+  } {
+    false
+  } ifelse
+  {
+    0 eq { /Identity-H } { /Identity-V } ifelse
+    exch 1 array astore composefont pop
+  } {
+    pdfMakeFont16
+  } ifelse
+} def
+% graphics state operators
+/q { gsave pdfDictSize dict begin } def
+/Q { end grestore } def
+/cm { concat } def
+/d { setdash } def
+/i { setflat } def
+/j { setlinejoin } def
+/J { setlinecap } def
+/M { setmiterlimit } def
+/w { setlinewidth } def
+% color operators
+/g { dup 1 array astore /pdfFill exch def setgray
+     /pdfLastFill true def /pdfLastStroke false def } def
+/G { dup 1 array astore /pdfStroke exch def setgray
+     /pdfLastStroke true def /pdfLastFill false def } def
+/rg { 3 copy 3 array astore /pdfFill exch def setrgbcolor
+      /pdfLastFill true def /pdfLastStroke false def } def
+/RG { 3 copy 3 array astore /pdfStroke exch def setrgbcolor
+      /pdfLastStroke true def /pdfLastFill false def } def
+/k { 4 copy 4 array astore /pdfFill exch def setcmykcolor
+     /pdfLastFill true def /pdfLastStroke false def } def
+/K { 4 copy 4 array astore /pdfStroke exch def setcmykcolor
+     /pdfLastStroke true def /pdfLastFill false def } def
+/ck { 6 copy 6 array astore /pdfFill exch def
+      findcmykcustomcolor exch setcustomcolor
+      /pdfLastFill true def /pdfLastStroke false def } def
+/CK { 6 copy 6 array astore /pdfStroke exch def
+      findcmykcustomcolor exch setcustomcolor
+      /pdfLastStroke true def /pdfLastFill false def } def
+% path segment operators
+/m { moveto } def
+/l { lineto } def
+/c { curveto } def
+/re { 4 2 roll moveto 1 index 0 rlineto 0 exch rlineto
+      neg 0 rlineto closepath } def
+/h { closepath } def
+% path painting operators
+/S { sCol stroke } def
+/Sf { fCol stroke } def
+/f { fCol fill } def
+/f* { fCol eofill } def
+% clipping operators
+/W { clip newpath } def
+/W* { eoclip newpath } def
+% text state operators
+/Tc { /pdfCharSpacing exch def } def
+/Tf { dup /pdfFontSize exch def
+      dup pdfHorizScaling mul exch matrix scale
+      pdfTextMat matrix concatmatrix dup 4 0 put dup 5 0 put
+      exch findfont exch makefont setfont } def
+/Tr { /pdfTextRender exch def } def
+/Ts { /pdfTextRise exch def } def
+/Tw { /pdfWordSpacing exch def } def
+/Tz { /pdfHorizScaling exch def } def
+% text positioning operators
+/Td { pdfTextMat transform moveto } def
+/Tm { /pdfTextMat exch def } def
+% text string operators
+/awcp { % awidthcharpath
+  exch {
+    1 string dup 0 3 index put 2 index charpath
+    3 index 3 index rmoveto
+    4 index eq { 5 index 5 index rmoveto } if
+  } forall
+  6 {pop} repeat
+} def
+/Tj { fCol
+      0 pdfTextRise pdfTextMat dtransform rmoveto
+      1 index stringwidth pdfTextMat idtransform pop
+      sub 1 index length dup 0 ne { div } { pop pop 0 } ifelse
+      pdfWordSpacing pdfHorizScaling mul 0 pdfTextMat dtransform 32
+      4 3 roll pdfCharSpacing pdfHorizScaling mul add 0
+      pdfTextMat dtransform
+      6 5 roll
+      currentpoint 8 2 roll
+      pdfTextRender 1 and 0 eq {
+        6 copy awidthshow
+      } if
+      pdfTextRender 3 and dup 1 eq exch 2 eq or {
+        8 6 roll moveto
+        currentfont /FontType get 3 eq { fCol } { sCol } ifelse
+        false awcp currentpoint stroke moveto
+      } {
+        8 {pop} repeat
+      } ifelse
+      0 pdfTextRise neg pdfTextMat dtransform rmoveto } def
+/Tj16 { pdfTextRender 1 and 0 eq { fCol } { sCol } ifelse
+        0 pdfTextRise pdfTextMat dtransform rmoveto
+        2 index stringwidth pdfTextMat idtransform pop
+        sub exch div
+        pdfWordSpacing pdfHorizScaling mul 0 pdfTextMat dtransform 32
+        4 3 roll pdfCharSpacing pdfHorizScaling mul add 0
+        pdfTextMat dtransform
+        6 5 roll awidthshow
+        0 pdfTextRise neg pdfTextMat dtransform rmoveto } def
+/Tj16V { pdfTextRender 1 and 0 eq { fCol } { sCol } ifelse
+         0 pdfTextRise pdfTextMat dtransform rmoveto
+         2 index stringwidth pdfTextMat idtransform exch pop
+         sub exch div
+         0 pdfWordSpacing pdfTextMat dtransform 32
+         4 3 roll pdfCharSpacing add 0 exch
+         pdfTextMat dtransform
+         6 5 roll awidthshow
+         0 pdfTextRise neg pdfTextMat dtransform rmoveto } def
+/TJm { pdfFontSize 0.001 mul mul neg 0
+       pdfTextMat dtransform rmoveto } def
+/TJmV { pdfFontSize 0.001 mul mul neg 0 exch
+        pdfTextMat dtransform rmoveto } def
+% Level 1 image operators
+/pdfIm1 {
+  /pdfImBuf1 4 index string def
+  { currentfile pdfImBuf1 readhexstring pop } image
+} def
+/pdfIm1Sep {
+  /pdfImBuf1 4 index string def
+  /pdfImBuf2 4 index string def
+  /pdfImBuf3 4 index string def
+  /pdfImBuf4 4 index string def
+  { currentfile pdfImBuf1 readhexstring pop }
+  { currentfile pdfImBuf2 readhexstring pop }
+  { currentfile pdfImBuf3 readhexstring pop }
+  { currentfile pdfImBuf4 readhexstring pop }
+  true 4 colorimage
+} def
+/pdfImM1 {
+  /pdfImBuf1 4 index 7 add 8 idiv string def
+  { currentfile pdfImBuf1 readhexstring pop } imagemask
+} def
+% Level 2 image operators
+/pdfImBuf 100 string def
+/pdfIm {
+  image
+  { currentfile pdfImBuf readline
+    not { pop exit } if
+    (%-EOD-) eq { exit } if } loop
+} def
+/pdfImSep {
+  findcmykcustomcolor exch
+  dup /Width get /pdfImBuf1 exch string def
+  dup /Decode get aload pop 1 index sub /pdfImDecodeRange exch def
+  /pdfImDecodeLow exch def
+  begin Width Height BitsPerComponent ImageMatrix DataSource end
+  /pdfImData exch def
+  { pdfImData pdfImBuf1 readstring pop
+    0 1 2 index length 1 sub {
+      1 index exch 2 copy get
+      pdfImDecodeRange mul 255 div pdfImDecodeLow add round cvi
+      255 exch sub put
+    } for }
+  6 5 roll customcolorimage
+  { currentfile pdfImBuf readline
+    not { pop exit } if
+    (%-EOD-) eq { exit } if } loop
+} def
+/pdfImM {
+  fCol imagemask
+  { currentfile pdfImBuf readline
+    not { pop exit } if
+    (%-EOD-) eq { exit } if } loop
+} def
+end
+%%EndResource
+%%EndProlog
+%%BeginSetup
+xpdf begin
+/F6_0 /Helvetica 1 1
+[ /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /space/exclam/quotedbl/numbersign/dollar/percent/ampersand/quoteright
+  /parenleft/parenright/asterisk/plus/comma/minus/period/slash
+  /zero/one/two/three/four/five/six/seven
+  /eight/nine/colon/semicolon/less/equal/greater/question
+  /at/A/B/C/D/E/F/G
+  /H/I/J/K/L/M/N/O
+  /P/Q/R/S/T/U/V/W
+  /X/Y/Z/bracketleft/backslash/bracketright/asciicircum/underscore
+  /quoteleft/a/b/c/d/e/f/g
+  /h/i/j/k/l/m/n/o
+  /p/q/r/s/t/u/v/w
+  /x/y/z/braceleft/bar/braceright/asciitilde/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /dotlessi/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /space/exclamdown/cent/sterling/fraction/yen/florin/section
+  /currency/quotesingle/quotedblleft/guillemotleft/guilsinglleft/guilsinglright/fi/fl
+  /.notdef/endash/dagger/daggerdbl/periodcentered/.notdef/paragraph/bullet
+  /quotesinglbase/quotedblbase/quotedblright/guillemotright/ellipsis/perthousand/.notdef/questiondown
+  /.notdef/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /emdash/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/AE/.notdef/ordfeminine/.notdef/.notdef/.notdef/.notdef
+  /Lslash/Oslash/OE/ordmasculine/.notdef/.notdef/.notdef/.notdef
+  /.notdef/ae/.notdef/.notdef/.notdef/dotlessi/.notdef/.notdef
+  /lslash/oslash/oe/germandbls/.notdef/.notdef/.notdef/.notdef]
+pdfMakeFont
+/F7_0 /Helvetica-Bold 1 1
+[ /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /space/exclam/quotedbl/numbersign/dollar/percent/ampersand/quoteright
+  /parenleft/parenright/asterisk/plus/comma/minus/period/slash
+  /zero/one/two/three/four/five/six/seven
+  /eight/nine/colon/semicolon/less/equal/greater/question
+  /at/A/B/C/D/E/F/G
+  /H/I/J/K/L/M/N/O
+  /P/Q/R/S/T/U/V/W
+  /X/Y/Z/bracketleft/backslash/bracketright/asciicircum/underscore
+  /quoteleft/a/b/c/d/e/f/g
+  /h/i/j/k/l/m/n/o
+  /p/q/r/s/t/u/v/w
+  /x/y/z/braceleft/bar/braceright/asciitilde/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /dotlessi/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /space/exclamdown/cent/sterling/fraction/yen/florin/section
+  /currency/quotesingle/quotedblleft/guillemotleft/guilsinglleft/guilsinglright/fi/fl
+  /.notdef/endash/dagger/daggerdbl/periodcentered/.notdef/paragraph/bullet
+  /quotesinglbase/quotedblbase/quotedblright/guillemotright/ellipsis/perthousand/.notdef/questiondown
+  /.notdef/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /emdash/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/AE/.notdef/ordfeminine/.notdef/.notdef/.notdef/.notdef
+  /Lslash/Oslash/OE/ordmasculine/.notdef/.notdef/.notdef/.notdef
+  /.notdef/ae/.notdef/.notdef/.notdef/dotlessi/.notdef/.notdef
+  /lslash/oslash/oe/germandbls/.notdef/.notdef/.notdef/.notdef]
+pdfMakeFont
+/F8_0 /Helvetica-Oblique 1 1
+[ /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /space/exclam/quotedbl/numbersign/dollar/percent/ampersand/quoteright
+  /parenleft/parenright/asterisk/plus/comma/minus/period/slash
+  /zero/one/two/three/four/five/six/seven
+  /eight/nine/colon/semicolon/less/equal/greater/question
+  /at/A/B/C/D/E/F/G
+  /H/I/J/K/L/M/N/O
+  /P/Q/R/S/T/U/V/W
+  /X/Y/Z/bracketleft/backslash/bracketright/asciicircum/underscore
+  /quoteleft/a/b/c/d/e/f/g
+  /h/i/j/k/l/m/n/o
+  /p/q/r/s/t/u/v/w
+  /x/y/z/braceleft/bar/braceright/asciitilde/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /dotlessi/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /space/exclamdown/cent/sterling/fraction/yen/florin/section
+  /currency/quotesingle/quotedblleft/guillemotleft/guilsinglleft/guilsinglright/fi/fl
+  /.notdef/endash/dagger/daggerdbl/periodcentered/.notdef/paragraph/bullet
+  /quotesinglbase/quotedblbase/quotedblright/guillemotright/ellipsis/perthousand/.notdef/questiondown
+  /.notdef/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /emdash/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/AE/.notdef/ordfeminine/.notdef/.notdef/.notdef/.notdef
+  /Lslash/Oslash/OE/ordmasculine/.notdef/.notdef/.notdef/.notdef
+  /.notdef/ae/.notdef/.notdef/.notdef/dotlessi/.notdef/.notdef
+  /lslash/oslash/oe/germandbls/.notdef/.notdef/.notdef/.notdef]
+pdfMakeFont
+/F9_0 /Helvetica-BoldOblique 1 1
+[ /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /space/exclam/quotedbl/numbersign/dollar/percent/ampersand/quoteright
+  /parenleft/parenright/asterisk/plus/comma/minus/period/slash
+  /zero/one/two/three/four/five/six/seven
+  /eight/nine/colon/semicolon/less/equal/greater/question
+  /at/A/B/C/D/E/F/G
+  /H/I/J/K/L/M/N/O
+  /P/Q/R/S/T/U/V/W
+  /X/Y/Z/bracketleft/backslash/bracketright/asciicircum/underscore
+  /quoteleft/a/b/c/d/e/f/g
+  /h/i/j/k/l/m/n/o
+  /p/q/r/s/t/u/v/w
+  /x/y/z/braceleft/bar/braceright/asciitilde/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /dotlessi/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /space/exclamdown/cent/sterling/fraction/yen/florin/section
+  /currency/quotesingle/quotedblleft/guillemotleft/guilsinglleft/guilsinglright/fi/fl
+  /.notdef/endash/dagger/daggerdbl/periodcentered/.notdef/paragraph/bullet
+  /quotesinglbase/quotedblbase/quotedblright/guillemotright/ellipsis/perthousand/.notdef/questiondown
+  /.notdef/grave/acute/circumflex/tilde/macron/breve/dotaccent
+  /dieresis/.notdef/ring/cedilla/.notdef/hungarumlaut/ogonek/caron
+  /emdash/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/AE/.notdef/ordfeminine/.notdef/.notdef/.notdef/.notdef
+  /Lslash/Oslash/OE/ordmasculine/.notdef/.notdef/.notdef/.notdef
+  /.notdef/ae/.notdef/.notdef/.notdef/dotlessi/.notdef/.notdef
+  /lslash/oslash/oe/germandbls/.notdef/.notdef/.notdef/.notdef]
+pdfMakeFont
+/F10_0 /Symbol 1 1
+[ /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /space/exclam/universal/numbersign/existential/percent/ampersand/suchthat
+  /parenleft/parenright/asteriskmath/plus/comma/minus/period/slash
+  /zero/one/two/three/four/five/six/seven
+  /eight/nine/colon/semicolon/less/equal/greater/question
+  /congruent/Alpha/Beta/Chi/Delta/Epsilon/Phi/Gamma
+  /Eta/Iota/theta1/Kappa/Lambda/Mu/Nu/Omicron
+  /Pi/Theta/Rho/Sigma/Tau/Upsilon/sigma1/Omega
+  /Xi/Psi/Zeta/bracketleft/therefore/bracketright/perpendicular/underscore
+  /radicalex/alpha/beta/chi/delta/epsilon/phi/gamma
+  /eta/iota/phi1/kappa/lambda/mu/nu/omicron
+  /pi/theta/rho/sigma/tau/upsilon/omega1/omega
+  /xi/psi/zeta/braceleft/bar/braceright/similar/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/Upsilon1/minute/lessequal/fraction/infinity/florin/club
+  /diamond/heart/spade/arrowboth/arrowleft/arrowup/arrowright/arrowdown
+  /degree/plusminus/second/greaterequal/multiply/proportional/partialdiff/bullet
+  /divide/notequal/equivalence/approxequal/ellipsis/arrowvertex/arrowhorizex/carriagereturn
+  /aleph/Ifraktur/Rfraktur/weierstrass/circlemultiply/circleplus/emptyset/intersection
+  /union/propersuperset/reflexsuperset/notsubset/propersubset/reflexsubset/element/notelement
+  /angle/gradient/registerserif/copyrightserif/trademarkserif/product/radical/dotmath
+  /logicalnot/logicaland/logicalor/arrowdblboth/arrowdblleft/arrowdblup/arrowdblright/arrowdbldown
+  /lozenge/angleleft/registersans/copyrightsans/trademarksans/summation/parenlefttp/parenleftex
+  /parenleftbt/bracketlefttp/bracketleftex/bracketleftbt/bracelefttp/braceleftmid/braceleftbt/braceex
+  /.notdef/angleright/integral/integraltp/integralex/integralbt/parenrighttp/parenrightex
+  /parenrightbt/bracketrighttp/bracketrightex/bracketrightbt/bracerighttp/bracerightmid/bracerightbt/.notdef]
+pdfMakeFont
+/F11_0 /ZapfDingbats 1 1
+[ /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /space/a1/a2/a202/a3/a4/a5/a119
+  /a118/a117/a11/a12/a13/a14/a15/a16
+  /a105/a17/a18/a19/a20/a21/a22/a23
+  /a24/a25/a26/a27/a28/a6/a7/a8
+  /a9/a10/a29/a30/a31/a32/a33/a34
+  /a35/a36/a37/a38/a39/a40/a41/a42
+  /a43/a44/a45/a46/a47/a48/a49/a50
+  /a51/a52/a53/a54/a55/a56/a57/a58
+  /a59/a60/a61/a62/a63/a64/a65/a66
+  /a67/a68/a69/a70/a71/a72/a73/a74
+  /a203/a75/a204/a76/a77/a78/a79/a81
+  /a82/a83/a84/a97/a98/a99/a100/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef/.notdef
+  /.notdef/a101/a102/a103/a104/a106/a107/a108
+  /a112/a111/a110/a109/a120/a121/a122/a123
+  /a124/a125/a126/a127/a128/a129/a130/a131
+  /a132/a133/a134/a135/a136/a137/a138/a139
+  /a140/a141/a142/a143/a144/a145/a146/a147
+  /a148/a149/a150/a151/a152/a153/a154/a155
+  /a156/a157/a158/a159/a160/a161/a163/a164
+  /a196/a165/a192/a166/a167/a168/a169/a170
+  /a171/a172/a173/a162/a174/a175/a176/a177
+  /a178/a179/a193/a180/a199/a181/a200/a182
+  /.notdef/a201/a183/a184/a197/a185/a194/a198
+  /a186/a195/a187/a188/a189/a190/a191/.notdef]
+pdfMakeFont
+612 792 false pdfSetup
+%%EndSetup
+%%Page: 1 1
+%%BeginPageSetup
+%%PageOrientation: Portrait
+pdfStartPage
+94 184 translate
+%%EndPageSetup
+[] 0 d
+0 i
+0 j
+0 J
+10 M
+1 w
+0 g
+0 G
+1 J
+1 j
+10 M
+q
+Q
+q
+42.77 261.91 106.65 100.07 re
+W
+Q
+q
+38.02 257.16 116.16 109.57 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[8 0 0 8 86.43 225.79] Tm
+0 0 Td
+/F6_0 1 Tf
+(Index) 2.446 Tj
+[0 8 -8 0 12.36 309.05] Tm
+0 0 Td
+/F6_0 1 Tf
+(xi) 0.722 Tj
+Q
+q
+0 0 424.5 423.75 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[14 0 0 14 182.3 397.14] Tm
+0 0 Td
+/F7_0 1 Tf
+(QQ Plots) 4.279 Tj
+[14 0 0 14 198.39 378.13] Tm
+0 0 Td
+/F6_0 1 Tf
+(Raw) 2 Tj
+[14 0 0 14 300.4 378.13] Tm
+0 0 Td
+/F6_0 1 Tf
+(Matched) 3.835 Tj
+[12 0 0 12 235.65 30.41] Tm
+0 0 Td
+/F6_0 1 Tf
+(Control Units) 5.779 Tj
+[0 12 -12 0 394.09 167.08] Tm
+0 0 Td
+/F6_0 1 Tf
+(Treated Units) 6.002 Tj
+Q
+q
+42.77 261.91 106.65 100.07 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[16 0 0 16 80.09 306.44] Tm
+0 0 Td
+/F6_0 1 Tf
+(re74) 2.001 Tj
+Q
+q
+158.92 261.91 106.65 100.07 re
+W
+Q
+q
+158.92 261.91 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+[1 0 0 1 0 0] Tm
+0 0 Td
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.98 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.05 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.2 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.22 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.29 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.48 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.73 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.8 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.89 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.3 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.43 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.52 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.56 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.61 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.67 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.76 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.01 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.11 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.22 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.39 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.64 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.82 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.89 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.96 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.26 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.32 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.51 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.89 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.09 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.17 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.29 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.37 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.59 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.69 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.01 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.37 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.9 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.22 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.53 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.58 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.76 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.1 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.35 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.52 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.75 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.92 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.3 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.55 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.68 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 170.01 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 170.21 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 170.7 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 171.03 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 171.49 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 171.95 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 172.48 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 172.84 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.11 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.53 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 174.18 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 174.89 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 175.19 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 175.73 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 176.29 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 176.59 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 176.9 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.21 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.32 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 178.56 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 179.16 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 180.79 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 181.62 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 181.81 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 182.36 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 182.96 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.25 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.54 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.65 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.97 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 184.54 265.08] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 184.96 265.2] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 185.26 266.08] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 185.75 266.17] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 186.14 266.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 186.42 266.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 186.65 266.55] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 187.06 267.32] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 187.95 267.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.32 268.44] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.51 269] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 189.78 269.26] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 191.08 269.57] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 191.41 269.57] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 191.83 269.7] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 192.12 269.74] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 192.47 270] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 192.71 270.87] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 193.26 272.27] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 193.37 273.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 194.43 273.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 195.09 273.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 195.61 273.63] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 196.89 274.8] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 198.05 275.14] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 198.42 277.14] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 198.63 278.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 278.46] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 200.93 278.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 201.5 279.99] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 202.4 280.48] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 202.57 280.87] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 203.12 281.02] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.9 281.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 206.02 286.14] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 207.65 286.42] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 208.25 288.11] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 208.65 288.71] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 209.25 288.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.81 289.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 211.37 292.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 212.77 292.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 214.78 294.85] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.85 296.32] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 217.85 296.59] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 219.66 299.87] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 222.07 300.21] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 223.51 300.3] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 224.77 302.05] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 227.34 302.67] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.9 307.05] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 233.81 317.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 233.81 332.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 233.81 356.55] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+Q
+q
+154.17 257.16 116.16 109.57 re
+W
+Q
+q
+158.92 261.91 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+158.92 261.91 m
+265.58 361.97 l
+S
+0.75 w
+[3 5] 0 d
+158.92 271.17 m
+265.58 371.24 l
+S
+158.92 252.64 m
+265.58 352.71 l
+S
+Q
+q
+0 0 424.5 423.75 re
+W
+0 G
+0.75 w
+[] 0 d
+158.92 265.61 m
+158.92 358.16 l
+S
+158.92 265.61 m
+154.17 265.61 l
+S
+158.92 278.84 m
+154.17 278.84 l
+S
+158.92 292.06 m
+154.17 292.06 l
+S
+158.92 305.28 m
+154.17 305.28 l
+S
+158.92 318.5 m
+154.17 318.5 l
+S
+158.92 331.72 m
+154.17 331.72 l
+S
+158.92 344.94 m
+154.17 344.94 l
+S
+158.92 358.16 m
+154.17 358.16 l
+S
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[0 8 -8 0 147.52 263.39] Tm
+0 0 Td
+/F6_0 1 Tf
+(0) 0.556 Tj
+[0 8 -8 0 147.52 280.94] Tm
+0 0 Td
+/F6_0 1 Tf
+(10000) 2.78 Tj
+[0 8 -8 0 147.52 320.6] Tm
+0 0 Td
+/F6_0 1 Tf
+(25000) 2.78 Tj
+158.92 261.91 106.66 100.06 re
+S
+Q
+q
+275.08 261.91 106.65 100.07 re
+W
+Q
+q
+275.08 261.91 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+[1 0 0 1 0 0] Tm
+0 0 Td
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.21 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.21 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.21 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.3 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.35 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.36 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.38 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.45 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.56 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.89 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.91 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.95 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.02 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.06 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.11 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.16 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.18 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.23 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.23 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.46 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.52 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.67 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.73 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.77 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.77 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.81 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.84 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.09 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.26 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.34 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.46 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.56 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.67 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.84 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.98 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.05 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.05 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.06 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.12 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.41 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.43 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.52 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.3 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.48 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.51 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.53 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.65 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.74 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.81 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.91 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.21 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.59 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.91 263.9] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 283.3 265.08] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 283.46 265.2] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 283.68 266.08] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 283.71 266.17] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 283.91 266.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 284.3 266.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 284.49 266.55] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 284.54 267.32] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 284.96 267.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.16 268.44] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.57 269] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.71 269.26] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.79 269.57] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286 269.57] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.27 269.7] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.3 269.74] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.37 270] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 287.16 270.87] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 287.59 272.27] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 289 273.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 290.4 273.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 291.45 273.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 292.45 273.63] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 292.46 274.8] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 292.88 275.14] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 294.79 277.14] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 295.13 278.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 297.77 278.46] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 297.89 278.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 297.91 279.99] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.15 280.48] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.28 280.87] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.53 281.02] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 300.48 281.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 301.15 286.14] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 301.24 286.42] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 301.72 288.11] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 302.29 288.71] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 302.58 288.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 303.22 289.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304 292.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.5 292.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 308.19 294.85] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 310.52 296.32] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 310.78 296.59] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 314.44 299.87] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 314.59 300.21] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.64 300.3] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 318.87 302.05] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 324.2 302.67] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 324.88 307.05] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 325.37 317.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 327.32 332.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 338.85 356.55] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+Q
+q
+270.33 257.16 116.16 109.57 re
+W
+Q
+q
+275.08 261.91 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+275.08 261.91 m
+381.73 361.97 l
+S
+0.75 w
+[3 5] 0 d
+275.08 271.17 m
+381.73 371.24 l
+S
+275.08 252.64 m
+381.73 352.71 l
+S
+Q
+q
+0 0 424.5 423.75 re
+W
+0 G
+0.75 w
+[] 0 d
+275.08 261.91 106.65 100.06 re
+S
+Q
+q
+42.77 152.34 106.65 100.07 re
+W
+Q
+q
+38.02 147.59 116.16 109.57 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[8 0 0 8 86.43 116.22] Tm
+0 0 Td
+/F6_0 1 Tf
+(Index) 2.446 Tj
+[0 8 -8 0 12.36 199.48] Tm
+0 0 Td
+/F6_0 1 Tf
+(xi) 0.722 Tj
+Q
+q
+42.77 152.34 106.65 100.07 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[16 0 0 16 80.09 197.02] Tm
+0 0 Td
+/F6_0 1 Tf
+(re75) 2.001 Tj
+Q
+q
+158.92 152.34 106.65 100.07 re
+W
+Q
+q
+158.92 152.34 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+[1 0 0 1 0 0] Tm
+0 0 Td
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 160.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.06 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.09 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.27 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.44 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.53 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.58 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.66 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.73 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.76 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.84 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 161.9 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.1 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.15 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.2 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.48 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.76 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.8 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.98 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.07 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.18 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.26 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.39 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.5 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 163.87 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.01 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.18 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.3 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.37 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.54 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.7 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.73 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 164.91 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.19 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.32 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.5 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.59 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.69 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 165.9 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.09 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.12 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.25 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.35 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.41 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.58 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.72 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.79 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 166.93 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.03 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.53 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 167.7 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.04 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.34 154.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.4 154.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 168.8 155.12] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.12 155.56] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.62 155.56] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.77 155.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.94 155.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 170.37 155.75] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 170.73 156.18] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 170.88 156.84] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 171.13 157.28] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 171.49 157.28] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 171.81 157.48] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 172.11 157.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 172.24 157.77] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 172.58 157.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.06 157.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.35 158.45] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.54 158.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.6 158.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 173.91 159.06] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 174.32 159.46] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 174.49 159.8] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 174.59 160.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 174.81 160.59] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 175.69 160.64] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 175.97 160.91] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 176.16 161.03] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 176.73 162.54] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.04 162.77] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.48 163.21] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.65 163.26] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.86 163.89] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 178.18 163.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 178.46 163.97] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 178.85 164.12] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 179.13 164.16] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 179.36 164.48] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 179.59 164.57] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 180 164.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 180.51 164.81] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 181.13 165.16] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 181.41 165.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 181.94 165.6] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.19 165.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 183.95 166.45] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 184.21 166.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 184.74 167.41] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 185.28 167.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 185.62 168.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 186.18 169.16] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 186.99 169.36] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 187.7 170.54] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.26 172.31] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.73 173.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 189.46 174.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 189.97 174.67] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 190.22 174.93] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 190.39 175.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 191.04 175.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 191.8 175.69] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 194.07 175.98] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 194.14 176.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 194.43 179.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 196.56 179.66] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.22 180.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 202.25 183.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.55 185.49] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 205.94 186.96] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 208.1 194.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 209.63 196.85] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 212.42 205.3] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 219.73 220.58] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.98 246.98] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+Q
+q
+154.17 147.59 116.16 109.57 re
+W
+Q
+q
+158.92 152.34 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+158.92 152.34 m
+265.58 252.4 l
+S
+0.75 w
+[3 5] 0 d
+158.92 161.6 m
+265.58 261.67 l
+S
+158.92 143.07 m
+265.58 243.14 l
+S
+Q
+q
+0 0 424.5 423.75 re
+W
+0 G
+0.75 w
+[] 0 d
+158.92 156.04 m
+158.92 248.17 l
+S
+158.92 156.04 m
+154.17 156.04 l
+S
+158.92 174.47 m
+154.17 174.47 l
+S
+158.92 192.9 m
+154.17 192.9 l
+S
+158.92 211.32 m
+154.17 211.32 l
+S
+158.92 229.75 m
+154.17 229.75 l
+S
+158.92 248.17 m
+154.17 248.17 l
+S
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[0 8 -8 0 147.52 153.82] Tm
+0 0 Td
+/F6_0 1 Tf
+(0) 0.556 Tj
+[0 8 -8 0 147.52 165.57] Tm
+0 0 Td
+/F6_0 1 Tf
+(5000) 2.224 Tj
+[0 8 -8 0 147.52 200.2] Tm
+0 0 Td
+/F6_0 1 Tf
+(15000) 2.78 Tj
+[0 8 -8 0 147.52 237.05] Tm
+0 0 Td
+/F6_0 1 Tf
+(25000) 2.78 Tj
+158.92 152.34 106.66 100.06 re
+S
+Q
+q
+275.08 152.34 106.65 100.07 re
+W
+Q
+q
+275.08 152.34 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+[1 0 0 1 0 0] Tm
+0 0 Td
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.12 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.24 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.25 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.53 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.88 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.88 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.93 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.05 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.07 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.14 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.17 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.23 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.24 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.26 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.26 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.33 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.85 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 278.92 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.35 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.55 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.55 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.55 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 279.69 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.16 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.24 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.38 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.44 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.49 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.51 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.57 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.62 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.88 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.91 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 280.93 154.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.13 154.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.15 154.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.58 155.12] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 281.77 155.56] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.06 155.56] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.12 155.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.27 155.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.45 155.75] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.55 156.18] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.61 156.84] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.76 157.28] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.79 157.28] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.88 157.48] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.93 157.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 283.45 157.77] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 284.23 157.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 284.5 157.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.25 158.45] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.87 158.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 285.94 158.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.05 159.06] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.05 159.46] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.32 159.8] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.92 160.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 286.97 160.59] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 287.03 160.64] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 287.67 160.91] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 288.2 161.03] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 288.36 162.54] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 288.73 162.77] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 289.07 163.21] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 289.54 163.26] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 289.75 163.89] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 290.15 163.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 290.47 163.97] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 290.75 164.12] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 291.68 164.16] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 292.05 164.48] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 292.17 164.57] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 292.83 164.78] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 293.78 164.81] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 293.86 165.16] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 293.94 165.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 294.06 165.6] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 294.2 165.72] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 294.35 166.45] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 294.63 166.61] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 294.92 167.41] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 295.59 167.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 295.69 168.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 295.78 169.16] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 296.23 169.36] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 297.14 170.54] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 298.86 172.31] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 300.14 173.95] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 300.51 174.47] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 301.51 174.67] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 303.4 174.93] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.34 175.52] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.79 175.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.91 175.69] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 306.03 175.98] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 306.79 176.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 308.04 179.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 310.29 179.66] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 310.31 180.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 310.63 183.33] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 312.71 185.49] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 317.54 186.96] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 318.67 194.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320 196.85] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 325.76 205.3] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 327.18 220.58] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.19 246.98] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+Q
+q
+270.33 147.59 116.16 109.57 re
+W
+Q
+q
+275.08 152.34 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+275.08 152.34 m
+381.73 252.4 l
+S
+0.75 w
+[3 5] 0 d
+275.08 161.6 m
+381.73 261.67 l
+S
+275.08 143.07 m
+381.73 243.14 l
+S
+Q
+q
+0 0 424.5 423.75 re
+W
+0 G
+0.75 w
+[] 0 d
+275.08 152.34 106.65 100.06 re
+S
+Q
+q
+42.77 42.77 106.65 100.07 re
+W
+Q
+q
+38.02 38.02 116.16 109.57 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[8 0 0 8 86.43 6.65] Tm
+0 0 Td
+/F6_0 1 Tf
+(Index) 2.446 Tj
+[0 8 -8 0 12.36 89.91] Tm
+0 0 Td
+/F6_0 1 Tf
+(xi) 0.722 Tj
+Q
+q
+42.77 42.77 106.65 100.07 re
+W
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[16 0 0 16 78.75 87.18] Tm
+0 0 Td
+/F6_0 1 Tf
+(educ) 2.168 Tj
+Q
+q
+158.92 42.77 106.65 100.07 re
+W
+Q
+q
+158.92 42.77 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+[1 0 0 1 0 0] Tm
+0 0 Td
+1 Tr
+[4.94 0 0 4.94 160.92 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 162.71 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 169.98 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.26 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 177.38 70.5] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 180.84 70.5] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 182.86 70.5] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 184.41 75.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.35 80.79] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.35 80.79] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 188.35 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 191.57 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 193.84 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 193.84 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 193.84 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 193.84 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 199.32 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 204.81 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 210.3 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.07 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 215.78 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 219.6 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 221.27 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.04 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 226.75 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 232.24 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 237.73 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 243.21 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 243.21 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 243.21 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 243.21 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 248.7 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 248.7 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 248.7 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 254.18 121.97] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 259.67 127.12] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+Q
+q
+154.17 38.02 116.16 109.57 re
+W
+Q
+q
+158.92 42.77 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+158.92 42.77 m
+265.58 142.83 l
+S
+0.75 w
+[3 5] 0 d
+158.92 52.03 m
+265.58 152.1 l
+S
+158.92 33.5 m
+265.58 133.57 l
+S
+Q
+q
+0 0 424.5 423.75 re
+W
+0 G
+0.75 w
+[] 0 d
+158.92 46.47 m
+158.92 123.69 l
+S
+158.92 46.47 m
+154.17 46.47 l
+S
+158.92 72.21 m
+154.17 72.21 l
+S
+158.92 97.95 m
+154.17 97.95 l
+S
+158.92 123.69 m
+154.17 123.69 l
+S
+[1 0 0 1 0 0] Tm
+0 0 Td
+0 g
+[0 8 -8 0 147.52 44.25] Tm
+0 0 Td
+/F6_0 1 Tf
+(0) 0.556 Tj
+[0 8 -8 0 147.52 69.99] Tm
+0 0 Td
+/F6_0 1 Tf
+(5) 0.556 Tj
+[0 8 -8 0 147.52 93.5] Tm
+0 0 Td
+/F6_0 1 Tf
+(10) 1.112 Tj
+[0 8 -8 0 147.52 119.24] Tm
+0 0 Td
+/F6_0 1 Tf
+(15) 1.112 Tj
+158.92 42.77 106.66 100.06 re
+S
+Q
+q
+275.08 42.77 106.65 100.07 re
+W
+Q
+q
+275.08 42.77 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+[1 0 0 1 0 0] Tm
+0 0 Td
+1 Tr
+[4.94 0 0 4.94 277.08 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 277.08 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.56 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 282.56 65.35] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 288.05 70.5] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 288.05 70.5] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.02 70.5] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.02 75.65] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.02 80.79] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 299.02 80.79] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.51 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.51 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.51 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 304.51 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 309.99 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 309.99 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 309.99 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 309.99 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 309.99 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 309.99 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.48 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.48 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.48 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.48 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.48 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 315.48 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 85.94] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 320.96 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 91.09] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 326.45 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 331.94 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 96.24] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 337.42 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 101.38] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 342.91 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 348.4 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 106.53] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 353.88 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 359.37 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 359.37 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 359.37 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 359.37 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 359.37 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 364.85 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 364.85 111.68] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 364.85 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 364.85 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 364.85 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 370.34 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 370.34 116.83] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 375.83 121.97] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+1 Tr
+[4.94 0 0 4.94 375.83 127.12] Tm
+0 0 Td
+/F11_0 1 Tf
+(l) 0.791 Tj
+0 Tr
+Q
+q
+270.33 38.02 116.16 109.57 re
+W
+Q
+q
+275.08 42.77 106.65 100.07 re
+W
+0 G
+0.75 w
+[] 0 d
+275.08 42.77 m
+381.73 142.83 l
+S
+0.75 w
+[3 5] 0 d
+275.08 52.03 m
+381.73 152.1 l
+S
+275.08 33.5 m
+381.73 133.57 l
+S
+Q
+q
+0 0 424.5 423.75 re
+W
+0 G
+0.75 w
+[] 0 d
+275.08 42.77 106.65 100.06 re
+S
+Q
+showpage
+%%PageTrailer
+pdfEndPage
+%%Trailer
+end
+%%DocumentSuppliedResources:
+%%EOF
diff --git a/inst/doc/figs/qqplotnn.pdf b/inst/doc/figs/qqplotnn.pdf
new file mode 100644
index 0000000..da48472
--- /dev/null
+++ b/inst/doc/figs/qqplotnn.pdf
@@ -0,0 +1,3007 @@
+%PDF-1.1
+%���ρ�
+1 0 obj
+<<
+/CreationDate (D:20050919135633)
+/ModDate (D:20050919135633)
+/Title (R Graphics Output)
+/Producer (R 2.1.1)
+/Creator (R)
+>>
+endobj
+2 0 obj
+<<
+/Type /Catalog
+/Pages 3 0 R
+>>
+endobj
+5 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F1
+/BaseFont /ZapfDingbats
+>>
+endobj
+6 0 obj
+<<
+/Type /Page
+/Parent 3 0 R
+/Contents 7 0 R
+/Resources 4 0 R
+>>
+endobj
+7 0 obj
+<<
+/Length 8 0 R
+>>
+stream
+q
+1.000 1.000 1.000 rg
+0 0 432.00 432.00 re f
+Q q 38.02 262.66 118.66 112.32 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 6.00 0.00 -0.00 6.00 90.10 250.30 Tm (Index) Tj
+/F2 1 Tf 0.00 6.00 -6.00 0.00 31.36 316.65 Tm (xi) Tj
+ET
+Q q
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 14.00 0.00 -0.00 14.00 186.05 405.39 Tm (QQ Plots) Tj
+/F2 1 Tf 14.00 0.00 -0.00 14.00 208.22 386.38 Tm (All) Tj
+/F2 1 Tf 14.00 0.00 -0.00 14.00 306.62 386.38 Tm (Matched) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 240.65 30.41 Tm (Control Units) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 401.59 171.20 Tm (Treated Units) Tj
+ET
+Q q 42.77 267.41 109.15 102.82 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 16.00 0.00 -0.00 16.00 81.34 313.31 Tm (re74) Tj
+ET
+Q q 161.42 267.41 109.15 102.82 re W n
+Q q 161.42 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.57 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.65 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.68 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.80 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.82 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.89 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.08 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.34 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.42 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.50 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.62 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.70 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.93 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.06 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.15 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.19 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.25 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.31 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.39 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.66 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.76 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.87 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.04 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.30 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.48 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.56 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.63 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.94 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.99 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.19 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.57 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.78 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.86 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.99 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.06 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.29 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.40 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.72 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.09 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.63 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.96 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.28 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.33 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.51 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.86 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.11 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.30 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.53 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.70 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.09 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.35 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.48 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.81 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.02 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.52 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.86 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.33 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.80 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.34 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.72 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.99 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.42 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.08 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.81 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.12 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.67 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.25 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.55 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.87 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.19 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.30 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.57 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.18 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.84 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.70 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.89 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.45 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.07 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.19 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.37 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.67 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.77 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.10 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.69 270.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.12 270.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.43 271.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.93 271.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.32 272.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.61 272.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.85 272.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.27 273.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.18 273.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.55 274.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.74 274.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 193.05 275.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.38 275.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.71 275.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 195.15 275.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 195.45 275.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 195.81 275.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 196.04 276.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 196.61 278.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 196.72 279.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.80 279.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 198.48 279.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 199.01 279.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 200.33 280.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 201.52 281.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 201.89 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.11 284.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.81 284.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.46 284.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 205.04 286.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 205.97 286.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 206.14 286.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 206.70 287.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.52 287.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.67 292.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.34 292.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.95 294.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.37 294.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.98 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.57 295.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.15 298.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.58 299.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.63 301.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.73 302.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.77 303.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.63 306.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.09 306.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.57 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.86 308.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.49 309.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.18 313.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.11 324.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.11 339.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.11 364.70 Tm (l) Tj 0 Tr
+ET
+Q q 156.67 262.66 118.66 112.32 re W n
+Q q 161.42 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 267.41 m 270.58 370.22 l S
+0.75 w
+[ 3.00 5.00] 0 d
+161.42 276.93 m 270.58 379.74 l S
+161.42 257.89 m 270.58 360.70 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 271.22 m 161.42 366.31 l S
+161.42 271.22 m 156.67 271.22 l S
+161.42 284.80 m 156.67 284.80 l S
+161.42 298.38 m 156.67 298.38 l S
+161.42 311.97 m 156.67 311.97 l S
+161.42 325.55 m 156.67 325.55 l S
+161.42 339.14 m 156.67 339.14 l S
+161.42 352.72 m 156.67 352.72 l S
+161.42 366.31 m 156.67 366.31 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 270.10 Tm (0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 280.35 Tm (5000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 292.82 Tm (10000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 319.99 Tm (20000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 347.16 Tm (30000) Tj
+ET
+161.42 267.41 m
+270.58 267.41 l
+270.58 370.22 l
+161.42 370.22 l
+161.42 267.41 l
+S
+Q q 280.08 267.41 109.15 102.82 re W n
+Q q 280.08 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.30 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.31 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.31 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.40 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.44 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.46 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.48 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.55 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.67 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.00 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.02 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.07 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.14 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.17 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.23 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.28 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.30 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.35 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.35 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.58 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.65 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.80 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.86 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.90 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.90 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.94 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.98 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.22 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.33 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.40 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.48 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.60 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.71 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.82 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.99 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.14 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.21 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.21 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.22 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.28 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.58 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.60 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.69 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.50 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.68 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.72 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.85 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.94 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.02 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.11 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.42 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.81 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.14 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.54 269.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.71 270.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.93 270.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.96 271.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.16 271.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.57 272.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.75 272.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.81 272.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.24 273.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.44 273.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.87 274.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.01 274.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.09 275.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.31 275.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.58 275.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.61 275.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.68 275.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.49 275.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.93 276.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.37 278.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.81 279.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.88 279.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.90 279.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.92 279.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.34 280.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.30 281.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.64 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.34 284.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.47 284.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.49 284.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.76 286.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.89 286.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.15 286.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.12 287.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.81 287.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.90 292.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.39 292.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.97 294.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.27 294.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.92 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.73 295.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.05 298.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.23 299.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 314.01 301.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 316.40 302.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 316.66 303.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 320.40 306.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 320.56 306.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.64 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 324.94 308.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 330.40 309.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 331.09 313.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 331.59 324.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 333.59 339.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 345.39 364.70 Tm (l) Tj 0 Tr
+ET
+Q q 275.33 262.66 118.66 112.32 re W n
+Q q 280.08 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 267.41 m 389.23 370.22 l S
+0.75 w
+[ 3.00 5.00] 0 d
+280.08 276.93 m 389.23 379.74 l S
+280.08 257.89 m 389.23 360.70 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 267.41 m
+389.23 267.41 l
+389.23 370.22 l
+280.08 370.22 l
+280.08 267.41 l
+S
+Q q 42.77 155.09 109.15 102.82 re W n
+Q q 38.02 150.34 118.66 112.32 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 6.00 0.00 -0.00 6.00 90.10 137.98 Tm (Index) Tj
+/F2 1 Tf 0.00 6.00 -6.00 0.00 31.36 204.33 Tm (xi) Tj
+ET
+Q q 42.77 155.09 109.15 102.82 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 16.00 0.00 -0.00 16.00 81.34 201.14 Tm (re75) Tj
+ET
+Q q 161.42 155.09 109.15 102.82 re W n
+Q q 161.42 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.66 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.69 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.87 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.04 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.13 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.19 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.34 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.37 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.46 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.52 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.62 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.70 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.72 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.77 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.82 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.11 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.40 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.43 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.63 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.71 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.82 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.91 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.05 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.15 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.54 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.68 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.85 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.97 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.05 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.22 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.38 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.42 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.59 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.88 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.02 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.20 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.29 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.39 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.61 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.80 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.84 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.97 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.07 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.13 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.31 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.45 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.52 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.66 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.76 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.27 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.46 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.80 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.11 157.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.17 157.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.57 158.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.91 158.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.42 158.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.57 158.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.74 158.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.18 158.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.55 159.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.70 159.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.96 160.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.33 160.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.66 160.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.97 160.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.10 160.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.44 160.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.93 160.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.24 161.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.43 161.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.49 161.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.81 162.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.22 162.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.40 162.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.51 163.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.73 163.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.63 163.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.92 163.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.11 164.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.69 165.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.02 165.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.47 166.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.64 166.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.85 167.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.18 167.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.46 167.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.86 167.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.15 167.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.39 167.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.62 167.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.04 167.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.56 167.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.20 168.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.49 168.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.03 168.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.31 168.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.08 169.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.35 169.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.89 170.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.45 171.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.80 171.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.37 172.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.19 172.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.92 173.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.49 175.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.98 177.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.72 177.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 193.25 178.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 193.50 178.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 193.68 178.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.33 179.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 195.11 179.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.44 179.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.52 180.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.81 182.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 199.98 183.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.71 183.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 205.82 186.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.16 189.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.59 190.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.80 198.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.36 200.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.22 209.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.70 225.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.26 252.38 Tm (l) Tj 0 Tr
+ET
+Q q 156.67 150.34 118.66 112.32 re W n
+Q q 161.42 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 155.09 m 270.58 257.90 l S
+0.75 w
+[ 3.00 5.00] 0 d
+161.42 164.61 m 270.58 267.42 l S
+161.42 145.57 m 270.58 248.38 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 158.90 m 161.42 253.56 l S
+161.42 158.90 m 156.67 158.90 l S
+161.42 177.83 m 156.67 177.83 l S
+161.42 196.76 m 156.67 196.76 l S
+161.42 215.69 m 156.67 215.69 l S
+161.42 234.63 m 156.67 234.63 l S
+161.42 253.56 m 156.67 253.56 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 157.78 Tm (0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 173.38 Tm (5000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 191.20 Tm (10000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 210.13 Tm (15000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 229.07 Tm (20000) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 248.00 Tm (25000) Tj
+ET
+161.42 155.09 m
+270.58 155.09 l
+270.58 257.90 l
+161.42 257.90 l
+161.42 155.09 l
+S
+Q q 280.08 155.09 109.15 102.82 re W n
+Q q 280.08 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.21 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.34 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.35 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.63 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.00 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.00 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.04 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.17 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.19 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.26 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.28 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.35 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.36 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.38 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.38 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.46 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.98 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.05 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.06 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.49 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.70 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.70 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.70 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.85 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.33 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.41 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.55 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.62 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.66 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.68 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.74 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.80 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.06 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.09 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.11 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.31 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.33 157.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.78 157.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.98 157.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.27 158.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.33 158.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.49 158.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.67 158.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.77 158.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.83 158.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.99 159.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.01 159.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.11 160.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.16 160.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.70 160.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.49 160.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.77 160.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.54 160.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.17 160.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.24 161.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.35 161.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.36 161.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.62 162.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.24 162.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.29 162.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.36 163.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.01 163.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.55 163.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.72 163.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.10 164.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.45 165.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.92 165.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.14 166.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.55 166.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.88 167.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.16 167.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.12 167.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.50 167.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.61 167.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.29 167.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.69 167.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.27 167.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.35 167.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.43 168.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.55 168.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.70 168.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.84 168.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.13 169.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.43 169.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.12 170.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.22 171.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.31 171.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.77 172.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.71 172.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.46 173.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.77 175.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.15 177.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.18 177.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.11 178.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.08 178.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.53 178.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.66 179.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.80 179.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 312.58 179.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.86 180.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 316.17 182.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 316.18 183.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 316.51 183.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 318.63 186.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 323.58 189.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 324.74 190.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 326.10 198.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 326.81 200.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.00 209.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 333.44 225.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 337.55 252.38 Tm (l) Tj 0 Tr
+ET
+Q q 275.33 150.34 118.66 112.32 re W n
+Q q 280.08 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 155.09 m 389.23 257.90 l S
+0.75 w
+[ 3.00 5.00] 0 d
+280.08 164.61 m 389.23 267.42 l S
+280.08 145.57 m 389.23 248.38 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 155.09 m
+389.23 155.09 l
+389.23 257.90 l
+280.08 257.90 l
+280.08 155.09 l
+S
+Q q 42.77 42.77 109.15 102.82 re W n
+Q q 38.02 38.02 118.66 112.32 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 6.00 0.00 -0.00 6.00 90.10 25.66 Tm (Index) Tj
+/F2 1 Tf 0.00 6.00 -6.00 0.00 31.36 92.01 Tm (xi) Tj
+ET
+Q q 42.77 42.77 109.15 102.82 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 16.00 0.00 -0.00 16.00 80.00 88.55 Tm (educ) Tj
+ET
+Q q 161.42 42.77 109.15 102.82 re W n
+Q q 161.42 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.34 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.79 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.23 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.36 71.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.90 71.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.97 71.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.56 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.59 81.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.59 81.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.59 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.88 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.82 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 208.43 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.05 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.66 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.57 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.27 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.16 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.50 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.12 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 247.73 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 247.73 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 247.73 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 247.73 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 253.35 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 253.35 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 253.35 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 258.96 124.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 264.58 129.49 Tm (l) Tj 0 Tr
+ET
+Q q 156.67 38.02 118.66 112.32 re W n
+Q q 161.42 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 42.77 m 270.58 145.58 l S
+0.75 w
+[ 3.00 5.00] 0 d
+161.42 52.29 m 270.58 155.10 l S
+161.42 33.25 m 270.58 136.06 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 46.58 m 161.42 125.91 l S
+161.42 46.58 m 156.67 46.58 l S
+161.42 73.02 m 156.67 73.02 l S
+161.42 99.46 m 156.67 99.46 l S
+161.42 125.91 m 156.67 125.91 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 45.46 Tm (0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 71.91 Tm (5) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 97.24 Tm (10) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 123.69 Tm (15) Tj
+ET
+161.42 42.77 m
+270.58 42.77 l
+270.58 145.58 l
+161.42 145.58 l
+161.42 42.77 l
+S
+Q q 280.08 42.77 109.15 102.82 re W n
+Q q 280.08 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.78 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.78 66.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.40 71.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.40 71.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.63 71.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.63 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.63 81.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.63 81.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.24 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.24 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.24 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.47 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.47 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.47 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.47 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.47 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.47 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 87.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.09 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 92.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 332.70 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 338.32 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 97.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 343.93 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.16 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.78 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.39 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.39 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.39 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.39 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.39 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.00 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.00 113.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.00 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.00 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.00 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.62 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.62 118.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 383.23 124.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 383.23 129.49 Tm (l) Tj 0 Tr
+ET
+Q q 275.33 38.02 118.66 112.32 re W n
+Q q 280.08 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 42.77 m 389.23 145.58 l S
+0.75 w
+[ 3.00 5.00] 0 d
+280.08 52.29 m 389.23 155.10 l S
+280.08 33.25 m 389.23 136.06 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 42.77 m
+389.23 42.77 l
+389.23 145.58 l
+280.08 145.58 l
+280.08 42.77 l
+S
+Q
+endstream
+endobj
+8 0 obj
+69233
+endobj
+9 0 obj
+<<
+/Type /Page
+/Parent 3 0 R
+/Contents 10 0 R
+/Resources 4 0 R
+>>
+endobj
+10 0 obj
+<<
+/Length 11 0 R
+>>
+stream
+q
+1.000 1.000 1.000 rg
+0 0 432.00 432.00 re f
+Q q 42.77 267.41 109.15 102.82 re W n
+Q q 38.02 262.66 118.66 112.32 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 6.00 0.00 -0.00 6.00 90.10 250.30 Tm (Index) Tj
+/F2 1 Tf 0.00 6.00 -6.00 0.00 31.36 316.65 Tm (xi) Tj
+ET
+Q q
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 14.00 0.00 -0.00 14.00 186.05 405.39 Tm (QQ Plots) Tj
+/F2 1 Tf 14.00 0.00 -0.00 14.00 208.22 386.38 Tm (All) Tj
+/F2 1 Tf 14.00 0.00 -0.00 14.00 306.62 386.38 Tm (Matched) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 240.65 30.41 Tm (Control Units) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 401.59 171.20 Tm (Treated Units) Tj
+ET
+Q q 42.77 267.41 109.15 102.82 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 16.00 0.00 -0.00 16.00 78.99 313.19 Tm (black) Tj
+ET
+Q q 161.42 267.41 109.15 102.82 re W n
+Q q 161.42 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 271.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.65 272.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.72 272.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.31 273.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.70 273.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.94 274.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.14 274.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.41 275.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.70 277.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.80 278.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.04 279.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.13 280.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.27 281.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.43 284.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.62 284.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.83 285.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.11 286.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.46 287.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.57 288.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.70 288.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.77 289.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.84 291.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.96 292.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.28 292.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.43 292.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.54 294.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.59 295.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.66 295.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.81 295.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.03 337.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.09 338.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.41 338.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.85 338.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.08 338.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.34 338.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.73 339.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.87 339.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.26 339.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.42 339.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.49 339.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.58 340.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.75 340.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.93 340.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.98 340.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.06 341.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.26 341.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.51 341.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.78 342.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.87 342.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.95 342.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.02 342.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.26 342.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.42 342.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.55 342.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.81 342.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.99 343.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.18 343.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.57 343.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.68 344.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.71 344.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.88 344.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.01 344.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.19 344.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.32 344.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.46 345.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.70 345.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.08 345.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.12 345.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.28 345.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.37 346.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.66 346.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.81 346.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.02 346.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.69 346.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.82 346.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.00 346.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.18 346.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.36 347.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.59 347.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.93 347.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.11 347.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.26 347.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.44 347.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.52 347.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.70 347.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.89 348.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.24 348.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.33 348.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.46 348.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.50 348.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.87 348.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.95 348.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.20 348.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.49 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.11 348.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.24 349.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.67 349.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.91 349.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.07 349.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.30 349.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.35 349.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.56 350.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.65 350.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.73 350.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.80 350.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.90 350.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.05 351.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.22 351.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.36 351.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.68 351.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.93 351.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.09 352.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.45 352.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.70 352.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.92 352.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.94 352.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.02 352.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.17 353.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.35 353.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.42 353.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.52 353.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.76 353.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.98 353.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.13 353.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.41 353.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.73 353.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.13 354.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.21 354.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.41 355.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.56 355.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.69 355.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.05 355.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.18 356.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.39 356.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.65 356.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.89 356.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.06 356.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.19 356.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.34 357.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.48 357.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.57 357.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.82 357.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.09 357.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.40 357.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.54 357.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.63 357.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.87 357.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.13 358.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.41 358.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.64 358.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.82 358.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.98 358.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.56 358.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.52 359.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.47 359.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.09 359.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.83 359.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.90 359.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 243.62 359.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 244.24 359.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 245.71 360.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 247.39 360.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 248.86 361.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 250.04 361.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 250.55 362.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 251.06 362.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 251.28 362.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 251.95 362.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 252.03 362.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 252.94 362.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 253.45 362.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 254.67 363.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 254.97 363.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 255.57 363.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 255.95 363.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.91 364.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 258.70 364.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.66 364.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 260.10 364.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.23 364.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.96 364.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 262.60 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 262.72 364.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.50 364.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 264.48 364.70 Tm (l) Tj 0 Tr
+ET
+Q q 156.67 262.66 118.66 112.32 re W n
+Q q 161.42 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 267.41 m 270.58 370.22 l S
+0.75 w
+[ 3.00 5.00] 0 d
+161.42 276.93 m 270.58 379.74 l S
+161.42 257.89 m 270.58 360.70 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 271.12 m 161.42 366.42 l S
+161.42 271.12 m 156.67 271.12 l S
+161.42 284.74 m 156.67 284.74 l S
+161.42 298.35 m 156.67 298.35 l S
+161.42 311.96 m 156.67 311.96 l S
+161.42 325.58 m 156.67 325.58 l S
+161.42 339.19 m 156.67 339.19 l S
+161.42 352.80 m 156.67 352.80 l S
+161.42 366.42 m 156.67 366.42 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 267.18 Tm (-0.2) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 281.96 Tm (0.0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 295.57 Tm (0.2) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 309.18 Tm (0.4) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 322.80 Tm (0.6) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 336.41 Tm (0.8) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 350.02 Tm (1.0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 363.64 Tm (1.2) Tj
+ET
+161.42 267.41 m
+270.58 267.41 l
+270.58 370.22 l
+161.42 370.22 l
+161.42 267.41 l
+S
+Q q 280.08 267.41 109.15 102.82 re W n
+Q q 280.08 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.70 271.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.92 271.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.58 274.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.98 275.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.66 275.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.71 276.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.78 277.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.71 277.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.79 278.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.87 279.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.40 280.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.56 281.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.56 282.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.69 284.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.74 284.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.81 284.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.50 286.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.50 286.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.57 287.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.63 287.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.67 288.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.15 289.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.98 291.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.30 292.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.68 294.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.70 294.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.77 295.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.77 295.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.85 296.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.93 337.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.29 338.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.45 338.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.58 338.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.09 338.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.61 338.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.98 338.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.00 339.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.08 339.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.11 339.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.19 339.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.22 339.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.01 339.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.96 340.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.18 340.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.67 340.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.86 340.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.13 340.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.33 341.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.45 341.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.55 341.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.64 341.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.86 341.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.34 342.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.46 342.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.80 342.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.91 342.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.27 342.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.64 342.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.80 343.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.01 343.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.09 343.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.42 343.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.45 344.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.99 344.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.31 344.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.54 344.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.34 344.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.44 344.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.85 345.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.42 345.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.46 345.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.97 345.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.98 346.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.44 346.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.47 346.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.84 346.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.84 346.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.91 346.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.97 347.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.30 347.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.59 347.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.88 347.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.52 347.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.57 347.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.97 347.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.97 348.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.02 348.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.19 348.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.48 348.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.99 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 348.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.26 348.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.35 348.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.36 348.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.79 349.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.79 349.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.85 349.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.25 349.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 354.47 349.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 354.72 349.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 354.97 349.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.02 350.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.28 350.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.38 350.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.90 350.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.28 350.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.61 350.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.06 351.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.25 351.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.27 351.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.95 351.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 358.08 351.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 358.14 351.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 359.30 351.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.42 352.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.81 352.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 360.97 352.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 361.77 352.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 361.89 352.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.10 352.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.26 352.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.52 353.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 363.07 353.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 363.97 353.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 364.01 353.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 364.48 353.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 364.71 353.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 364.74 353.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 365.24 353.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 365.48 354.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 365.81 354.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.52 354.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.79 354.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 367.51 354.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 368.01 354.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 368.04 354.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 368.82 354.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 369.26 355.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 369.57 355.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 369.64 355.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 369.68 355.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.18 355.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.29 355.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.64 356.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.77 356.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.94 356.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 371.73 356.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 371.85 356.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 371.92 356.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 371.93 356.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.40 357.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.67 357.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.02 358.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.10 358.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.27 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.35 358.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.43 358.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.88 358.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.90 358.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.94 359.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.99 359.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 374.26 359.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 374.32 360.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 374.58 360.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 374.72 360.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.35 360.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.55 360.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.84 360.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 376.26 361.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 376.43 361.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 376.86 361.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 376.97 361.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.71 361.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.80 361.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.22 362.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.48 362.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.75 362.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 379.88 363.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 379.97 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 380.04 363.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 380.23 363.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 380.53 363.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 381.61 363.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 381.97 363.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 382.66 364.17 Tm (l) Tj 0 Tr
+ET
+Q q 275.33 262.66 118.66 112.32 re W n
+Q q 280.08 267.41 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 267.41 m 389.23 370.22 l S
+0.75 w
+[ 3.00 5.00] 0 d
+280.08 276.93 m 389.23 379.74 l S
+280.08 257.89 m 389.23 360.70 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 267.41 m
+389.23 267.41 l
+389.23 370.22 l
+280.08 370.22 l
+280.08 267.41 l
+S
+Q q 42.77 155.09 109.15 102.82 re W n
+Q q 38.02 150.34 118.66 112.32 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 6.00 0.00 -0.00 6.00 90.10 137.98 Tm (Index) Tj
+/F2 1 Tf 0.00 6.00 -6.00 0.00 31.36 204.33 Tm (xi) Tj
+ET
+Q q 42.77 155.09 109.15 102.82 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 16.00 0.00 -0.00 16.00 73.78 202.41 Tm (hispan) Tj
+ET
+Q q 161.42 155.09 109.15 102.82 re W n
+Q q 161.42 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 157.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.52 157.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.64 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.78 157.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.88 157.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.06 157.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.43 158.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.53 158.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.83 158.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.02 158.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.16 158.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.49 158.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.65 159.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 165.86 159.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.04 159.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.25 159.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.47 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.54 160.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.59 160.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.93 160.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.16 160.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.51 160.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.73 161.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.83 161.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 167.98 161.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.16 161.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.29 161.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.52 161.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.66 161.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.84 161.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.95 161.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.05 161.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.21 162.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.29 162.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.39 162.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.75 162.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 169.99 162.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.10 162.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.47 162.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.78 162.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 170.89 162.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.00 163.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.15 163.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.39 163.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.45 163.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.56 163.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.01 163.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.29 164.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.43 164.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.59 164.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.82 164.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.88 164.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 172.97 164.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.34 164.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.45 164.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.71 165.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.97 165.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.45 165.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.59 165.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 174.70 165.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.02 165.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.21 166.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.31 166.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.42 166.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.62 166.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 175.75 166.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.02 166.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.18 166.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.45 166.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.54 167.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.79 167.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.88 167.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.11 167.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.39 167.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.66 168.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 177.81 168.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.01 168.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.08 168.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.12 168.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.30 168.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.52 168.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.83 169.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.87 169.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 178.91 169.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.00 169.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.15 169.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.23 169.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.44 169.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.71 169.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.92 169.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.96 169.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.14 169.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.38 169.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.53 170.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 180.65 170.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.13 170.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.28 170.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.31 171.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.39 171.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.66 171.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.90 171.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.23 171.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.43 171.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 182.94 171.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.02 172.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.45 172.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.65 172.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.88 172.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.93 172.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.15 173.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.50 173.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.65 173.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.70 173.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.78 173.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.85 173.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.06 173.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.21 173.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.34 173.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.62 173.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.83 173.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.97 173.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.11 174.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.28 174.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.38 174.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.62 174.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.01 175.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.14 175.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.29 175.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.41 175.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.50 176.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.56 176.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.80 176.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.13 176.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.22 176.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.34 176.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.74 177.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.79 177.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.01 177.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.23 178.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 178.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.49 178.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.61 178.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.67 178.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.74 179.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.06 179.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.12 179.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.23 179.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.27 179.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.42 180.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.45 180.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.61 180.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.91 180.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.03 180.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.28 180.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.51 181.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.57 181.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.65 181.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.94 181.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.09 181.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.16 182.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.83 182.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.96 182.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.48 182.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.73 183.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 243.87 183.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 244.21 183.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 245.80 183.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 246.18 183.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 246.90 183.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 247.56 183.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 249.57 183.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 250.34 184.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 251.56 184.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 252.31 184.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 252.78 226.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 254.30 228.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 254.72 233.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 255.50 235.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.70 240.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 257.33 241.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 258.29 243.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 260.96 249.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.85 250.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 262.42 251.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.79 252.38 Tm (l) Tj 0 Tr
+ET
+Q q 156.67 150.34 118.66 112.32 re W n
+Q q 161.42 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 155.09 m 270.58 257.90 l S
+0.75 w
+[ 3.00 5.00] 0 d
+161.42 164.61 m 270.58 267.42 l S
+161.42 145.57 m 270.58 248.38 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 158.85 m 161.42 254.25 l S
+161.42 158.85 m 156.67 158.85 l S
+161.42 172.48 m 156.67 172.48 l S
+161.42 186.11 m 156.67 186.11 l S
+161.42 199.74 m 156.67 199.74 l S
+161.42 213.37 m 156.67 213.37 l S
+161.42 227.00 m 156.67 227.00 l S
+161.42 240.63 m 156.67 240.63 l S
+161.42 254.25 m 156.67 254.25 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 154.90 Tm (-0.2) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 169.70 Tm (0.0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 183.33 Tm (0.2) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 196.96 Tm (0.4) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 210.59 Tm (0.6) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 224.22 Tm (0.8) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 237.85 Tm (1.0) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 251.47 Tm (1.2) Tj
+ET
+161.42 155.09 m
+270.58 155.09 l
+270.58 257.90 l
+161.42 257.90 l
+161.42 155.09 l
+S
+Q q 280.08 155.09 109.15 102.82 re W n
+Q q 280.08 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.14 157.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.36 157.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.48 158.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.63 158.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.71 158.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.00 158.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.21 158.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.41 158.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.43 158.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 283.68 158.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.12 158.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.17 158.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.43 158.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.46 159.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 159.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.43 159.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.59 159.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.59 159.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.64 159.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.82 159.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.89 159.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.13 159.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.16 160.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.26 160.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.47 160.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.49 160.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.72 160.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 286.74 160.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.14 161.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.24 161.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.45 161.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.47 161.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.75 161.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.91 161.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.08 161.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.28 161.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 288.99 161.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.02 161.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.05 161.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.18 162.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.29 162.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.38 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.61 162.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.83 162.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.84 162.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.29 162.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.34 162.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.91 163.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.26 163.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.29 163.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.40 163.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.80 163.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 291.96 163.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.00 164.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.05 164.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.07 164.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.26 164.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.43 164.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.66 164.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.76 164.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.77 165.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.83 165.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.87 165.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.94 165.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.97 166.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.13 166.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.28 166.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.75 166.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 293.78 166.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.39 166.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.52 166.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 167.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.23 167.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.26 167.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.61 167.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.63 168.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.05 168.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.13 168.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.51 168.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.63 169.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.66 169.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.69 169.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 296.90 169.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.07 169.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.08 169.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.47 169.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.78 170.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.13 170.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.67 170.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.77 170.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.78 170.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.84 170.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.95 170.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 298.97 171.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.08 171.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.36 171.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.66 171.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.15 171.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.34 171.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.71 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.11 171.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.71 172.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.75 172.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.92 172.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.04 172.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.14 172.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.40 173.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.66 173.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.77 173.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.96 173.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.68 173.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.73 173.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 303.91 173.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.05 174.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.19 174.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.31 174.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.33 174.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.88 174.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.51 174.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.11 175.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.19 175.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.20 175.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.42 175.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.65 175.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 307.78 176.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.50 176.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.82 176.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.00 176.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.70 176.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.14 177.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.23 177.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.40 177.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.51 177.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.96 177.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 354.53 177.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 354.75 177.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 355.75 178.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.60 178.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.36 178.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.55 178.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 359.86 178.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 361.17 178.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 361.19 179.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 361.77 179.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 361.99 179.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.56 179.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.71 180.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 364.16 180.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 364.65 180.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.05 180.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 366.13 180.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 367.06 180.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 367.37 181.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 368.34 181.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 368.87 181.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.27 181.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.48 181.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.80 181.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 371.18 181.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.03 182.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.27 182.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.90 182.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.17 182.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.31 182.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.49 182.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.74 183.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 373.80 183.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 374.69 183.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.01 183.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.71 183.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.73 183.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 376.18 183.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 376.39 183.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.04 184.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.70 226.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.75 227.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 377.99 228.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.18 229.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.34 233.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 380.01 234.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 380.40 243.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 381.22 246.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 381.37 246.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 381.85 248.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 382.96 252.37 Tm (l) Tj 0 Tr
+ET
+Q q 275.33 150.34 118.66 112.32 re W n
+Q q 280.08 155.09 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 155.09 m 389.23 257.90 l S
+0.75 w
+[ 3.00 5.00] 0 d
+280.08 164.61 m 389.23 267.42 l S
+280.08 145.57 m 389.23 248.38 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 155.09 m
+389.23 155.09 l
+389.23 257.90 l
+280.08 257.90 l
+280.08 155.09 l
+S
+Q q 42.77 42.77 109.15 102.82 re W n
+Q q 38.02 38.02 118.66 112.32 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 6.00 0.00 -0.00 6.00 90.10 25.66 Tm (Index) Tj
+/F2 1 Tf 0.00 6.00 -6.00 0.00 31.36 92.01 Tm (xi) Tj
+ET
+Q q 42.77 42.77 109.15 102.82 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 16.00 0.00 -0.00 16.00 84.00 91.63 Tm (age) Tj
+ET
+Q q 161.42 42.77 109.15 102.82 re W n
+Q q 161.42 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 163.51 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.10 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 168.69 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.29 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 173.88 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 176.47 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 179.06 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 181.65 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 183.51 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.24 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.24 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.24 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.24 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 184.24 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.99 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.83 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.57 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.43 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.43 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.43 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.43 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.79 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.02 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.02 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.02 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.02 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.02 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.02 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.52 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.61 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.61 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.61 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.61 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 197.20 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 199.79 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 199.79 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 199.79 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.38 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.38 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 202.38 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 203.45 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.98 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.98 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.98 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.57 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.68 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.16 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.16 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.21 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.75 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.75 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.75 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.34 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.34 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.34 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.13 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.93 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.93 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.52 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.52 79.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.12 79.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.12 79.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.12 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.12 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.74 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.71 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.71 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.71 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.71 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.96 83.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.81 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.89 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.34 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.48 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 235.62 91.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.66 91.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 238.66 91.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 241.26 96.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 241.26 96.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 243.85 98.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 243.85 98.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 243.85 98.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 246.44 103.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 246.44 103.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 249.03 105.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 250.10 105.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 251.62 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 251.62 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 252.64 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 254.21 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.80 110.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 257.76 113.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.40 115.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.99 118.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 264.58 118.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 264.58 118.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 264.58 122.98 Tm (l) Tj 0 Tr
+ET
+Q q 156.67 38.02 118.66 112.32 re W n
+Q q 161.42 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 42.77 m 270.58 145.58 l S
+0.75 w
+[ 3.00 5.00] 0 d
+161.42 52.29 m 270.58 155.10 l S
+161.42 33.25 m 270.58 136.06 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+161.42 56.34 m 161.42 129.57 l S
+161.42 56.34 m 156.67 56.34 l S
+161.42 80.75 m 156.67 80.75 l S
+161.42 105.16 m 156.67 105.16 l S
+161.42 129.57 m 156.67 129.57 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 54.12 Tm (20) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 78.53 Tm (30) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 102.94 Tm (40) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 154.77 127.35 Tm (50) Tj
+ET
+161.42 42.77 m
+270.58 42.77 l
+270.58 145.58 l
+161.42 145.58 l
+161.42 42.77 l
+S
+Q q 280.08 42.77 109.15 102.82 re W n
+Q q 280.08 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 47.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.17 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 49.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 284.76 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 52.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 54.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.35 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 57.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 289.94 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 59.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.53 61.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 64.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 295.13 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.72 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.31 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.31 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.31 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.31 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.31 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 300.31 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.90 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.90 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.90 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.90 66.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 302.90 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 305.49 69.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 308.08 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 310.67 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.27 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.27 71.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.27 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 315.86 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 318.45 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 318.45 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.04 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.04 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 321.04 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 323.63 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 323.63 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 323.63 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 323.63 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 326.22 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 326.22 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 328.81 79.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 328.81 79.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 328.81 79.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 334.00 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 334.00 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 334.00 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 334.00 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 336.59 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 336.59 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 336.59 81.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 336.59 83.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 339.18 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 341.77 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 341.77 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 344.36 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 344.36 86.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 344.36 91.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 344.36 91.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 91.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 96.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 349.55 96.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 357.32 98.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 359.91 98.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 359.91 98.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.50 103.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.50 103.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 362.50 105.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 365.09 105.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 365.09 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 365.09 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.28 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 370.28 108.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.87 110.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 372.87 113.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.46 115.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 375.46 118.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.05 118.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 378.05 118.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 383.23 122.98 Tm (l) Tj 0 Tr
+ET
+Q q 275.33 38.02 118.66 112.32 re W n
+Q q 280.08 42.77 109.15 102.82 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 42.77 m 389.23 145.58 l S
+0.75 w
+[ 3.00 5.00] 0 d
+280.08 52.29 m 389.23 155.10 l S
+280.08 33.25 m 389.23 136.06 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+280.08 42.77 m
+389.23 42.77 l
+389.23 145.58 l
+280.08 145.58 l
+280.08 42.77 l
+S
+Q
+endstream
+endobj
+11 0 obj
+69450
+endobj
+3 0 obj
+<<
+/Type /Pages
+/Kids [
+6 0 R
+9 0 R
+]
+/Count 2
+/MediaBox [0 0 432 432]
+>>
+endobj
+4 0 obj
+<<
+/ProcSet [/PDF /Text]
+/Font << /F1 5 0 R /F2 13 0 R /F3 14 0 R /F4 15 0 R /F5 16 0 R /F6 17 0 R >>
+/ExtGState << >>
+>>
+endobj
+12 0 obj
+<<
+/Type /Encoding
+/BaseEncoding /WinAnsiEncoding
+/Differences [ 45/minus 96/quoteleft
+144/dotlessi /grave /acute /circumflex /tilde /macron /breve /dotaccent
+/dieresis /.notdef /ring /cedilla /.notdef /hungarumlaut /ogonek /caron /space]
+>>
+endobj
+13 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F2
+/BaseFont /Helvetica
+/Encoding 12 0 R
+>>
+endobj
+14 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F3
+/BaseFont /Helvetica-Bold
+/Encoding 12 0 R
+>>
+endobj
+15 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F4
+/BaseFont /Helvetica-Oblique
+/Encoding 12 0 R
+>>
+endobj
+16 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F5
+/BaseFont /Helvetica-BoldOblique
+/Encoding 12 0 R
+>>
+endobj
+17 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F6
+/BaseFont /Symbol
+>>
+endobj
+xref
+0 18
+0000000000 65535 f 
+0000000020 00000 n 
+0000000162 00000 n 
+0000139289 00000 n 
+0000139378 00000 n 
+0000000211 00000 n 
+0000000294 00000 n 
+0000000374 00000 n 
+0000069660 00000 n 
+0000069681 00000 n 
+0000069762 00000 n 
+0000139267 00000 n 
+0000139515 00000 n 
+0000139773 00000 n 
+0000139871 00000 n 
+0000139974 00000 n 
+0000140080 00000 n 
+0000140190 00000 n 
+trailer
+<<
+/Size 18
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+140268
+%%EOF
diff --git a/inst/doc/figs/qqplotnn1.eps b/inst/doc/figs/qqplotnn1.eps
new file mode 100644
index 0000000..21833fe
--- /dev/null
+++ b/inst/doc/figs/qqplotnn1.eps
@@ -0,0 +1,1594 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 198 198 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 198 198
+%%EndComments
+%%BeginProlog
+/bp  { gs gs } def
+% begin .ps.prolog
+/gs  { gsave } def
+/gr  { grestore } def
+/ep  { showpage gr gr } def
+/m   { moveto } def
+/l  { rlineto } def
+/np  { newpath } def
+/cp  { closepath } def
+/f   { fill } def
+/o   { stroke } def
+/c   { newpath 0 360 arc } def
+/r   { 4 2 roll moveto 1 copy 3 -1 roll exch 0 exch rlineto 0 rlineto -1 mul 0 exch rlineto closepath } def
+/p1  { stroke } def
+/p2  { gsave bg setrgbcolor fill grestore newpath } def
+/p3  { gsave bg setrgbcolor fill grestore stroke } def
+/t   { 6 -2 roll moveto gsave rotate
+       ps mul neg 0 2 1 roll rmoveto
+       1 index stringwidth pop
+       mul neg 0 rmoveto show grestore } def
+/cl  { grestore gsave newpath 3 index 3 index moveto 1 index
+       4 -1 roll lineto  exch 1 index lineto lineto
+       closepath clip newpath } def
+/rgb { setrgbcolor } def
+/s   { scalefont setfont } def
+% end   .ps.prolog
+%%IncludeResource: font Helvetica
+/Helvetica findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font1 exch definefont pop
+%%IncludeResource: font Helvetica-Bold
+/Helvetica-Bold findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font2 exch definefont pop
+%%IncludeResource: font Helvetica-Oblique
+/Helvetica-Oblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font3 exch definefont pop
+%%IncludeResource: font Helvetica-BoldOblique
+/Helvetica-BoldOblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font4 exch definefont pop
+%%IncludeResource: font Symbol
+/Symbol findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  currentdict
+  end
+/Font5 exch definefont pop
+%%EndProlog
+%%Page: 1 1
+bp
+/bg { 1 1 1 } def
+0.00 0.00 198.00 198.00 r p2
+38.02 106.66 78.67 140.98 cl
+/ps 6 def /Font1 findfont 6 s
+0 0 0 rgb
+58.34 94.30 (Index) .5 0 0 t
+31.36 123.82 (xi) .5 0 90 t
+0.00 0.00 198.00 198.00 cl
+/ps 14 def /Font2 findfont 14 s
+0 0 0 rgb
+99.00 171.39 (QQ Plots) .5 0 0 t
+/ps 14 def /Font1 findfont 14 s
+99.00 152.38 (All) .5 0 0 t
+139.25 152.38 (Matched) .5 0 0 t
+/ps 12 def /Font1 findfont 12 s
+119.33 30.41 (Control Units) .5 0 0 t
+167.59 89.50 (Treated Units) .5 0 90 t
+42.77 111.41 73.92 136.22 cl
+/ps 13 def /Font1 findfont 13 s
+0 0 0 rgb
+58.34 119.34 (re74) .5 0 0 t
+83.42 111.41 114.58 136.22 cl
+83.42 111.41 114.58 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.58 112.33 1.78 c p1
+84.60 112.33 1.78 c p1
+84.62 112.33 1.78 c p1
+84.63 112.33 1.78 c p1
+84.66 112.33 1.78 c p1
+84.67 112.33 1.78 c p1
+84.69 112.33 1.78 c p1
+84.74 112.33 1.78 c p1
+84.81 112.33 1.78 c p1
+84.84 112.33 1.78 c p1
+84.86 112.33 1.78 c p1
+84.89 112.33 1.78 c p1
+84.92 112.33 1.78 c p1
+84.98 112.33 1.78 c p1
+85.02 112.33 1.78 c p1
+85.05 112.33 1.78 c p1
+85.06 112.33 1.78 c p1
+85.07 112.33 1.78 c p1
+85.09 112.33 1.78 c p1
+85.12 112.33 1.78 c p1
+85.19 112.33 1.78 c p1
+85.22 112.33 1.78 c p1
+85.25 112.33 1.78 c p1
+85.30 112.33 1.78 c p1
+85.37 112.33 1.78 c p1
+85.42 112.33 1.78 c p1
+85.45 112.33 1.78 c p1
+85.47 112.33 1.78 c p1
+85.55 112.33 1.78 c p1
+85.57 112.33 1.78 c p1
+85.63 112.33 1.78 c p1
+85.74 112.33 1.78 c p1
+85.79 112.33 1.78 c p1
+85.82 112.33 1.78 c p1
+85.86 112.33 1.78 c p1
+85.88 112.33 1.78 c p1
+85.94 112.33 1.78 c p1
+85.97 112.33 1.78 c p1
+86.06 112.33 1.78 c p1
+86.17 112.33 1.78 c p1
+86.32 112.33 1.78 c p1
+86.42 112.33 1.78 c p1
+86.51 112.33 1.78 c p1
+86.52 112.33 1.78 c p1
+86.57 112.33 1.78 c p1
+86.67 112.33 1.78 c p1
+86.75 112.33 1.78 c p1
+86.80 112.33 1.78 c p1
+86.87 112.33 1.78 c p1
+86.92 112.33 1.78 c p1
+87.03 112.33 1.78 c p1
+87.10 112.33 1.78 c p1
+87.14 112.33 1.78 c p1
+87.23 112.33 1.78 c p1
+87.29 112.33 1.78 c p1
+87.43 112.33 1.78 c p1
+87.53 112.33 1.78 c p1
+87.66 112.33 1.78 c p1
+87.80 112.33 1.78 c p1
+87.95 112.33 1.78 c p1
+88.06 112.33 1.78 c p1
+88.14 112.33 1.78 c p1
+88.26 112.33 1.78 c p1
+88.45 112.33 1.78 c p1
+88.66 112.33 1.78 c p1
+88.75 112.33 1.78 c p1
+88.90 112.33 1.78 c p1
+89.07 112.33 1.78 c p1
+89.16 112.33 1.78 c p1
+89.25 112.33 1.78 c p1
+89.34 112.33 1.78 c p1
+89.37 112.33 1.78 c p1
+89.73 112.33 1.78 c p1
+89.91 112.33 1.78 c p1
+90.38 112.33 1.78 c p1
+90.62 112.33 1.78 c p1
+90.68 112.33 1.78 c p1
+90.84 112.33 1.78 c p1
+91.02 112.33 1.78 c p1
+91.05 112.33 1.78 c p1
+91.10 112.33 1.78 c p1
+91.19 112.33 1.78 c p1
+91.22 112.33 1.78 c p1
+91.31 112.33 1.78 c p1
+91.48 112.62 1.78 c p1
+91.60 112.65 1.78 c p1
+91.69 112.87 1.78 c p1
+91.83 112.89 1.78 c p1
+91.94 112.98 1.78 c p1
+92.03 112.98 1.78 c p1
+92.09 112.98 1.78 c p1
+92.21 113.17 1.78 c p1
+92.47 113.29 1.78 c p1
+92.58 113.45 1.78 c p1
+92.64 113.59 1.78 c p1
+93.01 113.66 1.78 c p1
+93.39 113.73 1.78 c p1
+93.48 113.73 1.78 c p1
+93.61 113.77 1.78 c p1
+93.69 113.77 1.78 c p1
+93.79 113.84 1.78 c p1
+93.86 114.06 1.78 c p1
+94.02 114.40 1.78 c p1
+94.06 114.71 1.78 c p1
+94.36 114.73 1.78 c p1
+94.56 114.73 1.78 c p1
+94.71 114.74 1.78 c p1
+95.09 115.03 1.78 c p1
+95.42 115.11 1.78 c p1
+95.53 115.61 1.78 c p1
+95.59 115.88 1.78 c p1
+95.79 115.94 1.78 c p1
+96.26 116.00 1.78 c p1
+96.43 116.32 1.78 c p1
+96.69 116.44 1.78 c p1
+96.74 116.53 1.78 c p1
+96.90 116.57 1.78 c p1
+97.42 116.76 1.78 c p1
+97.75 117.84 1.78 c p1
+98.23 117.91 1.78 c p1
+98.40 118.33 1.78 c p1
+98.52 118.48 1.78 c p1
+98.70 118.48 1.78 c p1
+99.15 118.72 1.78 c p1
+99.32 119.35 1.78 c p1
+99.72 119.46 1.78 c p1
+100.31 120.00 1.78 c p1
+100.62 120.37 1.78 c p1
+101.21 120.43 1.78 c p1
+101.74 121.25 1.78 c p1
+102.44 121.33 1.78 c p1
+102.86 121.35 1.78 c p1
+103.23 121.79 1.78 c p1
+103.98 121.94 1.78 c p1
+105.60 123.03 1.78 c p1
+105.87 125.63 1.78 c p1
+105.87 129.33 1.78 c p1
+105.87 135.30 1.78 c p1
+78.67 106.66 119.33 140.98 cl
+83.42 111.41 114.58 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 111.41 m
+31.16 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+83.42 113.71 m
+31.16 24.81 l
+o
+np
+83.42 109.11 m
+31.16 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 112.33 m
+0 22.95 l
+o
+np
+83.42 112.33 m
+-4.75 0 l
+o
+np
+83.42 115.61 m
+-4.75 0 l
+o
+np
+83.42 118.88 m
+-4.75 0 l
+o
+np
+83.42 122.16 m
+-4.75 0 l
+o
+np
+83.42 125.44 m
+-4.75 0 l
+o
+np
+83.42 128.72 m
+-4.75 0 l
+o
+np
+83.42 132.00 m
+-4.75 0 l
+o
+np
+83.42 135.28 m
+-4.75 0 l
+o
+/ps 4 def /Font1 findfont 4 s
+76.77 112.33 (0) .5 0 90 t
+76.77 125.44 (20000) .5 0 90 t
+np
+83.42 111.41 m
+31.16 0 l
+0 24.81 l
+-31.16 0 l
+0 -24.81 l
+o
+124.08 111.41 155.23 136.22 cl
+124.08 111.41 155.23 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.23 112.33 1.78 c p1
+125.27 112.33 1.78 c p1
+125.27 112.33 1.78 c p1
+125.27 112.33 1.78 c p1
+125.30 112.33 1.78 c p1
+125.31 112.33 1.78 c p1
+125.32 112.33 1.78 c p1
+125.32 112.33 1.78 c p1
+125.34 112.33 1.78 c p1
+125.38 112.33 1.78 c p1
+125.47 112.33 1.78 c p1
+125.48 112.33 1.78 c p1
+125.49 112.33 1.78 c p1
+125.51 112.33 1.78 c p1
+125.52 112.33 1.78 c p1
+125.54 112.33 1.78 c p1
+125.55 112.33 1.78 c p1
+125.56 112.33 1.78 c p1
+125.57 112.33 1.78 c p1
+125.57 112.33 1.78 c p1
+125.64 112.33 1.78 c p1
+125.66 112.33 1.78 c p1
+125.70 112.33 1.78 c p1
+125.72 112.33 1.78 c p1
+125.73 112.33 1.78 c p1
+125.73 112.33 1.78 c p1
+125.74 112.33 1.78 c p1
+125.75 112.33 1.78 c p1
+125.82 112.33 1.78 c p1
+125.85 112.33 1.78 c p1
+125.87 112.33 1.78 c p1
+125.90 112.33 1.78 c p1
+125.93 112.33 1.78 c p1
+125.96 112.33 1.78 c p1
+125.99 112.33 1.78 c p1
+126.04 112.33 1.78 c p1
+126.08 112.33 1.78 c p1
+126.10 112.33 1.78 c p1
+126.10 112.33 1.78 c p1
+126.10 112.33 1.78 c p1
+126.12 112.33 1.78 c p1
+126.21 112.33 1.78 c p1
+126.21 112.33 1.78 c p1
+126.24 112.33 1.78 c p1
+126.47 112.33 1.78 c p1
+126.52 112.33 1.78 c p1
+126.53 112.33 1.78 c p1
+126.57 112.33 1.78 c p1
+126.60 112.33 1.78 c p1
+126.62 112.33 1.78 c p1
+126.65 112.33 1.78 c p1
+126.73 112.33 1.78 c p1
+126.84 112.33 1.78 c p1
+126.94 112.33 1.78 c p1
+127.05 112.33 1.78 c p1
+127.10 112.62 1.78 c p1
+127.16 112.65 1.78 c p1
+127.17 112.87 1.78 c p1
+127.23 112.89 1.78 c p1
+127.34 112.98 1.78 c p1
+127.40 112.98 1.78 c p1
+127.41 112.98 1.78 c p1
+127.54 113.17 1.78 c p1
+127.59 113.29 1.78 c p1
+127.72 113.45 1.78 c p1
+127.76 113.59 1.78 c p1
+127.78 113.66 1.78 c p1
+127.84 113.73 1.78 c p1
+127.92 113.73 1.78 c p1
+127.93 113.77 1.78 c p1
+127.95 113.77 1.78 c p1
+128.18 113.84 1.78 c p1
+128.31 114.06 1.78 c p1
+128.72 114.40 1.78 c p1
+129.13 114.71 1.78 c p1
+129.43 114.73 1.78 c p1
+129.72 114.73 1.78 c p1
+129.73 114.74 1.78 c p1
+129.85 115.03 1.78 c p1
+130.41 115.11 1.78 c p1
+130.51 115.61 1.78 c p1
+131.28 115.88 1.78 c p1
+131.31 115.94 1.78 c p1
+131.32 116.00 1.78 c p1
+131.68 116.32 1.78 c p1
+131.72 116.44 1.78 c p1
+131.79 116.53 1.78 c p1
+132.07 116.57 1.78 c p1
+132.27 116.76 1.78 c p1
+132.29 117.84 1.78 c p1
+132.43 117.91 1.78 c p1
+132.60 118.33 1.78 c p1
+132.68 118.48 1.78 c p1
+132.87 118.48 1.78 c p1
+133.10 118.72 1.78 c p1
+133.19 119.35 1.78 c p1
+133.24 119.46 1.78 c p1
+134.32 120.00 1.78 c p1
+135.00 120.37 1.78 c p1
+135.08 120.43 1.78 c p1
+136.15 121.25 1.78 c p1
+136.19 121.33 1.78 c p1
+136.50 121.35 1.78 c p1
+137.44 121.79 1.78 c p1
+139.00 121.94 1.78 c p1
+139.20 123.03 1.78 c p1
+139.34 125.63 1.78 c p1
+139.91 129.33 1.78 c p1
+143.28 135.30 1.78 c p1
+119.33 106.66 159.98 140.98 cl
+124.08 111.41 155.23 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 111.41 m
+31.15 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.08 113.71 m
+31.15 24.81 l
+o
+np
+124.08 109.11 m
+31.15 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 111.41 m
+31.15 0 l
+0 24.81 l
+-31.15 0 l
+0 -24.81 l
+o
+42.77 77.09 73.92 101.90 cl
+38.02 72.34 78.67 106.66 cl
+/ps 6 def /Font1 findfont 6 s
+0 0 0 rgb
+58.34 59.98 (Index) .5 0 0 t
+31.36 89.50 (xi) .5 0 90 t
+42.77 77.09 73.92 101.90 cl
+/ps 13 def /Font1 findfont 13 s
+0 0 0 rgb
+58.34 85.15 (re75) .5 0 0 t
+83.42 77.09 114.58 101.90 cl
+83.42 77.09 114.58 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.58 78.01 1.78 c p1
+84.62 78.01 1.78 c p1
+84.63 78.01 1.78 c p1
+84.68 78.01 1.78 c p1
+84.73 78.01 1.78 c p1
+84.76 78.01 1.78 c p1
+84.77 78.01 1.78 c p1
+84.79 78.01 1.78 c p1
+84.81 78.01 1.78 c p1
+84.82 78.01 1.78 c p1
+84.85 78.01 1.78 c p1
+84.86 78.01 1.78 c p1
+84.89 78.01 1.78 c p1
+84.92 78.01 1.78 c p1
+84.92 78.01 1.78 c p1
+84.94 78.01 1.78 c p1
+84.95 78.01 1.78 c p1
+85.03 78.01 1.78 c p1
+85.12 78.01 1.78 c p1
+85.13 78.01 1.78 c p1
+85.18 78.01 1.78 c p1
+85.20 78.01 1.78 c p1
+85.24 78.01 1.78 c p1
+85.26 78.01 1.78 c p1
+85.30 78.01 1.78 c p1
+85.33 78.01 1.78 c p1
+85.44 78.01 1.78 c p1
+85.48 78.01 1.78 c p1
+85.53 78.01 1.78 c p1
+85.57 78.01 1.78 c p1
+85.59 78.01 1.78 c p1
+85.64 78.01 1.78 c p1
+85.68 78.01 1.78 c p1
+85.69 78.01 1.78 c p1
+85.74 78.01 1.78 c p1
+85.82 78.01 1.78 c p1
+85.86 78.01 1.78 c p1
+85.92 78.01 1.78 c p1
+85.94 78.01 1.78 c p1
+85.97 78.01 1.78 c p1
+86.03 78.01 1.78 c p1
+86.09 78.01 1.78 c p1
+86.10 78.01 1.78 c p1
+86.14 78.01 1.78 c p1
+86.17 78.01 1.78 c p1
+86.18 78.01 1.78 c p1
+86.23 78.01 1.78 c p1
+86.27 78.01 1.78 c p1
+86.29 78.01 1.78 c p1
+86.33 78.01 1.78 c p1
+86.36 78.01 1.78 c p1
+86.51 78.01 1.78 c p1
+86.56 78.01 1.78 c p1
+86.66 78.01 1.78 c p1
+86.75 78.08 1.78 c p1
+86.76 78.16 1.78 c p1
+86.88 78.20 1.78 c p1
+86.97 78.31 1.78 c p1
+87.12 78.31 1.78 c p1
+87.16 78.33 1.78 c p1
+87.21 78.35 1.78 c p1
+87.34 78.36 1.78 c p1
+87.44 78.47 1.78 c p1
+87.49 78.63 1.78 c p1
+87.56 78.74 1.78 c p1
+87.67 78.74 1.78 c p1
+87.76 78.79 1.78 c p1
+87.85 78.85 1.78 c p1
+87.89 78.86 1.78 c p1
+87.98 78.86 1.78 c p1
+88.12 78.86 1.78 c p1
+88.21 79.03 1.78 c p1
+88.26 79.12 1.78 c p1
+88.28 79.15 1.78 c p1
+88.37 79.18 1.78 c p1
+88.49 79.28 1.78 c p1
+88.54 79.36 1.78 c p1
+88.57 79.53 1.78 c p1
+88.63 79.56 1.78 c p1
+88.89 79.57 1.78 c p1
+88.97 79.64 1.78 c p1
+89.03 79.67 1.78 c p1
+89.20 80.04 1.78 c p1
+89.29 80.10 1.78 c p1
+89.42 80.21 1.78 c p1
+89.46 80.22 1.78 c p1
+89.53 80.38 1.78 c p1
+89.62 80.39 1.78 c p1
+89.70 80.40 1.78 c p1
+89.81 80.44 1.78 c p1
+89.90 80.44 1.78 c p1
+89.96 80.52 1.78 c p1
+90.03 80.55 1.78 c p1
+90.15 80.60 1.78 c p1
+90.30 80.61 1.78 c p1
+90.48 80.69 1.78 c p1
+90.56 80.79 1.78 c p1
+90.72 80.80 1.78 c p1
+91.08 80.83 1.78 c p1
+91.30 81.01 1.78 c p1
+91.38 81.05 1.78 c p1
+91.53 81.25 1.78 c p1
+91.69 81.38 1.78 c p1
+91.79 81.51 1.78 c p1
+91.96 81.68 1.78 c p1
+92.19 81.73 1.78 c p1
+92.40 82.03 1.78 c p1
+92.56 82.47 1.78 c p1
+92.70 82.87 1.78 c p1
+92.92 83.00 1.78 c p1
+93.06 83.05 1.78 c p1
+93.14 83.11 1.78 c p1
+93.19 83.26 1.78 c p1
+93.37 83.30 1.78 c p1
+93.60 83.30 1.78 c p1
+94.26 83.38 1.78 c p1
+94.28 83.54 1.78 c p1
+94.37 84.21 1.78 c p1
+94.99 84.29 1.78 c p1
+95.76 84.46 1.78 c p1
+96.65 85.20 1.78 c p1
+97.32 85.73 1.78 c p1
+97.73 86.10 1.78 c p1
+98.36 88.01 1.78 c p1
+98.81 88.55 1.78 c p1
+99.62 90.65 1.78 c p1
+101.76 94.44 1.78 c p1
+105.63 100.98 1.78 c p1
+78.67 72.34 119.33 106.66 cl
+83.42 77.09 114.58 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 77.09 m
+31.16 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+83.42 79.39 m
+31.16 24.81 l
+o
+np
+83.42 74.79 m
+31.16 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 78.01 m
+0 22.84 l
+o
+np
+83.42 78.01 m
+-4.75 0 l
+o
+np
+83.42 82.58 m
+-4.75 0 l
+o
+np
+83.42 87.15 m
+-4.75 0 l
+o
+np
+83.42 91.72 m
+-4.75 0 l
+o
+np
+83.42 96.29 m
+-4.75 0 l
+o
+np
+83.42 100.85 m
+-4.75 0 l
+o
+/ps 4 def /Font1 findfont 4 s
+76.77 78.01 (0) .5 0 90 t
+76.77 91.72 (15000) .5 0 90 t
+np
+83.42 77.09 m
+31.16 0 l
+0 24.81 l
+-31.16 0 l
+0 -24.81 l
+o
+124.08 77.09 155.23 101.90 cl
+124.08 77.09 155.23 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.23 78.01 1.78 c p1
+125.25 78.01 1.78 c p1
+125.28 78.01 1.78 c p1
+125.29 78.01 1.78 c p1
+125.37 78.01 1.78 c p1
+125.47 78.01 1.78 c p1
+125.47 78.01 1.78 c p1
+125.48 78.01 1.78 c p1
+125.52 78.01 1.78 c p1
+125.53 78.01 1.78 c p1
+125.55 78.01 1.78 c p1
+125.55 78.01 1.78 c p1
+125.57 78.01 1.78 c p1
+125.57 78.01 1.78 c p1
+125.58 78.01 1.78 c p1
+125.58 78.01 1.78 c p1
+125.60 78.01 1.78 c p1
+125.75 78.01 1.78 c p1
+125.77 78.01 1.78 c p1
+125.77 78.01 1.78 c p1
+125.90 78.01 1.78 c p1
+125.96 78.01 1.78 c p1
+125.96 78.01 1.78 c p1
+125.96 78.01 1.78 c p1
+126.00 78.01 1.78 c p1
+126.14 78.01 1.78 c p1
+126.16 78.01 1.78 c p1
+126.20 78.01 1.78 c p1
+126.22 78.01 1.78 c p1
+126.23 78.01 1.78 c p1
+126.24 78.01 1.78 c p1
+126.25 78.01 1.78 c p1
+126.27 78.01 1.78 c p1
+126.34 78.01 1.78 c p1
+126.35 78.01 1.78 c p1
+126.36 78.01 1.78 c p1
+126.42 78.01 1.78 c p1
+126.42 78.01 1.78 c p1
+126.55 78.08 1.78 c p1
+126.61 78.16 1.78 c p1
+126.69 78.20 1.78 c p1
+126.71 78.31 1.78 c p1
+126.75 78.31 1.78 c p1
+126.80 78.33 1.78 c p1
+126.83 78.35 1.78 c p1
+126.85 78.36 1.78 c p1
+126.90 78.47 1.78 c p1
+126.90 78.63 1.78 c p1
+126.93 78.74 1.78 c p1
+126.94 78.74 1.78 c p1
+127.10 78.79 1.78 c p1
+127.32 78.85 1.78 c p1
+127.40 78.86 1.78 c p1
+127.62 78.86 1.78 c p1
+127.80 78.86 1.78 c p1
+127.82 79.03 1.78 c p1
+127.85 79.12 1.78 c p1
+127.86 79.15 1.78 c p1
+127.93 79.18 1.78 c p1
+128.11 79.28 1.78 c p1
+128.12 79.36 1.78 c p1
+128.14 79.53 1.78 c p1
+128.33 79.56 1.78 c p1
+128.48 79.57 1.78 c p1
+128.53 79.64 1.78 c p1
+128.64 79.67 1.78 c p1
+128.74 80.04 1.78 c p1
+128.87 80.10 1.78 c p1
+128.93 80.21 1.78 c p1
+129.05 80.22 1.78 c p1
+129.15 80.38 1.78 c p1
+129.23 80.39 1.78 c p1
+129.50 80.40 1.78 c p1
+129.61 80.44 1.78 c p1
+129.64 80.44 1.78 c p1
+129.83 80.52 1.78 c p1
+129.95 80.55 1.78 c p1
+130.11 80.60 1.78 c p1
+130.14 80.61 1.78 c p1
+130.16 80.69 1.78 c p1
+130.19 80.79 1.78 c p1
+130.24 80.80 1.78 c p1
+130.28 80.83 1.78 c p1
+130.36 81.01 1.78 c p1
+130.44 81.05 1.78 c p1
+130.64 81.25 1.78 c p1
+130.67 81.38 1.78 c p1
+130.70 81.51 1.78 c p1
+130.83 81.68 1.78 c p1
+131.10 81.73 1.78 c p1
+131.60 82.03 1.78 c p1
+131.97 82.47 1.78 c p1
+132.08 82.87 1.78 c p1
+132.37 83.00 1.78 c p1
+132.92 83.05 1.78 c p1
+133.20 83.11 1.78 c p1
+133.33 83.26 1.78 c p1
+133.37 83.30 1.78 c p1
+133.69 83.30 1.78 c p1
+133.91 83.38 1.78 c p1
+134.28 83.54 1.78 c p1
+134.94 84.21 1.78 c p1
+134.94 84.29 1.78 c p1
+135.04 84.46 1.78 c p1
+135.64 85.20 1.78 c p1
+137.05 85.73 1.78 c p1
+137.38 86.10 1.78 c p1
+137.77 88.01 1.78 c p1
+137.97 88.55 1.78 c p1
+139.46 90.65 1.78 c p1
+139.87 94.44 1.78 c p1
+141.04 100.98 1.78 c p1
+119.33 72.34 159.98 106.66 cl
+124.08 77.09 155.23 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 77.09 m
+31.15 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.08 79.39 m
+31.15 24.81 l
+o
+np
+124.08 74.79 m
+31.15 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 77.09 m
+31.15 0 l
+0 24.81 l
+-31.15 0 l
+0 -24.81 l
+o
+42.77 42.77 73.92 67.58 cl
+38.02 38.02 78.67 72.34 cl
+/ps 6 def /Font1 findfont 6 s
+0 0 0 rgb
+58.34 25.66 (Index) .5 0 0 t
+31.36 55.18 (xi) .5 0 90 t
+42.77 42.77 73.92 67.58 cl
+/ps 13 def /Font1 findfont 13 s
+0 0 0 rgb
+58.34 50.61 (educ) .5 0 0 t
+83.42 42.77 114.58 67.58 cl
+83.42 42.77 114.58 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+84.58 48.79 1.78 c p1
+85.10 48.79 1.78 c p1
+87.23 48.79 1.78 c p1
+89.35 48.79 1.78 c p1
+89.39 50.07 1.78 c p1
+90.40 50.07 1.78 c p1
+90.99 50.07 1.78 c p1
+91.44 51.35 1.78 c p1
+92.59 52.62 1.78 c p1
+92.59 52.62 1.78 c p1
+92.59 53.90 1.78 c p1
+93.53 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+97.40 53.90 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+100.39 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 57.73 1.78 c p1
+101.72 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+103.60 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+107.01 59.01 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+108.61 60.28 1.78 c p1
+108.61 60.28 1.78 c p1
+108.61 61.56 1.78 c p1
+108.61 61.56 1.78 c p1
+110.22 61.56 1.78 c p1
+110.22 61.56 1.78 c p1
+110.22 61.56 1.78 c p1
+111.82 62.84 1.78 c p1
+113.42 64.11 1.78 c p1
+78.67 38.02 119.33 72.34 cl
+83.42 42.77 114.58 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 42.77 m
+31.16 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+83.42 45.07 m
+31.16 24.81 l
+o
+np
+83.42 40.47 m
+31.16 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 43.69 m
+0 19.15 l
+o
+np
+83.42 43.69 m
+-4.75 0 l
+o
+np
+83.42 50.07 m
+-4.75 0 l
+o
+np
+83.42 56.45 m
+-4.75 0 l
+o
+np
+83.42 62.84 m
+-4.75 0 l
+o
+/ps 4 def /Font1 findfont 4 s
+76.77 43.69 (0) .5 0 90 t
+76.77 50.07 (5) .5 0 90 t
+76.77 62.84 (15) .5 0 90 t
+np
+83.42 42.77 m
+31.16 0 l
+0 24.81 l
+-31.16 0 l
+0 -24.81 l
+o
+124.08 42.77 155.23 67.58 cl
+124.08 42.77 155.23 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+125.23 48.79 1.78 c p1
+125.23 48.79 1.78 c p1
+126.84 48.79 1.78 c p1
+126.84 48.79 1.78 c p1
+128.44 50.07 1.78 c p1
+128.44 50.07 1.78 c p1
+131.64 50.07 1.78 c p1
+131.64 51.35 1.78 c p1
+131.64 52.62 1.78 c p1
+131.64 52.62 1.78 c p1
+133.25 53.90 1.78 c p1
+133.25 53.90 1.78 c p1
+133.25 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+138.05 53.90 1.78 c p1
+138.05 53.90 1.78 c p1
+138.05 53.90 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+150.87 60.28 1.78 c p1
+150.87 60.28 1.78 c p1
+150.87 61.56 1.78 c p1
+150.87 61.56 1.78 c p1
+150.87 61.56 1.78 c p1
+152.48 61.56 1.78 c p1
+152.48 61.56 1.78 c p1
+154.08 62.84 1.78 c p1
+154.08 64.11 1.78 c p1
+119.33 38.02 159.98 72.34 cl
+124.08 42.77 155.23 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 42.77 m
+31.15 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.08 45.07 m
+31.15 24.81 l
+o
+np
+124.08 40.47 m
+31.15 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 42.77 m
+31.15 0 l
+0 24.81 l
+-31.15 0 l
+0 -24.81 l
+o
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/doc/figs/qqplotnn1.pdf b/inst/doc/figs/qqplotnn1.pdf
new file mode 100644
index 0000000..64542bf
--- /dev/null
+++ b/inst/doc/figs/qqplotnn1.pdf
@@ -0,0 +1,1555 @@
+%PDF-1.1
+%���ρ�
+1 0 obj
+<<
+/CreationDate (D:20050929105523)
+/ModDate (D:20050929105523)
+/Title (R Graphics Output)
+/Producer (R 2.1.1)
+/Creator (R)
+>>
+endobj
+2 0 obj
+<<
+/Type /Catalog
+/Pages 3 0 R
+>>
+endobj
+5 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F1
+/BaseFont /ZapfDingbats
+>>
+endobj
+6 0 obj
+<<
+/Type /Page
+/Parent 3 0 R
+/Contents 7 0 R
+/Resources 4 0 R
+>>
+endobj
+7 0 obj
+<<
+/Length 8 0 R
+>>
+stream
+q
+1.000 1.000 1.000 rg
+0 0 198.00 198.00 re f
+Q q 25.34 115.10 49.10 44.88 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 4.00 0.00 -0.00 4.00 45.37 106.87 Tm (Index) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 20.91 135.99 Tm (xi) Tj
+ET
+Q q
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 10.00 0.00 -0.00 10.00 79.41 180.26 Tm (QQ Plots) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 92.61 167.59 Tm (All) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 130.12 167.59 Tm (Matched) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 101.66 20.28 Tm (Control Units) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 177.72 70.92 Tm (Treated Units) Tj
+ET
+Q q 28.51 118.27 42.77 38.54 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 11.00 0.00 -0.00 11.00 40.12 133.88 Tm (re74) Tj
+ET
+Q q 77.62 118.27 42.77 38.54 re W n
+Q q 77.62 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.92 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.95 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.96 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.01 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.02 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.05 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.12 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.22 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.25 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.29 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.33 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.36 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.45 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.50 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.54 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.55 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.58 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.60 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.63 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.74 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.78 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.82 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.89 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.99 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.06 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.09 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.12 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.24 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.26 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.34 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.49 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.57 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.60 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.65 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.68 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.77 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.81 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.94 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.08 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.29 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.42 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.55 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.57 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.64 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.78 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.88 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.95 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.04 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.11 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.26 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.36 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.41 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.54 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.62 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.82 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.95 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.14 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.32 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.53 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.68 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.79 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.96 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.21 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.50 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.62 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.84 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.06 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.18 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.31 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.43 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.47 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.97 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.21 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.86 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.20 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.27 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.49 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.73 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.78 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.85 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.97 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.01 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.14 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.37 119.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.54 119.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.66 119.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.85 119.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.01 119.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.12 119.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.22 119.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.38 119.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.74 120.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.88 120.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.96 120.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.47 120.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.99 120.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.12 120.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.29 120.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.41 120.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.55 120.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.64 121.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.86 121.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.91 122.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.33 122.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.60 122.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.81 122.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 92.32 122.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 92.79 122.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 92.94 123.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.02 124.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 124.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.94 124.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 94.17 124.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 94.53 124.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 94.60 125.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 94.82 125.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.53 125.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.98 127.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 96.64 127.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 96.88 127.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.04 128.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.28 128.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.90 128.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 98.13 129.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 98.69 129.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.49 130.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.92 131.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 100.72 131.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 101.45 132.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.42 132.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.99 132.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 103.50 133.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.53 133.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.76 135.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.12 139.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.12 144.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.12 154.25 Tm (l) Tj 0 Tr
+ET
+Q q 74.45 115.10 49.10 44.88 re W n
+Q q 77.62 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 118.27 m 120.38 156.82 l S
+0.75 w
+[ 3.00 5.00] 0 d
+77.62 121.84 m 120.38 160.38 l S
+77.62 114.70 m 120.38 153.25 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 119.70 m 77.62 155.35 l S
+77.62 119.70 m 74.45 119.70 l S
+77.62 124.79 m 74.45 124.79 l S
+77.62 129.88 m 74.45 129.88 l S
+77.62 134.98 m 74.45 134.98 l S
+77.62 140.07 m 74.45 140.07 l S
+77.62 145.16 m 74.45 145.16 l S
+77.62 150.26 m 74.45 150.26 l S
+77.62 155.35 m 74.45 155.35 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 118.95 Tm (0) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 126.13 Tm (10000) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 136.32 Tm (20000) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 146.51 Tm (30000) Tj
+ET
+77.62 118.27 m
+120.38 118.27 l
+120.38 156.82 l
+77.62 156.82 l
+77.62 118.27 l
+S
+Q q 126.72 118.27 42.77 38.54 re W n
+Q q 126.72 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.05 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.06 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.06 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.09 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.11 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.11 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.12 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.15 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.20 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.33 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.34 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.35 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.38 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.39 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.42 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.43 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.44 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.47 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.47 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.55 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.58 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.64 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.67 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.68 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.68 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.70 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.71 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.81 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.85 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.88 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.91 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.96 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.00 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.04 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.11 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.17 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.19 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.19 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.20 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.22 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.34 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.35 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.38 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.70 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.77 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.79 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.83 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.87 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.90 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.94 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.06 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.21 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.34 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.50 118.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.56 119.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.65 119.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.66 119.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.74 119.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.90 119.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.97 119.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.99 119.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.16 119.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.24 120.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.41 120.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.46 120.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.50 120.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.58 120.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.69 120.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.70 120.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.73 120.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.04 120.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.22 121.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.78 121.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.35 122.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.76 122.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.17 122.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.17 122.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.34 122.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.10 122.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.24 123.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.30 124.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.35 124.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.36 124.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.85 124.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.90 124.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.01 125.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.39 125.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.65 125.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.69 127.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.89 127.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.11 127.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.23 128.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.48 128.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.80 128.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.92 129.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 129.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 139.48 130.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.41 131.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.52 131.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 141.98 132.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.04 132.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.47 132.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 143.76 133.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 145.90 133.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.17 135.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.37 139.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 147.15 144.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.77 154.25 Tm (l) Tj 0 Tr
+ET
+Q q 123.55 115.10 49.10 44.88 re W n
+Q q 126.72 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 118.27 m 169.49 156.82 l S
+0.75 w
+[ 3.00 5.00] 0 d
+126.72 121.84 m 169.49 160.38 l S
+126.72 114.70 m 169.49 153.25 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 118.27 m
+169.49 118.27 l
+169.49 156.82 l
+126.72 156.82 l
+126.72 118.27 l
+S
+Q q 28.51 73.39 42.77 38.54 re W n
+Q q 25.34 70.22 49.10 44.88 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 4.00 0.00 -0.00 4.00 45.37 61.99 Tm (Index) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 20.91 91.11 Tm (xi) Tj
+ET
+Q q 28.51 73.39 42.77 38.54 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 11.00 0.00 -0.00 11.00 40.12 88.96 Tm (re75) Tj
+ET
+Q q 77.62 73.39 42.77 38.54 re W n
+Q q 77.62 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.95 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.97 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.04 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.10 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.14 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.16 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.19 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.22 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.23 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.27 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.29 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.33 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.36 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.37 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.39 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.41 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.52 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.64 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.65 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.73 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.76 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.80 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.83 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.89 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.93 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.08 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.14 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.21 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.25 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.28 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.35 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.41 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.43 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.50 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.61 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.66 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.74 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.77 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.81 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.89 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.97 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.98 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.04 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.08 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.10 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.17 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.22 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.25 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.31 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.35 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.55 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.62 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.75 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.87 73.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.90 73.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.06 73.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.19 74.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.39 74.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.45 74.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.51 74.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.69 74.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.83 74.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.89 74.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.99 74.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.14 74.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.27 74.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.39 74.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.44 75.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.57 75.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.76 75.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.88 75.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.96 75.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.98 75.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.11 75.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.27 75.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.34 75.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.38 76.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.47 76.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.82 76.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.93 76.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.01 76.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.24 76.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.36 76.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.54 77.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.61 77.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.69 77.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.82 77.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.93 77.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.09 77.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.20 77.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.29 77.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.38 77.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.55 77.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.75 77.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.00 77.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.12 77.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.33 78.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.83 78.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.13 78.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.24 78.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.45 78.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.67 78.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.80 79.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.03 79.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.35 79.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.64 79.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.86 80.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.05 81.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.34 81.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.55 81.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.65 81.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.72 81.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.97 81.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.28 81.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.19 82.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.22 82.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.34 83.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 92.19 83.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.26 83.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 94.47 84.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.39 85.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.95 86.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 96.82 89.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.43 90.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 98.55 93.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 101.48 99.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.79 109.37 Tm (l) Tj 0 Tr
+ET
+Q q 74.45 70.22 49.10 44.88 re W n
+Q q 77.62 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 73.39 m 120.38 111.94 l S
+0.75 w
+[ 3.00 5.00] 0 d
+77.62 76.96 m 120.38 115.50 l S
+77.62 69.82 m 120.38 108.37 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 74.82 m 77.62 110.31 l S
+77.62 74.82 m 74.45 74.82 l S
+77.62 81.92 m 74.45 81.92 l S
+77.62 89.01 m 74.45 89.01 l S
+77.62 96.11 m 74.45 96.11 l S
+77.62 103.21 m 74.45 103.21 l S
+77.62 110.31 m 74.45 110.31 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 74.07 Tm (0) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 78.92 Tm (5000) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 92.36 Tm (15000) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 106.56 Tm (25000) Tj
+ET
+77.62 73.39 m
+120.38 73.39 l
+120.38 111.94 l
+77.62 111.94 l
+77.62 73.39 l
+S
+Q q 126.72 73.39 42.77 38.54 re W n
+Q q 126.72 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.02 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.07 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.07 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.18 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.33 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.33 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.34 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.39 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.40 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.43 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.44 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.46 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.47 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.47 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.47 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.51 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.71 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.74 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.74 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.91 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.99 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.99 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.99 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.05 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.24 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.27 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.33 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.35 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.37 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.38 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.40 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.42 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.53 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.54 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.55 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.63 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.63 73.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.81 73.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.88 73.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.00 73.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.02 74.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.08 74.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.16 74.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.20 74.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.22 74.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.28 74.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.29 74.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.33 74.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.35 74.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.56 74.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.87 74.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.98 75.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.28 75.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.53 75.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.55 75.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.60 75.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.60 75.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.71 75.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.95 75.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.97 75.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.99 76.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.25 76.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.46 76.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.53 76.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.68 76.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.81 76.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.00 76.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.08 77.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.24 77.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.37 77.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.48 77.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.86 77.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.01 77.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.05 77.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.32 77.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.48 77.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.70 77.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.73 77.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.76 77.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.81 77.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.87 78.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.93 78.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.04 78.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.15 78.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.43 78.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.46 78.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.50 79.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.68 79.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.05 79.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.74 79.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.25 80.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.40 81.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.80 81.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.56 81.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.94 81.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.11 81.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.16 81.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.61 81.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.92 82.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 139.42 82.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.32 83.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.33 83.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.46 83.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 141.29 84.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 143.23 85.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 143.68 86.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.22 89.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.49 90.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.53 93.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 147.09 99.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 148.70 109.37 Tm (l) Tj 0 Tr
+ET
+Q q 123.55 70.22 49.10 44.88 re W n
+Q q 126.72 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 73.39 m 169.49 111.94 l S
+0.75 w
+[ 3.00 5.00] 0 d
+126.72 76.96 m 169.49 115.50 l S
+126.72 69.82 m 169.49 108.37 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 73.39 m
+169.49 73.39 l
+169.49 111.94 l
+126.72 111.94 l
+126.72 73.39 l
+S
+Q q 28.51 28.51 42.77 38.54 re W n
+Q q 25.34 25.34 49.10 44.88 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 4.00 0.00 -0.00 4.00 45.37 17.11 Tm (Index) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 20.91 46.23 Tm (xi) Tj
+ET
+Q q 28.51 28.51 42.77 38.54 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 11.00 0.00 -0.00 11.00 39.51 44.08 Tm (educ) Tj
+ET
+Q q 77.62 28.51 42.77 38.54 re W n
+Q q 77.62 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.61 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.53 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.45 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.50 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.88 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.70 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.32 40.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.90 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.90 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.90 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.19 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.61 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 101.43 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.01 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.10 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.10 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.10 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.30 58.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 117.50 60.52 Tm (l) Tj 0 Tr
+ET
+Q q 74.45 25.34 49.10 44.88 re W n
+Q q 77.62 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 28.51 m 120.38 67.06 l S
+0.75 w
+[ 3.00 5.00] 0 d
+77.62 32.08 m 120.38 70.62 l S
+77.62 24.94 m 120.38 63.49 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 29.94 m 77.62 59.68 l S
+77.62 29.94 m 74.45 29.94 l S
+77.62 39.85 m 74.45 39.85 l S
+77.62 49.77 m 74.45 49.77 l S
+77.62 59.68 m 74.45 59.68 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 29.19 Tm (0) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 39.10 Tm (5) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 48.27 Tm (10) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 58.18 Tm (15) Tj
+ET
+77.62 28.51 m
+120.38 28.51 l
+120.38 67.06 l
+77.62 67.06 l
+77.62 28.51 l
+S
+Q q 126.72 28.51 42.77 38.54 re W n
+Q q 126.72 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.20 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.20 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.40 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.40 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 40.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.40 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.40 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.60 58.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.60 60.52 Tm (l) Tj 0 Tr
+ET
+Q q 123.55 25.34 49.10 44.88 re W n
+Q q 126.72 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 28.51 m 169.49 67.06 l S
+0.75 w
+[ 3.00 5.00] 0 d
+126.72 32.08 m 169.49 70.62 l S
+126.72 24.94 m 169.49 63.49 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 28.51 m
+169.49 28.51 l
+169.49 67.06 l
+126.72 67.06 l
+126.72 28.51 l
+S
+Q
+endstream
+endobj
+8 0 obj
+67843
+endobj
+3 0 obj
+<<
+/Type /Pages
+/Kids [
+6 0 R
+]
+/Count 1
+/MediaBox [0 0 198 198]
+>>
+endobj
+4 0 obj
+<<
+/ProcSet [/PDF /Text]
+/Font << /F1 5 0 R /F2 10 0 R /F3 11 0 R /F4 12 0 R /F5 13 0 R /F6 14 0 R >>
+/ExtGState << >>
+>>
+endobj
+9 0 obj
+<<
+/Type /Encoding
+/BaseEncoding /WinAnsiEncoding
+/Differences [ 45/minus 96/quoteleft
+144/dotlessi /grave /acute /circumflex /tilde /macron /breve /dotaccent
+/dieresis /.notdef /ring /cedilla /.notdef /hungarumlaut /ogonek /caron /space]
+>>
+endobj
+10 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F2
+/BaseFont /Times-Roman
+/Encoding 9 0 R
+>>
+endobj
+11 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F3
+/BaseFont /Times-Bold
+/Encoding 9 0 R
+>>
+endobj
+12 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F4
+/BaseFont /Times-Italic
+/Encoding 9 0 R
+>>
+endobj
+13 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F5
+/BaseFont /Times-BoldItalic
+/Encoding 9 0 R
+>>
+endobj
+14 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F6
+/BaseFont /Symbol
+>>
+endobj
+xref
+0 15
+0000000000 65535 f 
+0000000020 00000 n 
+0000000162 00000 n 
+0000068291 00000 n 
+0000068374 00000 n 
+0000000211 00000 n 
+0000000294 00000 n 
+0000000374 00000 n 
+0000068270 00000 n 
+0000068511 00000 n 
+0000068768 00000 n 
+0000068867 00000 n 
+0000068965 00000 n 
+0000069065 00000 n 
+0000069169 00000 n 
+trailer
+<<
+/Size 15
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+69247
+%%EOF
diff --git a/inst/doc/figs/qqplotnn2.eps b/inst/doc/figs/qqplotnn2.eps
new file mode 100644
index 0000000..231cd55
--- /dev/null
+++ b/inst/doc/figs/qqplotnn2.eps
@@ -0,0 +1,1604 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 198 198 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 198 198
+%%EndComments
+%%BeginProlog
+/bp  { gs gs } def
+% begin .ps.prolog
+/gs  { gsave } def
+/gr  { grestore } def
+/ep  { showpage gr gr } def
+/m   { moveto } def
+/l  { rlineto } def
+/np  { newpath } def
+/cp  { closepath } def
+/f   { fill } def
+/o   { stroke } def
+/c   { newpath 0 360 arc } def
+/r   { 4 2 roll moveto 1 copy 3 -1 roll exch 0 exch rlineto 0 rlineto -1 mul 0 exch rlineto closepath } def
+/p1  { stroke } def
+/p2  { gsave bg setrgbcolor fill grestore newpath } def
+/p3  { gsave bg setrgbcolor fill grestore stroke } def
+/t   { 6 -2 roll moveto gsave rotate
+       ps mul neg 0 2 1 roll rmoveto
+       1 index stringwidth pop
+       mul neg 0 rmoveto show grestore } def
+/cl  { grestore gsave newpath 3 index 3 index moveto 1 index
+       4 -1 roll lineto  exch 1 index lineto lineto
+       closepath clip newpath } def
+/rgb { setrgbcolor } def
+/s   { scalefont setfont } def
+% end   .ps.prolog
+%%IncludeResource: font Helvetica
+/Helvetica findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font1 exch definefont pop
+%%IncludeResource: font Helvetica-Bold
+/Helvetica-Bold findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font2 exch definefont pop
+%%IncludeResource: font Helvetica-Oblique
+/Helvetica-Oblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font3 exch definefont pop
+%%IncludeResource: font Helvetica-BoldOblique
+/Helvetica-BoldOblique findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  /Encoding ISOLatin1Encoding def
+  currentdict
+  end
+/Font4 exch definefont pop
+%%IncludeResource: font Symbol
+/Symbol findfont
+dup length dict begin
+  {1 index /FID ne {def} {pop pop} ifelse} forall
+  currentdict
+  end
+/Font5 exch definefont pop
+%%EndProlog
+%%Page: 1 1
+bp
+/bg { 1 1 1 } def
+0.00 0.00 198.00 198.00 r p2
+38.02 106.66 78.67 140.98 cl
+/ps 6 def /Font1 findfont 6 s
+0 0 0 rgb
+58.34 94.30 (Index) .5 0 0 t
+31.36 123.82 (xi) .5 0 90 t
+0.00 0.00 198.00 198.00 cl
+/ps 14 def /Font2 findfont 14 s
+0 0 0 rgb
+99.00 171.39 (QQ Plots) .5 0 0 t
+/ps 14 def /Font1 findfont 14 s
+99.00 152.38 (All) .5 0 0 t
+139.25 152.38 (Matched) .5 0 0 t
+/ps 12 def /Font1 findfont 12 s
+119.33 30.41 (Control Units) .5 0 0 t
+167.59 89.50 (Treated Units) .5 0 90 t
+42.77 111.41 73.92 136.22 cl
+/ps 9 def /Font1 findfont 9 s
+0 0 0 rgb
+58.34 120.65 (black) .5 0 0 t
+83.42 111.41 114.58 136.22 cl
+83.42 111.41 114.58 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+84.59 112.33 1.78 c p1
+84.64 112.37 1.78 c p1
+84.68 112.68 1.78 c p1
+84.81 113.23 1.78 c p1
+84.84 113.64 1.78 c p1
+84.87 113.75 1.78 c p1
+84.95 114.13 1.78 c p1
+84.98 114.31 1.78 c p1
+85.09 114.68 1.78 c p1
+85.17 114.75 1.78 c p1
+85.23 115.03 1.78 c p1
+85.27 115.04 1.78 c p1
+85.30 115.27 1.78 c p1
+85.35 115.47 1.78 c p1
+85.37 115.50 1.78 c p1
+85.45 115.67 1.78 c p1
+85.48 115.80 1.78 c p1
+85.53 115.86 1.78 c p1
+85.56 115.87 1.78 c p1
+85.60 115.91 1.78 c p1
+85.63 116.25 1.78 c p1
+85.69 117.09 1.78 c p1
+85.75 117.14 1.78 c p1
+85.85 117.34 1.78 c p1
+85.89 117.52 1.78 c p1
+85.93 117.73 1.78 c p1
+86.01 118.08 1.78 c p1
+86.07 118.26 1.78 c p1
+86.09 118.80 1.78 c p1
+86.14 128.76 1.78 c p1
+86.17 128.80 1.78 c p1
+86.21 128.86 1.78 c p1
+86.33 128.89 1.78 c p1
+86.39 128.91 1.78 c p1
+86.44 128.97 1.78 c p1
+86.50 129.01 1.78 c p1
+86.61 129.04 1.78 c p1
+86.65 129.10 1.78 c p1
+86.77 129.17 1.78 c p1
+86.83 129.21 1.78 c p1
+86.87 129.23 1.78 c p1
+86.88 129.23 1.78 c p1
+86.91 129.28 1.78 c p1
+86.93 129.28 1.78 c p1
+86.99 129.38 1.78 c p1
+87.00 129.42 1.78 c p1
+87.08 129.43 1.78 c p1
+87.18 129.43 1.78 c p1
+87.20 129.43 1.78 c p1
+87.22 129.44 1.78 c p1
+87.27 129.48 1.78 c p1
+87.34 129.50 1.78 c p1
+87.40 129.51 1.78 c p1
+87.47 129.56 1.78 c p1
+87.56 129.56 1.78 c p1
+87.71 129.58 1.78 c p1
+87.77 129.59 1.78 c p1
+87.92 129.61 1.78 c p1
+87.97 129.63 1.78 c p1
+88.05 129.64 1.78 c p1
+88.07 129.72 1.78 c p1
+88.09 129.73 1.78 c p1
+88.11 129.73 1.78 c p1
+88.13 129.80 1.78 c p1
+88.17 129.92 1.78 c p1
+88.22 129.92 1.78 c p1
+88.29 129.95 1.78 c p1
+88.35 130.07 1.78 c p1
+88.38 130.08 1.78 c p1
+88.46 130.10 1.78 c p1
+88.54 130.10 1.78 c p1
+88.60 130.16 1.78 c p1
+88.70 130.26 1.78 c p1
+88.73 130.28 1.78 c p1
+88.77 130.28 1.78 c p1
+88.82 130.33 1.78 c p1
+88.89 130.39 1.78 c p1
+88.96 130.40 1.78 c p1
+89.02 130.42 1.78 c p1
+89.11 130.64 1.78 c p1
+89.15 130.65 1.78 c p1
+89.19 130.70 1.78 c p1
+89.23 130.70 1.78 c p1
+89.30 130.72 1.78 c p1
+89.37 130.72 1.78 c p1
+89.44 130.76 1.78 c p1
+89.47 130.78 1.78 c p1
+89.51 130.79 1.78 c p1
+89.56 130.84 1.78 c p1
+89.62 130.86 1.78 c p1
+89.70 130.90 1.78 c p1
+89.72 130.92 1.78 c p1
+89.77 130.93 1.78 c p1
+89.83 130.95 1.78 c p1
+89.86 130.97 1.78 c p1
+89.87 130.97 1.78 c p1
+89.89 131.04 1.78 c p1
+89.94 131.08 1.78 c p1
+90.12 131.09 1.78 c p1
+90.22 131.16 1.78 c p1
+90.40 131.18 1.78 c p1
+90.48 131.22 1.78 c p1
+90.52 131.25 1.78 c p1
+90.60 131.30 1.78 c p1
+90.63 131.32 1.78 c p1
+90.70 131.32 1.78 c p1
+90.71 131.37 1.78 c p1
+90.74 131.37 1.78 c p1
+90.78 131.45 1.78 c p1
+90.87 131.50 1.78 c p1
+90.94 131.50 1.78 c p1
+90.95 131.54 1.78 c p1
+90.98 131.56 1.78 c p1
+91.00 131.56 1.78 c p1
+91.07 131.59 1.78 c p1
+91.20 131.65 1.78 c p1
+91.24 131.72 1.78 c p1
+91.29 131.75 1.78 c p1
+91.33 131.77 1.78 c p1
+91.36 131.79 1.78 c p1
+91.51 131.81 1.78 c p1
+91.54 131.85 1.78 c p1
+91.56 131.87 1.78 c p1
+91.58 131.90 1.78 c p1
+91.62 131.94 1.78 c p1
+91.67 132.05 1.78 c p1
+91.70 132.30 1.78 c p1
+91.76 132.36 1.78 c p1
+91.81 132.37 1.78 c p1
+91.87 132.44 1.78 c p1
+91.91 132.53 1.78 c p1
+92.00 132.56 1.78 c p1
+92.14 132.62 1.78 c p1
+92.16 132.63 1.78 c p1
+92.20 132.64 1.78 c p1
+92.24 132.67 1.78 c p1
+92.26 132.67 1.78 c p1
+92.31 132.75 1.78 c p1
+92.33 132.78 1.78 c p1
+92.35 132.82 1.78 c p1
+92.36 132.90 1.78 c p1
+92.42 132.90 1.78 c p1
+92.47 132.93 1.78 c p1
+92.57 132.93 1.78 c p1
+92.67 132.94 1.78 c p1
+92.73 132.98 1.78 c p1
+92.78 133.03 1.78 c p1
+104.53 133.07 1.78 c p1
+105.36 133.11 1.78 c p1
+105.38 133.14 1.78 c p1
+105.58 133.22 1.78 c p1
+105.90 133.25 1.78 c p1
+106.55 133.37 1.78 c p1
+106.96 133.38 1.78 c p1
+107.05 133.42 1.78 c p1
+107.12 133.47 1.78 c p1
+107.15 133.52 1.78 c p1
+107.41 133.61 1.78 c p1
+107.55 133.62 1.78 c p1
+107.87 133.81 1.78 c p1
+108.01 133.82 1.78 c p1
+108.08 133.84 1.78 c p1
+108.28 133.85 1.78 c p1
+108.35 133.98 1.78 c p1
+108.66 134.25 1.78 c p1
+109.12 134.33 1.78 c p1
+109.25 134.34 1.78 c p1
+109.44 134.41 1.78 c p1
+109.58 134.46 1.78 c p1
+109.75 134.52 1.78 c p1
+109.98 134.58 1.78 c p1
+110.06 134.62 1.78 c p1
+110.14 134.70 1.78 c p1
+110.26 134.72 1.78 c p1
+110.46 134.88 1.78 c p1
+110.78 134.95 1.78 c p1
+111.28 134.96 1.78 c p1
+111.70 134.98 1.78 c p1
+111.79 134.99 1.78 c p1
+111.99 135.05 1.78 c p1
+112.26 135.11 1.78 c p1
+112.42 135.24 1.78 c p1
+112.91 135.25 1.78 c p1
+113.08 135.28 1.78 c p1
+113.26 135.30 1.78 c p1
+78.67 106.66 119.33 140.98 cl
+83.42 111.41 114.58 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 111.41 m
+31.16 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+83.42 113.71 m
+31.16 24.81 l
+o
+np
+83.42 109.11 m
+31.16 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 112.32 m
+0 23.01 l
+o
+np
+83.42 112.32 m
+-4.75 0 l
+o
+np
+83.42 115.60 m
+-4.75 0 l
+o
+np
+83.42 118.89 m
+-4.75 0 l
+o
+np
+83.42 122.18 m
+-4.75 0 l
+o
+np
+83.42 125.47 m
+-4.75 0 l
+o
+np
+83.42 128.75 m
+-4.75 0 l
+o
+np
+83.42 132.04 m
+-4.75 0 l
+o
+np
+83.42 135.33 m
+-4.75 0 l
+o
+/ps 4 def /Font1 findfont 4 s
+76.77 112.32 (-0.2) .5 0 90 t
+76.77 125.47 (0.6) .5 0 90 t
+76.77 135.33 (1.2) .5 0 90 t
+np
+83.42 111.41 m
+31.16 0 l
+0 24.81 l
+-31.16 0 l
+0 -24.81 l
+o
+124.08 111.41 155.23 136.22 cl
+124.08 111.41 155.23 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+125.22 112.54 1.78 c p1
+125.29 113.09 1.78 c p1
+125.42 113.13 1.78 c p1
+125.68 113.21 1.78 c p1
+125.90 113.63 1.78 c p1
+126.01 113.85 1.78 c p1
+126.16 114.21 1.78 c p1
+126.16 114.25 1.78 c p1
+126.18 114.37 1.78 c p1
+126.30 114.42 1.78 c p1
+126.49 114.52 1.78 c p1
+126.55 114.91 1.78 c p1
+126.72 115.11 1.78 c p1
+126.78 115.36 1.78 c p1
+126.83 115.47 1.78 c p1
+126.83 115.63 1.78 c p1
+126.88 115.74 1.78 c p1
+126.97 115.85 1.78 c p1
+127.04 115.98 1.78 c p1
+127.06 116.95 1.78 c p1
+127.17 117.12 1.78 c p1
+127.18 117.32 1.78 c p1
+127.18 117.44 1.78 c p1
+127.35 117.45 1.78 c p1
+127.36 118.00 1.78 c p1
+127.46 118.08 1.78 c p1
+127.48 118.25 1.78 c p1
+127.62 118.64 1.78 c p1
+127.64 118.68 1.78 c p1
+127.68 128.76 1.78 c p1
+127.87 128.78 1.78 c p1
+127.88 128.81 1.78 c p1
+127.92 128.88 1.78 c p1
+127.96 128.89 1.78 c p1
+128.15 128.90 1.78 c p1
+128.15 128.93 1.78 c p1
+128.19 128.94 1.78 c p1
+128.35 128.99 1.78 c p1
+128.47 129.02 1.78 c p1
+128.54 129.02 1.78 c p1
+128.65 129.04 1.78 c p1
+128.93 129.07 1.78 c p1
+128.96 129.07 1.78 c p1
+129.01 129.08 1.78 c p1
+129.08 129.13 1.78 c p1
+129.18 129.15 1.78 c p1
+129.39 129.16 1.78 c p1
+129.40 129.32 1.78 c p1
+129.44 129.35 1.78 c p1
+129.60 129.40 1.78 c p1
+129.72 129.44 1.78 c p1
+129.81 129.46 1.78 c p1
+130.07 129.51 1.78 c p1
+130.12 129.71 1.78 c p1
+130.15 129.75 1.78 c p1
+130.17 129.85 1.78 c p1
+130.38 129.85 1.78 c p1
+130.44 130.00 1.78 c p1
+130.53 130.04 1.78 c p1
+130.54 130.05 1.78 c p1
+130.67 130.15 1.78 c p1
+130.74 130.16 1.78 c p1
+130.98 130.18 1.78 c p1
+131.02 130.19 1.78 c p1
+131.15 130.21 1.78 c p1
+131.19 130.22 1.78 c p1
+131.34 130.24 1.78 c p1
+131.52 130.30 1.78 c p1
+131.58 130.37 1.78 c p1
+131.89 130.52 1.78 c p1
+131.90 130.53 1.78 c p1
+131.92 130.54 1.78 c p1
+131.99 130.56 1.78 c p1
+131.99 130.59 1.78 c p1
+132.19 130.66 1.78 c p1
+132.31 130.68 1.78 c p1
+132.32 130.70 1.78 c p1
+132.39 130.70 1.78 c p1
+132.40 130.71 1.78 c p1
+132.45 130.75 1.78 c p1
+132.47 130.76 1.78 c p1
+132.56 130.78 1.78 c p1
+132.60 130.81 1.78 c p1
+132.60 131.09 1.78 c p1
+132.63 131.12 1.78 c p1
+132.79 131.18 1.78 c p1
+132.79 131.19 1.78 c p1
+132.88 131.29 1.78 c p1
+133.11 131.33 1.78 c p1
+133.14 131.35 1.78 c p1
+133.14 131.37 1.78 c p1
+133.21 131.37 1.78 c p1
+133.24 131.37 1.78 c p1
+133.29 131.45 1.78 c p1
+133.29 131.48 1.78 c p1
+133.33 131.50 1.78 c p1
+133.37 131.56 1.78 c p1
+133.39 131.61 1.78 c p1
+145.86 131.77 1.78 c p1
+145.87 131.79 1.78 c p1
+146.01 131.81 1.78 c p1
+146.19 131.89 1.78 c p1
+146.30 131.92 1.78 c p1
+146.48 131.98 1.78 c p1
+146.53 132.01 1.78 c p1
+146.53 132.04 1.78 c p1
+146.78 132.07 1.78 c p1
+146.81 132.08 1.78 c p1
+146.83 132.12 1.78 c p1
+147.02 132.12 1.78 c p1
+147.05 132.15 1.78 c p1
+147.34 132.20 1.78 c p1
+147.36 132.23 1.78 c p1
+147.40 132.33 1.78 c p1
+147.47 132.33 1.78 c p1
+147.65 132.38 1.78 c p1
+147.68 132.39 1.78 c p1
+147.80 132.39 1.78 c p1
+147.84 132.45 1.78 c p1
+147.91 132.49 1.78 c p1
+147.99 132.61 1.78 c p1
+148.19 132.68 1.78 c p1
+148.23 132.70 1.78 c p1
+148.32 132.73 1.78 c p1
+148.44 132.82 1.78 c p1
+148.64 132.82 1.78 c p1
+148.83 132.85 1.78 c p1
+148.91 132.88 1.78 c p1
+148.95 132.91 1.78 c p1
+149.04 132.99 1.78 c p1
+149.08 133.02 1.78 c p1
+149.17 133.04 1.78 c p1
+149.20 133.04 1.78 c p1
+149.28 133.11 1.78 c p1
+149.32 133.16 1.78 c p1
+149.56 133.18 1.78 c p1
+149.65 133.18 1.78 c p1
+149.68 133.34 1.78 c p1
+149.79 133.51 1.78 c p1
+149.79 133.51 1.78 c p1
+149.92 133.56 1.78 c p1
+150.00 133.57 1.78 c p1
+150.01 133.68 1.78 c p1
+150.01 133.72 1.78 c p1
+150.16 133.72 1.78 c p1
+150.35 133.80 1.78 c p1
+150.45 133.83 1.78 c p1
+150.52 133.87 1.78 c p1
+150.53 133.92 1.78 c p1
+150.59 133.93 1.78 c p1
+150.75 133.93 1.78 c p1
+150.89 133.94 1.78 c p1
+150.91 134.00 1.78 c p1
+151.13 134.08 1.78 c p1
+151.25 134.19 1.78 c p1
+151.30 134.19 1.78 c p1
+151.41 134.22 1.78 c p1
+151.44 134.23 1.78 c p1
+151.47 134.26 1.78 c p1
+151.68 134.30 1.78 c p1
+151.78 134.34 1.78 c p1
+151.90 134.38 1.78 c p1
+152.20 134.53 1.78 c p1
+152.29 134.53 1.78 c p1
+152.37 134.54 1.78 c p1
+152.63 134.58 1.78 c p1
+152.71 134.61 1.78 c p1
+152.82 134.66 1.78 c p1
+152.87 134.66 1.78 c p1
+153.03 134.75 1.78 c p1
+153.12 134.75 1.78 c p1
+153.14 134.76 1.78 c p1
+153.15 134.80 1.78 c p1
+153.17 134.80 1.78 c p1
+153.18 134.82 1.78 c p1
+153.34 134.82 1.78 c p1
+153.54 134.82 1.78 c p1
+153.56 134.86 1.78 c p1
+153.60 134.86 1.78 c p1
+153.73 135.00 1.78 c p1
+153.74 135.04 1.78 c p1
+153.82 135.07 1.78 c p1
+153.85 135.18 1.78 c p1
+153.89 135.29 1.78 c p1
+153.96 135.32 1.78 c p1
+119.33 106.66 159.98 140.98 cl
+124.08 111.41 155.23 136.22 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 111.41 m
+31.15 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.08 113.71 m
+31.15 24.81 l
+o
+np
+124.08 109.11 m
+31.15 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 111.41 m
+31.15 0 l
+0 24.81 l
+-31.15 0 l
+0 -24.81 l
+o
+42.77 77.09 73.92 101.90 cl
+38.02 72.34 78.67 106.66 cl
+/ps 6 def /Font1 findfont 6 s
+0 0 0 rgb
+58.34 59.98 (Index) .5 0 0 t
+31.36 89.50 (xi) .5 0 90 t
+42.77 77.09 73.92 101.90 cl
+/ps 9 def /Font1 findfont 9 s
+0 0 0 rgb
+58.34 87.20 (hispan) .5 0 0 t
+83.42 77.09 114.58 101.90 cl
+83.42 77.09 114.58 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+84.59 78.01 1.78 c p1
+84.69 78.06 1.78 c p1
+84.75 78.10 1.78 c p1
+84.86 78.14 1.78 c p1
+84.95 78.21 1.78 c p1
+85.00 78.23 1.78 c p1
+85.01 78.25 1.78 c p1
+85.04 78.29 1.78 c p1
+85.06 78.32 1.78 c p1
+85.14 78.32 1.78 c p1
+85.16 78.36 1.78 c p1
+85.25 78.37 1.78 c p1
+85.34 78.38 1.78 c p1
+85.39 78.43 1.78 c p1
+85.45 78.48 1.78 c p1
+85.49 78.53 1.78 c p1
+85.52 78.61 1.78 c p1
+85.59 78.64 1.78 c p1
+85.65 78.66 1.78 c p1
+85.68 78.79 1.78 c p1
+85.73 78.89 1.78 c p1
+85.75 78.89 1.78 c p1
+85.78 79.00 1.78 c p1
+85.79 79.03 1.78 c p1
+85.84 79.07 1.78 c p1
+85.96 79.14 1.78 c p1
+86.04 79.20 1.78 c p1
+86.12 79.22 1.78 c p1
+86.18 79.23 1.78 c p1
+86.31 79.25 1.78 c p1
+86.36 79.25 1.78 c p1
+86.39 79.26 1.78 c p1
+86.47 79.28 1.78 c p1
+86.54 79.31 1.78 c p1
+86.57 79.36 1.78 c p1
+86.59 79.46 1.78 c p1
+86.61 79.49 1.78 c p1
+86.67 79.57 1.78 c p1
+86.76 79.57 1.78 c p1
+86.80 79.59 1.78 c p1
+86.87 79.61 1.78 c p1
+86.90 79.62 1.78 c p1
+86.93 79.63 1.78 c p1
+87.00 79.78 1.78 c p1
+87.06 79.81 1.78 c p1
+87.10 79.84 1.78 c p1
+87.15 79.84 1.78 c p1
+87.27 79.85 1.78 c p1
+87.33 79.87 1.78 c p1
+87.38 79.88 1.78 c p1
+87.40 79.88 1.78 c p1
+87.45 79.91 1.78 c p1
+87.48 79.93 1.78 c p1
+87.52 79.94 1.78 c p1
+87.54 79.97 1.78 c p1
+87.56 80.05 1.78 c p1
+87.57 80.08 1.78 c p1
+87.60 80.12 1.78 c p1
+87.62 80.14 1.78 c p1
+87.70 80.15 1.78 c p1
+87.74 80.24 1.78 c p1
+87.77 80.34 1.78 c p1
+87.78 80.34 1.78 c p1
+87.84 80.35 1.78 c p1
+87.88 80.39 1.78 c p1
+87.93 80.40 1.78 c p1
+87.99 80.40 1.78 c p1
+88.02 80.41 1.78 c p1
+88.07 80.42 1.78 c p1
+88.08 80.52 1.78 c p1
+88.14 80.69 1.78 c p1
+88.26 80.70 1.78 c p1
+88.31 80.72 1.78 c p1
+88.38 80.77 1.78 c p1
+88.45 80.82 1.78 c p1
+88.54 80.84 1.78 c p1
+88.61 80.88 1.78 c p1
+88.65 80.97 1.78 c p1
+88.70 81.00 1.78 c p1
+88.76 81.00 1.78 c p1
+88.79 81.01 1.78 c p1
+88.83 81.02 1.78 c p1
+88.92 81.03 1.78 c p1
+88.96 81.04 1.78 c p1
+88.99 81.15 1.78 c p1
+89.00 81.15 1.78 c p1
+89.05 81.20 1.78 c p1
+89.10 81.21 1.78 c p1
+89.15 81.34 1.78 c p1
+89.19 81.35 1.78 c p1
+89.21 81.38 1.78 c p1
+89.34 81.43 1.78 c p1
+89.39 81.47 1.78 c p1
+89.46 81.58 1.78 c p1
+89.50 81.65 1.78 c p1
+89.55 81.71 1.78 c p1
+89.60 81.71 1.78 c p1
+89.66 81.84 1.78 c p1
+89.73 81.85 1.78 c p1
+89.76 81.88 1.78 c p1
+89.79 81.88 1.78 c p1
+89.84 81.92 1.78 c p1
+89.90 81.94 1.78 c p1
+90.01 82.02 1.78 c p1
+90.10 82.05 1.78 c p1
+90.19 82.10 1.78 c p1
+90.22 82.13 1.78 c p1
+90.28 82.23 1.78 c p1
+90.39 82.26 1.78 c p1
+90.44 82.29 1.78 c p1
+90.47 82.31 1.78 c p1
+90.50 82.31 1.78 c p1
+90.60 82.36 1.78 c p1
+90.66 82.43 1.78 c p1
+90.70 82.54 1.78 c p1
+90.75 82.56 1.78 c p1
+90.78 82.67 1.78 c p1
+90.84 82.71 1.78 c p1
+90.90 82.75 1.78 c p1
+90.96 82.77 1.78 c p1
+90.99 82.78 1.78 c p1
+91.07 82.81 1.78 c p1
+91.10 82.88 1.78 c p1
+91.14 82.90 1.78 c p1
+91.22 82.94 1.78 c p1
+91.29 82.95 1.78 c p1
+91.44 82.96 1.78 c p1
+91.45 83.05 1.78 c p1
+91.53 83.11 1.78 c p1
+91.58 83.12 1.78 c p1
+91.62 83.35 1.78 c p1
+91.67 83.36 1.78 c p1
+91.76 83.36 1.78 c p1
+91.77 83.37 1.78 c p1
+91.86 83.38 1.78 c p1
+91.94 83.38 1.78 c p1
+92.01 83.38 1.78 c p1
+92.03 83.39 1.78 c p1
+92.10 83.40 1.78 c p1
+92.19 83.49 1.78 c p1
+92.25 83.51 1.78 c p1
+92.27 83.52 1.78 c p1
+92.30 83.53 1.78 c p1
+92.32 83.58 1.78 c p1
+92.37 83.65 1.78 c p1
+92.41 83.70 1.78 c p1
+92.47 83.70 1.78 c p1
+92.49 83.76 1.78 c p1
+92.51 83.76 1.78 c p1
+92.54 83.77 1.78 c p1
+92.59 83.80 1.78 c p1
+92.64 83.87 1.78 c p1
+92.67 83.89 1.78 c p1
+92.68 83.89 1.78 c p1
+92.69 83.90 1.78 c p1
+92.74 83.90 1.78 c p1
+92.78 83.94 1.78 c p1
+92.81 83.95 1.78 c p1
+99.32 83.98 1.78 c p1
+105.43 83.99 1.78 c p1
+105.85 84.06 1.78 c p1
+106.63 84.13 1.78 c p1
+106.97 84.17 1.78 c p1
+107.43 84.23 1.78 c p1
+107.61 84.24 1.78 c p1
+107.98 84.25 1.78 c p1
+108.27 84.30 1.78 c p1
+108.44 84.31 1.78 c p1
+108.56 84.33 1.78 c p1
+109.16 84.33 1.78 c p1
+109.35 84.40 1.78 c p1
+109.45 84.49 1.78 c p1
+109.74 84.54 1.78 c p1
+109.88 84.55 1.78 c p1
+110.16 94.83 1.78 c p1
+110.50 95.07 1.78 c p1
+110.81 96.54 1.78 c p1
+111.09 96.84 1.78 c p1
+111.20 97.22 1.78 c p1
+111.91 97.85 1.78 c p1
+112.10 98.51 1.78 c p1
+112.81 99.29 1.78 c p1
+113.02 100.56 1.78 c p1
+113.32 100.75 1.78 c p1
+113.42 100.87 1.78 c p1
+78.67 72.34 119.33 106.66 cl
+83.42 77.09 114.58 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 77.09 m
+31.16 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+83.42 79.39 m
+31.16 24.81 l
+o
+np
+83.42 74.79 m
+31.16 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 78.00 m
+0 23.06 l
+o
+np
+83.42 78.00 m
+-4.75 0 l
+o
+np
+83.42 81.30 m
+-4.75 0 l
+o
+np
+83.42 84.59 m
+-4.75 0 l
+o
+np
+83.42 87.88 m
+-4.75 0 l
+o
+np
+83.42 91.18 m
+-4.75 0 l
+o
+np
+83.42 94.47 m
+-4.75 0 l
+o
+np
+83.42 97.76 m
+-4.75 0 l
+o
+np
+83.42 101.06 m
+-4.75 0 l
+o
+/ps 4 def /Font1 findfont 4 s
+76.77 78.00 (-0.2) .5 0 90 t
+76.77 91.18 (0.6) .5 0 90 t
+76.77 101.06 (1.2) .5 0 90 t
+np
+83.42 77.09 m
+31.16 0 l
+0 24.81 l
+-31.16 0 l
+0 -24.81 l
+o
+124.08 77.09 155.23 101.90 cl
+124.08 77.09 155.23 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+125.27 78.07 1.78 c p1
+125.37 78.08 1.78 c p1
+125.39 78.08 1.78 c p1
+125.41 78.08 1.78 c p1
+125.42 78.09 1.78 c p1
+125.43 78.12 1.78 c p1
+125.44 78.15 1.78 c p1
+125.44 78.16 1.78 c p1
+125.47 78.17 1.78 c p1
+125.50 78.17 1.78 c p1
+125.54 78.21 1.78 c p1
+125.55 78.23 1.78 c p1
+125.69 78.25 1.78 c p1
+125.73 78.26 1.78 c p1
+125.79 78.32 1.78 c p1
+125.82 78.33 1.78 c p1
+125.93 78.35 1.78 c p1
+125.93 78.35 1.78 c p1
+126.04 78.44 1.78 c p1
+126.05 78.44 1.78 c p1
+126.08 78.46 1.78 c p1
+126.12 78.50 1.78 c p1
+126.13 78.55 1.78 c p1
+126.18 78.57 1.78 c p1
+126.18 78.62 1.78 c p1
+126.20 78.62 1.78 c p1
+126.24 78.63 1.78 c p1
+126.26 78.68 1.78 c p1
+126.95 78.70 1.78 c p1
+126.97 78.73 1.78 c p1
+127.06 78.76 1.78 c p1
+127.16 78.84 1.78 c p1
+127.24 78.84 1.78 c p1
+127.25 78.88 1.78 c p1
+127.29 79.02 1.78 c p1
+127.38 79.07 1.78 c p1
+127.42 79.07 1.78 c p1
+127.50 79.12 1.78 c p1
+127.54 79.19 1.78 c p1
+127.68 79.20 1.78 c p1
+127.85 79.25 1.78 c p1
+127.94 79.29 1.78 c p1
+127.95 79.33 1.78 c p1
+128.00 79.33 1.78 c p1
+128.06 79.42 1.78 c p1
+128.09 79.44 1.78 c p1
+128.10 79.47 1.78 c p1
+128.17 79.50 1.78 c p1
+128.24 79.52 1.78 c p1
+128.30 79.57 1.78 c p1
+128.43 79.60 1.78 c p1
+128.44 79.60 1.78 c p1
+128.47 79.64 1.78 c p1
+128.50 79.67 1.78 c p1
+128.55 79.71 1.78 c p1
+128.70 79.73 1.78 c p1
+128.87 79.74 1.78 c p1
+129.00 79.76 1.78 c p1
+129.20 79.77 1.78 c p1
+129.34 79.78 1.78 c p1
+129.38 79.79 1.78 c p1
+129.54 79.83 1.78 c p1
+129.57 80.05 1.78 c p1
+129.90 80.14 1.78 c p1
+129.94 80.21 1.78 c p1
+129.98 80.21 1.78 c p1
+129.99 80.22 1.78 c p1
+130.05 80.28 1.78 c p1
+130.05 80.33 1.78 c p1
+130.06 80.45 1.78 c p1
+130.11 80.49 1.78 c p1
+130.16 80.52 1.78 c p1
+130.17 80.63 1.78 c p1
+130.19 80.70 1.78 c p1
+130.29 80.71 1.78 c p1
+130.41 80.77 1.78 c p1
+130.42 80.81 1.78 c p1
+130.43 80.82 1.78 c p1
+130.58 80.85 1.78 c p1
+130.67 80.90 1.78 c p1
+130.69 80.92 1.78 c p1
+130.78 80.96 1.78 c p1
+130.79 81.00 1.78 c p1
+130.80 81.07 1.78 c p1
+130.81 81.08 1.78 c p1
+130.83 81.10 1.78 c p1
+130.84 81.11 1.78 c p1
+130.92 81.14 1.78 c p1
+130.93 81.15 1.78 c p1
+130.96 81.18 1.78 c p1
+130.97 81.18 1.78 c p1
+131.06 81.25 1.78 c p1
+131.08 81.27 1.78 c p1
+131.08 81.30 1.78 c p1
+131.10 81.48 1.78 c p1
+131.13 81.57 1.78 c p1
+131.16 81.63 1.78 c p1
+131.17 81.64 1.78 c p1
+131.27 81.66 1.78 c p1
+131.29 81.69 1.78 c p1
+131.33 81.75 1.78 c p1
+131.39 81.76 1.78 c p1
+131.50 81.77 1.78 c p1
+131.58 81.79 1.78 c p1
+131.61 81.81 1.78 c p1
+131.73 81.82 1.78 c p1
+131.77 81.89 1.78 c p1
+131.90 81.96 1.78 c p1
+131.95 81.97 1.78 c p1
+132.01 82.03 1.78 c p1
+132.02 82.23 1.78 c p1
+132.10 82.24 1.78 c p1
+132.20 82.24 1.78 c p1
+132.22 82.26 1.78 c p1
+132.23 82.29 1.78 c p1
+132.32 82.32 1.78 c p1
+132.35 82.35 1.78 c p1
+132.44 82.35 1.78 c p1
+132.56 82.36 1.78 c p1
+132.62 82.43 1.78 c p1
+132.62 82.51 1.78 c p1
+132.68 82.51 1.78 c p1
+132.75 82.53 1.78 c p1
+132.75 82.63 1.78 c p1
+132.80 82.66 1.78 c p1
+132.85 82.68 1.78 c p1
+132.89 82.69 1.78 c p1
+132.93 82.77 1.78 c p1
+132.94 82.82 1.78 c p1
+133.20 82.87 1.78 c p1
+133.26 82.94 1.78 c p1
+133.28 83.00 1.78 c p1
+133.30 83.05 1.78 c p1
+133.39 83.07 1.78 c p1
+145.90 83.09 1.78 c p1
+146.02 83.11 1.78 c p1
+146.07 83.13 1.78 c p1
+146.08 83.14 1.78 c p1
+146.21 83.20 1.78 c p1
+146.22 83.22 1.78 c p1
+146.24 83.28 1.78 c p1
+146.31 83.29 1.78 c p1
+146.43 83.34 1.78 c p1
+146.43 83.50 1.78 c p1
+147.36 83.50 1.78 c p1
+147.43 83.52 1.78 c p1
+147.45 83.57 1.78 c p1
+147.57 83.67 1.78 c p1
+147.80 83.67 1.78 c p1
+147.89 83.70 1.78 c p1
+147.92 83.70 1.78 c p1
+148.02 83.74 1.78 c p1
+148.04 83.78 1.78 c p1
+148.39 83.82 1.78 c p1
+148.46 83.85 1.78 c p1
+148.49 83.96 1.78 c p1
+149.30 84.00 1.78 c p1
+149.62 84.02 1.78 c p1
+149.64 84.02 1.78 c p1
+149.76 84.04 1.78 c p1
+150.15 84.05 1.78 c p1
+150.22 84.06 1.78 c p1
+150.22 84.07 1.78 c p1
+150.22 84.09 1.78 c p1
+150.29 84.15 1.78 c p1
+150.46 84.18 1.78 c p1
+150.53 84.22 1.78 c p1
+150.61 84.30 1.78 c p1
+150.78 84.35 1.78 c p1
+150.90 84.38 1.78 c p1
+151.49 84.39 1.78 c p1
+151.69 84.40 1.78 c p1
+152.02 84.51 1.78 c p1
+152.06 84.58 1.78 c p1
+152.24 94.64 1.78 c p1
+152.38 95.03 1.78 c p1
+152.39 95.77 1.78 c p1
+152.44 96.19 1.78 c p1
+152.51 97.02 1.78 c p1
+152.60 97.11 1.78 c p1
+152.63 97.77 1.78 c p1
+152.64 97.81 1.78 c p1
+153.33 97.92 1.78 c p1
+153.34 98.69 1.78 c p1
+153.95 100.53 1.78 c p1
+119.33 72.34 159.98 106.66 cl
+124.08 77.09 155.23 101.90 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 77.09 m
+31.15 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.08 79.39 m
+31.15 24.81 l
+o
+np
+124.08 74.79 m
+31.15 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 77.09 m
+31.15 0 l
+0 24.81 l
+-31.15 0 l
+0 -24.81 l
+o
+42.77 42.77 73.92 67.58 cl
+38.02 38.02 78.67 72.34 cl
+/ps 6 def /Font1 findfont 6 s
+0 0 0 rgb
+58.34 25.66 (Index) .5 0 0 t
+31.36 55.18 (xi) .5 0 90 t
+42.77 42.77 73.92 67.58 cl
+/ps 9 def /Font1 findfont 9 s
+0 0 0 rgb
+58.34 52.01 (educ) .5 0 0 t
+83.42 42.77 114.58 67.58 cl
+83.42 42.77 114.58 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+84.58 48.79 1.78 c p1
+85.10 48.79 1.78 c p1
+87.23 48.79 1.78 c p1
+89.35 48.79 1.78 c p1
+89.39 50.07 1.78 c p1
+90.40 50.07 1.78 c p1
+90.99 50.07 1.78 c p1
+91.44 51.35 1.78 c p1
+92.59 52.62 1.78 c p1
+92.59 52.62 1.78 c p1
+92.59 53.90 1.78 c p1
+93.53 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+94.19 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+95.80 53.90 1.78 c p1
+97.40 53.90 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+97.40 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 55.18 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+99.00 56.45 1.78 c p1
+100.39 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 56.45 1.78 c p1
+100.60 57.73 1.78 c p1
+101.72 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+102.20 57.73 1.78 c p1
+103.60 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 57.73 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+103.81 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+105.41 59.01 1.78 c p1
+107.01 59.01 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+107.01 60.28 1.78 c p1
+108.61 60.28 1.78 c p1
+108.61 60.28 1.78 c p1
+108.61 61.56 1.78 c p1
+108.61 61.56 1.78 c p1
+110.22 61.56 1.78 c p1
+110.22 61.56 1.78 c p1
+110.22 61.56 1.78 c p1
+111.82 62.84 1.78 c p1
+113.42 64.11 1.78 c p1
+78.67 38.02 119.33 72.34 cl
+83.42 42.77 114.58 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 42.77 m
+31.16 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+83.42 45.07 m
+31.16 24.81 l
+o
+np
+83.42 40.47 m
+31.16 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+83.42 43.69 m
+0 19.15 l
+o
+np
+83.42 43.69 m
+-4.75 0 l
+o
+np
+83.42 50.07 m
+-4.75 0 l
+o
+np
+83.42 56.45 m
+-4.75 0 l
+o
+np
+83.42 62.84 m
+-4.75 0 l
+o
+/ps 4 def /Font1 findfont 4 s
+76.77 43.69 (0) .5 0 90 t
+76.77 50.07 (5) .5 0 90 t
+76.77 62.84 (15) .5 0 90 t
+np
+83.42 42.77 m
+31.16 0 l
+0 24.81 l
+-31.16 0 l
+0 -24.81 l
+o
+124.08 42.77 155.23 67.58 cl
+124.08 42.77 155.23 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+125.23 48.79 1.78 c p1
+125.23 48.79 1.78 c p1
+126.84 48.79 1.78 c p1
+126.84 48.79 1.78 c p1
+128.44 50.07 1.78 c p1
+128.44 50.07 1.78 c p1
+131.64 50.07 1.78 c p1
+131.64 51.35 1.78 c p1
+131.64 52.62 1.78 c p1
+131.64 52.62 1.78 c p1
+133.25 53.90 1.78 c p1
+133.25 53.90 1.78 c p1
+133.25 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+134.85 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+136.45 53.90 1.78 c p1
+138.05 53.90 1.78 c p1
+138.05 53.90 1.78 c p1
+138.05 53.90 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+138.05 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 55.18 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+139.66 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+141.26 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 56.45 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+142.86 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 57.73 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+144.46 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+146.07 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 59.01 1.78 c p1
+147.67 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+149.27 60.28 1.78 c p1
+150.87 60.28 1.78 c p1
+150.87 60.28 1.78 c p1
+150.87 61.56 1.78 c p1
+150.87 61.56 1.78 c p1
+150.87 61.56 1.78 c p1
+152.48 61.56 1.78 c p1
+152.48 61.56 1.78 c p1
+154.08 62.84 1.78 c p1
+154.08 64.11 1.78 c p1
+119.33 38.02 159.98 72.34 cl
+124.08 42.77 155.23 67.58 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 42.77 m
+31.15 24.81 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.08 45.07 m
+31.15 24.81 l
+o
+np
+124.08 40.47 m
+31.15 24.82 l
+o
+0.00 0.00 198.00 198.00 cl
+0 0 0 rgb
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.08 42.77 m
+31.15 0 l
+0 24.81 l
+-31.15 0 l
+0 -24.81 l
+o
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/doc/figs/qqplotnn2.pdf b/inst/doc/figs/qqplotnn2.pdf
new file mode 100644
index 0000000..c41d505
--- /dev/null
+++ b/inst/doc/figs/qqplotnn2.pdf
@@ -0,0 +1,1557 @@
+%PDF-1.1
+%���ρ�
+1 0 obj
+<<
+/CreationDate (D:20050929105523)
+/ModDate (D:20050929105523)
+/Title (R Graphics Output)
+/Producer (R 2.1.1)
+/Creator (R)
+>>
+endobj
+2 0 obj
+<<
+/Type /Catalog
+/Pages 3 0 R
+>>
+endobj
+5 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F1
+/BaseFont /ZapfDingbats
+>>
+endobj
+6 0 obj
+<<
+/Type /Page
+/Parent 3 0 R
+/Contents 7 0 R
+/Resources 4 0 R
+>>
+endobj
+7 0 obj
+<<
+/Length 8 0 R
+>>
+stream
+q
+1.000 1.000 1.000 rg
+0 0 198.00 198.00 re f
+Q q 25.34 115.10 49.10 44.88 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 4.00 0.00 -0.00 4.00 45.37 106.87 Tm (Index) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 20.91 135.99 Tm (xi) Tj
+ET
+Q q
+BT
+0.000 0.000 0.000 rg
+/F3 1 Tf 10.00 0.00 -0.00 10.00 79.41 180.26 Tm (QQ Plots) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 92.61 167.59 Tm (All) Tj
+/F2 1 Tf 10.00 0.00 -0.00 10.00 130.12 167.59 Tm (Matched) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 101.66 20.28 Tm (Control Units) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 177.72 70.92 Tm (Treated Units) Tj
+ET
+Q q 28.51 118.27 42.77 38.54 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 11.00 0.00 -0.00 11.00 37.98 133.84 Tm (black) Tj
+ET
+Q q 77.62 118.27 42.77 38.54 re W n
+Q q 77.62 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 118.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.93 118.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.02 118.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.11 119.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.17 119.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.18 120.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.24 120.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.30 120.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.33 120.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.41 121.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.54 121.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.58 122.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.66 122.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.74 122.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.83 123.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.92 123.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.97 124.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.03 125.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.04 126.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.06 126.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.12 126.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.15 127.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.23 127.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.34 127.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.39 127.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.41 127.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.47 128.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.48 128.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.57 128.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.69 144.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.73 144.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.75 144.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.79 144.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.82 144.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.92 144.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.02 144.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.19 144.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.33 144.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.46 144.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.51 144.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.55 144.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.75 144.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.77 144.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.81 144.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.83 144.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.88 144.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.95 144.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.98 144.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.06 144.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.28 144.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.46 144.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.64 145.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.74 145.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.77 145.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.82 145.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.06 145.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.06 145.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.09 145.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.21 145.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.28 145.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.35 145.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.45 145.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.48 145.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.54 145.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.61 145.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.64 146.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.67 146.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.74 146.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.90 146.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.10 146.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.21 146.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.27 146.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.43 146.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.53 146.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.60 146.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.70 146.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.87 146.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.92 146.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.99 146.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.14 146.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.21 147.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.30 147.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.35 147.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.47 147.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.51 147.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.58 147.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.61 147.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.63 147.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.66 147.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.71 147.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.72 148.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.81 148.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.89 148.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.95 148.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.97 148.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.04 148.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.08 148.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.13 148.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.18 148.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.23 148.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.32 148.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.48 148.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.50 148.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.56 148.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.64 148.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.68 149.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.75 149.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.82 149.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.86 149.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.88 149.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.94 149.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.02 149.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.14 149.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.22 149.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.35 149.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.44 149.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.50 149.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.61 149.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.67 149.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.82 149.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.95 149.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.98 150.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.01 150.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.08 150.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.11 150.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.20 150.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.34 150.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.43 150.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.46 150.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.57 150.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.63 150.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.69 150.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.83 150.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.95 150.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.09 150.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.24 151.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.32 151.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.35 151.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.47 151.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.51 151.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.67 151.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.76 151.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.85 151.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.89 151.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.94 151.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.98 151.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.00 151.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 105.08 151.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.27 151.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.61 151.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.80 151.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.91 151.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.00 152.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.36 152.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.61 152.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.18 152.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.45 152.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 109.01 152.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 109.64 152.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.25 152.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.53 152.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.67 152.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 111.07 152.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 111.43 152.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 111.86 153.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.32 153.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.55 153.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.01 153.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.41 153.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.75 153.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.03 153.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.30 153.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.44 153.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.81 153.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.98 153.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.20 153.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.34 153.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.61 153.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.76 153.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 116.01 153.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 116.43 154.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 116.87 154.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 116.95 154.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 117.25 154.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 117.43 154.25 Tm (l) Tj 0 Tr
+ET
+Q q 74.45 115.10 49.10 44.88 re W n
+Q q 77.62 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 118.27 m 120.38 156.82 l S
+0.75 w
+[ 3.00 5.00] 0 d
+77.62 121.84 m 120.38 160.38 l S
+77.62 114.70 m 120.38 153.25 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 119.69 m 77.62 155.39 l S
+77.62 119.69 m 74.45 119.69 l S
+77.62 124.79 m 74.45 124.79 l S
+77.62 129.89 m 74.45 129.89 l S
+77.62 134.99 m 74.45 134.99 l S
+77.62 140.09 m 74.45 140.09 l S
+77.62 145.19 m 74.45 145.19 l S
+77.62 150.29 m 74.45 150.29 l S
+77.62 155.39 m 74.45 155.39 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 116.97 Tm (-0.2) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 128.02 Tm (0.2) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 138.22 Tm (0.6) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 148.42 Tm (1.0) Tj
+ET
+77.62 118.27 m
+120.38 118.27 l
+120.38 156.82 l
+77.62 156.82 l
+77.62 118.27 l
+S
+Q q 126.72 118.27 42.77 38.54 re W n
+Q q 126.72 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.04 118.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.13 118.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.19 119.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.39 119.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.46 119.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.48 119.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.53 120.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.60 120.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.62 120.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.66 120.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.67 120.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.83 120.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.86 121.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.94 122.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.09 122.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.20 122.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.20 123.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.29 123.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.57 123.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.60 124.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.78 124.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.85 124.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.88 125.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.98 125.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.09 127.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.11 127.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.40 127.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.62 127.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.66 128.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.70 144.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.83 144.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.96 144.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.10 144.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.25 144.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.31 144.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.36 144.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.51 144.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.96 144.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.05 144.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.10 144.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.27 144.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.62 144.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.71 144.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.72 144.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.74 145.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.87 145.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.92 145.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.28 145.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.29 145.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.41 145.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.54 145.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.58 145.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.72 145.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.72 145.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.80 145.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.81 145.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.28 145.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.74 145.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.77 145.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.80 146.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.81 146.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.83 146.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.99 146.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.04 146.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.14 146.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.19 146.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.25 146.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.49 146.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.57 146.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.80 146.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.87 146.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.93 146.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.93 146.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.97 146.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.17 146.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.24 146.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.25 147.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.65 147.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.66 147.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.78 147.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.92 147.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.95 147.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.14 147.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.15 147.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.40 147.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.47 147.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.64 147.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.78 147.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.81 148.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.88 148.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.03 148.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.13 148.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.19 148.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.54 148.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.61 148.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.08 148.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.08 148.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.19 148.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.44 148.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.65 149.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.73 149.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.98 149.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.09 149.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.10 149.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.16 149.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.33 149.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.62 149.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.71 149.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.76 149.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.84 149.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.08 149.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.10 149.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.17 149.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.25 149.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.51 149.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.70 149.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.78 149.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.83 149.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.86 149.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.91 149.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.99 149.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.17 149.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.37 150.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.42 150.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.48 150.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.50 150.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.69 150.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.01 150.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.08 150.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.30 150.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.31 150.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.37 150.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.38 150.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.53 150.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.55 150.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.61 150.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.82 150.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.87 150.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.28 151.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.31 151.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.48 151.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.01 151.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.29 151.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.49 151.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.52 151.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.73 151.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.89 151.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.93 151.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.11 152.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.11 152.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.12 152.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.23 152.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.27 152.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.37 152.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.40 152.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.48 152.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.94 152.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.09 152.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.14 152.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.26 152.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.40 152.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.45 152.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.57 152.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.58 152.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.63 153.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.94 153.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.09 153.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.12 153.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.22 153.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.22 153.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.52 153.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.54 153.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.00 153.41 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.09 153.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.17 153.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.58 153.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.76 153.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.76 153.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.94 153.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.00 153.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.13 154.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.14 154.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.27 154.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.50 154.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.55 154.22 Tm (l) Tj 0 Tr
+ET
+Q q 123.55 115.10 49.10 44.88 re W n
+Q q 126.72 118.27 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 118.27 m 169.49 156.82 l S
+0.75 w
+[ 3.00 5.00] 0 d
+126.72 121.84 m 169.49 160.38 l S
+126.72 114.70 m 169.49 153.25 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 118.27 m
+169.49 118.27 l
+169.49 156.82 l
+126.72 156.82 l
+126.72 118.27 l
+S
+Q q 28.51 73.39 42.77 38.54 re W n
+Q q 25.34 70.22 49.10 44.88 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 4.00 0.00 -0.00 4.00 45.37 61.99 Tm (Index) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 20.91 91.11 Tm (xi) Tj
+ET
+Q q 28.51 73.39 42.77 38.54 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 11.00 0.00 -0.00 11.00 35.54 90.10 Tm (hispan) Tj
+ET
+Q q 77.62 73.39 42.77 38.54 re W n
+Q q 77.62 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 73.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.02 73.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.05 73.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.24 73.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.34 73.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.45 73.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.54 73.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.57 74.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.66 74.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.68 74.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.75 74.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.86 74.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.94 74.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.98 74.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.04 74.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.07 74.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.18 74.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.23 74.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.28 74.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.31 74.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.42 74.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.48 74.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.66 74.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.72 74.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.81 74.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 79.90 75.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.02 75.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.10 75.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.15 75.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.19 75.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.21 75.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.35 75.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.55 75.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.62 75.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.66 75.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.74 75.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.80 75.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 80.94 75.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.06 75.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.13 75.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.17 75.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.20 75.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.24 75.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.27 75.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.29 75.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.37 75.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.45 75.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.55 75.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.63 75.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.69 76.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.73 76.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.76 76.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.81 76.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.90 76.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.94 76.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.97 76.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.02 76.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.15 76.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.19 76.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.30 76.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.33 76.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.43 76.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.50 76.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.63 76.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.70 77.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.78 77.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.85 77.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.90 77.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.93 77.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 82.99 77.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.11 77.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.19 77.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.29 77.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.33 77.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.35 77.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.42 77.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.47 77.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.51 77.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.59 77.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.68 77.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.78 77.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.82 77.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.88 77.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.92 77.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 83.99 77.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.07 78.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.08 78.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.11 78.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.18 78.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.28 78.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.30 78.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.35 78.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.41 78.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.49 78.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.54 78.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.61 78.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.68 78.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.73 78.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.85 78.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.88 78.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.95 78.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.99 79.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.03 79.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.20 79.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.26 79.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.50 79.32 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.56 79.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.59 79.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.63 79.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.66 79.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.71 79.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.74 79.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.82 79.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.99 79.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.09 79.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.16 79.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.22 79.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.28 79.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.34 79.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.43 79.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.45 79.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.50 80.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.69 80.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.73 80.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.78 80.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.87 80.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.93 80.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.03 80.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.09 80.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.12 80.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.21 80.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.33 80.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.40 80.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.44 80.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.52 80.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.53 80.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.61 80.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.65 81.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.70 81.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.85 81.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.93 81.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.99 81.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.01 81.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.07 81.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.12 81.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.15 81.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.20 81.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.26 81.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.34 81.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.59 81.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.76 81.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.91 81.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.93 81.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.98 82.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.01 82.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.05 82.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.11 82.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 89.16 82.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 98.14 82.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.71 82.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.20 82.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 107.54 82.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.12 82.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.42 83.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.76 83.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 109.06 83.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 109.60 83.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.82 83.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.96 83.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 111.22 83.31 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 111.44 83.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.01 83.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.23 83.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.39 83.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.64 99.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 112.92 101.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.29 103.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.66 103.79 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.07 104.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 114.61 105.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.31 105.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.65 106.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 116.52 106.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 116.87 106.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 117.50 108.37 Tm (l) Tj 0 Tr
+ET
+Q q 74.45 70.22 49.10 44.88 re W n
+Q q 77.62 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 73.39 m 120.38 111.94 l S
+0.75 w
+[ 3.00 5.00] 0 d
+77.62 76.96 m 120.38 115.50 l S
+77.62 69.82 m 120.38 108.37 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 74.81 m 77.62 110.56 l S
+77.62 74.81 m 74.45 74.81 l S
+77.62 79.92 m 74.45 79.92 l S
+77.62 85.03 m 74.45 85.03 l S
+77.62 90.13 m 74.45 90.13 l S
+77.62 95.24 m 74.45 95.24 l S
+77.62 100.35 m 74.45 100.35 l S
+77.62 105.45 m 74.45 105.45 l S
+77.62 110.56 m 74.45 110.56 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 72.09 Tm (-0.2) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 83.15 Tm (0.2) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 93.36 Tm (0.6) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 103.58 Tm (1.0) Tj
+ET
+77.62 73.39 m
+120.38 73.39 l
+120.38 111.94 l
+77.62 111.94 l
+77.62 73.39 l
+S
+Q q 126.72 73.39 42.77 38.54 re W n
+Q q 126.72 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.03 73.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.12 73.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.15 73.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.19 73.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.20 73.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.25 74.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.29 74.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.34 74.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.43 74.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.52 74.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.56 74.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.72 74.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.76 74.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.78 74.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.78 74.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.86 74.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.96 74.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.28 75.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.94 75.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 128.97 75.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.14 75.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.21 75.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.22 75.49 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.24 75.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.26 75.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.28 75.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.30 75.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.31 75.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.39 75.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.44 76.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.44 76.25 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.45 76.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.74 76.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.84 76.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.88 76.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.94 76.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.19 76.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.29 77.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.43 77.03 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.53 77.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.58 77.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.66 77.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.67 77.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.75 77.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.78 77.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 130.83 77.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.30 77.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.36 77.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.55 77.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.59 77.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.67 77.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.70 77.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.75 77.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.75 77.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.87 77.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.92 78.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.95 78.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.05 78.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.09 78.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.23 78.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.51 78.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.60 78.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.79 78.40 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.83 78.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.84 78.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.88 78.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.88 78.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.98 78.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 132.98 78.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.23 78.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.30 78.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.39 78.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.60 78.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.63 78.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.81 79.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.83 79.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.91 79.07 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.98 79.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 133.99 79.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.02 79.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.06 79.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.31 79.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.33 79.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.37 79.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.54 79.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.56 79.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.62 79.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.66 79.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.69 79.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.86 79.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.90 79.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 134.97 79.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.05 79.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.12 80.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.14 80.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.24 80.16 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.25 80.21 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.28 80.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.35 80.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.48 80.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.50 80.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.55 80.35 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.75 80.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.81 80.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.81 80.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.91 80.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.03 80.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.25 80.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.34 80.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.44 80.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.45 80.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.60 80.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.76 80.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 136.77 80.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.10 80.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.23 81.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.26 81.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.32 81.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.33 81.18 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.34 81.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.38 81.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.45 81.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.48 81.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.53 81.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.53 81.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.57 81.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.64 81.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.77 81.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 137.97 81.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.06 81.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.11 81.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.19 81.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.31 81.84 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.32 81.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.93 81.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.97 81.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.07 81.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.08 82.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.13 82.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.22 82.08 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.26 82.12 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 156.36 82.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.25 82.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.27 82.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.41 82.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.52 82.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.56 82.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.27 82.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.43 82.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.45 82.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.88 82.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.93 82.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.96 82.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 158.99 82.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 159.25 82.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.05 82.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.18 82.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.22 82.97 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.32 83.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.34 83.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.62 83.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.62 83.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 161.10 83.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.25 83.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.90 83.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.95 83.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.01 83.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.21 83.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.83 83.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.84 83.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.87 83.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 163.96 83.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.34 83.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.59 83.88 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.61 99.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.70 99.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.85 100.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.28 101.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.33 102.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.67 102.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.76 103.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 165.99 103.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.01 106.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.43 109.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.61 109.14 Tm (l) Tj 0 Tr
+ET
+Q q 123.55 70.22 49.10 44.88 re W n
+Q q 126.72 73.39 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 73.39 m 169.49 111.94 l S
+0.75 w
+[ 3.00 5.00] 0 d
+126.72 76.96 m 169.49 115.50 l S
+126.72 69.82 m 169.49 108.37 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 73.39 m
+169.49 73.39 l
+169.49 111.94 l
+126.72 111.94 l
+126.72 73.39 l
+S
+Q q 28.51 28.51 42.77 38.54 re W n
+Q q 25.34 25.34 49.10 44.88 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 4.00 0.00 -0.00 4.00 45.37 17.11 Tm (Index) Tj
+/F2 1 Tf 0.00 4.00 -4.00 0.00 20.91 46.23 Tm (xi) Tj
+ET
+Q q 28.51 28.51 42.77 38.54 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 11.00 0.00 -0.00 11.00 39.51 44.08 Tm (educ) Tj
+ET
+Q q 77.62 28.51 42.77 38.54 re W n
+Q q 77.62 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 77.90 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 78.61 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 81.53 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.45 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 84.50 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 85.88 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 86.70 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 87.32 40.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.90 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.90 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 88.90 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 90.19 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 91.10 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 93.30 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 95.50 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 97.70 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.61 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 99.90 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 101.43 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 102.10 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.01 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 104.30 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 106.50 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 108.70 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 110.90 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.10 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.10 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 113.10 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 115.30 58.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 117.50 60.52 Tm (l) Tj 0 Tr
+ET
+Q q 74.45 25.34 49.10 44.88 re W n
+Q q 77.62 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 28.51 m 120.38 67.06 l S
+0.75 w
+[ 3.00 5.00] 0 d
+77.62 32.08 m 120.38 70.62 l S
+77.62 24.94 m 120.38 63.49 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+77.62 29.94 m 77.62 59.68 l S
+77.62 29.94 m 74.45 29.94 l S
+77.62 39.85 m 74.45 39.85 l S
+77.62 49.77 m 74.45 49.77 l S
+77.62 59.68 m 74.45 59.68 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 29.19 Tm (0) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 39.10 Tm (5) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 48.27 Tm (10) Tj
+/F2 1 Tf 0.00 3.00 -3.00 0.00 73.18 58.18 Tm (15) Tj
+ET
+77.62 28.51 m
+120.38 28.51 l
+120.38 67.06 l
+77.62 67.06 l
+77.62 28.51 l
+S
+Q q 126.72 28.51 42.77 38.54 re W n
+Q q 126.72 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+BT
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 127.00 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.20 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 129.20 36.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.40 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 131.40 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 38.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 40.69 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 135.80 42.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 138.00 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 140.20 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 142.40 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 44.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 144.60 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 46.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 146.80 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 149.00 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 48.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 151.20 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 50.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 153.40 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 155.60 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 52.59 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 157.80 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 160.00 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 54.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 162.20 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.40 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 164.40 56.56 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.60 58.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 3.29 0 0 3.29 166.60 60.52 Tm (l) Tj 0 Tr
+ET
+Q q 123.55 25.34 49.10 44.88 re W n
+Q q 126.72 28.51 42.77 38.54 re W n
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 28.51 m 169.49 67.06 l S
+0.75 w
+[ 3.00 5.00] 0 d
+126.72 32.08 m 169.49 70.62 l S
+126.72 24.94 m 169.49 63.49 l S
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+126.72 28.51 m
+169.49 28.51 l
+169.49 67.06 l
+126.72 67.06 l
+126.72 28.51 l
+S
+Q
+endstream
+endobj
+8 0 obj
+67972
+endobj
+3 0 obj
+<<
+/Type /Pages
+/Kids [
+6 0 R
+]
+/Count 1
+/MediaBox [0 0 198 198]
+>>
+endobj
+4 0 obj
+<<
+/ProcSet [/PDF /Text]
+/Font << /F1 5 0 R /F2 10 0 R /F3 11 0 R /F4 12 0 R /F5 13 0 R /F6 14 0 R >>
+/ExtGState << >>
+>>
+endobj
+9 0 obj
+<<
+/Type /Encoding
+/BaseEncoding /WinAnsiEncoding
+/Differences [ 45/minus 96/quoteleft
+144/dotlessi /grave /acute /circumflex /tilde /macron /breve /dotaccent
+/dieresis /.notdef /ring /cedilla /.notdef /hungarumlaut /ogonek /caron /space]
+>>
+endobj
+10 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F2
+/BaseFont /Times-Roman
+/Encoding 9 0 R
+>>
+endobj
+11 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F3
+/BaseFont /Times-Bold
+/Encoding 9 0 R
+>>
+endobj
+12 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F4
+/BaseFont /Times-Italic
+/Encoding 9 0 R
+>>
+endobj
+13 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F5
+/BaseFont /Times-BoldItalic
+/Encoding 9 0 R
+>>
+endobj
+14 0 obj
+<<
+/Type /Font
+/Subtype /Type1
+/Name /F6
+/BaseFont /Symbol
+>>
+endobj
+xref
+0 15
+0000000000 65535 f 
+0000000020 00000 n 
+0000000162 00000 n 
+0000068420 00000 n 
+0000068503 00000 n 
+0000000211 00000 n 
+0000000294 00000 n 
+0000000374 00000 n 
+0000068399 00000 n 
+0000068640 00000 n 
+0000068897 00000 n 
+0000068996 00000 n 
+0000069094 00000 n 
+0000069194 00000 n 
+0000069298 00000 n 
+trailer
+<<
+/Size 15
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+69376
+%%EOF
diff --git a/inst/doc/graphics.R b/inst/doc/graphics.R
new file mode 100644
index 0000000..2dc558a
--- /dev/null
+++ b/inst/doc/graphics.R
@@ -0,0 +1,48 @@
+# File to create sample graphics and output for documentation
+
+library(MatchIt)
+library(lattice)
+data(lalonde)
+m.out <- matchit(treat ~ re74+re75+educ+black+hispan+age, data=lalonde, method="nearest")
+
+print(summary(m.out))
+
+ps.options(family = c("Times"), pointsize = 8)
+
+postscript(file="figs/qqplotnn1.eps", horizontal=FALSE, paper="special", width=2.75, height=2.75)
+par(mar=c(2, 2, 2, 2) + 0.1, cex.lab=0.7, cex.axis=0.5,
+    mgp=c(1,0.5,0), cex.main=0.8, cex=1, bg="white", mfrow=c(1,2))
+plot(m.out, which.xs=c("re74", "re75", "educ"), interactive=FALSE)
+dev.off()
+
+pdf(file="figs/qqplotnn1.pdf", width=2.75, height=2.75, pointsize=8, family="Times")
+par(mar=c(2, 2, 2, 2) + 0.1, cex.lab=0.7, cex.axis=0.5,
+    mgp=c(1,0.5,0), cex.main=0.8, cex=1, bg="white", mfrow=c(1,2))
+plot(m.out, which.xs=c("re74", "re75", "educ"), interactive=FALSE)
+dev.off()
+
+postscript(file="figs/qqplotnn2.eps", horizontal=FALSE, paper="special", width=2.75, height=2.75)
+par(mar=c(2, 2, 2, 2) + 0.1, cex.lab=0.7, cex.axis=0.5,
+    mgp=c(1,0.5,0), cex.main=0.8, cex=1, bg="white", mfrow=c(1,2))
+plot(m.out, which.xs=c("black", "hispan", "educ"), interactive=FALSE)
+dev.off()
+
+pdf(file="figs/qqplotnn2.pdf", width=2.75, height=2.75, pointsize=8, family="Times")
+par(mar=c(2, 2, 2, 2) + 0.1, cex.lab=0.7, cex.axis=0.5,
+    mgp=c(1,0.5,0), cex.main=0.8, cex=1, bg="white", mfrow=c(1,2))
+plot(m.out, which.xs=c("black", "hispan", "educ"), interactive=FALSE)
+dev.off()
+
+postscript(file="figs/jitterplotnn.eps", horizontal=FALSE, paper="special", width=5.5, height=3.5)
+par(mar=c(2, 2, 2, 2) + 0.1, cex.lab=0.7, cex.axis=0.5,
+    mgp=c(1,0.5,0), cex.main=0.8, cex=1, bg="white")
+plot(m.out, type="jitter", interactive=FALSE)
+dev.off()
+
+pdf(file="figs/jitterplotnn.pdf", width=5.5, height=3.5, pointsize=8, family="Times")
+par(mar=c(2, 2, 2, 2) + 0.1, cex.lab=0.7, cex.axis=0.5,
+    mgp=c(1,0.5,0), cex.main=0.8, cex=1, bg="white")
+plot(m.out, type="jitter", interactive=FALSE)
+dev.off()
+
+
diff --git a/inst/doc/index.shtml b/inst/doc/index.shtml
new file mode 100755
index 0000000..865e724
--- /dev/null
+++ b/inst/doc/index.shtml
@@ -0,0 +1,76 @@
+<html>
+<head>
+<title>MatchIt Software Website</title>
+<script language='Javascript' src='/gking.js'></script></HEAD>
+
+<BODY><script language="Javascript">displayHeader()</script>
+
+<h1>MatchIt: Nonparametric Preprocessing for Parametric Causal Inference</h1>
+
+<p><a href="http://people.iq.harvard.edu/~dho/" target="gkingext">Daniel Ho</a>,
+<a href="http://www.princeton.edu/~kimai/" target="gkingext">Kosuke Imai</a>, 
+<a href="http://GKing.Harvard.edu">Gary King</a>, 
+<a href="http://people.iq.harvard.edu/~estuart/" target="gkingext">Elizabeth Stuart</a>
+
+<p>"At MatchIt, we don't make parametric models, we make parametric models
+work better."
+
+<!-- rbuild: replace 'Version:' '</b>' version -->
+<p><b>Version:2.4-10</b>
+
+  <table width="90%" border="0" cellpadding="10">
+    <tr>
+	  <td><img src="face_off.jpg"></a></td>
+
+<!-- width="285" height="425"> -->
+
+      <td valign="top"><br>MatchIt implements the suggestions of <a
+      href="/files/abs/matchp-abs.shtml">Ho, Imai, King, and Stuart
+      (2007)</a> for improving parametric statistical
+      models by
+      preprocessing data with nonparametric matching methods. MatchIt
+      implements a wide range of sophisticated matching methods,
+      making it possible to greatly reduce the dependence of causal
+      inferences on hard-to-justify, but commonly made, statistical
+      modeling assumptions. The software also easily fits into
+      existing research practices since, after preprocessing data with
+      MatchIt, researchers can use whatever parametric model they
+      would have used without MatchIt, but produce inferences with
+      substantially more robustness and less sensitivity to modeling
+      assumptions. MatchIt is an <a
+      href="http://www.r-project.org" target="gkingext">R</a> program, and also works
+      seamlessly with <a href="/zelig/">Zelig</a>.
+
+<ul>
+        <li>Documentation: <a href="docs/">HTML</a> or <a
+href="/matchit/docs/matchit.pdf">PDF</a> 
+        <li><a
+href="http://gking.harvard.edu/matchit/docs/Installing_M_SMALL_ATC.html">Installation
+and Downloads</a>
+
+<li>All questions, bugs and requests: MatchIt Mailing List: <a
+href="http://lists.hmdc.harvard.edu/index.cgi?info=matchit"
+target="gkingext">[Un]Subscribe</a>, or <a
+href="http://lists.hmdc.harvard.edu/lists/matchit/"
+target="gkingext">Browse/Search Archives</a>
+
+</ul>
+
+We're pleased to report that the <a
+href="/files/abs/matchp-abs.shtml">article</a> on which MatchIt is
+based won the <em>Warren Miller Prize</em> for the best paper in
+<em>Political Analysis</em> that year and, separately, has been named a
+    <em>Fast Breaking Paper</em> by Thomson Reuters' ScienceWatch, for
+    being the article with the largest
+    percentage increase in citations among those in the top 1% of
+    total citations across the social sciences in the last two years.
+    (You may be interested in this interview: <a
+  href="http://sciencewatch.com/dr/fbp/2008/08octfbp/08octfbpHoET/">HTML</a> |
+    <a href="/files/fbp08.pdf">PDF</a>)
+
+</td>      
+    </tr>
+  </table>
+
+<script language="Javascript">displayFooter()</script></BODY>
+</html>
diff --git a/inst/doc/intro.tex b/inst/doc/intro.tex
new file mode 100644
index 0000000..60f32e6
--- /dev/null
+++ b/inst/doc/intro.tex
@@ -0,0 +1,85 @@
+
+\section{What \MatchIt\ Does}
+
+\MatchIt\ implements the suggestions of \citet*{HoImaKin07} for
+improving parametric statistical models and reducing model dependence
+by preprocessing data with semi-parametric and non-parametric matching
+methods.  After appropriately preprocessing with \MatchIt, researchers
+can use whatever parametric model and software they would have used
+without \MatchIt, without other modification, and produce inferences
+that are more robust and less sensitive to modeling assumptions.  (In
+addition, you may wish to use Zelig
+(\hlink{\url{http://gking.harvard.edu/zelig/}})
+{http://gking.harvard.edu/zelig/}; \citealt{ImaKinLau06} for
+subsequent parametric analyses, as it is designed to be convenient in
+analyzing \MatchIt\ data sets.)  \MatchIt\ reduces the dependence of
+causal inferences on commonly made, but hard-to-justify, statistical
+modeling assumptions via the largest range of sophisticated matching
+methods of any software we know of.  The program includes most
+existing approaches to matching and even enables users to access
+methods implemented in other programs through its single, unified, and
+easy-to-use interface.  In addition, we have written \MatchIt\ so
+that adding new matching methods to the software is as easy for anyone
+with the inclination as it is for us.
+
+\section{Software Requirements} 
+\label{sec:require}
+
+\MatchIt\ works in conjunction with the R programming language and
+statistical software, and will run on any platform where R is
+installed (Windows, Unix, or Mac OS X).  R is available free for
+download at the Comprehensive R Archive Network (CRAN) at
+\hlink{http://cran.r-project.org/}{http://cran.r-project.org/}.
+\MatchIt\ has been tested on the most recent version of R.  A good way
+to learn R, if you don't know it already, is to learn Zelig (available
+at
+\hlink{http://gking.harvard.edu/zelig}{http://gking.harvard.edu/zelig})
+which includes a self-contained introduction to R and can be used to
+analyze the matched data after running \MatchIt.
+
+\section{Installing \MatchIt}
+\label{sec:install}
+
+To install \MatchIt\ for all platforms, type at the R command prompt,
+\begin{verbatim}
+> install.packages("MatchIt")
+\end{verbatim}
+and \MatchIt\ will install itself onto your system automatically.
+(During the installation process you may either decide to keep or
+discard the installation files, which will not affect the way
+\MatchIt\ runs.)  
+
+\section{Loading \MatchIt} \label{sec:load}
+
+You need to install \MatchIt\ only once, but you must load it prior to
+each use.  You can do this at the R prompt:
+\begin{verbatim}
+> library(MatchIt)
+\end{verbatim}
+
+Alternatively, you can specify R to load \MatchIt\ automatically at
+launch by editing the {\tt Rprofile} file located in the R program
+subdirectory, e.g.  \texttt{C:/R/rw2011/etc/}, for Windows systems or
+the {\tt .Rprofile} file located in the home directory for Unix/Linux
+and Mac OS X systems, and adding this line:
+\begin{verbatim}
+options(defaultPackages = c(getOption("defaultPackages"), "MatchIt"))
+\end{verbatim}
+For this change to take effect, you need to restart R.
+
+\section{Updating \MatchIt}
+
+We recommend that you periodically update \MatchIt\ at the R prompt by typing:
+\begin{verbatim}
+> update.packages()
+> library(MatchIt)
+\end{verbatim}
+which will update all the libraries including \MatchIt\ and load the
+new version of \MatchIt.
+
+
+%%% Local Variables: 
+%%% mode: pdflatex
+%%% TeX-master: "matchit"
+%%% TeX-master: t
+%%% End: 
diff --git a/inst/doc/makematchH b/inst/doc/makematchH
new file mode 100755
index 0000000..b2e6c93
--- /dev/null
+++ b/inst/doc/makematchH
@@ -0,0 +1,18 @@
+#!/bin/tcsh
+source ~/.aliases
+latex matchit
+bibtex matchit
+latex matchit
+latex matchit
+latex matchit
+latex2html -noauto_link -info "" -contents "http://gking.harvard.edu/matchit/docs/matchit.html" -t "matchit" -local_icons -toc_depth 3 -link 3 -dir ~/www/matchit/docs/ matchit.tex
+
+dp matchit
+cp matchit.pdf ~/www/matchit/docs/.
+
+#rm -rf matchit.Rcheck
+cp ~/www/matchit/docs/matchit.html ~/www/matchit/docs/index.html
+echo "A new version of MatchIt has been posted"|mail -s "MatchIt" kimai at Princeton.Edu
+echo "A new version of MatchIt has been posted"|mail -s "MatchIt" stuart at stat.harvard.edu
+echo "A new version of MatchIt has been posted"|mail -s "MatchIt" daniel.ho at yale.edu
+
diff --git a/inst/doc/matchit.aux b/inst/doc/matchit.aux
new file mode 100644
index 0000000..9350245
--- /dev/null
+++ b/inst/doc/matchit.aux
@@ -0,0 +1,188 @@
+\relax 
+\ifx\hyper at anchor\@undefined
+\global \let \oldcontentsline\contentsline
+\gdef \contentsline#1#2#3#4{\oldcontentsline{#1}{#2}{#3}}
+\global \let \oldnewlabel\newlabel
+\gdef \newlabel#1#2{\newlabelxx{#1}#2}
+\gdef \newlabelxx#1#2#3#4#5#6{\oldnewlabel{#1}{{#2}{#3}}}
+\AtEndDocument{\let \contentsline\oldcontentsline
+\let \newlabel\oldnewlabel}
+\else
+\global \let \hyper at last\relax 
+\fi
+
+\citation{HoImaKin07}
+\citation{ImaKinLau06}
+\@writefile{toc}{\contentsline {chapter}{\numberline {1}Introduction}{3}{chapter.1}}
+\@writefile{lof}{\addvspace {10\p@ }}
+\@writefile{lot}{\addvspace {10\p@ }}
+\@writefile{toc}{\contentsline {section}{\numberline {1.1}What \textsc  {MatchIt}\ Does}{3}{section.1.1}}
+\@writefile{toc}{\contentsline {section}{\numberline {1.2}Software Requirements}{3}{section.1.2}}
+\newlabel{sec:require}{{1.2}{3}{Software Requirements\relax }{section.1.2}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {1.3}Installing \textsc  {MatchIt}}{4}{section.1.3}}
+\newlabel{sec:install}{{1.3}{4}{Installing \MatchIt \relax }{section.1.3}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {1.4}Loading \textsc  {MatchIt}}{4}{section.1.4}}
+\newlabel{sec:load}{{1.4}{4}{Loading \MatchIt \relax }{section.1.4}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {1.5}Updating \textsc  {MatchIt}}{4}{section.1.5}}
+\citation{ImaDyk04}
+\citation{HoImaKin07}
+\@writefile{toc}{\contentsline {chapter}{\numberline {2}Statistical Overview}{5}{chapter.2}}
+\@writefile{lof}{\addvspace {10\p@ }}
+\@writefile{lot}{\addvspace {10\p@ }}
+\citation{HoImaKin07}
+\@writefile{toc}{\contentsline {section}{\numberline {2.1}Preprocessing via Matching}{6}{section.2.1}}
+\citation{ImaKinStu08}
+\@writefile{toc}{\contentsline {section}{\numberline {2.2}Checking Balance}{7}{section.2.2}}
+\newlabel{sec:balance-sum}{{2.2}{7}{Checking Balance\relax }{section.2.2}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {2.3}Conducting Analyses after Matching}{7}{section.2.3}}
+\newlabel{s:qoi}{{2.3}{7}{Conducting Analyses after Matching\relax }{section.2.3}{}}
+\citation{HoImaKin07}
+\citation{lalonde86}
+\citation{DehWah99}
+\@writefile{toc}{\contentsline {chapter}{\numberline {3}User's Guide to \textsc  {MatchIt}}{9}{chapter.3}}
+\@writefile{lof}{\addvspace {10\p@ }}
+\@writefile{lot}{\addvspace {10\p@ }}
+\newlabel{methods}{{3}{9}{User's Guide to \MatchIt \relax }{chapter.3}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {3.1}Preprocessing via Matching}{9}{section.3.1}}
+\newlabel{sec:matching}{{3.1}{9}{Preprocessing via Matching\relax }{section.3.1}{}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {3.1.1}Quick Overview}{9}{subsection.3.1.1}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {3.1.2}Examples}{9}{subsection.3.1.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.1}Exact Matching}{10}{subsubsection.3.1.2.1}}
+\newlabel{subsubsec:exact}{{3.1.2.1}{10}{Exact Matching\relax }{subsubsection.3.1.2.1}{}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.2}Subclassification}{10}{subsubsection.3.1.2.2}}
+\newlabel{subsubsec:subclass}{{3.1.2.2}{10}{Subclassification\relax }{subsubsection.3.1.2.2}{}}
+\citation{GuRos93}
+\citation{Hansen04}
+\citation{Rosenbaum02}
+\citation{Hansen04}
+\citation{Hansen04}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.3}Nearest Neighbor Matching}{11}{subsubsection.3.1.2.3}}
+\newlabel{subsubsec:nearest}{{3.1.2.3}{11}{Nearest Neighbor Matching\relax }{subsubsection.3.1.2.3}{}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.4}Optimal Matching}{11}{subsubsection.3.1.2.4}}
+\newlabel{subsubsec:optimal}{{3.1.2.4}{11}{Optimal Matching\relax }{subsubsection.3.1.2.4}{}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.5}Full Matching}{11}{subsubsection.3.1.2.5}}
+\newlabel{subsubsec:full}{{3.1.2.5}{11}{Full Matching\relax }{subsubsection.3.1.2.5}{}}
+\citation{DiaSek05}
+\citation{AbaImb07}
+\citation{Sekhon04}
+\citation{IacKinPor08}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.6}Genetic Matching}{12}{subsubsection.3.1.2.6}}
+\newlabel{subsub:genetic}{{3.1.2.6}{12}{Genetic Matching\relax }{subsubsection.3.1.2.6}{}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.1.2.7}Coarsened Exact Matching}{12}{subsubsection.3.1.2.7}}
+\newlabel{subsub:cem}{{3.1.2.7}{12}{Coarsened Exact Matching\relax }{subsubsection.3.1.2.7}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {3.2}Checking Balance}{13}{section.3.2}}
+\newlabel{sec:balance}{{3.2}{13}{Checking Balance\relax }{section.3.2}{}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {3.2.1}Quick Overview}{13}{subsection.3.2.1}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {3.2.2}Details}{13}{subsection.3.2.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.2.2.1}The {\tt  summary()} Command}{13}{subsubsection.3.2.2.1}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {3.2.2.2}The \texttt  {plot()} Command}{14}{subsubsection.3.2.2.2}}
+\@writefile{toc}{\contentsline {section}{\numberline {3.3}Conducting Analyses after Matching}{15}{section.3.3}}
+\newlabel{sec:analysis}{{3.3}{15}{Conducting Analyses after Matching\relax }{section.3.3}{}}
+\citation{ImaKinLau06}
+\@writefile{toc}{\contentsline {subsection}{\numberline {3.3.1}Quick Overview}{16}{subsection.3.3.1}}
+\citation{KinZen06}
+\citation{KinZen07}
+\@writefile{toc}{\contentsline {subsection}{\numberline {3.3.2}Examples}{17}{subsection.3.3.2}}
+\@writefile{toc}{\contentsline {chapter}{\numberline {4}Reference Manual}{21}{chapter.4}}
+\@writefile{lof}{\addvspace {10\p@ }}
+\@writefile{lot}{\addvspace {10\p@ }}
+\newlabel{chap:reference}{{4}{21}{Reference Manual\relax }{chapter.4}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {4.1}\texttt  {matchit()}: Implementation of Matching Methods}{21}{section.4.1}}
+\newlabel{sec:matchit}{{4.1}{21}{\texttt {matchit()}: Implementation of Matching Methods\relax }{section.4.1}{}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.1.0.1}Syntax}{21}{subsubsection.4.1.0.1}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.1.0.2}Arguments}{21}{subsubsection.4.1.0.2}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.1}Arguments for All Matching Methods}{21}{paragraph.4.1.0.2.1}}
+\newlabel{subsubsec:inputs-all}{{4.1.0.2.2}{22}{Additional Arguments for Specification of Distance Measures\relax }{paragraph.4.1.0.2.2}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.2}Additional Arguments for Specification of Distance Measures}{22}{paragraph.4.1.0.2.2}}
+\citation{Imai05}
+\citation{KinZen06}
+\citation{KinZen07}
+\newlabel{subsubsec:inputs-subclass}{{4.1.0.2.3}{24}{Additional Arguments for Subclassification\relax }{paragraph.4.1.0.2.3}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.3}Additional Arguments for Subclassification}{24}{paragraph.4.1.0.2.3}}
+\newlabel{subsubsec:inputs-nearest}{{4.1.0.2.4}{24}{Additional Arguments for Nearest Neighbor Matching\relax }{paragraph.4.1.0.2.4}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.4}Additional Arguments for Nearest Neighbor Matching}{24}{paragraph.4.1.0.2.4}}
+\newlabel{subsubsec:inputs-optimal}{{4.1.0.2.5}{25}{Additional Arguments for Optimal Matching\relax }{paragraph.4.1.0.2.5}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.5}Additional Arguments for Optimal Matching}{25}{paragraph.4.1.0.2.5}}
+\newlabel{subsubsec:inputs-full}{{4.1.0.2.6}{25}{Additional Arguments for Full Matching\relax }{paragraph.4.1.0.2.6}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.6}Additional Arguments for Full Matching}{25}{paragraph.4.1.0.2.6}}
+\newlabel{subsubsec:inputs-genetic}{{4.1.0.2.7}{26}{Additional Arguments for Genetic Matching\relax }{paragraph.4.1.0.2.7}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.7}Additional Arguments for Genetic Matching}{26}{paragraph.4.1.0.2.7}}
+\newlabel{subsubsec:inputs-cem}{{4.1.0.2.8}{26}{Additional Arguments for Coarsened Exact Matching\relax }{paragraph.4.1.0.2.8}{}}
+\@writefile{toc}{\contentsline {paragraph}{\numberline {4.1.0.2.8}Additional Arguments for Coarsened Exact Matching}{26}{paragraph.4.1.0.2.8}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.1.0.3}Output Values}{26}{subsubsection.4.1.0.3}}
+\newlabel{sec:outputs}{{4.1.0.3}{26}{Output Values\relax }{subsubsection.4.1.0.3}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {4.2}\texttt  {summary()}: Numerical Summaries of Balance}{27}{section.4.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.2.0.1}Syntax}{27}{subsubsection.4.2.0.1}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.2.0.2}Arguments}{28}{subsubsection.4.2.0.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.2.0.3}Output Values}{28}{subsubsection.4.2.0.3}}
+\@writefile{toc}{\contentsline {section}{\numberline {4.3}\texttt  {plot()}: Graphical Summaries of Balance}{29}{section.4.3}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {4.3.1}Plot options for the matchit object}{29}{subsection.4.3.1}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.3.1.1}Syntax}{30}{subsubsection.4.3.1.1}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.3.1.2}Arguments}{30}{subsubsection.4.3.1.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.3.1.3}Output Values}{30}{subsubsection.4.3.1.3}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {4.3.2}Plot options for the matchit summary object}{31}{subsection.4.3.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.3.2.1}Syntax}{31}{subsubsection.4.3.2.1}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.3.2.2}Arguments}{31}{subsubsection.4.3.2.2}}
+\@writefile{toc}{\contentsline {subsubsection}{\numberline {4.3.2.3}Output Values}{31}{subsubsection.4.3.2.3}}
+\@writefile{toc}{\contentsline {section}{\numberline {4.4}\texttt  {match.data()}: Extracting the Matched Data Set}{31}{section.4.4}}
+\newlabel{sec:match.data}{{4.4}{31}{\texttt {match.data()}: Extracting the Matched Data Set\relax }{section.4.4}{}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {4.4.1}Usage}{31}{subsection.4.4.1}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {4.4.2}Arguments}{31}{subsection.4.4.2}}
+\@writefile{toc}{\contentsline {subsection}{\numberline {4.4.3}Examples}{32}{subsection.4.4.3}}
+\citation{HoImaKin07}
+\citation{HoImaKin07a}
+\citation{KinZen06}
+\citation{KinZen07}
+\citation{StoKinZen05}
+\citation{VenRip02}
+\citation{HasTib90}
+\citation{Ripley96}
+\citation{BreFriOls84}
+\citation{Hansen04}
+\citation{DiaSek05}
+\citation{IacKinPor08}
+\citation{IacKinPor08b}
+\@writefile{toc}{\contentsline {chapter}{\numberline {5}Frequently Asked Questions}{34}{chapter.5}}
+\@writefile{lof}{\addvspace {10\p@ }}
+\@writefile{lot}{\addvspace {10\p@ }}
+\@writefile{toc}{\contentsline {section}{\numberline {5.1}How do I Cite this Work?}{34}{section.5.1}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.2}What if My datasets Are Big and Are Taking Up Too Much Memory?}{34}{section.5.2}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.3}How Exactly are the Weights Created?}{35}{section.5.3}}
+\newlabel{subsec:weights}{{5.3}{35}{How Exactly are the Weights Created?\relax }{section.5.3}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.4}How Do I Create Observation Names?}{35}{section.5.4}}
+\newlabel{rnames}{{5.4}{35}{How Do I Create Observation Names?\relax }{section.5.4}{}}
+\citation{KinHonJos01}
+\@writefile{toc}{\contentsline {section}{\numberline {5.5}How Can I See Outcomes of Matched Pairs?}{36}{section.5.5}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.6}How Do I Ensure Replicability As \textsc  {MatchIt}\ Versions Develop?}{36}{section.5.6}}
+\newlabel{subsec:vercontrol}{{5.6}{36}{How Do I Ensure Replicability As \MatchIt \ Versions Develop?\relax }{section.5.6}{}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.7}How Do I Use My Own Distance Measure with \textsc  {MatchIt}\tmspace  +\thinmuskip {.1667em}?}{36}{section.5.7}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.8}What Do I Do about Missing Data?}{37}{section.5.8}}
+\@writefile{toc}{\contentsline {section}{\numberline {5.9}Why Preprocessing?}{37}{section.5.9}}
+\@writefile{toc}{\contentsline {chapter}{\numberline {6}What's New?}{38}{chapter.6}}
+\@writefile{lof}{\addvspace {10\p@ }}
+\@writefile{lot}{\addvspace {10\p@ }}
+\bibstyle{asa}
+\bibdata{gk,gkpubs}
+\bibcite{AbaImb07}{{1}{2007}{{Abadie and Imbens}}{{}}}
+\bibcite{BreFriOls84}{{2}{1984}{{Breiman et~al.}}{{Breiman, Friedman, Olshen, and Stone}}}
+\bibcite{DehWah99}{{3}{1999}{{Dehejia and Wahba}}{{}}}
+\bibcite{DiaSek05}{{4}{2005}{{Diamond and Sekhon}}{{}}}
+\bibcite{GuRos93}{{5}{1993}{{Gu and Rosenbaum}}{{}}}
+\bibcite{Hansen04}{{6}{2004}{{Hansen}}{{}}}
+\bibcite{HasTib90}{{7}{1990}{{Hastie and Tibshirani}}{{}}}
+\bibcite{HoImaKin07}{{8}{2007}{{Ho et~al.}}{{Ho, Imai, King, and Stuart}}}
+\bibcite{HoImaKin07a}{{9}{Forthcoming}{{Ho et~al.}}{{Ho, Imai, King, and Stuart}}}
+\bibcite{IacKinPor08b}{{10}{2008{a}}{{Iacus et~al.}}{{Iacus, King, and Porro}}}
+\bibcite{IacKinPor08}{{11}{2008{b}}{{Iacus et~al.}}{{Iacus, King, and Porro}}}
+\bibcite{Imai05}{{12}{2005}{{Imai}}{{}}}
+\bibcite{ImaKinLau06}{{13}{2006}{{Imai et~al.}}{{Imai, King, and Lau}}}
+\bibcite{ImaKinStu08}{{14}{2008}{{Imai et~al.}}{{Imai, King, and Stuart}}}
+\bibcite{ImaDyk04}{{15}{2004}{{Imai and van Dyk}}{{}}}
+\bibcite{KinHonJos01}{{16}{2001}{{King et~al.}}{{King, Honaker, Joseph, and Scheve}}}
+\bibcite{KinZen06}{{17}{2006}{{King and Zeng}}{{}}}
+\bibcite{KinZen07}{{18}{2007}{{King and Zeng}}{{}}}
+\bibcite{lalonde86}{{19}{1986}{{Lalonde}}{{}}}
+\bibcite{Ripley96}{{20}{1996}{{Ripley}}{{}}}
+\bibcite{Rosenbaum02}{{21}{2002}{{Rosenbaum}}{{}}}
+\bibcite{StoKinZen05}{{22}{2005}{{Stoll et~al.}}{{Stoll, King, and Zeng}}}
+\bibcite{VenRip02}{{23}{2002}{{Venables and Ripley}}{{}}}
diff --git a/inst/doc/matchit.bbl b/inst/doc/matchit.bbl
new file mode 100644
index 0000000..4490ab4
--- /dev/null
+++ b/inst/doc/matchit.bbl
@@ -0,0 +1,118 @@
+\begin{thebibliography}{23}
+\newcommand{\enquote}[1]{``#1''}
+\expandafter\ifx\csname natexlab\endcsname\relax\def\natexlab#1{#1}\fi
+
+\bibitem[{Abadie and Imbens(2007)}]{AbaImb07}
+Abadie, A. and Imbens, G.~W. (2007), \enquote{Bias-Corrected Matching
+  Estimators for Average Treatment Effects,}
+  {http://ksghome.harvard.edu/~aabadie/research.html}.
+
+\bibitem[{Breiman et~al.(1984)Breiman, Friedman, Olshen, and
+  Stone}]{BreFriOls84}
+Breiman, L., Friedman, J.~H., Olshen, R.~A., and Stone, C.~J. (1984),
+  \textit{Classification and Regression Trees}, New York, New York: Chapman \&
+  Hall.
+
+\bibitem[{Dehejia and Wahba(1999)}]{DehWah99}
+Dehejia, R.~H. and Wahba, S. (1999), \enquote{Causal Effects in Nonexperimental
+  Studies: Re-Evaluating the Evaluation of Training Programs,} \textit{Journal
+  of the American Statistical Association}, 94, 1053--62.
+
+\bibitem[{Diamond and Sekhon(2005)}]{DiaSek05}
+Diamond, A. and Sekhon, J. (2005), \enquote{Genetic Matching for Estimating
+  Causal Effects: A New Method of Achieving Balance in Observational Studies,}
+  {http://jsekhon.fas.harvard.edu/}.
+
+\bibitem[{Gu and Rosenbaum(1993)}]{GuRos93}
+Gu, X. and Rosenbaum, P.~R. (1993), \enquote{Comparison of multivariate
+  matching methods: structures, distances, and algorithms,} \textit{Journal of
+  Computational and Graphical Statistics}, 2, 405--420.
+
+\bibitem[{Hansen(2004)}]{Hansen04}
+Hansen, B.~B. (2004), \enquote{Full Matching in an Observational Study of
+  Coaching for the {SAT},} \textit{Journal of the American Statistical
+  Association}, 99, 609--618.
+
+\bibitem[{Hastie and Tibshirani(1990)}]{HasTib90}
+Hastie, T.~J. and Tibshirani, R. (1990), \textit{Generalized Additive Models},
+  London: Chapman Hall.
+
+\bibitem[{Ho et~al.(2007)Ho, Imai, King, and Stuart}]{HoImaKin07}
+Ho, D., Imai, K., King, G., and Stuart, E. (2007), \enquote{Matching as
+  Nonparametric Preprocessing for Reducing Model Dependence in Parametric
+  Causal Inference,} \textit{Political Analysis}, 15, 199--236,
+  {http://gking.harvard.edu/files/abs/matchp-abs.shtml}.
+
+\bibitem[{Ho et~al.(Forthcoming)Ho, Imai, King, and Stuart}]{HoImaKin07a}
+Ho, D.~E., Imai, K., King, G., and Stuart, E.~A. (Forthcoming),
+  \enquote{MatchIt: Nonparametric Preprocessing for Parametric Causal
+  Inference,} \textit{Journal of Statistical Software},
+  {http://gking.harvard.edu/matchit}.
+
+\bibitem[{Iacus et~al.(2008{\natexlab{a}})Iacus, King, and
+  Porro}]{IacKinPor08b}
+Iacus, S.~M., King, G., and Porro, G. (2008{\natexlab{a}}), \enquote{CEM:
+  Coarsened Exact Matching Software,} {http://gking.harvard.edu/cem}.
+
+\bibitem[{Iacus et~al.(2008{\natexlab{b}})Iacus, King, and Porro}]{IacKinPor08}
+--- (2008{\natexlab{b}}), \enquote{Matching for Causal Inference Without
+  Balance Checking,} {http://gking.harvard.edu/files/abs/cem-abs.shtml}.
+
+\bibitem[{Imai(2005)}]{Imai05}
+Imai, K. (2005), \enquote{Do Get-Out-The-Vote Calls Reduce Turnout? The
+  Importance of Statistical Methods for Field Experiments,} \textit{American
+  Political Science Review}, 99, 283--300.
+
+\bibitem[{Imai et~al.(2006)Imai, King, and Lau}]{ImaKinLau06}
+Imai, K., King, G., and Lau, O. (2006), \enquote{Zelig: Everyone's Statistical
+  Software,} {http://gking.harvard.edu/zelig}.
+
+\bibitem[{Imai et~al.(2008)Imai, King, and Stuart}]{ImaKinStu08}
+Imai, K., King, G., and Stuart, E. (2008), \enquote{Misunderstandings Among
+  Experimentalists and Observationalists about Causal Inference,}
+  \textit{Journal of the Royal Statistical Society, {S}eries {A}}, 171, part 2,
+  481--502, {http://gking.harvard.edu/files/abs/matchse-abs.shtml}.
+
+\bibitem[{Imai and van Dyk(2004)}]{ImaDyk04}
+Imai, K. and van Dyk, D.~A. (2004), \enquote{Causal Inference with General
+  Treatment Treatment Regimes: Generalizing the Propensity Score,}
+  \textit{Journal of the American Statistical Association}, 99, 854--866.
+
+\bibitem[{King et~al.(2001)King, Honaker, Joseph, and Scheve}]{KinHonJos01}
+King, G., Honaker, J., Joseph, A., and Scheve, K. (2001), \enquote{Analyzing
+  Incomplete Political Science Data: An Alternative Algorithm for Multiple
+  Imputation,} \textit{American Political Science Review}, 95, 49--69,
+  {http://gking.harvard.edu/files/abs/evil-abs.shtml}.
+
+\bibitem[{King and Zeng(2006)}]{KinZen06}
+King, G. and Zeng, L. (2006), \enquote{The Dangers of Extreme Counterfactuals,}
+  \textit{Political Analysis}, 14, 131--159,
+  {http://gking.harvard.edu/files/abs/counterft-abs.shtml}.
+
+\bibitem[{King and Zeng(2007)}]{KinZen07}
+--- (2007), \enquote{When Can History Be Our Guide? The Pitfalls of
+  Counterfactual Inference,} \textit{International Studies Quarterly},
+  183--210, {http://gking.harvard.edu/files/abs/counterf-abs.shtml}.
+
+\bibitem[{Lalonde(1986)}]{lalonde86}
+Lalonde, R. (1986), \enquote{Evaluating the Econometric Evaluations of Training
+  Programs,} \textit{American Economic Review}, 76, 604--620.
+
+\bibitem[{Ripley(1996)}]{Ripley96}
+Ripley, B. (1996), \textit{Pattern Recognition and Neural Networks}, Cambridge
+  Univeristy Press.
+
+\bibitem[{Rosenbaum(2002)}]{Rosenbaum02}
+Rosenbaum, P.~R. (2002), \textit{Observational Studies, 2nd Edition}, New York,
+  NY: Springer Verlag.
+
+\bibitem[{Stoll et~al.(2005)Stoll, King, and Zeng}]{StoKinZen05}
+Stoll, H., King, G., and Zeng, L. (2005), \enquote{WhatIf: Software for
+  Evaluating Counterfactuals,} \textit{Journal of Statistical Software}, 15,
+  {http://www.jstatsoft.org/index.php?vol=15}.
+
+\bibitem[{Venables and Ripley(2002)}]{VenRip02}
+Venables, W.~N. and Ripley, B.~D. (2002), \textit{Modern Applied Statistics
+  with S}, Springer-Verlag, 4th ed.
+
+\end{thebibliography}
diff --git a/inst/doc/matchit.blg b/inst/doc/matchit.blg
new file mode 100644
index 0000000..f029998
--- /dev/null
+++ b/inst/doc/matchit.blg
@@ -0,0 +1,52 @@
+This is BibTeX, Version 0.99c (Web2C 7.4.5)
+The top-level auxiliary file: matchit.aux
+The style file: asa.bst
+Database file #1: gk.bib
+Database file #2: gkpubs.bib
+Warning--I didn't find a database entry for "Sekhon04"
+Warning--empty journal in AbaImb07
+Warning--empty journal in IacKinPor08b
+Warning--empty journal in IacKinPor08
+Warning--empty journal in ImaKinLau06
+You've used 23 entries,
+            2777 wiz_defined-function locations,
+            874 strings with 10020 characters,
+and the built_in function-call counts, 10366 in all, are:
+= -- 948
+> -- 516
+< -- 16
++ -- 188
+- -- 162
+* -- 982
+:= -- 1854
+add.period$ -- 41
+call.type$ -- 23
+change.case$ -- 148
+chr.to.int$ -- 28
+cite$ -- 27
+duplicate$ -- 469
+empty$ -- 713
+format.name$ -- 239
+if$ -- 1983
+int.to.chr$ -- 2
+int.to.str$ -- 1
+missing$ -- 27
+newline$ -- 74
+num.names$ -- 92
+pop$ -- 173
+preamble$ -- 1
+purify$ -- 146
+quote$ -- 0
+skip$ -- 315
+stack$ -- 0
+substring$ -- 552
+swap$ -- 109
+text.length$ -- 0
+text.prefix$ -- 0
+top$ -- 0
+type$ -- 192
+warning$ -- 4
+while$ -- 88
+width$ -- 0
+write$ -- 253
+(There were 5 warnings)
diff --git a/inst/doc/matchit.log b/inst/doc/matchit.log
new file mode 100644
index 0000000..9208903
--- /dev/null
+++ b/inst/doc/matchit.log
@@ -0,0 +1,636 @@
+This is pdfTeX, Version 3.14159-1.10b (Web2C 7.4.5) (format=pdflatex 2007.11.9)  2 FEB 2009 09:43
+**matchit
+(./matchit.tex{/usr/share/texmf/pdftex/config/pdftex.cfg}
+LaTeX2e <2001/06/01>
+Babel <v3.7h> and hyphenation patterns for american, french, german, ngerman, n
+ohyphenation, loaded.
+(/usr/share/texmf/tex/latex/base/book.cls
+Document Class: book 2001/04/21 v1.4e Standard LaTeX document class
+(/usr/share/texmf/tex/latex/base/bk12.clo
+File: bk12.clo 2001/04/21 v1.4e Standard LaTeX file (size option)
+)
+\c at part=\count79
+\c at chapter=\count80
+\c at section=\count81
+\c at subsection=\count82
+\c at subsubsection=\count83
+\c at paragraph=\count84
+\c at subparagraph=\count85
+\c at figure=\count86
+\c at table=\count87
+\abovecaptionskip=\skip41
+\belowcaptionskip=\skip42
+\bibindent=\dimen102
+)
+(/usr/share/texmf/tex/latex/natbib/bibentry.sty
+Package: bibentry 1999/02/23 1.2 (PWD)
+)
+(/usr/share/texmf/tex/latex/graphics/graphicx.sty
+Package: graphicx 1999/02/16 v1.0f Enhanced LaTeX Graphics (DPC,SPQR)
+
+(/usr/share/texmf/tex/latex/graphics/keyval.sty
+Package: keyval 1999/03/16 v1.13 key=value parser (DPC)
+\KV at toks@=\toks14
+)
+(/usr/share/texmf/tex/latex/graphics/graphics.sty
+Package: graphics 2001/07/07 v1.0n Standard LaTeX Graphics (DPC,SPQR)
+
+(/usr/share/texmf/tex/latex/graphics/trig.sty
+Package: trig 1999/03/16 v1.09 sin cos tan (DPC)
+)
+(/usr/share/texmf/tex/latex/config/graphics.cfg
+File: graphics.cfg 2001/08/31 v1.1 graphics configuration of teTeX/TeXLive
+)
+Package graphics Info: Driver file: pdftex.def on input line 80.
+
+(/usr/share/texmf/tex/latex/graphics/pdftex.def
+File: pdftex.def 2002/06/19 v0.03k graphics/color for pdftex
+\Gread at gobject=\count88
+))
+\Gin at req@height=\dimen103
+\Gin at req@width=\dimen104
+)
+(/usr/share/texmf/tex/latex/natbib/natbib.sty
+Package: natbib 2000/07/24 7.0a (PWD)
+\bibhang=\skip43
+\bibsep=\skip44
+LaTeX Info: Redefining \cite on input line 508.
+\c at NAT@ctr=\count89
+)
+(/usr/share/texmf/tex/latex/amsmath/amsmath.sty
+Package: amsmath 2000/07/18 v2.13 AMS math features
+\@mathmargin=\skip45
+
+For additional information on amsmath, use the `?' option.
+(/usr/share/texmf/tex/latex/amsmath/amstext.sty
+Package: amstext 2000/06/29 v2.01
+
+(/usr/share/texmf/tex/latex/amsmath/amsgen.sty
+File: amsgen.sty 1999/11/30 v2.0
+\@emptytoks=\toks15
+\ex@=\dimen105
+))
+(/usr/share/texmf/tex/latex/amsmath/amsbsy.sty
+Package: amsbsy 1999/11/29 v1.2d
+\pmbraise@=\dimen106
+)
+(/usr/share/texmf/tex/latex/amsmath/amsopn.sty
+Package: amsopn 1999/12/14 v2.01 operator names
+)
+\inf at bad=\count90
+LaTeX Info: Redefining \frac on input line 211.
+\uproot@=\count91
+\leftroot@=\count92
+LaTeX Info: Redefining \overline on input line 307.
+\classnum@=\count93
+\DOTSCASE@=\count94
+LaTeX Info: Redefining \ldots on input line 379.
+LaTeX Info: Redefining \dots on input line 382.
+LaTeX Info: Redefining \cdots on input line 467.
+\Mathstrutbox@=\box26
+\strutbox@=\box27
+\big at size=\dimen107
+LaTeX Font Info:    Redeclaring font encoding OML on input line 567.
+LaTeX Font Info:    Redeclaring font encoding OMS on input line 568.
+\macc at depth=\count95
+\c at MaxMatrixCols=\count96
+\dotsspace@=\muskip10
+\c at parentequation=\count97
+\dspbrk at lvl=\count98
+\tag at help=\toks16
+\row@=\count99
+\column@=\count100
+\maxfields@=\count101
+\andhelp@=\toks17
+\eqnshift@=\dimen108
+\alignsep@=\dimen109
+\tagshift@=\dimen110
+\tagwidth@=\dimen111
+\totwidth@=\dimen112
+\lineht@=\dimen113
+\@envbody=\toks18
+\multlinegap=\skip46
+\multlinetaggap=\skip47
+\mathdisplay at stack=\toks19
+LaTeX Info: Redefining \[ on input line 2666.
+LaTeX Info: Redefining \] on input line 2667.
+)
+(/usr/share/texmf/tex/latex/amsfonts/amssymb.sty
+Package: amssymb 2002/01/22 v2.2d
+
+(/usr/share/texmf/tex/latex/amsfonts/amsfonts.sty
+Package: amsfonts 2001/10/25 v2.2f
+\symAMSa=\mathgroup4
+\symAMSb=\mathgroup5
+LaTeX Font Info:    Overwriting math alphabet `\mathfrak' in version `bold'
+(Font)                  U/euf/m/n --> U/euf/b/n on input line 132.
+))
+(/usr/share/texmf/tex/latex/tools/verbatim.sty
+Package: verbatim 2001/03/12 v1.5p LaTeX2e package for verbatim enhancements
+\every at verbatim=\toks20
+\verbatim at line=\toks21
+\verbatim at in@stream=\read1
+)
+(/usr/share/texmf/tex/generic/misc/epsf.tex
+This is `epsf.tex' v2.7k <10 July 1997>
+\epsffilein=\read2
+\epsfframemargin=\dimen114
+\epsfframethickness=\dimen115
+\epsfrsize=\dimen116
+\epsftmp=\dimen117
+\epsftsize=\dimen118
+\epsfxsize=\dimen119
+\epsfysize=\dimen120
+\pspoints=\dimen121
+\epsfnoopenhelp=\toks22
+) (/usr/share/latex2html/texinputs/url.sty
+Package: url 1999/03/02  ver 1.4  Verb mode for urls, email addresses, and file
+ names
+)
+(/usr/share/latex2html/texinputs/html.sty
+(/usr/share/texmf/tex/latex/hyperref/hyperref.sty
+Package: hyperref 2003/01/22 v6.73n Hypertext links for LaTeX
+\@linkdim=\dimen122
+\Hy at linkcounter=\count102
+\Hy at pagecounter=\count103
+
+(/usr/share/texmf/tex/latex/hyperref/pd1enc.def
+File: pd1enc.def 2003/01/22 v6.73n Hyperref: PDFDocEncoding definition (HO)
+)
+(/usr/share/texmf/tex/latex/config/hyperref.cfg
+File: hyperref.cfg 2002/06/06 v1.2 hyperref configuration of TeXLive and teTeX
+)
+Package hyperref Info: Hyper figures OFF on input line 1792.
+Package hyperref Info: Link nesting OFF on input line 1797.
+Package hyperref Info: Hyper index ON on input line 1800.
+Package hyperref Info: Plain pages ON on input line 1805.
+Package hyperref Info: Backreferencing OFF on input line 1812.
+
+Implicit mode ON; LaTeX internals redefined
+Package hyperref Info: Bookmarks ON on input line 1916.
+LaTeX Info: Redefining \url on input line 2055.
+\Fld at menulength=\count104
+\Field at Width=\dimen123
+\Fld at charsize=\dimen124
+\Choice at toks=\toks23
+\Field at toks=\toks24
+Package hyperref Info: Hyper figures OFF on input line 2513.
+Package hyperref Info: Link nesting OFF on input line 2518.
+Package hyperref Info: Hyper index ON on input line 2521.
+Package hyperref Info: backreferencing OFF on input line 2528.
+Package hyperref Info: Link coloring OFF on input line 2533.
+\c at Item=\count105
+\c at Hfootnote=\count106
+)
+*hyperref using default driver hpdftex*
+(/usr/share/texmf/tex/latex/hyperref/hpdftex.def
+File: hpdftex.def 2003/01/22 v6.73n Hyperref driver for pdfTeX
+
+(/usr/share/texmf/tex/latex/psnfss/pifont.sty
+Package: pifont 2002/09/08 PSNFSS-v9.0a Pi font support (SPQR) 
+LaTeX Font Info:    Try loading font information for U+pzd on input line 62.
+
+(/usr/share/texmf/tex/latex/psnfss/upzd.fd
+File: upzd.fd 2001/06/04 font definitions for U/pzd.
+)
+LaTeX Font Info:    Try loading font information for U+psy on input line 63.
+
+(/usr/share/texmf/tex/latex/psnfss/upsy.fd
+File: upsy.fd 2001/06/04 font definitions for U/psy.
+))
+\Fld at listcount=\count107
+\@outlinefile=\write3
+)
+Package: html 1999/07/19 v1.38 hypertext commands for latex2html (nd, hws, rrm)
+
+\c at lpart=\count108
+\c at lchapter=\count109
+\c at lsection=\count110
+\c at lsubsection=\count111
+\c at lsubsubsection=\count112
+\c at lparagraph=\count113
+\c at lsubparagraph=\count114
+\c at lsubsubparagraph=\count115
+\ptrfile=\write4
+)
+(/usr/share/texmf/tex/latex/tools/dcolumn.sty
+Package: dcolumn 2001/05/28 v1.06 decimal alignment package (DPC)
+
+(/usr/share/texmf/tex/latex/tools/array.sty
+Package: array 1998/05/13 v2.3m Tabular extension package (FMi)
+\col at sep=\dimen125
+\extrarowheight=\dimen126
+\NC at list=\toks25
+\extratabsurround=\skip48
+\backup at length=\skip49
+))
+(/usr/share/texmf/tex/latex/preprint/fullpage.sty
+Package: fullpage 1999/02/23 1.1 (PWD)
+\FP at margin=\skip50
+) (./matchit.aux)
+\openout1 = `matchit.aux'.
+
+LaTeX Font Info:    Checking defaults for OML/cmm/m/it on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+LaTeX Font Info:    Checking defaults for T1/cmr/m/n on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+LaTeX Font Info:    Checking defaults for OT1/cmr/m/n on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+LaTeX Font Info:    Checking defaults for OMS/cmsy/m/n on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+LaTeX Font Info:    Checking defaults for OMX/cmex/m/n on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+LaTeX Font Info:    Checking defaults for U/cmr/m/n on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+LaTeX Font Info:    Checking defaults for PD1/pdf/m/n on input line 56.
+LaTeX Font Info:    ... okay on input line 56.
+
+(/usr/share/texmf/tex/context/base/supp-pdf.tex
+(/usr/share/texmf/tex/context/base/supp-mis.tex
+loading : Context Support Macros / Missing
+\protectiondepth=\count116
+\scratchcounter=\count117
+\scratchtoks=\toks26
+\scratchdimen=\dimen127
+\scratchskip=\skip51
+\scratchmuskip=\muskip11
+\scratchbox=\box28
+\scratchread=\read3
+\scratchwrite=\write5
+\zeropoint=\dimen128
+\minusone=\count118
+\thousandpoint=\dimen129
+\emptytoks=\toks27
+\nextbox=\box29
+\nextdepth=\dimen130
+\everyline=\toks28
+\!!counta=\count119
+\!!countb=\count120
+\recursecounter=\count121
+)
+loading : Context Support Macros / PDF
+\nofMPsegments=\count122
+\nofMParguments=\count123
+\everyMPtoPDFconversion=\toks29
+)
+Package hyperref Info: Link coloring OFF on input line 56.
+ (/usr/share/texmf/tex/latex/hyperref/nameref.sty
+Package: nameref 2001/01/27 v2.19 Cross-referencing by name of section
+\c at section@level=\count124
+)
+LaTeX Info: Redefining \ref on input line 56.
+LaTeX Info: Redefining \pageref on input line 56.
+ (./matchit.out)
+(./matchit.out)
+\openout3 = `matchit.out'.
+
+LaTeX Font Info:    Try loading font information for U+msa on input line 58.
+ (/usr/share/texmf/tex/latex/amsfonts/umsa.fd
+File: umsa.fd 2002/01/19 v2.2g AMS font definitions
+)
+LaTeX Font Info:    Try loading font information for U+msb on input line 58.
+
+(/usr/share/texmf/tex/latex/amsfonts/umsb.fd
+File: umsb.fd 2002/01/19 v2.2g AMS font definitions
+)
+Underfull \hbox (badness 1412) in paragraph at lines 58--58
+[][]/cmr10 at 10.95pt/David Flo-rence Pro-fes-sor of Gov-ern-ment, Har-vard Uni-ve
+r-sity (In-sti-tute for Quan-ti-ta-
+ []
+
+
+Underfull \hbox (badness 1983) in paragraph at lines 58--58
+/cmr10 at 10.95pt/tive So-cial Sci-ence, 1737 Cam-bridge Street, Har-vard Uni-ver-
+sity, Cam-bridge MA 02138;
+ []
+
+
+Underfull \hbox (badness 1715) in paragraph at lines 58--58
+[][]/cmr10 at 10.95pt/Assistant Pro-fes-sor, De-part-ments of Men-tal Health and B
+io-statis-tics, Johns Hop-kins
+ []
+
+[1
+
+
+{/usr/share/texmf/dvips/config/pdftex.map}] (./matchit.toc
+
+LaTeX Font Warning: Font shape `OT1/cmr/bx/sc' undefined
+(Font)              using `OT1/cmr/bx/n' instead on input line 11.
+
+! pdfTeX warning (ext4): destination with the same identifier (name{page.1}) ha
+s been already used, duplicate ignored
+<to be read again> 
+                   \penalty 
+l.32 ...4.1.0.1}Syntax}{21}{subsubsection.4.1.0.1}
+                                                   [1
+
+])
+\tf at toc=\write6
+\openout6 = `matchit.toc'.
+
+ (./matchit.bbl)
+[2]
+Chapter 1.
+(./intro.tex [3
+
+
+]) [4]
+Chapter 2.
+(./overview.tex [5
+
+] [6] [7]) [8]
+Chapter 3.
+(./preprocess.tex [9
+
+]
+Overfull \hbox (6.26747pt too wide) in paragraph at lines 95--102
+/cmr12/scribed be-low, by leav-ing the de-fault of /cmtt12/method = "nearest" /
+cmr12/but adding the op-tion /cmtt12/subclass/cmr12/.
+ []
+
+[10] [11]
+
+Package natbib Warning: Citation `Sekhon04' on page 12 undefined on input line 
+192.
+
+
+Overfull \hbox (5.72021pt too wide) in paragraph at lines 197--197
+[]/cmtt12/> m.out <- matchit(treat ~ age + educ + black + hispan + married + no
+degree +[] 
+ []
+
+) (./balance.tex [12]
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\<def>-command' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\f at encoding' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\<let>-command' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\<def>-command' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\f at family' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\<def>-command' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\f at series' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\<def>-command' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\f at shape' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\<def>-command' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\font at name' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\OT1/cmtt/m/n/12' on input line 11.
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string,
+(hyperref)                removing `\ignorespaces' on input line 11.
+
+LaTeX Font Info:    Try loading font information for OMS+cmr on input line 30.
+(/usr/share/texmf/tex/latex/base/omscmr.fd
+File: omscmr.fd 1999/05/25 v2.5h Standard LaTeX font definitions
+)
+LaTeX Font Info:    Font shape `OMS/cmr/m/n' in size <12> not available
+(Font)              Font shape `OMS/cmsy/m/n' tried instead on input line 30.
+ [13]
+LaTeX Font Info:    Font shape `OT1/cmtt/bx/n' in size <12> not available
+(Font)              Font shape `OT1/cmtt/m/n' tried instead on input line 80.
+
+<figs/jitterplotnn.pdf, id=482, 867.24pt x 433.62pt>
+File: figs/jitterplotnn.pdf Graphic file (type pdf)
+
+<use figs/jitterplotnn.pdf>
+<figs/qqplotnn1.pdf, id=483, 198.7425pt x 198.7425pt> [14]
+File: figs/qqplotnn1.pdf Graphic file (type pdf)
+
+<use figs/qqplotnn1.pdf> <figs/hist.pdf, id=488, 433.62pt x 433.62pt>
+File: figs/hist.pdf Graphic file (type pdf)
+
+<use figs/hist.pdf>) (./matchit2zelig.tex [15 <./figs/jitterplotnn.pdf> <./figs
+/qqplotnn1.pdf> <./figs/hist.pdf>] [16]
+Overfull \hbox (4.2199pt too wide) in paragraph at lines 104--104
+ []/cmtt12/> z.out <- zelig(re78 ~ treat + age + educ + black + hispan + nodegr
+ee + 
+ []
+
+
+Overfull \hbox (41.26991pt too wide) in paragraph at lines 129--129
+ []                    /cmtt12/married + re74 + re75, method = "nearest", data 
+= lalonde)[] 
+ []
+
+[17]
+Overfull \hbox (41.26991pt too wide) in paragraph at lines 139--139
+ []                  /cmtt12/married + re74 + re75, data = match.data(m.out1, "
+control"),[] 
+ []
+
+
+Overfull \hbox (56.73216pt too wide) in paragraph at lines 142--154
+/cmr12/prob-a-bly be changed to in-clude all the data in this es-ti-ma-tion (us
+-ing /cmtt12/data = match.data(m.out1)
+ []
+
+
+Overfull \hbox (10.3949pt too wide) in paragraph at lines 155--155
+ []/cmtt12/> x.out1 <- setx(z.out1, data = match.data(m.out1, "treat"), cond = 
+TRUE) 
+ []
+
+
+Overfull \hbox (28.9199pt too wide) in paragraph at lines 168--168
+ []                  /cmtt12/married + re74 + re75, data = match.data(m.out1, "
+treat"),[] 
+ []
+
+
+Overfull \hbox (22.7449pt too wide) in paragraph at lines 174--174
+ []/cmtt12/> x.out2 <- setx(z.out2, data = match.data(m.out1, "control"), cond 
+= TRUE) 
+ []
+
+[18] [19]
+Overfull \hbox (28.9199pt too wide) in paragraph at lines 251--251
+ []/cmtt12/> weighted.mean(mdata$re78[mdata$treat == 1], mdata$weights[mdata$tr
+eat==1])[] 
+ []
+
+
+Overfull \hbox (65.96992pt too wide) in paragraph at lines 252--252
+ []        /cmtt12/- weighted.mean(mdata$re78[mdata$treat==0], mdata$weights[md
+ata$treat==0])[] 
+ []
+
+
+Overfull \hbox (16.5699pt too wide) in paragraph at lines 266--266
+ []/cmtt12/> zelig(re78 ~ treat + black + hispan + educ, data = m.data, model =
+ "ls",[] 
+ []
+
+) [20]
+Chapter 4.
+LaTeX Font Info:    Font shape `OT1/cmtt/bx/n' in size <17.28> not available
+(Font)              Font shape `OT1/cmtt/m/n' tried instead on input line 95.
+(./matchitref.tex
+
+Package hyperref Warning: Difference (2) between bookmark levels is greater 
+(hyperref)                than one, level fixed on input line 1.
+
+[21
+
+] [22] [23] [24]
+Overfull \hbox (6.39474pt too wide) in paragraph at lines 243--248
+/cmr12/pack-age. See /cmtt12/help(fullmatch) /cmr12/or []http://www.stat.lsa.um
+ich.edu/~bbh/optmatch.html[]
+ []
+
+[25]
+Overfull \hbox (0.83185pt too wide) in paragraph at lines 284--286
+[]/cmtt12/.../cmr12/: Ad-di-tional in-puts that can be passed to the /cmtt12/fu
+llmatch() /cmr12/func-tion in the /cmtt12/optmatch
+ []
+
+
+Overfull \hbox (40.20618pt too wide) in paragraph at lines 334--338
+[]/cmtt12/model/cmr12/: the out-put of the model used to es-ti-mate the dis-tan
+ce mea-sure. /cmtt12/summary(m.out$model)
+ []
+
+[26]) (./summaryref.tex
+
+Package hyperref Warning: Difference (2) between bookmark levels is greater 
+(hyperref)                than one, level fixed on input line 6.
+
+
+Overfull \hbox (55.12024pt too wide) in paragraph at lines 8--8
+[]/cmtt12/summary(object, interactions = FALSE, addlvariables = NULL, standardi
+ze = FALSE, ...)[] 
+ []
+
+
+Overfull \hbox (6.94044pt too wide) in paragraph at lines 15--20
+/cmr12/and only the co-vari-ates them-selves when /cmtt12/interactions = FALSE/
+cmr12/, (DE-FAULT = /cmtt12/FALSE/cmr12/). 
+ []
+
+[27] [28]
+Overfull \hbox (8.04178pt too wide) in paragraph at lines 78--82
+/cmr12/vari-ates $/cmmi12/X$ /cmr12/and their in-ter-ac-tions, where /cmtt12/Me
+ans Treated$/cmr12/= /cmmi12/^^V[] /cmr12/= [] [][] /cmmi12/w[]X[]$
+ []
+
+) (./plotref.tex [29] [30]) (./mdataref.tex [31]
+Overfull \hbox (36.59523pt too wide) in paragraph at lines 83--83
+[]/cmtt12/> unmatched.data <- lalonde[!row.names(lalonde)%in%row.names(match.da
+ta(m.out1)),][] 
+ []
+
+[32]) (./faq.tex [33]
+Chapter 5.
+[34
+
+] [35]
+Overfull \hbox (48.94524pt too wide) in paragraph at lines 121--121
+[]/cmtt12/cbind(lalonde[row.names(foo$match.matrix),"re78"], lalonde[foo$match.
+matrix,"re78"])[] 
+ []
+
+
+Package hyperref Warning: Token not allowed in a PDFDocEncoded string:
+(hyperref)                \kern 1.95872pt
+(hyperref)                removed on input line 157.
+
+[36]) [37]
+Chapter 6.
+
+Overfull \hbox (0.1057pt too wide) in paragraph at lines 120--122
+[]/cmbx12/2.4-7 /cmr12/(Au-gust 4, 2008): Fixed mi-nor bug in sub-clas-si-fi-ca
+-tion (thanks to Ben Domingue) 
+ []
+
+[38
+
+] [39] (./matchit.bbl
+Underfull \hbox (badness 3029) in paragraph at lines 22--25
+[]/cmr12/Diamond, A. and Sekhon, J. (2005), ``Ge-netic Match-ing for Es-ti-mat-
+ing Causal
+ []
+
+
+Underfull \hbox (badness 8189) in paragraph at lines 22--25
+/cmr12/Ef-fects: A New Method of Achiev-ing Bal-ance in Ob-ser-va-tional Stud-i
+es,''
+ []
+
+
+Underfull \hbox (badness 10000) in paragraph at lines 58--60
+[]/cmr12/--- (2008b), ``Match-ing for Causal In-fer-ence With-out Bal-ance Chec
+k-ing,''
+ []
+
+[40
+
+
+])
+
+Package natbib Warning: There were undefined citations.
+
+[41] (./matchit.aux)
+
+LaTeX Font Warning: Some font shapes were not available, defaults substituted.
+
+ ) 
+Here is how much of TeX's memory you used:
+ 4456 strings out of 95437
+ 56697 string characters out of 1190233
+ 112297 words of memory out of 1000001
+ 7198 multiletter control sequences out of 10000+50000
+ 19072 words of font info for 74 fonts, out of 500000 for 1000
+ 14 hyphenation exceptions out of 1000
+ 34i,11n,41p,219b,459s stack positions out of 1500i,500n,5000p,200000b,5000s
+ 714 PDF objects out of 300000
+ 152 named destinations out of 131072
+ 465 words of extra memory for PDF output out of 65536
+{/usr/share/texmf/dvips/tetex/bbad153f.enc}</usr/share/texmf/fonts/type1/blue
+sky/cm/cmsy6.pfb>{/usr/share/texmf/dvips/tetex/aae443f0.enc}</usr/share/texmf/f
+onts/type1/bluesky/cm/cmmi6.pfb>{/usr/share/texmf/dvips/tetex/f7b6d320.enc}</us
+r/share/texmf/fonts/type1/bluesky/cm/cmr6.pfb></usr/share/texmf/fonts/type1/blu
+esky/cm/cmsy8.pfb></usr/share/texmf/fonts/type1/bluesky/cm/cmr7.pfb></usr/share
+/texmf/fonts/type1/bluesky/cm/cmex10.pfb>{/usr/share/texmf/dvips/tetex/74afc74c
+.enc}</usr/share/texmf/fonts/type1/bluesky/cm/cmti12.pfb></usr/share/texmf/font
+s/type1/bluesky/cm/cmmi8.pfb></usr/share/texmf/fonts/type1/bluesky/cm/cmmi12.pf
+b>{/usr/share/texmf/dvips/tetex/09fbbfac.enc}</usr/share/texmf/fonts/type1/blue
+sky/cm/cmtt12.pfb></usr/share/texmf/fonts/type1/bluesky/cm/cmbx12.pfb></usr/sha
+re/texmf/fonts/type1/bluesky/cm/cmsy10.pfb></usr/share/texmf/fonts/type1/bluesk
+y/cm/cmtt10.pfb></usr/share/texmf/fonts/type1/bluesky/cm/cmr8.pfb></usr/share/t
+exmf/fonts/type1/bluesky/cm/cmr10.pfb></usr/share/texmf/fonts/type1/bluesky/cm/
+cmr12.pfb></usr/share/texmf/fonts/type1/bluesky/cm/cmr17.pfb>{/usr/share/texmf/
+dvips/tetex/0ef0afca.enc}</usr/share/texmf/fonts/type1/bluesky/cm/cmcsc10.pfb>
+Output written on matchit.pdf (42 pages, 430354 bytes).
diff --git a/inst/doc/matchit.out b/inst/doc/matchit.out
new file mode 100644
index 0000000..de0cbe5
--- /dev/null
+++ b/inst/doc/matchit.out
@@ -0,0 +1,62 @@
+\BOOKMARK [0][-]{chapter.1}{Introduction}{}
+\BOOKMARK [1][-]{section.1.1}{What MatchIt Does}{chapter.1}
+\BOOKMARK [1][-]{section.1.2}{Software Requirements}{chapter.1}
+\BOOKMARK [1][-]{section.1.3}{Installing MatchIt}{chapter.1}
+\BOOKMARK [1][-]{section.1.4}{Loading MatchIt}{chapter.1}
+\BOOKMARK [1][-]{section.1.5}{Updating MatchIt}{chapter.1}
+\BOOKMARK [0][-]{chapter.2}{Statistical Overview}{}
+\BOOKMARK [1][-]{section.2.1}{Preprocessing via Matching}{chapter.2}
+\BOOKMARK [1][-]{section.2.2}{Checking Balance}{chapter.2}
+\BOOKMARK [1][-]{section.2.3}{Conducting Analyses after Matching}{chapter.2}
+\BOOKMARK [0][-]{chapter.3}{User's Guide to MatchIt}{}
+\BOOKMARK [1][-]{section.3.1}{Preprocessing via Matching}{chapter.3}
+\BOOKMARK [2][-]{subsection.3.1.1}{Quick Overview}{section.3.1}
+\BOOKMARK [2][-]{subsection.3.1.2}{Examples}{section.3.1}
+\BOOKMARK [3][-]{subsubsection.3.1.2.1}{Exact Matching}{subsection.3.1.2}
+\BOOKMARK [3][-]{subsubsection.3.1.2.2}{Subclassification}{subsection.3.1.2}
+\BOOKMARK [3][-]{subsubsection.3.1.2.3}{Nearest Neighbor Matching}{subsection.3.1.2}
+\BOOKMARK [3][-]{subsubsection.3.1.2.4}{Optimal Matching}{subsection.3.1.2}
+\BOOKMARK [3][-]{subsubsection.3.1.2.5}{Full Matching}{subsection.3.1.2}
+\BOOKMARK [3][-]{subsubsection.3.1.2.6}{Genetic Matching}{subsection.3.1.2}
+\BOOKMARK [3][-]{subsubsection.3.1.2.7}{Coarsened Exact Matching}{subsection.3.1.2}
+\BOOKMARK [1][-]{section.3.2}{Checking Balance}{chapter.3}
+\BOOKMARK [2][-]{subsection.3.2.1}{Quick Overview}{section.3.2}
+\BOOKMARK [2][-]{subsection.3.2.2}{Details}{section.3.2}
+\BOOKMARK [3][-]{subsubsection.3.2.2.1}{The summary\(\) Command}{subsection.3.2.2}
+\BOOKMARK [3][-]{subsubsection.3.2.2.2}{The plot\(\) Command}{subsection.3.2.2}
+\BOOKMARK [1][-]{section.3.3}{Conducting Analyses after Matching}{chapter.3}
+\BOOKMARK [2][-]{subsection.3.3.1}{Quick Overview}{section.3.3}
+\BOOKMARK [2][-]{subsection.3.3.2}{Examples}{section.3.3}
+\BOOKMARK [0][-]{chapter.4}{Reference Manual}{}
+\BOOKMARK [1][-]{section.4.1}{matchit\(\): Implementation of Matching Methods}{chapter.4}
+\BOOKMARK [2][-]{subsubsection.4.1.0.1}{Syntax}{section.4.1}
+\BOOKMARK [3][-]{subsubsection.4.1.0.2}{Arguments}{subsubsection.4.1.0.1}
+\BOOKMARK [3][-]{subsubsection.4.1.0.3}{Output Values}{subsubsection.4.1.0.1}
+\BOOKMARK [1][-]{section.4.2}{summary\(\): Numerical Summaries of Balance}{chapter.4}
+\BOOKMARK [2][-]{subsubsection.4.2.0.1}{Syntax}{section.4.2}
+\BOOKMARK [3][-]{subsubsection.4.2.0.2}{Arguments}{subsubsection.4.2.0.1}
+\BOOKMARK [3][-]{subsubsection.4.2.0.3}{Output Values}{subsubsection.4.2.0.1}
+\BOOKMARK [1][-]{section.4.3}{plot\(\): Graphical Summaries of Balance}{chapter.4}
+\BOOKMARK [2][-]{subsection.4.3.1}{Plot options for the matchit object}{section.4.3}
+\BOOKMARK [3][-]{subsubsection.4.3.1.1}{Syntax}{subsection.4.3.1}
+\BOOKMARK [3][-]{subsubsection.4.3.1.2}{Arguments}{subsection.4.3.1}
+\BOOKMARK [3][-]{subsubsection.4.3.1.3}{Output Values}{subsection.4.3.1}
+\BOOKMARK [2][-]{subsection.4.3.2}{Plot options for the matchit summary object}{section.4.3}
+\BOOKMARK [3][-]{subsubsection.4.3.2.1}{Syntax}{subsection.4.3.2}
+\BOOKMARK [3][-]{subsubsection.4.3.2.2}{Arguments}{subsection.4.3.2}
+\BOOKMARK [3][-]{subsubsection.4.3.2.3}{Output Values}{subsection.4.3.2}
+\BOOKMARK [1][-]{section.4.4}{match.data\(\): Extracting the Matched Data Set}{chapter.4}
+\BOOKMARK [2][-]{subsection.4.4.1}{Usage}{section.4.4}
+\BOOKMARK [2][-]{subsection.4.4.2}{Arguments}{section.4.4}
+\BOOKMARK [2][-]{subsection.4.4.3}{Examples}{section.4.4}
+\BOOKMARK [0][-]{chapter.5}{Frequently Asked Questions}{}
+\BOOKMARK [1][-]{section.5.1}{How do I Cite this Work?}{chapter.5}
+\BOOKMARK [1][-]{section.5.2}{What if My datasets Are Big and Are Taking Up Too Much Memory?}{chapter.5}
+\BOOKMARK [1][-]{section.5.3}{How Exactly are the Weights Created?}{chapter.5}
+\BOOKMARK [1][-]{section.5.4}{How Do I Create Observation Names?}{chapter.5}
+\BOOKMARK [1][-]{section.5.5}{How Can I See Outcomes of Matched Pairs?}{chapter.5}
+\BOOKMARK [1][-]{section.5.6}{How Do I Ensure Replicability As MatchIt Versions Develop?}{chapter.5}
+\BOOKMARK [1][-]{section.5.7}{How Do I Use My Own Distance Measure with MatchIt?}{chapter.5}
+\BOOKMARK [1][-]{section.5.8}{What Do I Do about Missing Data?}{chapter.5}
+\BOOKMARK [1][-]{section.5.9}{Why Preprocessing?}{chapter.5}
+\BOOKMARK [0][-]{chapter.6}{What's New?}{}
diff --git a/inst/doc/matchit.pdf b/inst/doc/matchit.pdf
new file mode 100644
index 0000000..f619bce
Binary files /dev/null and b/inst/doc/matchit.pdf differ
diff --git a/inst/doc/matchit.tex b/inst/doc/matchit.tex
new file mode 100644
index 0000000..03ae024
--- /dev/null
+++ b/inst/doc/matchit.tex
@@ -0,0 +1,196 @@
+\documentclass[oneside,letterpaper,12pt]{book}
+\usepackage{bibentry}
+\usepackage{graphicx}
+\usepackage{natbib}
+\usepackage[reqno]{amsmath}
+\usepackage{amssymb}
+\usepackage{verbatim}
+\usepackage{epsf}
+\usepackage{url}
+\usepackage{html}
+\usepackage{dcolumn}
+\usepackage{fullpage}
+\bibpunct{(}{)}{;}{a}{}{,}
+\newcolumntype{.}{D{.}{.}{-1}}
+\newcolumntype{d}[1]{D{.}{.}{#1}}
+%\pagestyle{myheadings}
+\htmladdtonavigation{
+  \htmladdnormallink{%
+    \htmladdimg{http://gking.harvard.edu/pics/home.gif}}
+  {http://gking.harvard.edu/}}
+\newcommand{\hlink}{\htmladdnormallink}
+
+\bodytext{ BACKGROUND="http://gking.harvard.edu/pics/temple.jpg"}
+\setcounter{tocdepth}{3}
+\setcounter{secnumdepth}{4}
+
+\newcommand{\MatchIt}{\textsc{MatchIt}}
+
+\title{\MatchIt: Nonparametric Preprocessing for Parametric Causal
+  Inference\thanks{We thank Olivia Lau for helpful suggestions about
+    incorporating \MatchIt\, into Zelig.}}
+
+\author{Daniel E. Ho,\thanks{Assistant Professor of Law 
+\& Robert E.\ Paradise Faculty Scholar, Stanford Law
+    School (559 Nathan Abbott Way, Stanford CA 94305;
+    \texttt{http://dho.stanford.edu}, \texttt{dho at law.stanford.edu},
+    (650) 723-9560).}  \and %
+  Kosuke Imai,\thanks{Assistant Professor, Department of Politics,
+    Princeton University (Corwin Hall 041, Department of Politics,
+    Princeton University, Princeton NJ 08544, USA;
+    \texttt{http://imai.princeton.edu},
+    \texttt{kimai at Princeton.Edu}).}  \and %
+  Gary King,\thanks{David Florence Professor of Government, Harvard
+    University (Institute for Quantitative Social Science, 1737
+    Cambridge Street, Harvard University, Cambridge MA 02138;
+    \texttt{http://GKing.Harvard.Edu}, \texttt{King at Harvard.Edu},
+    (617) 495-2027).}  \and %
+Elizabeth A. Stuart\thanks{Assistant Professor, Departments of Mental 
+Health and Biostatistics, Johns Hopkins Bloomberg School of Public Health 
+(624 N Broadway, Room 804, Baltimore, MD 21205; 
+  \texttt{http://www.biostat.jhsph.edu/$\sim$estuart},
+  \texttt{estuart at jhsph.edu}).}}
+
+%\makeindex
+
+\begin{document}
+\maketitle
+
+\begin{rawhtml}
+  <p> [Also available is a downloadable <a
+  href="/matchit/docs/matchit.pdf">PDF</a> version of this entire
+  document]
+\end{rawhtml}
+
+\tableofcontents
+
+\nobibliography*
+
+%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
+\clearpage
+
+\chapter{Introduction}
+\input{intro}
+
+
+%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
+
+\chapter{Statistical Overview}
+\input{overview}
+
+%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
+
+\chapter{User's Guide to \MatchIt}
+\label{methods}
+
+\input{preprocess}
+\input{balance}
+\input{matchit2zelig}
+
+%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
+
+\chapter{Reference Manual}
+\label{chap:reference}
+
+\section{\texttt{matchit()}: Implementation of Matching Methods}
+\label{sec:matchit}
+Use \texttt{matchit()} to implement a variety of matching procedures
+including exact matching, nearest neighbor matching,
+subclassification, optimal matching, genetic matching, and full
+matching.  The output of {\tt matchit()} can be analyzed via any
+standard R package, by exporting the data for use in another program,
+or most simply via \hlink{Zelig}{http://gking.harvard.edu/zelig} in R.
+
+\input{matchitref}
+\input{summaryref}
+\input{plotref}
+\input{mdataref}
+\input{faq}
+
+%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
+
+%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
+
+
+\chapter{What's New?}
+
+\begin{itemize}
+\item \textbf{2.4-10} (February 2, 2009): Minor documentation fixes
+\item \textbf{2.4-8,2.4-9} (January 29, 2009): Minor documentation fixes
+\item \textbf{2.4-7} (August 4, 2008): Fixed minor bug in subclassification 
+(thanks to Ben Domingue)
+\item \textbf{2.4-6} (July 21, 2008): Improved summary object for
+  exact matching (thanks to Andrew Stokes)
+\item \textbf{2.4-5} (July 20, 2008): Fixed a minor bug.
+\item \textbf{2.4-4} (July 18, 2008): Fixed another bug with regard to the discard option (thanks to Ben Dominique).
+\item \textbf{2.4-3} (July 18, 2008): Fixed a bug in full matching
+  regarding the discard option (thanks to Ben Dominique). Some updates
+  of documentation regarding coarsened exact matching (2.4-1 and
+  2.4-2).
+\item \textbf{2.4} (June 12, 2008): Included coarsened exact matching;
+  documentation bug fixes (thanks to Will Lowe)
+\item \textbf{2.3-1} (October 11, 2007): Stable release for R
+  2.6. Documentation improved. Some minor bug fixes and improvements.
+\item \textbf{2.2-14} (September 2, 2007): Stable release for R 2.5.
+  Documentation improved for full matching. (Thanks to Langche Zeng)
+\item \textbf{2.2-13} (April 10, 2007): Stable release for R
+  2.4. Additional fix to package dependencies. Bug fix for summary().
+\item \textbf{2.2-12} (April 6, 2007): Stable release for R 2.4. Fix
+  to package dependencies.
+\item \textbf{2.2-11} (July 13, 2006): Stable release for R 2.3.
+  Fix to ensure summary() command works with character variables in dataframe (thanks to Daniel Gerlanc).
+\item \textbf{2.2-10} (May 9, 2006): Stable release for R 2.3.
+  A bug fix in {\tt demo(analysis)} (thanks to Julia Gray).
+\item \textbf{2.2-9} (May 3, 2006): Stable release for R 2.3.
+  A minor change to DESCRIPTION file.
+\item \textbf{2.2-8} (May 1, 2006): Stable release for R 2.3.
+  Removed dependency on Zelig (thanks to Dave Kane).
+\item \textbf{2.2-7} (April 11, 2006): Stable release for R 2.2.
+  Error message for missing values in the data frame added
+  (thanks to Olivia Lau).
+\item \textbf{2.2-6} (April 4, 2006): Stable release for R 2.2.
+  Bug fixes related to {\tt reestimate} in {\tt matchit()} and {\tt
+  match.data()} (thanks to Ani Ruhil and Claire Aussems). 
+\item \textbf{2.2-5} (December 7, 2005): Stable release for R 2.2.
+  Changed URL of {\tt WhatIf} to CRAN.
+\item \textbf{2.2-4} (December 3, 2005): Stable release for R 2.2.
+  User's own distance measure can be used with \MatchIt\, (thanks to
+  Nelson Lim).
+\item \textbf{2.2-3} (November 18, 2005): Stable release for R 2.2.
+  standardize option added to full matching and subclass (thanks to
+  Jeronimo Cortina).
+\item \textbf{2.2-2} (November 9, 2005): Stable release for R 2.2.
+  {\tt optmatch} package now on CRAN. Changed URL for that package. 
+\item \textbf{2.2-1} (November 1, 2005): Stable release for R 2.2.
+  balance measures based on empirical CDF are added as a new option
+  {\tt standardize} in {\tt summary()}.
+\item \textbf{2.1-4} (October 14, 2005): Stable release for R 2.2.
+  strictly empirical (no interpolation) quantile-quantile functions
+  and plots are used.
+\item \textbf{2.1-3} (September 27, 2005): Stable release for R 2.1.
+  automated the installation of optional packages. fixed a coding
+  error in {\tt summary()}, the documentation edited.
+\item \textbf{2.1-2} (September 27, 2005): Stable release for R 2.1.
+  minor changes to file names, the option {\tt "whichxs"} added to the
+  {\tt plot()}, major editing of the documentation.
+\item \textbf{2.1-1} (September 16, 2005): Stable release for R
+        2.1. Genetic matching added.    
+\item \textbf{2.0-1} (August 29, 2005): Stable release for R 2.1.
+  Major revisions including some syntax changes. Statistical tests are
+  no longer used for balance checking, which are now based on the
+  empirical covariate distributions (e.g., quantile-quantile plot).
+\item \textbf{1.0-2} (August 10, 2005): Stable release for R
+  2.1. Minor bug fixes (Thanks to Bart Bonikowski).
+\item \textbf{1.0-1} (January 3, 2005): Stable release for R 2.0. The
+  first official version of \MatchIt
+\end{itemize}
+
+
+
+\clearpage
+
+\bibliographystyle{asa}
+\bibliography{gk,gkpubs}
+
+\end{document}
+
diff --git a/inst/doc/matchit.toc b/inst/doc/matchit.toc
new file mode 100644
index 0000000..8ee17e1
--- /dev/null
+++ b/inst/doc/matchit.toc
@@ -0,0 +1,70 @@
+\contentsline {chapter}{\numberline {1}Introduction}{3}{chapter.1}
+\contentsline {section}{\numberline {1.1}What \textsc {MatchIt}\ Does}{3}{section.1.1}
+\contentsline {section}{\numberline {1.2}Software Requirements}{3}{section.1.2}
+\contentsline {section}{\numberline {1.3}Installing \textsc {MatchIt}}{4}{section.1.3}
+\contentsline {section}{\numberline {1.4}Loading \textsc {MatchIt}}{4}{section.1.4}
+\contentsline {section}{\numberline {1.5}Updating \textsc {MatchIt}}{4}{section.1.5}
+\contentsline {chapter}{\numberline {2}Statistical Overview}{5}{chapter.2}
+\contentsline {section}{\numberline {2.1}Preprocessing via Matching}{6}{section.2.1}
+\contentsline {section}{\numberline {2.2}Checking Balance}{7}{section.2.2}
+\contentsline {section}{\numberline {2.3}Conducting Analyses after Matching}{7}{section.2.3}
+\contentsline {chapter}{\numberline {3}User's Guide to \textsc {MatchIt}}{9}{chapter.3}
+\contentsline {section}{\numberline {3.1}Preprocessing via Matching}{9}{section.3.1}
+\contentsline {subsection}{\numberline {3.1.1}Quick Overview}{9}{subsection.3.1.1}
+\contentsline {subsection}{\numberline {3.1.2}Examples}{9}{subsection.3.1.2}
+\contentsline {subsubsection}{\numberline {3.1.2.1}Exact Matching}{10}{subsubsection.3.1.2.1}
+\contentsline {subsubsection}{\numberline {3.1.2.2}Subclassification}{10}{subsubsection.3.1.2.2}
+\contentsline {subsubsection}{\numberline {3.1.2.3}Nearest Neighbor Matching}{11}{subsubsection.3.1.2.3}
+\contentsline {subsubsection}{\numberline {3.1.2.4}Optimal Matching}{11}{subsubsection.3.1.2.4}
+\contentsline {subsubsection}{\numberline {3.1.2.5}Full Matching}{11}{subsubsection.3.1.2.5}
+\contentsline {subsubsection}{\numberline {3.1.2.6}Genetic Matching}{12}{subsubsection.3.1.2.6}
+\contentsline {subsubsection}{\numberline {3.1.2.7}Coarsened Exact Matching}{12}{subsubsection.3.1.2.7}
+\contentsline {section}{\numberline {3.2}Checking Balance}{13}{section.3.2}
+\contentsline {subsection}{\numberline {3.2.1}Quick Overview}{13}{subsection.3.2.1}
+\contentsline {subsection}{\numberline {3.2.2}Details}{13}{subsection.3.2.2}
+\contentsline {subsubsection}{\numberline {3.2.2.1}The {\tt summary()} Command}{13}{subsubsection.3.2.2.1}
+\contentsline {subsubsection}{\numberline {3.2.2.2}The \texttt {plot()} Command}{14}{subsubsection.3.2.2.2}
+\contentsline {section}{\numberline {3.3}Conducting Analyses after Matching}{15}{section.3.3}
+\contentsline {subsection}{\numberline {3.3.1}Quick Overview}{16}{subsection.3.3.1}
+\contentsline {subsection}{\numberline {3.3.2}Examples}{17}{subsection.3.3.2}
+\contentsline {chapter}{\numberline {4}Reference Manual}{21}{chapter.4}
+\contentsline {section}{\numberline {4.1}\texttt {matchit()}: Implementation of Matching Methods}{21}{section.4.1}
+\contentsline {subsubsection}{\numberline {4.1.0.1}Syntax}{21}{subsubsection.4.1.0.1}
+\contentsline {subsubsection}{\numberline {4.1.0.2}Arguments}{21}{subsubsection.4.1.0.2}
+\contentsline {paragraph}{\numberline {4.1.0.2.1}Arguments for All Matching Methods}{21}{paragraph.4.1.0.2.1}
+\contentsline {paragraph}{\numberline {4.1.0.2.2}Additional Arguments for Specification of Distance Measures}{22}{paragraph.4.1.0.2.2}
+\contentsline {paragraph}{\numberline {4.1.0.2.3}Additional Arguments for Subclassification}{24}{paragraph.4.1.0.2.3}
+\contentsline {paragraph}{\numberline {4.1.0.2.4}Additional Arguments for Nearest Neighbor Matching}{24}{paragraph.4.1.0.2.4}
+\contentsline {paragraph}{\numberline {4.1.0.2.5}Additional Arguments for Optimal Matching}{25}{paragraph.4.1.0.2.5}
+\contentsline {paragraph}{\numberline {4.1.0.2.6}Additional Arguments for Full Matching}{25}{paragraph.4.1.0.2.6}
+\contentsline {paragraph}{\numberline {4.1.0.2.7}Additional Arguments for Genetic Matching}{26}{paragraph.4.1.0.2.7}
+\contentsline {paragraph}{\numberline {4.1.0.2.8}Additional Arguments for Coarsened Exact Matching}{26}{paragraph.4.1.0.2.8}
+\contentsline {subsubsection}{\numberline {4.1.0.3}Output Values}{26}{subsubsection.4.1.0.3}
+\contentsline {section}{\numberline {4.2}\texttt {summary()}: Numerical Summaries of Balance}{27}{section.4.2}
+\contentsline {subsubsection}{\numberline {4.2.0.1}Syntax}{27}{subsubsection.4.2.0.1}
+\contentsline {subsubsection}{\numberline {4.2.0.2}Arguments}{28}{subsubsection.4.2.0.2}
+\contentsline {subsubsection}{\numberline {4.2.0.3}Output Values}{28}{subsubsection.4.2.0.3}
+\contentsline {section}{\numberline {4.3}\texttt {plot()}: Graphical Summaries of Balance}{29}{section.4.3}
+\contentsline {subsection}{\numberline {4.3.1}Plot options for the matchit object}{29}{subsection.4.3.1}
+\contentsline {subsubsection}{\numberline {4.3.1.1}Syntax}{30}{subsubsection.4.3.1.1}
+\contentsline {subsubsection}{\numberline {4.3.1.2}Arguments}{30}{subsubsection.4.3.1.2}
+\contentsline {subsubsection}{\numberline {4.3.1.3}Output Values}{30}{subsubsection.4.3.1.3}
+\contentsline {subsection}{\numberline {4.3.2}Plot options for the matchit summary object}{31}{subsection.4.3.2}
+\contentsline {subsubsection}{\numberline {4.3.2.1}Syntax}{31}{subsubsection.4.3.2.1}
+\contentsline {subsubsection}{\numberline {4.3.2.2}Arguments}{31}{subsubsection.4.3.2.2}
+\contentsline {subsubsection}{\numberline {4.3.2.3}Output Values}{31}{subsubsection.4.3.2.3}
+\contentsline {section}{\numberline {4.4}\texttt {match.data()}: Extracting the Matched Data Set}{31}{section.4.4}
+\contentsline {subsection}{\numberline {4.4.1}Usage}{31}{subsection.4.4.1}
+\contentsline {subsection}{\numberline {4.4.2}Arguments}{31}{subsection.4.4.2}
+\contentsline {subsection}{\numberline {4.4.3}Examples}{32}{subsection.4.4.3}
+\contentsline {chapter}{\numberline {5}Frequently Asked Questions}{34}{chapter.5}
+\contentsline {section}{\numberline {5.1}How do I Cite this Work?}{34}{section.5.1}
+\contentsline {section}{\numberline {5.2}What if My datasets Are Big and Are Taking Up Too Much Memory?}{34}{section.5.2}
+\contentsline {section}{\numberline {5.3}How Exactly are the Weights Created?}{35}{section.5.3}
+\contentsline {section}{\numberline {5.4}How Do I Create Observation Names?}{35}{section.5.4}
+\contentsline {section}{\numberline {5.5}How Can I See Outcomes of Matched Pairs?}{36}{section.5.5}
+\contentsline {section}{\numberline {5.6}How Do I Ensure Replicability As \textsc {MatchIt}\ Versions Develop?}{36}{section.5.6}
+\contentsline {section}{\numberline {5.7}How Do I Use My Own Distance Measure with \textsc {MatchIt}\tmspace +\thinmuskip {.1667em}?}{36}{section.5.7}
+\contentsline {section}{\numberline {5.8}What Do I Do about Missing Data?}{37}{section.5.8}
+\contentsline {section}{\numberline {5.9}Why Preprocessing?}{37}{section.5.9}
+\contentsline {chapter}{\numberline {6}What's New?}{38}{chapter.6}
diff --git a/inst/doc/matchit2zelig.tex b/inst/doc/matchit2zelig.tex
new file mode 100644
index 0000000..ef2f1fc
--- /dev/null
+++ b/inst/doc/matchit2zelig.tex
@@ -0,0 +1,285 @@
+\section{Conducting Analyses after Matching}
+\label{sec:analysis}
+
+Any software package may be used for parametric analysis following
+\MatchIt.  This includes any of the relevant R packages, or other
+statistical software by exporting the resulting matched data sets
+using R commands such as {\tt write.csv()} and {\tt write.table()} for
+ASCII files or {\tt write.dta()} in the {\tt foreign} package for a
+STATA binary file.
+
+When variable numbers of treated and control units have been matched
+to each other (e.g., through exact matching, full matching, or k:1
+matching with replacement), the weights created by MatchIt should be
+used (e.g., in a weighted regression) to ensure that the matched
+treated and control groups are weighted up to be similar.  Users
+should also remember that the weights created by MatchIt estimate the
+average treatment effect on the treated, with the control units
+weighted to resemble the treated units.  See below for more detail on
+the weights.  With subclassification, estimates should be obtained
+within each subclass and then aggregated across subclasses.  When it
+is not possible to calculate an effect within each subclass, again the
+weights can be used to weight the matched units.
+
+In this section, we show how to use
+\hlink{Zelig}{http://gking.harvard.edu/zelig/} with \MatchIt.  Zelig
+\citep{ImaKinLau06} is an R package that implements a large variety of
+statistical models (using numerous existing R packages) with a single
+easy-to-use interface, gives easily interpretable results by
+simulating quantities of interest, provides numerical and graphical
+summaries, and is easily extensible to include new methods.
+
+\subsection{Quick Overview}
+
+The general syntax is as follows. First, we use \texttt{match.data()}
+to create the matched data from the \MatchIt\ output object
+(\texttt{m.out}) by excluding unmatched units from the original data,
+and including information produced by the particular matching
+procedure (i.e., primarily a new data set, but also information that
+may result such as weights, subclasses, or the distance measure).
+\begin{verbatim}
+> m.data <- match.data(m.out)
+\end{verbatim}
+where {\tt m.data} is the resulting matched data.  Zelig analyses all
+use three commands --- \texttt{zelig}, \texttt{setx}, and
+\texttt{sim}.  For example, the basic statistical analysis is
+performed first:
+\begin{verbatim}
+> z.out <- zelig(Y ~ treat + x1 + x2, model = mymodel, data = m.data)
+\end{verbatim}
+where {\tt Y} is the outcome variable, {\tt mymodel} is the selected
+model, and {\tt z.out} is the output object from {\tt zelig}.  This
+output object includes estimated coefficients, standard errors, and
+other typical outputs from your chosen statistical model.  Its
+contents can be examined via \texttt{summary(z.out)} or
+\texttt{plot(z.out)}, but the idea of Zelig is that these statistical
+results are typically only intermediate quantities needed to compute
+your ultimate quantities of interest, which in the case of matching
+are usually causal inferences.  To get these causal quantities, we use
+Zelig's other two commands.  Thus, we can set the explanatory
+variables at their means (the default) and change the treatment
+variable from a 0 to a 1:
+\begin{verbatim}
+> x.out0 <- setx(z.out0, treat=0)
+> x1.out0 <- setx(z.out0, treat=1)
+\end{verbatim}
+and finally compute the resulting estimates of the causal effects and
+examine a summary:
+\begin{verbatim}
+> s.out0 <- sim(z.out1, x = x.out1)
+> summary(s.out0)
+\end{verbatim}
+
+\subsection{Examples}
+
+We now give four examples using the Lalonde data.  They are meant to
+be read sequentially.  You can run these example commands by typing
+{\tt demo(analysis)}.  Although we use the linear least squares model
+in these examples, a wide range of other models are available in Zelig
+(for the list of supported models, see
+\hlink{\url{http://gking.harvard.edu/zelig/docs/Models_Zelig_Can.html}}
+{http://gking.harvard.edu/zelig/docs/Models_Zelig_Can.html}.
+
+To load the Zelig package after installing it, type
+\begin{verbatim}
+> library(Zelig)
+\end{verbatim}
+
+\begin{description}
+\item[Model-Based Estimates] In our first example, we conduct a
+  standard parametric analysis and compute quantities of interest in
+  the most common way.  We begin with nearest neighbor matching with a
+  logistic regression-based propensity score, discarding control units
+  outside the convex hull of the treated units
+  \citep{KinZen06,KinZen07}:
+\begin{verbatim}
+> m.out <- matchit(treat ~ age + educ + black + hispan + nodegree + 
+                    married + re74 + re75, method = "nearest", discard
+                    = "hull.control", data = lalonde)
+\end{verbatim}
+  Then we check balance using the summary and plot procedures (which
+  we don't show here).  When the best balance is achieved, 
+  we run the parametric analysis:
+\begin{verbatim}
+> z.out <- zelig(re78 ~ treat + age + educ + black + hispan + nodegree + 
+                  married + re74 + re75, data = match.data(m.out), 
+                  model = "ls")
+\end{verbatim}
+  and then set the explanatory variables at their means (the default)
+  and change the treatment variable from a 0 to a 1:
+\begin{verbatim}
+> x.out <- setx(z.out, treat=0)
+> x1.out <- setx(z.out, treat=1)
+\end{verbatim}
+and finally compute the result and examine a summary:
+\begin{verbatim}
+> s.out <- sim(z.out, x = x.out, x1 = x1.out)
+> summary(s.out)
+\end{verbatim}
+
+\item[Average Treatment Effect on the Treated] We illustrate now how
+  to estimate the average treatment effect on the treated in a way
+  that is quite robust.  We do this by estimating the coefficients in
+  the control group alone.
+
+  We begin by conducting nearest neighbor matching with a logistic
+  regression-based propensity score:
+\begin{verbatim}
+> m.out1 <- matchit(treat ~ age + educ + black + hispan + nodegree + 
+                    married + re74 + re75, method = "nearest", data = lalonde)
+\end{verbatim}
+  Then we check balance using the summary and plot procedures (which
+  we don't show here).  We reestimate the matching procedure until we
+  achieve the best balance possible.  (The running examples here are
+  meant merely to illustrate, not to suggest that we've achieved the
+  best balance.)  Then we go to Zelig, and in this case choose to fit
+  a linear least squares model to the control group only:
+\begin{verbatim}
+> z.out1 <- zelig(re78 ~ age + educ + black + hispan + nodegree + 
+                  married + re74 + re75, data = match.data(m.out1, "control"), 
+                  model = "ls")
+\end{verbatim}
+  where the {\tt "control"} option in {\tt match.data()} extracts only
+  the matched control units and {\tt ls} specifies least squares
+  regression.  In a smaller data set, this example should probably be
+  changed to include all the data in this estimation (using
+  \texttt{data = match.data(m.out1)} for the data) and by including
+  the treatment indicator (which is excluded in the example since its
+  a constant in the control group.)  Next, we use the coefficients
+  estimated in this way from the control group, and combine them with
+  the values of the covariates set to the values of the treated units.
+  We do this by choosing conditional prediction (which means use the
+  observed values) in \texttt{setx()}.  The {\tt sim()} command does
+  the imputation.
+\begin{verbatim}
+> x.out1 <- setx(z.out1, data = match.data(m.out1, "treat"), cond = TRUE)
+> s.out1 <- sim(z.out1, x = x.out1)
+\end{verbatim}
+Finally, we obtain a summary of the results by 
+\begin{verbatim}
+> summary(s.out1)
+\end{verbatim}
+
+\item[Average Treatment Effect (Overall)] To estimate the average
+  treatment effect, we continue with the previous example and fit the
+  linear model to the {\it treatment group}:
+\begin{verbatim}
+> z.out2 <- zelig(re78 ~ age + educ + black + hispan + nodegree + 
+                  married + re74 + re75, data = match.data(m.out1, "treat"), 
+                  model = "ls")
+\end{verbatim}
+We then conduct the same simulation procedure in order to impute the
+counterfactual outcome for the {\it control group},
+\begin{verbatim}
+> x.out2 <- setx(z.out2, data = match.data(m.out1, "control"), cond = TRUE)
+> s.out2 <- sim(z.out2, x = x.out2)
+\end{verbatim}
+In this calculation, Zelig is computing the difference between
+observed and the expected values.  This means that the treatment
+effect for the control units is the effect of control (observed
+control outcome minus the imputed outcome under treatment from the
+model).  Hence, to combine treatment effects just reverse the signs of
+the estimated treatment effect of controls.
+\begin{verbatim}
+> ate.all <- c(s.out1$qi$att.ev, -s.out2$qi$att.ev)
+\end{verbatim}
+The point estimate, its standard error, and the $95\%$ confidence
+interval is given by
+\begin{verbatim}
+> mean(ate.all)
+> sd(ate.all)
+> quantile(ate.all, c(0.025, 0.975))
+\end{verbatim}
+  
+\item[Subclassification] In subclassification, the average treatment
+  effect estimates are obtained separately for each subclass, and then
+  aggregated for an overall estimate.  Estimating the treatment
+  effects separately for each subclass, and then aggregating across
+  subclasses, can increase the robustness of the ultimate results
+  since the parametric analysis within each subclass requires only
+  local rather than global assumptions.  However, fewer observations
+  are obviously available within each subclass, and so this option is
+  normally chosen for larger data sets.
+
+  We begin this example by conducting subclassification with four
+  subclasses,
+\begin{verbatim}
+> m.out2 <- matchit(treat ~ age + educ + black + hispan + nodegree + 
+                    married + re74 + re75, data = lalonde, 
+                    method = "subclass", subclass = 4)
+\end{verbatim}
+  When balance is as good as we can get it, we then fit a linear
+  regression within each subclass by controlling for the estimated
+  propensity score (called \texttt{distance}) and other covariates.
+  In most software, this would involve running four separate
+  regressions and then combining the results.  In Zelig, however, all
+  we need to do is to use the {\tt by} option:
+\begin{verbatim}
+> z.out3 <- zelig(re78 ~ re74 + re75 + distance, 
+                  data = match.data(m.out2, "control"), 
+                  model = "ls", by = "subclass")
+\end{verbatim}
+  The same set of commands as in the first example are used to do the
+  imputation of the counterfactual outcomes for the treated units:
+\begin{verbatim}
+> x.out3 <- setx(z.out3, data = match.data(m.out2, "treat"), fn = NULL, 
+                 cond = TRUE)
+> s.out3 <- sim(z.out3, x = x.out3)
+> summary(s.out3)
+\end{verbatim}
+It is also possible to get the summary result for each subclass. For
+example, the following command summarizes the result for the second
+subclass.
+\begin{verbatim}
+> summary(s.out3, subset = 2)
+\end{verbatim}
+  
+\item[How Adjustment After Exact Matching Has No Effect] Regression 
+adjustment after exact one-to-one exact matching gives the identical 
+answer as a simple, unadjusted difference in means.  General exact 
+matching, as implemented in MatchIt, allows one-to-many matches, so to see 
+the same result we must weight when adjusting.  In other words: weighted 
+regression adjustment after general exact matching gives the identical 
+answer as a simple, unadjusted weighted difference in means.  For 
+example:
+
+\begin{verbatim}
+> m.out <- matchit(treat ~ educ + black + hispan, data = lalonde, 
+                   method = "exact")
+> m.data <- match.data(m.out)
+> ## weighted diff in means 
+> weighted.mean(mdata$re78[mdata$treat == 1], mdata$weights[mdata$treat==1]) 
+        - weighted.mean(mdata$re78[mdata$treat==0], mdata$weights[mdata$treat==0])
+[1] 807
+> ## weighted least squares without covariates
+> zelig(re78 ~ treat, data = m.data, model = "ls", weights = "weights")
+
+Call:
+zelig(formula = re78 ~ treat, model = "ls", data = m.data, weights =
+"weights")
+
+Coefficients:
+(Intercept)        treat  
+       5524          807 
+
+> ## weighted least squares with covariates
+> zelig(re78 ~ treat + black + hispan + educ, data = m.data, model = "ls", 
+        weights = "weights")
+
+Call:
+zelig(formula = re78 ~ treat + black + hispan + educ, model = "ls",
+data = m.data, weights = "weights")
+
+Coefficients:
+(Intercept)        treat        black       hispan         educ  
+        314          807        -1882          258          657  
+\end{verbatim}
+
+
+ \end{description}
+
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/inst/doc/matchitref.tex b/inst/doc/matchitref.tex
new file mode 100644
index 0000000..4f3c30a
--- /dev/null
+++ b/inst/doc/matchitref.tex
@@ -0,0 +1,389 @@
+\subsubsection{Syntax}
+\begin{verbatim}
+> m.out <- matchit(formula, data, method = "nearest", verbose = FALSE, ...)
+\end{verbatim}
+
+\subsubsection{Arguments}
+
+\paragraph{Arguments for All Matching Methods}
+
+\begin{itemize}
+
+\item \texttt{formula}: formula used to calculate the distance measure
+  for matching (e.g., the propensity score model).  It takes the usual syntax of R formulas, {\tt treat
+    \~\ x1 + x2}, where {\tt treat} is a binary treatment indicator,
+  and {\tt x1} and {\tt x2} are the pre-treatment covariates. Both the
+  treatment indicator and pre-treatment covariates must be contained
+  in the same data frame, which is specified as {\tt data} (see
+  below).  All of the usual R syntax for formulas work here. For
+  example, {\tt x1:x2} represents the first order interaction term
+  between {\tt x1} and {\tt x2}, and {\tt I(x1 \^\ 2)} represents the
+  square term of {\tt x1}. See {\tt help(formula)} for details.
+  
+\item \texttt{data}: the data frame containing the variables called in
+  {\tt formula}.  
+  
+\item \texttt{method}: the matching method (default =
+  \texttt{"nearest"}, nearest neighbor matching).  Currently,
+  \texttt{"exact"} (exact matching), \texttt{"full"} (full matching),
+  \texttt{"nearest"} (nearest neighbor matching), \texttt{"optimal"}
+  (optimal matching), \texttt{"subclass"} (subclassification),
+  \texttt{"genetic"} (genetic matching), and \texttt{"cem"} (coarsened
+  exact matching) are available. Note that within each of these
+  matching methods, \MatchIt\ offers a variety of options. See below
+  for more details.
+  
+\item \texttt{verbose}: a logical value indicating whether to print
+  the status of the matching algorithm (default = \texttt{FALSE}).
+\end{itemize}
+
+
+\paragraph{Additional Arguments for Specification of
+  Distance Measures}
+\label{subsubsec:inputs-all}
+
+The following arguments specify distance measures that are used for
+matching methods. These arguments apply to all matching methods {\it
+  except exact matching}.
+
+\begin{itemize}
+  
+\item \texttt{distance}: the method used to estimate the distance
+  measure (default = {\tt "logit"}, logistic regression) or a
+  numerical vector of user's own distance measure.  Before using any
+  of these techniques, it is best to understand the theoretical
+  groundings of these techniques and to evaluate the results.  Most of
+  these methods (such as logistic or probit regression) define the
+  distance by first estimating the propensity score, defined as the
+  probability of receiving treatment, conditional on the covariates.
+  Available methods include:
+  \begin{itemize}
+  \item {\tt "mahalanobis"}: the Mahalanobis distance measure.
+  \item binomial generalized linear models with one of the following
+    link functions:
+    \begin{itemize}
+    \item \texttt{"logit"}: logistic link 
+    \item {\tt "linear.logit"}: logistic link with linear propensity
+      score\footnote{The linear propensity scores are obtained by
+        transforming back onto a linear scale.}
+    \item \texttt{"probit"}: probit link
+    \item {\tt "linear.probit"}: probit link with linear propensity
+      score
+    \item {\tt "cloglog"}: complementary log-log link
+    \item {\tt "linear.cloglog"}: complementary log-log link with linear
+      propensity score
+    \item {\tt "log"}: log link
+    \item {\tt "linear.log"}: log link with linear propensity score
+    \item {\tt "cauchit"} Cauchy CDF link
+    \item {\tt "linear.cauchit"} Cauchy CDF link with linear propensity
+      score
+    \end{itemize}
+  \item Choose one of the following generalized additive models (see
+    {\tt help(gam)} for more options).
+    \begin{itemize}
+    \item \texttt{"GAMlogit"}: logistic link
+    \item {\tt "GAMlinear.logit"}: logistic link with linear propensity
+      score
+    \item \texttt{"GAMprobit"}: probit link
+    \item {\tt "GAMlinear.probit"}: probit link with linear propensity
+      score
+    \item {\tt "GAMcloglog"}: complementary log-log link 
+    \item {\tt "GAMlinear.cloglog"}: complementary log-log link with
+      linear propensity score
+    \item {\tt "GAMlog"}: log link
+    \item {\tt "GAMlinear.log"}: log link with linear propensity score,
+    \item {\tt "GAMcauchit"}: Cauchy CDF link
+    \item {\tt "GAMlinear.cauchit"}: Cauchy CDF link with linear
+      propensity score
+\end{itemize} 
+\item \texttt{"nnet"}: neural network model.  See {\tt help(nnet)} for
+  more options.
+\item \texttt{"rpart"}: classification trees.  See {\tt help(rpart)}
+  for more options.
+  \end{itemize}
+  
+\item \texttt{distance.options}: optional arguments for estimating the
+  distance measure. The input to this argument should be a list.  For
+  example, if the distance measure is estimated with a logistic
+  regression, users can increase the maximum IWLS iterations by
+  \texttt{distance.options = list(maxit = 5000)}.  Find additional
+  options for general linear models using {\tt help(glm)} or {\tt
+    help(family)}, for general additive models using {\tt help(gam)},
+  for neutral network models {\tt help(nnet)}, and for classification
+  trees {\tt help(rpart)}.
+  
+\item \texttt{discard}: specifies whether to discard units that fall
+  outside some measure of support of the distance measure (default =
+  \texttt{"none"}, discard no units).  Discarding units may change the
+  quantity of interest being estimated by changing the observations left in the analysis. 
+  Enter a logical vector
+  indicating which unit should be discarded or choose from the
+  following options:
+  \begin{itemize}
+  \item \texttt{"none"}: no units will be discarded before matching.
+    Use this option when the units to be matched are substantially
+    similar, such as in the case of matching treatment and control
+    units from a field experiment that was close to (but not fully)
+    randomized (e.g., \citealt{Imai05}), when caliper matching will
+    restrict the donor pool, or when you do not wish to change the
+    quantity of interest and the parametric methods to be used
+    post-matching can be trusted to extrapolate.
+  \item \texttt{"hull.both"}: all units that are not within the convex
+    hull will be discarded.  See \citet{KinZen06,KinZen07} for
+    information about the convex hull in this context and as a measure
+    of model dependence.
+  \item \texttt{"both"}: all units (treated and control) that are
+    outside the support of the distance measure will be discarded.
+  \item \texttt{"hull.control"}: only control units that are not
+    within the convex hull of the treated units will be discarded.  
+  \item \texttt{"control"}: only control units outside the support of
+    the distance measure of the treated units will be discarded.  Use
+    this option when the average treatment effect on the treated is of
+    most interest and when you are unwilling to discard
+    non-overlapping treatment units (which would change the quantity
+    of interest).
+  \item \texttt{"hull.treat"}: only treated units that are not within
+    the convex hull of the control units will be discarded. 
+  \item \texttt{"treat"}: only treated units outside the support of
+    the distance measure of the control units will be discarded.  Use
+    this option when the average treatment effect on the control units
+    is of most interest and when unwilling to discard control units.
+  \end{itemize}
+  
+\item \texttt{reestimate}: If {\tt FALSE} (default), the model for the
+  distance measure will not be re-estimated after units are discarded.
+  The input must be a logical value.  Re-estimation may be desirable
+  for efficiency reasons, especially if many units were discarded and
+  so the post-discard samples are quite different from the original
+  samples.
+  
+\end{itemize}
+
+\paragraph{Additional Arguments for Subclassification}
+\label{subsubsec:inputs-subclass}
+
+\begin{itemize}
+\item \texttt{sub.by}: criteria for subclassification.  Choose from:
+  \texttt{"treat"} (default), the number of treatment units;
+  \texttt{"control"}, the number of control units; or \texttt{"all"},
+  the total number of units.  Changing the default will likely also
+  signal a change in your quantity of interest from the average
+  treatment effect on the treated to other quantities.
+\item \texttt{subclass}: either a scalar specifying the number of
+  subclasses, or a vector of probabilities bounded between 0 and 1,
+  which create quantiles of the distance measure using the units in
+  the group specified by \texttt{sub.by} (default = \texttt{subclass =
+    6}).  
+\end{itemize}
+
+\paragraph{Additional Arguments for Nearest Neighbor Matching}
+\label{subsubsec:inputs-nearest}
+
+\begin{itemize}
+\item \texttt{m.order}: the order in which to match treatment units
+  with control units.
+  \begin{itemize}
+  \item {\tt "largest"} (default): matches from the largest value of
+    the distance measure to the smallest.
+  \item {\tt "smallest"}: matches from the smallest value of the
+    distance measure to the largest.
+  \item {\tt "random"}: matches in random order.
+  \end{itemize}
+\item \texttt{replace}: logical value indicating whether each control
+  unit can be matched to more than one treated unit (default = {\tt
+    replace = FALSE}, each control unit is used at most once -- i.e.,
+  sampling without replacement). For matching with replacement, use
+  \texttt{replace = TRUE}.  After matching with replacement, the weights
+  can be used to reflect the frequency with which each control unit was matched.
+\item \texttt{ratio}: the number of control units to match to each
+  treated unit (default = {\tt 1}).  If matching is done without
+  replacement and there are fewer control units than {\tt ratio} times
+  the number of eligible treated units (i.e., there are not enough
+  control units for the specified method), then the higher ratios will
+  have \texttt{NA} in place of the matching unit number in
+  \texttt{match.matrix}.
+\item \texttt{exact}: variables on which to perform exact matching
+  within the nearest neighbor matching (default = {\tt NULL}, no exact
+  matching).  If \texttt{exact} is specified, only matches that
+  exactly match on the covariates in \texttt{exact} will be allowed.
+  Within the matches that match on the variables in \texttt{exact},
+  the match with the closest distance measure will be chosen.
+  \texttt{exact} should be entered as a vector of variable names
+  (e.g., \texttt{exact = c("X1", "X2")}).
+\item \texttt{caliper}: the number of standard deviations of the
+  distance measure within which to draw control units (default = {\tt
+    0}, no caliper matching).  If a caliper is specified, a control
+  unit within the caliper for a treated unit is randomly selected as
+  the match for that treated unit.  If \texttt{caliper != 0}, there
+  are two additional options:
+  \begin{itemize} 
+  \item \texttt{calclosest}: whether to take the nearest available
+    match if no matches are available within the \texttt{caliper}
+    (default = {\tt FALSE}).
+  \item \texttt{mahvars}: variables on which to perform
+    Mahalanobis-metric matching within each caliper (default = {\tt
+      NULL}).  Variables should be entered as a vector of variable
+    names (e.g., \texttt{mahvars = c("X1", "X2")}).  If
+    \texttt{mahvars} is specified without \texttt{caliper}, the
+    caliper is set to 0.25.
+  \end{itemize}
+\item \texttt{subclass} and \texttt{sub.by}: See the options for
+  subclassification for more details on these options.  If a
+  \texttt{subclass} is specified within \texttt{method = "nearest"},
+  the matched units will be placed into subclasses after the nearest
+  neighbor matching is completed.
+\end{itemize}
+
+\paragraph{Additional Arguments for Optimal Matching}
+\label{subsubsec:inputs-optimal}
+
+\begin{itemize}
+\item {\tt ratio}: the number of control units to be matched to each
+  treatment unit (default = {\tt 1}).
+\item {\tt ...}: additional inputs that can be passed to the {\tt
+    fullmatch()} function in the {\tt optmatch} package. See {\tt
+    help(fullmatch)} or
+  \hlink{http://www.stat.lsa.umich.edu/\~{}bbh/optmatch.html}{http://www.stat.lsa.umich.edu/~bbh/optmatch.html}
+  for details.
+\end{itemize}
+
+\paragraph{Additional Arguments for Full Matching}
+\label{subsubsec:inputs-full}
+
+See {\tt help(fullmatch)} (part of this information is copied below)
+or
+\hlink{http://www.stat.lsa.umich.edu/\~{}bbh/optmatch.html}{http://www.stat.lsa.umich.edu/~bbh/optmatch.html}
+for details.
+
+\begin{itemize}
+\item {\tt min.controls}: The minimum ratio of controls to treatments
+  that is to be permitted within a matched set: should be nonnegative
+  and finite.  If {\tt min.controls} is not a whole number, the
+  reciprocal of a whole number, or zero, then it is rounded down to
+  the nearest whole number or reciprocal of a whole number.
+  
+\item {\tt max.controls}: The maximum ratio of controls to treatments
+  that is to be permitted within a matched set: should be positive and
+  numeric. If {\tt max.controls} is not a whole number, the reciprocal
+  of a whole number, or {\tt Inf}, then it is rounded up to the
+  nearest whole number or reciprocal of a whole number.
+  
+\item {\tt omit.fraction}: Optionally, specify what fraction of
+  controls or treated subjects are to be rejected.  If {\tt
+    omit.fraction} is a positive fraction less than one, then {\tt
+    fullmatch()} leaves up to that fraction of the control reservoir
+  unmatched.  If {\tt omit.fraction} is a negative number greater than
+  $-1$, then {\tt fullmatch()} leaves up to $|{\rm omit.fraction}|$ of
+  the treated group unmatched.  Positive values are only accepted if
+  ${\rm max.controls} >= 1$; negative values, only if ${\rm
+    min.controls} <= 1$.  If {\tt omit.fraction} is not specified,
+  then only those treated and control subjects without permissible
+  matches among the control and treated subjects, respectively, are
+  omitted.
+
+\item {\tt ...}: Additional inputs that can be passed to the {\tt
+    fullmatch()} function in the {\tt optmatch} package.
+\end{itemize}
+
+\paragraph{Additional Arguments for Genetic Matching}
+\label{subsubsec:inputs-genetic}
+
+The available options are listed below.
+\begin{itemize}
+\item {\tt ratio}: the number of control units to be matched to each
+  treatment unit (default = {\tt 1}).
+\item {\tt ...}: additional minor inputs that can be passed to the
+  {\tt GenMatch()} function in the {\tt Matching} package. See {\tt
+    help(GenMatch)} or\\
+  \hlink{http://sekhon.polisci.berkeley.edu/library/Matching/html/GenMatch.html}{http://sekhon.polisci.berkeley.edu/library/Matching/html/GenMatch.html}
+  for details.
+\end{itemize}
+
+\paragraph{Additional Arguments for Coarsened Exact Matching}
+\label{subsubsec:inputs-cem}
+
+The available options are listed here:
+\begin{itemize}
+\item{cutpoints} named list each describing the cutpoints for the
+    variables.  Each list element is either a vector of cutpoints, a
+    number of cutpoints, a method for automatic bin contruction.
+\item{k2k} return k-to-k matching?
+\item{verbose} controls level of verbosity
+\item{dist} user defined distance function 
+\item {\tt ...}: additional minor inputs that can be passed to the
+  {\tt cem()} function in the {\tt cem} package. See {\tt
+    help(cem)} or
+  \hlink{http://gking.harvard.edu/cem}{http://gking.harvard.edu/cem}
+  for details.
+\end{itemize}
+
+\subsubsection{Output Values}
+\label{sec:outputs}
+
+Regardless of the type of matching performed, the \texttt{matchit}
+output object contains the following elements:\footnote{When
+  inapplicable or unnecessary, these elements may equal {\tt NULL}.
+  For example, when exact matching, {\tt match.matrix = NULL}.}
+
+\begin{itemize}
+\item \texttt{call}: the original {\tt matchit()} call.
+  
+\item \texttt{formula}: the formula used to specify the model for
+  estimating the distance measure.
+  
+\item \texttt{model}: the output of the model used to estimate
+  the distance measure.  \texttt{summary(m.out\$model)} will give the
+  summary of the model where \texttt{m.out} is the output object from
+  \texttt{matchit()}.
+  
+\item \texttt{match.matrix}: an $n_1 \times$ \texttt{ratio} matrix
+  where:
+  \begin{itemize}
+  \item the row names represent the names of the treatment units
+    (which match the row names of the data frame specified in
+    \texttt{data}).
+  \item each column stores the name(s) of the control unit(s) matched
+    to the treatment unit of that row. For example, when the
+    \texttt{ratio} input for nearest neighbor or optimal matching is
+    specified as 3, the three columns of \texttt{match.matrix}
+    represent the three control units matched to one treatment unit).
+  \item \texttt{NA} indicates that the treatment unit was not matched.
+  \end{itemize}
+  
+\item \texttt{discarded}: a vector of length $n$ that displays whether
+  the units were ineligible for matching due to common support
+  restrictions.  It equals \texttt{TRUE} if unit $i$ was discarded,
+  and it is set to \texttt{FALSE} otherwise.
+  
+\item \texttt{distance}: a vector of length $n$ with the estimated
+  distance measure for each unit.
+  
+\item \texttt{weights}: a vector of length $n$ with the weights
+  assigned to each unit in the matching process.  Unmatched units have
+  weights equal to $0$. Matched treated units have weight $1$.  Each
+  matched control unit has weight proportional to the number of
+  treatment units to which it was matched, and the sum of the control
+  weights is equal to the number of uniquely matched control units.
+ 
+\item \texttt{subclass}: the subclass index in an ordinal scale from 1
+  to the total number of subclasses as specified in \texttt{subclass}
+  (or the total number of subclasses from full or exact matching).
+  Unmatched units have \texttt{NA}.
+  
+\item \texttt{q.cut}: the subclass cut-points that classify the
+  distance measure.
+  
+\item \texttt{treat}: the treatment indicator from \texttt{data} (the
+  left-hand side of \texttt{formula}).
+ 
+\item \texttt{X}: the covariates used for estimating the distance
+  measure (the right-hand side of \texttt{formula}).  When applicable,
+  \texttt{X} is augmented by covariates contained in \texttt{mahvars}
+  and \texttt{exact}.
+\end{itemize}
+
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/inst/doc/mdataref.tex b/inst/doc/mdataref.tex
new file mode 100644
index 0000000..975d076
--- /dev/null
+++ b/inst/doc/mdataref.tex
@@ -0,0 +1,103 @@
+\section{\texttt{match.data()}: Extracting the Matched Data Set}
+\label{sec:match.data}
+
+\subsection{Usage}
+
+To extract the matched data set for subsequent analyses from the
+output object (see Section~\ref{sec:analysis}), we provide the
+function {\tt match.data()}.  This is used as follows:
+
+\begin{verbatim}
+> m.data <- match.data(object, group = "all", distance = "distance", 
+                       weights = "weights", subclass = "subclass")
+\end{verbatim}
+
+The output of the function {\tt match.data()} is the original data
+frame where additional information about matching (i.e., distance
+measure as well as resulting weights and subclasses) is added,
+restricted to units that were matched.
+
+\subsection{Arguments}
+
+{\tt match.data()} takes the following inputs:
+\begin{enumerate}
+\item {\tt object} is the output object from {\tt matchit()}. This is
+  a required input.
+\item {\tt group} specifies for which matched group the user wants to
+  extract the data. Available options are {\tt "all"} (all matched
+  units), {\tt "treat"} (matched units in the treatment group), and
+  {\tt "control"} (matched units in the control group). The default is
+  {\tt "all"}.
+\item {\tt distance} specifies the variable name used to store the
+  distance measure. The default is {\tt "distance"}.
+\item {\tt weights} specifies the variable name used to store the
+  resulting weights from matching. The default is {\tt "weights"}. See
+  Section~\ref{subsec:weights} for more details on the weights.
+\item {\tt subclass} specifies the variable name used to store the
+  subclass indicator. The default is {\tt "subclass"}.
+\end{enumerate}
+
+\subsection{Examples}
+
+Here, we present examples for using {\tt match.data()}. Users can run
+these commands by typing {\tt demo(match.data)} at the R
+prompt. First, we load the Lalonde data,
+
+\begin{verbatim}
+> data(lalonde)
+\end{verbatim}
+
+The next line performs nearest neighbor matching based on the
+estimated propensity score from the logistic regression,
+
+\begin{verbatim}
+> m.out1 <- matchit(treat ~ re74 + re75 + age + educ, data = lalonde, 
++     method = "nearest", distance = "logit")
+\end{verbatim}
+
+To obtain matched data, type the following command, 
+
+\begin{verbatim}
+> m.data1 <- match.data(m.out1)
+\end{verbatim}
+
+It is easy to summarize the resulting matched data,
+
+\begin{verbatim}
+> summary(m.data1)
+\end{verbatim}
+
+To obtain matched data for the treatment or control group, specify the option
+{\tt group} as follows,
+
+\begin{verbatim}
+> m.data2 <- match.data(m.out1, group = "treat")
+> summary(m.data2)
+> m.data3 <- match.data(m.out1, group = "control")
+> summary(m.data3)
+\end{verbatim}
+
+We can also use the function to return unmatched data:
+
+\begin{verbatim}
+> unmatched.data <- lalonde[!row.names(lalonde)%in%row.names(match.data(m.out1)),]
+\end{verbatim}
+
+We can also specify different names for the subclass indicator, the
+weight variable, and the estimated distance measure. The following
+example first does a subclassification method, obtains the
+matched data with specified names for those three variables, and then
+print out the names of all variables in the resulting matched data.
+
+\begin{verbatim}
+> m.out2 <- matchit(treat ~ re74 + re75 + age + educ, data = lalonde, 
++     method = "subclass")
+> m.data4 <- match.data(m.out2, subclass = "block", weights = "w", 
++     distance = "pscore")
+> names(m.data4)
+\end{verbatim}
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/inst/doc/notation.tex b/inst/doc/notation.tex
new file mode 100644
index 0000000..4aaf294
--- /dev/null
+++ b/inst/doc/notation.tex
@@ -0,0 +1,151 @@
+\documentclass[oneside,letterpaper,titlepage,12pt]{article}
+%\usepackage[ae,hyper]{/usr/lib/R/share/texmf/Rd}
+\usepackage{makeidx}
+\usepackage{graphicx}
+\usepackage{natbib}
+\usepackage[reqno]{amsmath}
+\usepackage{amssymb}
+\usepackage{verbatim}
+\usepackage{epsf}
+\usepackage{url}
+\usepackage{html}
+\usepackage{dcolumn}
+\usepackage{longtable}
+\usepackage{vmargin}
+\setpapersize{USletter}
+\newcolumntype{.}{D{.}{.}{-1}}
+\newcolumntype{d}[1]{D{.}{.}{#1}}
+%\pagestyle{myheadings}
+\htmladdtonavigation{
+  \htmladdnormallink{%
+    \htmladdimg{http://gking.harvard.edu/pics/home.gif}}
+  {http://gking.harvard.edu/}}
+\newcommand{\hlink}{\htmladdnormallink}
+
+\bodytext{ BACKGROUND="http://gking.harvard.edu/pics/temple.setcounter"}
+\setcounter{tocdepth}{3}
+
+\parindent=0cm
+\newcommand{\MatchIt}{\textsc{MatchIt}}
+
+\begin{document}
+
+\begin{center}
+Notation for \MatchIt \\
+Elizabeth Stuart \\
+\end{center}
+
+This document details the notation to be used in the matching paper to accompany \MatchIt,
+as discussed in conference call on April 27, 2004 and emails on April 27-29, 2004. \\
+
+We first provide a general idea of the notation and ideas.  Formal notation follows.
+
+\begin{enumerate}
+\item  There exists in nature fixed values, $\theta_{1i}$ and $\theta_{0i}$, the
+potential outcomes under treatment and control, respectively.  They, or
+more usually their difference, are our quantities of interest and hence
+the inferential target in this exercise.  They are not generally known.
+There also exist in nature a vector of fixed values $X_i$ that are known and
+will play the role of covariates to condition on.  Note that the use of $X_i$ in matching assumes that they are not 
+affected by treatment assignment: $X_{1i}=X_{0i}=X_i$.  If a researcher is interested in adjusting for a variable potentially affected by treatment
+assignment, then methods such as principal stratification should be used. [We can write a paragraph on that somewhere.]
+
+\item  Then (i.e., only after step 1) $T_i$ is created, preferably by the
+experimenter, who assigns its values randomly, but in some cases $T_i$ is
+created by the world and we hope that it was created effectively randomly
+(or randomly conditional on the observed $X_i$).  This is what is known as the assumption of 
+unconfounded treatment assignment: That treatment assignment is independent of
+the potential outcomes given the covariates $X_i$. 
+
+\item  Finally, the observed outcome variable $Y_i$ is calculated
+deterministically as $Y_i = \theta_{1i}T_i + \theta_{0i}(1-T_i)$.  This is
+an accounting identity, not a regression equation with an error term;
+i.e., it is just true, not really an assumption.
+\end{enumerate}
+
+The accounting identity in 3 implies that we observe $\theta_{1i}=Y_i$ (but
+not $\theta_{0i}$) when $T_i=1$, and we observe $\theta_{0i}=Y_i$ (but not
+$\theta_{1i}$) when $T_i=0$.  Since the fundamental problem of causal
+inference indicates that either $\theta_{0i}$ or $\theta_{1i}$ will be
+unobserved for each $i$, we will need to infer their values, for which we
+define $\tilde\theta_{1i} \sim p(\theta_{1i})$  and $\tilde\theta_{0i} \sim
+p(\theta_{0i})$ as draws of the potential outcomes under treatment and
+control, respectively, from their respective predictive posterior
+distributions.\\
+
+We now detail the notation utilized.  Fixed, but sometimes unknown values are represented by Greek letters.  Draws from the posterior
+distribution of these unknown values are represented by a tilde over the variable of interest.  Fixed, but always known values are represented
+by capital Roman letters.
+We first define notation for individual $i$:
+\begin{itemize}
+\item $\theta_{1i}=$ individual $i$'s potential outcome under treatment 
+\item $\theta_{0i}=$ individual $i$'s potential outcome under control
+\item $T_i=$ individual $i$'s observed treatment assignment 
+\begin{itemize} \item $T_i=1$ means individual $i$ receives treatment
+		\item $T_i=0$ means individual $i$ receives control
+\end{itemize}
+\item $\theta_{0i}$ and $\theta_{1i}$ are considered fixed quantities.  Which one is observed depends on the random variable $T_i$.
+\item $Y_i=T_i \theta_{1i} + (1-T_i) \theta_{0i}$ is individual $i$'s observed outcome
+\item Let $Y_{1i}=(\theta_{1i}|T_i=1)$.  Similarly, $Y_{0i}=(\theta_{0i}|T_i=0)$.  One of these is observed for individual $i$.  [Do we actually want this
+notation?  It's not quite right since the capital Roman letter would imply that $Y_{1i}$ is always observed, but the notation may be handy (see below).]
+\item Let $\tilde{\theta}_{0i}$ be a draw from the posterior distribution of $\theta_{0i}$: $\tilde{\theta}_{0i} \sim p(\theta_{0i})$. 
+Similarly, let  $\tilde{\theta}_{1i}$ be a draw from the posterior distribution of $\theta_{1i}$: $\tilde{\theta}_{1i} \sim p(\theta_{1i})$.
+\item Consider variables $X_i$.  If $X_{0i}=X_{1i}=X_i$ then $X$ is a ``proper covariate'' in that it is not affected by treatment assignment.  Only proper
+covariates should be used in the matching procedure.  That $X_i$ is not affected by treatment assignment 
+is always an assumption (sometimes more reasonable than other times)--we never observe $X_{0i}$ and $X_{1i}$ for individual $i$.
+\end{itemize}
+
+For individual $i$, the potentially observed values can be represented by the following 2x2 table:
+
+\begin{center}
+\begin{tabular}{cc|c|c|}
+\multicolumn{4}{c}{\hspace*{4cm} Actual treatment assignment} \\
+\\
+\multicolumn{2}{c}{} & \multicolumn{2}{c}{Control \hfill Treatment} \\
+\cline{3-4}
+& & & \phantom{abcd} \\
+& Control & $\theta_{0i}$, $X_i$ & $\tilde{\theta}_{0i}$, $X_i$ \\
+Potential & & &  \phantom{abcd} \\
+\cline{3-4}
+outcomes under & & & \phantom{abcd} \\
+& Treatment  & $\tilde{\theta}_{1i}$, $X_i$ & $\theta_{1i}$, $X_i$ \\
+& & & \phantom{abcd} \\
+\cline{3-4}
+\end{tabular}
+\end{center}
+ 
+For each individual, we are in either Column 1 or Column 2 (depending on treatment assignment).  Within each column, 1 number will be observed and 1 will be a drawn
+value from the posterior distribution (i.e., the true value for that cell is missing). Thus, for each individual we are in the situation of one of the 
+following two vectors of potential outcomes:
+
+\begin{center}
+\begin{tabular}{rl}
+If $T_i=1$: & $(\tilde\theta_{0i}, \theta_{1i})$ \\
+If $T_i=0$: & $(\theta_{0i}, \tilde\theta_{1i})$ \\
+\end{tabular}
+\end{center}
+
+Now consider $n$ individuals observed, with $n_1$ in the treated group and $n_0$ in the control group ($n=n_0+n_1$).  Then we have the following notation:
+\begin{itemize}
+\item $n_1=\sum_{i=1}^n T_i$, $n_0=\sum_{i=1}^n (1-T_i)$
+\item ${\bf Y_0} = \{Y_{i}|T_i=0\}$.  ${\bf Y_0}$ is of length $n_0$.
+\item ${\bf Y_1} = \{Y_{i}|T_i=1\}$.  ${\bf Y_1}$ is of length $n_1$.
+\item ${\bf Y} = \{ {\bf Y_0}, {\bf Y_1}\}$.  ${\bf Y}$ is of length $n$.
+\item $\overline{Y}_1 = \frac{\sum_{i=1}^n T_i \theta_{1i}}{\sum_{i=1}^n T_i}=\frac{\sum_{i=1}^{n_1} Y_{1i}}{n_1}$
+\item $\overline{Y}_0 = \frac{\sum_{i=1}^n (1-T_i) \theta_{0i}}{\sum_{i=1}^n (1-T_i)}=\frac{\sum_{i=1}^{n_0} Y_{0i}}{n_0}$
+\item Observed sample variances would be calculated in a similar way (using ${\bf Y_0}$ and ${\bf Y_1}$).
+\end{itemize}
+
+Throughout, we will use $p()$ to represent pdf's and $g()$ for functional forms of models.
+
+One point to make sure we mention in the write-up is to say what OLS assumes.  OLS with a treatment indicator does:
+$$Y_i|X_i, T_i \sim N(\alpha + \beta_0 T_i + {\boldsymbol \beta} {\bf X_i}, \sigma^2)$$
+which assumes that the models of the potential outcomes follow parallel lines with equal residual variance:
+$$\theta_{1i}|X_i \sim N(\alpha + \beta_0 + {\boldsymbol \beta} {\bf X_i}, \sigma^2)$$
+$$\theta_{0i}|X_i \sim N(\alpha + {\boldsymbol \beta} {\bf X_i}, \sigma^2).$$
+We can also have a graphical representation of this, perhaps with some examples of outcomes that clearly don't have that nice parallel linear relationship,
+and show that this would be a very special case of what we're advocating.
+
+
+
+\end{document}
diff --git a/inst/doc/overview.tex b/inst/doc/overview.tex
new file mode 100644
index 0000000..d44adc2
--- /dev/null
+++ b/inst/doc/overview.tex
@@ -0,0 +1,199 @@
+
+\MatchIt\ is designed for causal inference with a dichotomous treatment
+variable and a set of pretreatment control variables.  Any number or
+type of dependent variables can be used.  (If you are interested in
+the causal effect of more than one variable in your data set, run
+\MatchIt\ separately for each one; it is unlikely in any event that
+any one parametric model will produce valid causal inferences for more
+than one treatment variable at a time.)  \MatchIt\ can be used for
+other types of causal variables by dichotomizing them, perhaps in
+multiple ways \citep[see also][]{ImaDyk04}.  \MatchIt\ works for
+experimental data, but is usually used for observational studies where
+the treatment variable is not randomly assigned by the investigator,
+or the random assignment goes awry.
+
+We adopt the same notation as in \citet*{HoImaKin07}.  Unless
+otherwise noted, let $i$ index the $n$ units in the data set, $n_1$
+denote the number of treated units, $n_0$ denote the number of control
+units (such that $n=n_0+n_1$), and $x_i$ indicate a vector of
+pretreatment (or control) variables for unit $i$.  Let $t_i=1$ when
+unit $i$ is assigned treatment, and $t_i=0$ when unit $i$ is assigned
+control.  (The labels ``treatment'' and ``control'' and values 1 and 0
+respectively are arbitrary and can be switched for convenience, except
+that some methods of matching are keyed to the definition of the
+treated group.)  Denote $y_i(1)$ as the potential outcome of unit $i$
+under treatment --- the value the outcome variable would take if $t_i$
+were equal to 1, whether or not $t_i$ in fact is 0 or 1 -- and
+$y_i(0)$ the potential outcome of unit $i$ under control --- the value
+the outcome variable would take if $t_i$ were equal to 0, regardless
+of its value in fact.  The variables $y_i(1)$ and $y_i(0)$ are jointly
+unobservable, and for each $i$, we observe one
+$y_i=t_iy_i(1)+(1-t_i)y_i(0)$, and not the other.  
+
+Also denote a fixed vector of exogenous, pretreatment measured
+confounders as $X_i$.  These variables are defined in the hope or
+under the assumption that conditioning on them appropriately will make
+inferences ignorable.  Measures of balance should be computed with
+respect to all of $X$, even if some methods of matching only use some
+components.
+
+\section{Preprocessing via Matching}
+
+If $t_i$ and $X_i$ were independent, we would not need to control for
+$X_i$, and any parametric analysis would effectively reduce to a
+difference in means of $Y$ for the treated and control groups.  The
+goal of matching is to preprocess the data prior to the parametric
+analysis so that the actual relationship between $t_i$ and $X_i$ is
+eliminated or reduced without introducing bias and or increasing
+inefficiency too much.  
+
+When matching we select, duplicate, or selectively drop observations
+from our data, and we do so without inducing bias as long as we use a
+rule that is a function only of $t_i$ and $X_i$ and does not depend on
+the outcome variable $Y_i$.  Many methods that offer this
+preprocessing are included here, including exact, subclassification,
+nearest neighbor, optimal, and genetic
+matching.  For many of these methods the propensity score--defined as the
+probability of receiving the treatment given the covariates--is a key tool.
+In order to avoid changing the quantity of interest, most
+\MatchIt\ routines work by retaining all treated units and selecting (or weighting)
+control units to include in the final data set; this enables
+one to estimate the average treatment effect on the treated (the purpose
+of which is described in Section \ref{s:qoi}).
+
+\MatchIt\ implements and evaluates the choice of the rules for
+matching.  Matching sometimes increases efficiency by eliminating
+heterogeneity or deleting observations outside of an area where a
+model can reasonably be used to extrapolate, but one needs to be
+careful not to lose too many observations in matching or efficiency
+will drop more than the reduction in bias that is achieved.
+
+The simplest way to obtain good matches (as defined above) is to use
+one-to-one exact matching, which pairs each treated unit with one
+control unit for which the values of $X_i$ are identical.  However,
+with many covariates and finite numbers of potential matches, 
+sufficient exact matches often cannot be found.  Indeed, many of the
+other methods implemented in \MatchIt\ attempt to balance the overall
+covariate distributions as much as possible, when sufficient
+one-to-one exact matches are not available.
+
+A key point in \citet*{HoImaKin07} is that matching methods by
+themselves are not methods of estimation: Every use of matching in the
+literature involves an analysis step following the matching procedure,
+but almost all analyses use a simple difference in means.  This
+procedure is appropriate only if exact matching was conducted.  In
+almost all other cases, some adjustment is required, and there is no
+reason to degrade your inferences by using an inferior method of
+analysis such as a difference in means even when improving your
+inferences via preprocessing.  Thus, with \MatchIt, you can improve
+your analyses in two ways. \MatchIt\ analyses are ``doubly
+robust'' in that if \emph{either} the matching analysis \emph{or} the
+analysis model is correct (but not necessarily both) your inferences
+will be statistically consistent.  In practice, the modeling choices
+you make at the analysis stage will be much less consequential if you
+match first.
+
+\section{Checking Balance}
+\label{sec:balance-sum}
+
+The goal of matching is to create a data set that looks closer to one
+that would result from a perfectly blocked (and possibly randomized)
+experiment.  When we get close, we break the link between the treatment
+variable and the pretreatment controls, which makes the parametric
+form of the analysis model less relevant or irrelevant entirely.  To
+break this link, we need the distribution of covariates to be the same
+within the matched treated and control groups.
+
+A crucial part of any matching procedure is, therefore, to assess how
+close the (empirical) covariate distributions are in the two groups,
+which is known as ``balance.''  Because the outcome variable is not
+used in the matching procedure, any number of matching methods can be
+tried and evaluated, and the one matching procedure that leads to the
+best balance can be chosen.  \MatchIt\ provides a number of ways to
+assess the balance of covariates after matching, including numerical
+summaries such as the ``mean Diff.'' (difference in means) or the
+difference in means divided by the treated group standard deviation,
+and summaries based on quantile-quantile plots that compare the
+empirical distributions of each covariate.  The widely used procedure
+of doing t-tests of the difference in means is highly misleading and
+should never be used to assess balance; see \citet{ImaKinStu08}.
+
+These balance diagnostics should be performed on all variables in $X$,
+even if some are excluded from one of the matching procedures.
+
+\section{Conducting Analyses after Matching}\label{s:qoi}
+
+The most common way that parametric analyses are used to compute
+quantities of interest (without matching) is by (statistically)
+holding constant some explanatory variables, changing others, and
+computing predicted or expected values and taking the difference or
+ratio, all by using the parametric functional form.  In the case of
+causal inference, this would mean looking at the effect on the
+expected value of the outcome variable when changing $T$ from 0 to 1,
+while holding constant the pretreatment control variables $X$ at their
+means or medians.  This, and indeed any other appropriate analysis
+procedure, would be a perfectly reasonable way to proceed with
+analysis after matching.  If it is the chosen way to proceed, then
+either treated or control units may be deleted during the matching
+stage, since the same parametric structure is assumed to apply to all
+observations.
+
+In other instances, researchers wish to reduce the assumptions
+inherent in their statistical model and so want to allow for the
+possibility that their treatment effect to vary over observations.  In
+this situation, one popular quantity of interest used is the
+\emph{average treatment effect on the treated} (ATT).  For example,
+for the treated group, the potential outcomes under control, $Y_i(0)$,
+are missing, whereas the outcomes under treatment, $Y_i(1)$, are
+observed, and the goal of the analysis is to impute the missing
+outcomes, $Y_i(0)$ for observations with $T_i=1$.  We do this via
+simulation using a parametric statistical model such as regression,
+logit, or others (as described below).  Once those potential outcomes
+are imputed from the model, the estimate of individual $i$'s treatment
+effect is $Y_i(1)-\widehat{Y}_i(0)$ where $\widehat{Y}_i(0)$ is a
+predicted value of the dependent variable for unit $i$ under the
+counterfactual condition where $T_i=0$.  The in-sample average
+treatment effect for the treated individuals can then be obtained by
+averaging this difference over all observations $i$ where in fact
+$T_i=1$.  Most \MatchIt\ algorithms retain all treated units, and
+choose some subset of or repeated units from the control group, so
+that estimating the ATT is straightforward.  If one chooses options
+that allow matching with replacement, or any solution that has
+different numbers of controls (or treateds) within each subclass or strata (such
+as full matching), 
+then the parametric analysis following matching must accomodate these
+procedures, such as by using fixed effects or weights, as appropriate.
+(Similar procedures can also be used to estimate various other
+quantities of interest such as the average treatment effect by
+computing it for all observations, but then one must be aware that the
+quantity of interest may change during the matching procedure 
+as some control units may be dropped.)
+
+The imputation from the model can be done in at least two ways.
+Recall that the model is used to impute \emph{the value that the
+  outcome variable would take among the treated units if those treated
+  units were actually controls}.  Thus, one reasonable approach would
+be to fit a model to the matched data and create simulated predicted
+values of the dependent variable for the treated units with $T_i$
+switched counterfactually from 1 to 0.  An alternative approach would
+be to fit a model without $T$ by using only the outcomes of the
+matched control units (i.e., using only observations where $T_i=0$).
+Then, given this fitted model, the missing outcomes $Y_i(0)$ are
+imputed for the matched treated units by using the values of the
+explanatory variables for the treated units.  The first approach will
+usually have lower variance, since all observations are used, and the
+second may have less bias, since no assumption of constant parameters
+across the models of the potential outcomes under treatment and control is needed.  
+See \citet*{HoImaKin07} for more details.
+
+Other quantities of interest can also be computed at the parametric
+stage, following any procedures you would have followed in the absence
+of matching.  The advantage is that if matching is done well your
+answers will be more robust to many small changes in parametric
+specification.
+
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/inst/doc/plotref.tex b/inst/doc/plotref.tex
new file mode 100644
index 0000000..f674ece
--- /dev/null
+++ b/inst/doc/plotref.tex
@@ -0,0 +1,105 @@
+\section{\texttt{plot()}: Graphical Summaries of Balance}
+
+
+\subsection{Plot options for the matchit object}
+The \texttt{plot()} command allows you to check the distributions of
+propensity scores and covariates in the assignment model, squares, and
+interactions, and within each subclasses if specified.
+
+\subsubsection{Syntax}
+
+\begin{verbatim}
+> plot(m.out, discrete.cutoff = 5, type = "QQ", 
+       numdraws = 5000, interactive = TRUE, which.xs = NULL, ...)
+\end{verbatim}
+
+\subsubsection{Arguments}
+
+\begin{itemize}
+\item {\tt type}: type of output graph. \texttt{type = "QQ"}
+  (default) outputs empirical quantile-quantile plots of each
+  covariate to check balance of marginal distributions. Alternatively,
+  \texttt{type = "jitter"} outputs jitter plots of the propensity
+  score for treated and control units.  Finally, \texttt{type="hist"} outputs  
+  histograms of the propensity score in the original treated and control groups
+  and weighted histograms of the propensity score in the matched treated and control groups.
+  
+\item {\tt discrete.cutoff}: For quantile-quantile plots, discrete
+  covariates that take 5 or fewer values are jittered for visibility.
+  This may be changed by setting this argument to any other positive
+  integer.
+  
+\item {\tt interactive}: If \texttt{TRUE} (default), users can
+  identify individual units by clicking on the graph with the left
+  mouse button, and (when applicable) choose subclasses to plot.
+  
+\item {\tt which.xs}: For quantitle-quantile plots, specifies particular covariate names in a
+  character vector to plot only a subset of the covariates.
+
+\item {\tt subclass}: If \texttt{interactive = FALSE}, users can
+  specify which subclass to plot. 
+
+\end{itemize}
+
+\subsubsection{Output Values}
+
+\begin{itemize}
+\item Empirical quantile-quantile plot: This graph plots covariate
+  values that fall in (approximately) the same quantile of treated and
+  control distributions.  Control unit quantile values are plotted on
+  the x-axis, and treated unit quantile values are plotted on the
+  y-axis.  If values fall below the 45 degree line, control units
+  generally take lower values of the covariate.  Data points that fall
+  exactly on the 45 degree line indicate that the marginal
+  distributions are identical.
+  
+\item Jitter plots: This graph plots jittered estimated propensity
+  scores of treated and control units.  Dark diamonds indicate matched
+  units and grey diamonds indicate unmatched or discarded units.  The
+  area of the diamond is proportional to the weights. Vertical lines
+  are plotted if subclassification is used.
+
+\item Histograms: This graph plots histograms of the estimated propensity 
+scores in the original treated and control groups and weighted histograms of the estimated
+propensity scores in the matched treated and control groups.  Plots can be compared vertically to
+quickly check the balance before and after matching.  
+
+\end{itemize}
+
+\subsection{Plot options for the matchit summary object}
+You can also send a matchit summary object to the \texttt{plot()} command, to obtain
+a summary of the balance on each covariate before and after matching.  The summary() object
+must have been created using the option {\texttt standardize=TRUE}.  The idea for this plot
+came from the ``twang" package by McCaffrey, Ridgeway, and Morral.  
+
+\subsubsection{Syntax}
+
+\begin{verbatim}
+> s.out <- summary(object, standardize=TRUE, ...)
+
+> plot(s.out, ...)
+\end{verbatim}
+
+\subsubsection{Arguments}
+
+\begin{itemize}
+\item {\tt interactive}: If \texttt{TRUE} (default), users can
+  identify individual variables by clicking on the graph with the left
+  mouse button.
+\end{itemize}
+
+\subsubsection{Output Values}
+
+\begin{itemize}
+\item Line plot of standardized differences in means before and after matching.  
+Numbers plotted are those output by the summary() command in the sum.all and sum.matched
+objects.  
+\end{itemize}
+
+
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
+
diff --git a/inst/doc/preprocess.tex b/inst/doc/preprocess.tex
new file mode 100644
index 0000000..1023b0d
--- /dev/null
+++ b/inst/doc/preprocess.tex
@@ -0,0 +1,233 @@
+\section{Preprocessing via Matching}
+\label{sec:matching}
+
+\subsection{Quick Overview}
+
+The main command \texttt{matchit()} implements the matching
+procedures.  A general syntax is:
+\begin{verbatim}
+> m.out <- matchit(treat ~ x1 + x2, data = mydata)
+\end{verbatim}
+where {\tt treat} is the dichotomous treatment variable, and {\tt x1}
+and {\tt x2} are pre-treatment covariates, all of which are contained
+in the data frame {\tt mydata}.  The dependent variable (or variables)
+may be included in \texttt{mydata} for convenience but is never used
+by \MatchIt\ or included in the formula.  This command creates the
+\MatchIt\ object called \texttt{m.out}.  Name the output object to see
+a quick summary of the results:
+\begin{verbatim}
+> m.out
+\end{verbatim}
+
+\subsection{Examples}
+
+To run any of the examples below, you first must load the library and
+and data:
+\begin{verbatim}
+> library(MatchIt)
+> data(lalonde)
+\end{verbatim}
+
+Our example data set is a subset of the job training program analyzed
+in \citet{lalonde86} and \citet{DehWah99}. \MatchIt\ includes a
+subsample of the original data consisting of the National Supported
+Work Demonstration (NSW) treated group and the comparison sample from
+the Population Survey of Income Dynamics (PSID).\footnote{This data
+  set, \texttt{lalonde}, was created using NSWRE74$\_$TREATED.TXT and
+  CPS3$\_$CONTROLS.TXT from
+  http://www.columbia.edu/$\sim$rd247/nswdata.}  The variables in this
+data set include participation in the job training program
+(\texttt{treat}, which is equal to 1 if participated in the program,
+and 0 otherwise), age ({\tt age}), years of education ({\tt educ}),
+race (\texttt{black} which is equal to 1 if black, and 0 otherwise;
+\texttt{hispan} which is equal to 1 if hispanic, and 0 otherwise),
+marital status (\texttt{married}, which is equal to 1 if married, 0
+otherwise), high school degree (\texttt{nodegree}, which is equal to 1
+if no degree, 0 otherwise), 1974 real earnings (\texttt{re74}), 1975
+real earnings (\texttt{re75}), and the main outcome variable, 1978
+real earnings (\texttt{re78}).
+
+\subsubsection{Exact Matching}
+\label{subsubsec:exact}
+
+The simplest version of matching is exact.  This technique matches
+\emph{each} treated unit to \emph{all} possible control units with
+exactly the same values on all the covariates, forming subclasses such
+that within each subclass all units (treatment and control) have the
+same covariate values.  Exact matching is implemented in \MatchIt\ 
+using \texttt{method = "exact"}.  Exact matching will be done on all
+covariates included on the right-hand side of the \texttt{formula}
+specified in the \MatchIt\ call.  There are no additional options for
+exact matching.  (Exact restrictions on a subset of covariates can
+also be specified in nearest neighbor matching; see
+Section~\ref{subsubsec:nearest}.)  The following example can be
+run by typing {\tt demo(exact)} at the R prompt,
+\begin{verbatim}
+> m.out <- matchit(treat ~ educ + black + hispan, data = lalonde, 
+                   method = "exact")
+\end{verbatim}
+
+\subsubsection{Subclassification}
+\label{subsubsec:subclass}
+
+When there are many covariates (or some covariates can take a large
+number of values), finding sufficient exact matches will often be
+impossible.  The goal of subclassification is to form subclasses, such
+that in each the distribution (rather than the exact values) of
+covariates for the treated and control groups are as similar as
+possible.  Various subclassification schemes exist, including the one
+based on a scalar distance measure such as the propensity score
+estimated using the \texttt{distance} option (see
+Section~\ref{subsubsec:inputs-all}).  Subclassification is implemented
+in \MatchIt\ using \texttt{method = "subclass"}.
+
+The following example script can be run by typing {\tt demo(subclass)}
+at the R prompt,
+\begin{verbatim}
+> m.out <- matchit(treat ~ re74 + re75 + educ + black + hispan + age, 
+                   data = lalonde, method = "subclass")
+\end{verbatim}
+The above syntax forms 6 subclasses, which is the default number
+of subclasses, based on a distance measure (the propensity score) estimated using logistic
+regression.  By default, each subclass will have approximately the
+same number of treated units.
+
+Subclassification may also be used in conjunction with nearest
+neighbor matching described below, by leaving the default of
+\texttt{method = "nearest"} but adding the option \texttt{subclass}.
+When you choose this option, \MatchIt\ selects matches using nearest neighbor
+matching, but
+after the nearest neighbor matches are chosen it places them into
+subclasses, and adds a variable to the output object indicating subclass membership.
+
+
+\subsubsection{Nearest Neighbor Matching}
+\label{subsubsec:nearest}
+
+Nearest neighbor matching selects the $r$ (default=1) best control
+matches for each individual in the treatment group (excluding those
+discarded using the \texttt{discard} option).  Matching is done
+using a distance measure specified by the {\tt distance} option
+(default=logit).  Matches are chosen for each treated unit one at a
+time, with the order specified by the \texttt{m.order} command (default=largest to smallest).  
+At each matching step we choose the control unit that is not
+yet matched but is closest to the treated unit on the distance
+measure.
+
+Nearest neighbor matching is implemented in \MatchIt\ using the
+\texttt{method = "nearest"} option.  The following example script can
+be run by typing {\tt demo(nearest)}:
+\begin{verbatim}
+> m.out <- matchit(treat ~ re74 + re75 + educ + black + hispan + age, 
+                   data = lalonde, method = "nearest")
+\end{verbatim}
+
+\subsubsection{Optimal Matching}
+\label{subsubsec:optimal}
+
+The default nearest neighbor matching method in \MatchIt\ is
+``greedy'' matching, where the closest control match for each treated
+unit is chosen one at a time, without trying to minimize a global
+distance measure.  In contrast, ``optimal'' matching finds the matched
+samples with the smallest average absolute distance across all the
+matched pairs.  \citet{GuRos93} find that greedy and optimal matching
+approaches generally choose the same sets of controls for the overall
+matched samples, but optimal matching does a better job of minimizing
+the distance within each pair.  In addition, optimal matching can be
+helpful when there are not many appropriate control matches for the
+treated units.
+
+Optimal matching is performed with \MatchIt\ by setting \texttt{method
+  = "optimal"}, which automatically loads an add-on package called
+\texttt{optmatch} \citep{Hansen04}.  The following example can also be
+run by typing {\tt demo(optimal)} at the R prompt.  We conduct 2:1 optimal
+ratio matching based on the propensity score from the logistic
+regression.
+\begin{verbatim}
+> m.out <- matchit(treat ~ re74 + re75 + age + educ, data = lalonde, 
+                   method = "optimal", ratio = 2)
+\end{verbatim}
+
+\subsubsection{Full Matching}
+\label{subsubsec:full}
+
+Full matching is a particular type of subclassification that forms the
+subclasses in an optimal way \citep{Rosenbaum02, Hansen04}.  A fully
+matched sample is composed of matched sets, where each matched set
+contains one treated unit and one or more controls (or one control
+unit and one or more treated units).  As with subclassification, the
+only units not placed into a subclass will be those discarded (if a
+\texttt{discard} option is specified) because they are outside the
+range of common support.  Full matching is optimal in terms of
+minimizing a weighted average of the estimated distance measure
+between each treated subject and each control subject within each
+subclass.
+
+Full matching can be performed with \MatchIt\ by setting
+\texttt{method = "full"}.  Just as with optimal matching, we use the
+\texttt{optmatch} package \citep{Hansen04}, which automatically loads
+when needed.  The following example with full matching (using the
+default propensity score based on logistic regression) can also be run
+by typing {\tt demo(full)} at the R prompt:
+\begin{verbatim}
+> m.out <- matchit(treat ~ age + educ + black + hispan + married +
+                   nodegree + re74 + re75, data = lalonde, method = "full")
+\end{verbatim}
+
+\subsubsection{Genetic Matching}
+\label{subsub:genetic}
+
+Genetic matching automates the process of finding a good matching
+solution \citep{DiaSek05}.  The idea is to use a genetic search
+algorithm to find a set of weights for each covariate such that the a
+version of optimal balance is achieved after matching.  As currently
+implemented, matching is done with replacement using the matching
+method of \citet{AbaImb07} and balance is determined by two univariate
+tests, paired t-tests for dichotomous variables and a
+Kolmogorov-Smirnov test for multinomial and continuous variables, but
+these options can be changed.
+
+Genetic matching can be performed with \MatchIt\ by setting
+\texttt{method = "genetic"}, which automatically loads the
+\texttt{Matching} \citep{Sekhon04} package.  The following example of
+genetic matching (using the estimated propensity score based on
+logistic regression as one of the covariates) can also be run by
+typing {\tt demo(genetic)}:
+\begin{verbatim}
+> m.out <- matchit(treat ~ age + educ + black + hispan + married + nodegree + 
+                   re74 + re75, data = lalonde, method = "genetic")
+\end{verbatim}
+
+
+\subsubsection{Coarsened Exact Matching}
+\label{subsub:cem}
+
+Coarsened Exact Matching (CEM) is a Monotonoic Imbalance Bounding
+(MIB) matching method --- which means that the balance between the
+treated and control groups is chosen by the user ex ante rather than
+discovered through the usual laborious process of checking after the
+fact and repeatedly reestimating, and so that adjusting the imbalance
+on one variable has no effect on the maximum imbalance of any other.
+CEM also strictly bounds through ex ante user choice both the degree
+of model dependence and the average treatment effect estimation error,
+eliminates the need for a separate procedure to restrict data to
+common empirical support, meets the congruence principle, is robust to
+measurement error, works well with multiple imputation methods for
+missing data, and is extremely fast computationally even with very
+large data sets.  CEM also works well for multicategory treatments,
+determining blocks in experimental designs, and evaluating extreme
+counterfactuals \citep{IacKinPor08}.
+
+CEM can be performed with \MatchIt\ by setting \texttt{method =
+  "cem"}, which automatically loads the \texttt{cem} package.  The
+following examples of CEM (with automatic coarsening) can also be run
+by typing \texttt{demo(cem)}:
+\begin{verbatim}
+m.out <- matchit(treat ~ age + educ + black + hispan + married + nodegree 
+                 + re74 + re75, data = lalonde, method = "cem")
+\end{verbatim}
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/inst/doc/summaryref.tex b/inst/doc/summaryref.tex
new file mode 100644
index 0000000..7b8be8f
--- /dev/null
+++ b/inst/doc/summaryref.tex
@@ -0,0 +1,127 @@
+\section{\texttt{summary()}: Numerical Summaries of Balance}
+
+The \texttt{summary()} command returns numerical summaries of balance
+diagnostics.
+
+\subsubsection{Syntax}
+\begin{verbatim}
+summary(object, interactions = FALSE, addlvariables = NULL, standardize = FALSE, ...)
+\end{verbatim}
+
+\subsubsection{Arguments}
+
+\begin{itemize}
+\item \texttt{object}: the output from {\tt matchit()}.
+\item \texttt{interactions}: an option to calculate summary statistics
+  in \texttt{sum.all} and \texttt{sum.matched} for all covariates,
+  their squares, and two-way interactions when \texttt{interactions =
+    TRUE} and only the covariates themselves when \texttt{interactions
+    = FALSE}, (DEFAULT = {\tt FALSE}).
+\item \texttt{addlvariables}: additional variables on which to
+  calculate the diagnostic statistics (in addition to the variables
+  included in the matching procedure) (DEFAULT = {\tt NULL}).
+  \texttt{addlvariables}: a data frame containing additional variables
+  whose balance is examined. The data should come with the same number
+  of units and units in the same order as in the data set used for
+  {\tt matchit()}.
+\item \texttt{standardize}: a logical variable indicating whether to
+  standardize balance measures, i.e., whether the difference in means should be divided
+  by the standard deviation in the original treated group. (DEFAULT = {\tt FALSE})
+\end{itemize}
+
+\subsubsection{Output Values}
+
+The output from the \texttt{summary()} command includes the following
+elements, when applicable:
+\begin{itemize}
+\item The original assignment model call.
+\item \texttt{sum.all}: a data frame that contains variable names and
+  interactions down the row names, and summary statistics on \emph{all
+    observations} in each of the columns.  The columns in
+  \texttt{sum.all} contain: 
+%\footnote{The output for full matching is
+%    slightly different from that described here; see Section
+%    \ref{subsubsec:full} for details.}
+  \begin{itemize}
+  \item means of all covariates $X$ for treated and control units,
+    where \texttt{Means Treated}$= \mu_{X|T=1} = \frac{1}{n_1}
+    \sum_{T=1} X_i$ and \texttt{Means Control}$= \mu_{X|T=0} =
+    \frac{1}{n_0} \sum_{T=0} X_i$,
+ \item standard deviation in the control group for all covariates $X$, where applicable, 
+        $$\quad s_{x|T=0} = \sqrt{\frac{\sum_{i \in \{i: T_i=0\}}
+        (X_i - \mu_{X|T=0})^2}{n_0-1} }.$$
+  \item balance statistics of the original data (before matching),
+    which compare treated and control covariate distributions. If {\tt
+      standardize = FALSE}, balance measures will be presented on the
+    original scale. Specifically, mean differences (\texttt{Mean
+      Diff.}) as well as the median, mean, and maximum value of
+    differences in empirical quantile functions for each covariate
+    will be given (\texttt{eQQ Med}, \texttt{eQQ Mean}, and
+    \texttt{eQQ Max}, respectively). If {\tt standardize = TRUE}, the
+    balance measures will be standardized.  Standardized mean
+    differences (\texttt{Std.\ Mean Diff.}), defined as
+    $\frac{\mu_{X|T=1} - \mu_{X|T=0}}{s_{x|T=1}}$, as well as the
+    median, mean, and maximum value of differences in empirical
+    cumulative distribution functions for each covariate will be given
+    (\texttt{eCDF Med}, \texttt{eCDF Mean}, and \texttt{eCDF Max},
+    respectively).
+  \end{itemize}
+  
+\item \texttt{sum.matched}: a data frame which contains variable names
+  down the row names, and summary statistics on only the \emph{matched
+    observations} in each of the columns.  Specifically, the columns
+  in \texttt{sum.matched} contain the following elements:
+%\footnote{The
+%    values output for full matching are slightly different from that
+%    described here; see Section \ref{subsubsec:full} for details}:
+  \begin{itemize}
+  \item weighted means for matched treatment units and matched control units of all covariates
+    $X$ and their interactions, where \texttt{Means Treated}$=
+    \mu_{wX|T=1} = \frac{1}{n_1} \sum_{T=1} w_iX_i$ and \texttt{Means
+      Control}$=\mu_{wX|T=0} = \frac{1}{n_0} \sum_{T=0} w_iX_i$,
+  \item weighted standard deviations in the matched control group for
+    all covariates $X$, where applicable, where \texttt{SD} $= s_{wX} =
+    \sqrt{\frac{1}{n} \sum_{i} (w_iX_i - \overline{X}^*)^2}$, where
+    $\overline{X}^*$ is the weighted mean of $X$ in the matched
+    control group, and
+  \item balance statistics of the matched data (after matching), which
+    compare treated and control covariate distributions. If {\tt
+      standardize = FALSE}, balance measures will be presented on the
+    original scale. Specifically, mean differences (\texttt{Mean
+      Diff.}) as well as the median, mean, and maximum value of
+    differences in empirical quantile functions for each covariate
+    will be given (\texttt{eQQ Med}, \texttt{eQQ Mean}, and
+    \texttt{eQQ Max}, respectively). If {\tt standardize = TRUE}, the
+    balance measures will be standardized.  Standardized mean
+    differences (\texttt{Std.\ Mean Diff.}), defined as
+    $\frac{\mu_{wX|T=1} - \mu_{wX|T=0}}{s_{x|T=1}}$, as well as the
+    median, mean, and maximum value of differences in empirical
+    cumulative distribution functions for each covariate will be given
+    (\texttt{eCDF Med}, \texttt{eCDF Mean}, and \texttt{eCDF Max},
+    respectively).
+  \end{itemize}
+  where $w$ represents the vector of \texttt{weights}.
+  
+\item \texttt{reduction}: the percent reduction in the difference in
+  means achieved in each of the balance measures in \texttt{sum.all}
+  and \texttt{sum.matched}, defined as $100(|a|-|b|)/|a|$, where $a$
+  was the value of the balance measure before matching and $b$ is the
+  value of the balance measure after matching.
+  
+\item \texttt{nn}: the sample sizes in the full and matched samples
+  and the number of discarded units, by treatment and control.
+  
+\item \texttt{q.table}: an array that contains the same information
+  as \texttt{sum.matched} by subclass.
+  
+\item \texttt{qn}: the sample sizes in the full and matched
+  samples and the number of discarded units, by subclass and by
+  treatment and control.
+\item \texttt{match.matrix}: the same object is contained in the
+  output of {\tt matchit()}.
+\end{itemize}
+
+%%% Local Variables: 
+%%% mode: latex
+%%% TeX-master: "matchit"
+%%% End: 
diff --git a/man/help.matchit.Rd b/man/help.matchit.Rd
index a2d1176..9809210 100644
--- a/man/help.matchit.Rd
+++ b/man/help.matchit.Rd
@@ -30,7 +30,7 @@ help.matchit(object)
                                                                                                                                                              
 \author{
   Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
-  <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
+  <\email{king at harvard.edu}>; Elizabeth Stuart<\email{estuart at jhsph.edu}>
 }
 
 \keyword{documentation}
diff --git a/man/lalonde.Rd b/man/lalonde.Rd
index 1df0821..b597909 100644
--- a/man/lalonde.Rd
+++ b/man/lalonde.Rd
@@ -21,11 +21,11 @@ dollars.  "re78" is income in 1978, in U.S. dollars. }
 
 \references{
 	Lalonde, R. (1986). Evaluating the econometric evaluations of training programs 
-	with experimental data. {\it American Economic Review} 76: 604-620. \\
+	with experimental data. American Economic Review 76: 604-620.
 
 	Dehejia, R.H. and Wahba, S. (1999).  Causal Effects in Nonexperimental Studies: 
-	Re-Evaluating the Evaluation  of Training Programs.  {\it Journal of the American 
-	Statistical Association} 94: 1053-1062.
+	Re-Evaluating the Evaluation  of Training Programs.  Journal of the American 
+	Statistical Association 94: 1053-1062.
 }
 \source{\url{http://www.columbia.edu/~rd247/nswdata.html}}
 \keyword{datasets}  
diff --git a/man/match.data.Rd b/man/match.data.Rd
index 6f1b0dd..79910f0 100644
--- a/man/match.data.Rd
+++ b/man/match.data.Rd
@@ -5,7 +5,8 @@
 \title{Output Matched Data Sets}
 
 \description{\code{match.data} outputs matched data sets from
-\code{matchit()}.}
+\code{matchit()}.
+}
 
 \usage{
 match.data <- match.data(object, group="all", distance = "distance",
@@ -13,31 +14,23 @@ weights = "weights", subclass = "subclass")
 }
 
 \arguments{
-
-  \item{object}{The output object from {\tt matchit()}. This is
-    a required input.
-  } 
+  \item{object}{The output object from \code{matchit}. This is
+    a required input.} 
   \item{group}{This argument specifies for which matched group the user
     wants to extract the data. Available options are \code{"all"} (all
     matched units), \code{"treat"} (matched units in the treatment
     group), and \code{"control"} (matched units in the control
-    group). The default is \code{"all"}.
-  }
+    group). The default is \code{"all"}.}
   \item{distance}{This argument specifies the variable name used to
-    store the distance measure. The default is \code{"distance"}.
-  }
+    store the distance measure. The default is \code{"distance"}.}
   \item{weights}{This argument specifies the variable name used to store
-    the resulting weights from matching. The default is
-    \code{"weights"}.
-  }
+    the resulting weights from matching. The default is \code{"weights"}.}
   \item{subclass}{This argument specifies the variable name used to store the
-    subclass indicator. The default is \code{"subclass"}.
-  }
+    subclass indicator. The default is \code{"subclass"}.}
 }
 
 \value{
-
-  \item{Returns a subset of the original data set sent to
+  Returns a subset of the original data set sent to
     \code{matchit()}, with just the matched units.  The data set also
     contains the additional variables \code{distance}, \code{weights},
     and \code{subclass}. The variable \code{distance} gives
@@ -48,7 +41,6 @@ weights = "weights", subclass = "subclass")
     See the \url{http://gking.harvard.edu/matchit/} for the complete
     documentation and type \code{demo(match.data)} at the R prompt to
     see a demonstration of the code.
-  }
 }
 
 \seealso{Please use \code{help.matchit} to access the matchit reference
@@ -56,9 +48,9 @@ weights = "weights", subclass = "subclass")
   \url{http://gking.harvard.edu/matchit}.}
 
 \author{
-  Daniel Ho <\email{daniel.ho at yale.edu}>; Kosuke Imai
-  <\email{kimai at princeton.edu}>; Gary King
-  <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
+  Daniel Ho \email{daniel.ho at yale.edu}; Kosuke Imai
+  \email{kimai at princeton.edu}; Gary King
+  \email{king at harvard.edu}; Elizabeth Stuart \email{estuart at jhsph.edu}
 }
 
 \keyword{methods}
diff --git a/man/matchit.Rd b/man/matchit.Rd
index 2d39262..2e9b0f5 100644
--- a/man/matchit.Rd
+++ b/man/matchit.Rd
@@ -53,11 +53,9 @@ numerically using \code{summary(matchitobject)}.
     works. For example, \code{x1:x2} represents the first order
     interaction term between \code{x1} and \code{x2}, and \code{I(x1^2)}
 represents the square term of \code{x1}. See \code{help(formula)}
-    for details.
-  }
+    for details.}
   \item{data}{This argument specifies the data frame containing the
-    variables called in \code{formula}.
-  }
+    variables called in \code{formula}.}
   \item{method}{This argument specifies a matching method. Currently,
     \code{"exact"} (exact matching), \code{"full"} (full matching),
     \code{"genetic"} (genetic matching), \code{"nearest"} (nearest
@@ -66,83 +64,60 @@ represents the square term of \code{x1}. See \code{help(formula)}
     \code{"nearest"}. Note that within each of these matching methods,
     \emph{MatchIt} offers a variety of options. See
     \url{http://gking.harvard.edu/matchit/docs/Inputs.html} for the
-complete list
-    of supported options.
-  }
+    complete list of supported options.}
   \item{distance}{This argument specifies the method used to estimate the
     distance measure. The default is logistic regression,
     \code{"logit"}. A variety of other methods are available. See
     \url{http://gking.harvard.edu/matchit/docs/All_Matching_Methods.html}
-for the complete list of
-    supported methods.
-  }
+    for the complete list of supported methods.}
   \item{distance.options}{ This optional argument specifies the optional
     arguments that are passed to the model for estimating the distance
-    measure. The input to this argument should be a list.
-  }
+    measure. The input to this argument should be a list.}
   \item{discard}{This argument specifies whether to discard units that
     fall outside some measure of support of the distance score before
     matching, and not allow them to be used at all in the matching
     procedure.  Note that discarding units may change the quantity of
-    interest being estimated.
-
-    \item{none}{(default) discards no units before matching.} 
-    \item{both}{discards all units (treated and control) that are
-      outside the support of the distance measure.  
-    }
-    \item{control}{discards only control units outside the
-      support of the distance measure of the treated units.
-    }
-    \item{treat}{discards only treated units outside the support
-      of the distance measure of the control units.  
-    }
-  }
+    interest being estimated.  The options are: \code{"none"} (default), which discards no units before matching,
+    \code{"both"}, which discards all units (treated and control) that are
+      outside the support of the distance measure,
+    \code{"control"}, which discards only control units outside the
+      support of the distance measure of the treated units, and
+    \code{"treat"}, which discards only treated units outside the support
+      of the distance measure of the control units.}
   \item{reestimate}{This argument specifies whether the model for
     distance measure should be re-estimated after units are
     discarded. The input must be a logical value. The default is
-    \code{FALSE}.
-  }
+    \code{FALSE}.}
   \item{...}{Additional arguments to be passed to a variety of matching
     methods. See \url{http://gking.harvard.edu/matchit/??} for the
-    complete list of options.
-  }
+    complete list of options.}
 }
 
 \value{
-  \item{call}{The original \code{matchit} call.
-  }
+  \item{call}{The original \code{matchit} call.}
   \item{formula}{The formula used to specify the model for
-    estimating the distance measure.
-  }
+    estimating the distance measure.}
   \item{model}{The output of the model used to estimate
     the distance measure.  \code{summary(m.out$model)} will give the
     summary of the model where \code{m.out} is the output object from
-    \code{matchit}.
-  }
+    \code{matchit}.}
   \item{match.matrix}{An \eqn{n_1} by \code{ratio} matrix
-    where\cr\cr
-    the row names, which can be obtained through
+    where the row names, which can be obtained through
     \code{row.names(match.matrix)}, represent the names of the
     treatment units, which come from the data frame specified in
-    \code{data}.\cr\cr
-    
-    each column stores the name(s) of the control unit(s) matched
+    \code{data}.  Each column stores the name(s) of the control unit(s) matched
     to the treatment unit of that row. For example, when the
     \code{ratio} input for nearest neighbor or optimal matching is
     specified as 3, the three columns of 
     \code{match.matrix} represent the three control units matched to
-    one treatment unit).\cr\cr
-    
-    \code{NA} indicates that the treatment unit was not matched.
-  }   
+    one treatment unit).    
+    \code{NA} indicates that the treatment unit was not matched.}   
   \item{discarded}{A vector of length $n$ that displays
     whether the units were ineligible for matching due to common
     support restrictions.  It equals \code{TRUE} if unit \eqn{i} was
-    discarded, and it is set to \code{FALSE} otherwise.
-  }
+    discarded, and it is set to \code{FALSE} otherwise.}
   \item{distance}{A vector of length \eqn{n} with the estimated
-    distance measure for each unit.
-  }
+    distance measure for each unit.}
   \item{weights}{A vector of length \eqn{n} that provides the
     weights assigned to each unit in the matching process.  Unmatched
     units have weights equal to \code{0}. Matched treated units have
@@ -150,24 +125,18 @@ for the complete list of
     to the number of treatment units to which it was matched, and the sum of
     the control weights is equal to the number of uniquely matched
     control units. See
-\url{http://gking.harvard.edu/matchit/docs/How_Exactly_are.html} for
-more
-    details.
-  }
+    \url{http://gking.harvard.edu/matchit/docs/How_Exactly_are.html} for  
+    more details.}
   \item{subclass}{The subclass index in an ordinal
     scale from 1 to the total number of subclasses as specified in
     \code{subclass} (or the total number of subclasses from full or
-    exact matching).  Unmatched units have \code{NA}.
-  }
+    exact matching).  Unmatched units have \code{NA}.}
   \item{q.cut}{The subclass cut-points that classify the
-    distance measure.
-  }
+    distance measure.}
   \item{treat}{The treatment indicator from
-    \code{data} (the left-hand side of \code{formula}).
-  }
+    \code{data} (the left-hand side of \code{formula}).}
   \item{X}{The covariates used for estimating the
-    distance measure (the right-hand side of \code{formula}).
-  }
+    distance measure (the right-hand side of \code{formula}).}
 }
 
 \seealso{Please use \code{help.matchit} to access the matchit reference
@@ -176,14 +145,15 @@ more
 }
 
 \references{Daniel Ho, Kosuke Imai, Gary King, and Elizabeth Stuart
-  (2004) `Matching as Nonparametric Preprocessing for Improving Parametric
-  Causal Inference,'' preprint available at
-  \url{http://gking.harvard.edu/files/abs/matchp-abs.shtml} }
+  (2007).  Matching as Nonparametric Preprocessing for Reducing Model Dependence in Parametric
+  Causal Inference.  Political Analysis 15(3): 199-236.
+  \url{http://gking.harvard.edu/files/abs/matchp-abs.shtml} 
+}
 
 \author{
-  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
-  <\email{king at harvard.edu}>; Elizabeth
-  Stuart<\email{stuart at stat.harvard.edu}> }
+  Daniel Ho \email{daniel.ho at yale.edu};  Kosuke Imai \email{kimai at princeton.edu}; Gary King
+  \email{king at harvard.edu}; Elizabeth
+  Stuart\email{estuart at jhsph.edu} }
 
 \keyword{environment}
 
diff --git a/man/user.prompt.Rd b/man/user.prompt.Rd
index 277b4fb..d7576df 100644
--- a/man/user.prompt.Rd
+++ b/man/user.prompt.Rd
@@ -15,7 +15,7 @@ user.prompt()
 
 \seealso{\code{readline}}
 
-\author{Olivia Lau <\email{olau at fas.harvard.edu}>
+\author{Olivia Lau \email{olau at fas.harvard.edu}
 }
 
 \examples{

-- 
Alioth's /usr/local/bin/git-commit-notice on /srv/git.debian.org/git/debian-science/packages/r-cran-matchit.git



More information about the debian-science-commits mailing list