[med-svn] [r-cran-brew] 05/07: New upstream version 1.0-6

Andreas Tille tille at debian.org
Thu Oct 19 06:37:31 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-brew.

commit bafb1a661958809285091277f76cc5b326ecbf9b
Author: Andreas Tille <tille at debian.org>
Date:   Thu Oct 19 08:35:59 2017 +0200

    New upstream version 1.0-6
---
 DESCRIPTION                                    |   15 +
 NAMESPACE                                      |    5 +
 R/brew.R                                       |  312 ++
 debian/changelog                               |   12 -
 debian/compat                                  |    1 -
 debian/control                                 |   21 -
 debian/copyright                               |   29 -
 debian/patches/avoid-privacy-breach-logo.patch |   17 -
 debian/patches/series                          |    1 -
 debian/rules                                   |    4 -
 debian/source/format                           |    1 -
 debian/watch                                   |    2 -
 inst/Sweave-test-1-006.eps                     | 3965 ++++++++++++++++++++++++
 inst/Sweave-test-1-006.pdf                     | 3810 +++++++++++++++++++++++
 inst/Sweave-test-1-007.eps                     |  316 ++
 inst/Sweave-test-1-007.pdf                     |  213 ++
 inst/Sweave-test-1.aux                         |    3 +
 inst/Sweave-test-1.dvi                         |  Bin 0 -> 3120 bytes
 inst/Sweave-test-1.log                         |  226 ++
 inst/Sweave-test-1.orig.dvi                    |  Bin 0 -> 3120 bytes
 inst/Sweave-test-1.tex                         |  127 +
 inst/brew-test-1-1.eps                         | 3965 ++++++++++++++++++++++++
 inst/brew-test-1-1.pdf                         | 3810 +++++++++++++++++++++++
 inst/brew-test-1-2.eps                         |  316 ++
 inst/brew-test-1.aux                           |    3 +
 inst/brew-test-1.brew                          |   83 +
 inst/brew-test-1.dvi                           |  Bin 0 -> 3132 bytes
 inst/brew-test-1.log                           |  100 +
 inst/brew-test-1.tex                           |  100 +
 inst/brew-test-2-table.brew                    |    9 +
 inst/brew-test-2.aux                           |    1 +
 inst/brew-test-2.brew                          |   89 +
 inst/brew-test-2.dvi                           |  Bin 0 -> 1572 bytes
 inst/brew-test-2.html                          |  688 ++++
 inst/brew-test-2.log                           |   75 +
 inst/brew-test-2.tex                           |  125 +
 inst/brew-test-3.brew                          |    6 +
 inst/broken.brew                               |    8 +
 inst/catprint.brew                             |   35 +
 inst/example1.brew                             |    9 +
 inst/example2.brew                             |    1 +
 inst/featurefull.brew                          |   14 +
 man/brew.Rd                                    |  116 +
 man/brewCache.rd                               |   81 +
 44 files changed, 18626 insertions(+), 88 deletions(-)

diff --git a/DESCRIPTION b/DESCRIPTION
new file mode 100644
index 0000000..f40aabb
--- /dev/null
+++ b/DESCRIPTION
@@ -0,0 +1,15 @@
+Package: brew
+Type: Package
+Title: Templating Framework for Report Generation
+Version: 1.0-6
+Date: 2010-09-30
+Author: Jeffrey Horner
+Maintainer: Jeffrey Horner <jeffrey.horner at gmail.com>
+Description: brew implements a templating framework for mixing text and
+        R code for report generation. brew template syntax is similar
+        to PHP, Ruby's erb module, Java Server Pages, and Python's psp
+        module.
+License: GPL-2
+Packaged: 2011-04-13 14:36:39 UTC; hornerj
+Repository: CRAN
+Date/Publication: 2011-04-13 15:16:08
diff --git a/NAMESPACE b/NAMESPACE
new file mode 100644
index 0000000..2996467
--- /dev/null
+++ b/NAMESPACE
@@ -0,0 +1,5 @@
+export(setBufLen)
+export(brewCache)
+export(brewCacheOn)
+export(brewCacheOff)
+export(brew)
diff --git a/R/brew.R b/R/brew.R
new file mode 100644
index 0000000..c7d7a75
--- /dev/null
+++ b/R/brew.R
@@ -0,0 +1,312 @@
+#
+#  brew - text templating for R (www.r-project.org)
+#
+#  Copyright (C) 2007 Jeffrey Horner
+#
+#  brew is free software; you can redistribute it and/or modify
+#  it under the terms of the GNU General Public License as published by
+#  the Free Software Foundation; either version 2 of the License, or
+#  (at your option) any later version.
+#
+#  This program is distributed in the hope that it will be useful,
+#  but WITHOUT ANY WARRANTY; without even the implied warranty of
+#  MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
+#  GNU General Public License for more details.
+#
+#  You should have received a copy of the GNU General Public License
+#  along with this program; if not, write to the Free Software
+#  Foundation, Inc., 59 Temple Place, Suite 330, Boston, MA  02111-1307  USA
+
+BRTEXT <- 1
+BRCODE <- 2
+BRCOMMENT <- 3
+BRCATCODE <- 4
+BRTEMPLATE <- 5
+DELIM <- list()
+DELIM[[BRTEXT]] <- c('','')
+DELIM[[BRCODE]] <- c('<%','%>')
+DELIM[[BRCOMMENT]] <- c('<%#','%>')
+DELIM[[BRCATCODE]] <- c('<%=','%>')
+DELIM[[BRTEMPLATE]] <- c('<%%','%%>')
+
+.bufLen <- 0
+.cache <- NULL
+
+# Experimental function for setting the size of internal buffers.
+# There's anecdotal evidence that suggests larger buffer sizes
+# means faster parsing. 
+setBufLen <- function(len=0){
+	.bufLen <<- len
+	invisible(NULL)
+}
+
+brewCache     <- function(envir=NULL) {
+	if (missing(envir)) return(.cache)
+	.cache <<- envir
+	invisible(NULL)
+}
+brewCacheOn  <- function() brewCache(new.env(hash=TRUE,parent=globalenv()))
+brewCacheOff <- function() brewCache(NULL)
+
+`.brew.cached` <- function(output=stdout(),envir=parent.frame()){
+	# Only sink if caller passed an argument
+	sunk <- FALSE
+	if (!missing(output)) {
+		sunk <- TRUE
+		sink(output)
+	}
+
+	text <- get('text')
+	brew.cat <- function(from,to) cat(text[from:to],sep='',collapse='')
+	.prev.brew.cat <- NULL
+	if (exists('.brew.cat',envir=envir)){
+		.prev.brew.cat <- get('.brew.cat',pos=envir)
+	}
+	assign('.brew.cat',brew.cat, envir=envir)
+
+	code <- get('code')
+	ret <- try(eval(code,envir=envir))
+
+	# sink() will warn if trying to end the real stdout diversion
+	if (sunk && unclass(output) != 1) sink()
+
+	if(!is.null(.prev.brew.cat)){
+		assign('.brew.cat',.prev.brew.cat,envir=envir)
+	} else {
+		rm('.brew.cat',envir=envir)
+	}
+
+	invisible(ret)
+}
+
+`brew` <-
+function(file=stdin(),output=stdout(),text=NULL,envir=parent.frame(),run=TRUE,parseCode=TRUE,tplParser=NULL,chdir=FALSE){
+
+	file.mtime <- canCache <- isFile <- closeIcon <- FALSE
+	filekey <- file # we modify file when chdir=TRUE, so keep same cache key
+
+	# Error check input
+	if (is.character(file) && file.exists(file)){
+		isFile <- closeIcon <- TRUE
+		if (chdir || isTRUE(getOption('brew.chdir'))){
+			isURL <- length(grep("^(ftp|http|file)://", file)) > 0L
+			if(isURL)
+				warning("'chdir = TRUE' makes no sense for a URL")
+			if(!isURL && (path <- dirname(file)) != ".") {
+				owd <- getwd()
+				if(is.null(owd))
+					warning("cannot 'chdir' as current directory is unknown")
+				else on.exit(setwd(owd), add=TRUE)
+				setwd(path)
+				file <- basename(file)
+			}
+		}
+
+	} else if (is.character(text) && nchar(text[1]) > 0){
+		closeIcon <- TRUE
+		icon <- textConnection(text[1])
+	} else if (inherits(file,'connection') && summary(file)$"can read" == 'yes') {
+		icon <- file
+	} else {
+		stop('No valid input')
+		return(invisible(NULL))
+	}
+
+	# Error check output
+	if (inherits(output,'connection')){
+		if (summary(output)$"can write" != 'yes')
+			stop('output connection is not writeable')
+	} else if ( !is.character(output) )
+		stop('No valid output')
+
+	# Error check env
+	if (!is.environment(envir)){
+		warning('envir is not a valid environment')
+		return(invisible(NULL))
+	}
+
+	# Can we use the cache
+	if (!is.null(.cache) && isFile && run && is.null(tplParser)){
+		canCache <- TRUE
+		if (exists(filekey,.cache)){
+			file.cache <- get(filekey,.cache)
+			file.mtime <- file.info(file)$mtime
+			if (file.cache$mtime >= file.mtime){
+				brew.cached <- .brew.cached
+				environment(brew.cached) <- file.cache$env
+				if (!missing(output)) {
+					return(brew.cached(output,envir))
+				} else {
+					return(brew.cached(envir=envir))
+				}
+			}
+		}
+	}
+
+	# Not using cache, open input file if needed
+	if (isFile) icon <- file(file,open="rt")
+
+	state <- BRTEXT
+	text <- code <- tpl <- character(.bufLen)
+	textLen <- codeLen <- as.integer(0)
+	textStart <- as.integer(1)
+	line <- ''
+	
+	while(TRUE){
+		if (!nchar(line)){
+			line <- readLines(icon,1)
+		   	if (length(line) != 1) break
+			line <- paste(line,"\n",sep='')
+		}
+		if (state == BRTEXT){
+
+			spl <- strsplit(line,DELIM[[BRCODE]],fixed=TRUE)[[1]]
+
+			# Beginning markup found
+			if (length(spl) > 1){
+
+				if (nchar(spl[1])) {
+					text[textLen+1] <- spl[1]
+					textLen <- textLen + 1
+				}
+				line <- paste(spl[-1],collapse='<%')
+
+				# We know we've found this so far, so go ahead and set up state.
+				state <- BRCODE
+
+				# Now let's search for additional markup.
+				if (regexpr('^=',spl[2]) > 0){
+					state <- BRCATCODE
+					line <- sub('^=','',line)
+				} else if (regexpr('^#',spl[2]) > 0){
+					state <- BRCOMMENT
+				} else if (regexpr('^%',spl[2]) > 0){
+					if (is.null(tplParser)){
+						text[textLen+1] <- '<%'
+						textLen <- textLen + 1
+					}
+					line <- sub('^%','',line)
+					state <- BRTEMPLATE
+					next
+				}
+
+				if (textStart <= textLen) {
+					code[codeLen+1] <- paste('.brew.cat(',textStart,',',textLen,')',sep='')
+					codeLen <- codeLen + 1
+					textStart <- textLen + 1
+				}
+			} else {
+				text[textLen+1] <- line
+				textLen <- textLen + 1
+				line <- ''
+			}
+		} else {
+			if (regexpr("%%>",line,perl=TRUE) > 0){
+				if (state != BRTEMPLATE)
+					stop("Oops! Someone forgot to close a tag. We saw: ",DELIM[[state]][1],' and we need ',DELIM[[state]][2])
+				spl <- strsplit(line,"%%>",fixed=TRUE)[[1]]
+				if (!is.null(tplParser)){
+					tpl[length(tpl)+1] <- spl[1]
+					# call template parser
+					tplBufList <- tplParser(tpl)
+					if (length(tplBufList)){
+						textBegin <- textLen + 1;
+						textEnd <- textBegin + length(tplBufList) - 1
+						textLen <- textEnd
+						text[textBegin:textEnd] <- tplBufList
+					}
+					tpl <- character()
+				} else {
+					text[textLen+1] <- paste(spl[1],'%>',sep='')
+					textLen <- textLen + 1
+				}
+				line <- paste(spl[-1],collapse='%%>')
+				state <- BRTEXT
+				next
+			}
+			if (regexpr("%>",line,perl=TRUE) > 0){
+				spl <- strsplit(line,"%>",fixed=TRUE)[[1]]
+				line <- paste(spl[-1],collapse='%>')
+
+				n <- nchar(spl[1])
+				# test  for '-' immediately preceding %> will strip trailing newline from line
+				if (n > 0) {
+					if (substr(spl[1],n,n) == '-') {
+						line <- substr(line,1,nchar(line)-1)
+						spl[1] <- substr(spl[1],1,n-1)
+					}
+					text[textLen+1] <- spl[1]
+					textLen <- textLen + 1
+				}
+
+				# We've found the end of a brew section, but we only care if the
+				# section is a BRCODE or BRCATCODE. We just implicitly drop BRCOMMENT sections
+				if (state == BRCODE){
+					code[codeLen+1] <- paste(text[textStart:textLen],collapse='')
+					codeLen <- codeLen + 1
+				} else if (state == BRCATCODE){
+					code[codeLen+1] <- paste('cat(',paste(text[textStart:textLen],collapse=''),')',sep='')
+					codeLen <- codeLen + 1
+				}
+				textStart <- textLen + 1
+				state <- BRTEXT
+			} else if (regexpr("<%",line,perl=TRUE) > 0){
+				stop("Oops! Someone forgot to close a tag. We saw: ",DELIM[[state]][1],' and we need ',DELIM[[state]][2])
+			} else {
+				if (state == BRTEMPLATE && !is.null(tplParser))
+					tpl[length(tpl)+1] <- line
+				else {
+					text[textLen+1] <- line
+					textLen <- textLen + 1
+				}
+				line <- ''
+			}
+		}
+	}
+	if (state == BRTEXT){
+		if (textStart <= textLen) {
+			code[codeLen+1] <- paste('.brew.cat(',textStart,',',textLen,')',sep='')
+			codeLen <- codeLen + 1
+			textStart <- textLen + 1
+		}
+	} else {
+		stop("Oops! Someone forgot to close a tag. We saw: ",DELIM[[state]][1],' and we need ',DELIM[[state]][2])
+	}
+
+	if (closeIcon) close(icon)
+
+	if (run){
+
+		brew.env <- new.env(parent=globalenv())
+		assign('text',text,brew.env)
+		assign('code',parse(text=code,srcfile=NULL),brew.env)
+		brew.cached <- .brew.cached
+		environment(brew.cached) <- brew.env
+
+		if (canCache){
+			if (file.mtime == FALSE) file.mtime <- file.info(file)$mtime
+			assign(filekey,list(mtime=file.mtime,env=brew.env),.cache)
+		}
+
+		if (!missing(output)) {
+			return(brew.cached(output,envir))
+		} else {
+			return(brew.cached(envir=envir))
+		}
+	} else if (parseCode){
+		brew.env <- new.env(parent=globalenv())
+		assign('text',text,brew.env)
+		assign('code',parse(text=code,srcfile=NULL),brew.env)
+		brew.cached <- .brew.cached
+		environment(brew.cached) <- brew.env
+		invisible(brew.cached)
+	} else {
+		invisible(list(text=text,code=code))
+	}
+}
+
+.onAttach <- function(library, pkg)
+{
+	unlockBinding('.bufLen',asNamespace('brew'))
+	unlockBinding('.cache',asNamespace('brew'))
+}
diff --git a/debian/changelog b/debian/changelog
deleted file mode 100644
index 6aaff1c..0000000
--- a/debian/changelog
+++ /dev/null
@@ -1,12 +0,0 @@
-r-cran-brew (1.0-6-2) UNRELEASED; urgency=medium
-
-  * Fix Vcs-Browser
-  * cme fix dpkg-control
-
- -- Andreas Tille <tille at debian.org>  Mon, 02 Jan 2017 15:56:58 +0100
-
-r-cran-brew (1.0-6-1) unstable; urgency=low
-
-  * Initial release (Closes: #751954)
-
- -- Andreas Tille <tille at debian.org>  Fri, 13 Jun 2014 22:52:06 +0200
diff --git a/debian/compat b/debian/compat
deleted file mode 100644
index ec63514..0000000
--- a/debian/compat
+++ /dev/null
@@ -1 +0,0 @@
-9
diff --git a/debian/control b/debian/control
deleted file mode 100644
index 55f8c2a..0000000
--- a/debian/control
+++ /dev/null
@@ -1,21 +0,0 @@
-Source: r-cran-brew
-Maintainer: Debian Med Packaging Team <debian-med-packaging at lists.alioth.debian.org>
-Uploaders: Andreas Tille <tille at debian.org>
-Section: gnu-r
-Priority: optional
-Build-Depends: debhelper (>= 9),
-               cdbs,
-               r-base-dev (>= 3.0.0)
-Standards-Version: 3.9.8
-Vcs-Browser: https://anonscm.debian.org/viewvc/debian-med/trunk/packages/R/r-cran-brew/trunk/
-Vcs-Svn: svn://anonscm.debian.org/debian-med/trunk/packages/R/r-cran-brew/trunk/
-Homepage: http://cran.r-project.org/web/packages/brew/
-
-Package: r-cran-brew
-Architecture: any
-Depends: ${shlibs:Depends},
-         ${R:Depends}
-Description: GNU R templating framework for report generation
- The GNU R package brew implements a templating framework for mixing
- text and R code for report generation. brew template syntax is similar
- to PHP, Ruby's erb module, Java Server Pages, and Python's psp module.
diff --git a/debian/copyright b/debian/copyright
deleted file mode 100644
index d08d248..0000000
--- a/debian/copyright
+++ /dev/null
@@ -1,29 +0,0 @@
-Format: http://www.debian.org/doc/packaging-manuals/copyright-format/1.0/
-Upstream-Name: brew
-Upstream-Contact: Jeffrey Horner <jeffrey.horner at gmail.com>
-Source: http://cran.r-project.org/web/packages/brew/
-
-Files: *
-Copyright: 2001-2011 Jeffrey Horner <jeffrey.horner at gmail.com>
-License: GPLv2+
-
-Files: debian/*
-Copyright: 2014 Andreas Tille <tille at debian.org>
-License: GPLv2+
-
-License: GPLv2+
- This program is free software: you can redistribute it and/or modify
- it under the terms of the GNU General Public License as published by
- the Free Software Foundation, either version 2 of the License, or
- (at your option) any later version.
- .
- This program is distributed in the hope that it will be useful,
- but WITHOUT ANY WARRANTY; without even the implied warranty of
- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
- GNU General Public License for more details.
- .
- You should have received a copy of the GNU General Public License
- along with this program.  If not, see <http://www.gnu.org/licenses/>.
- .
- On Debian systems, the complete text of the GNU Public
- License can be found in `/usr/share/common-licenses/GPL'.
diff --git a/debian/patches/avoid-privacy-breach-logo.patch b/debian/patches/avoid-privacy-breach-logo.patch
deleted file mode 100644
index 0f70b66..0000000
--- a/debian/patches/avoid-privacy-breach-logo.patch
+++ /dev/null
@@ -1,17 +0,0 @@
-Author: Andreas Tille <tille at debian.org>
-Last-Update: Fri, 13 Jun 2014 22:52:06 +0200
-Description: Lintian claims potential privacy breach when using
- external images.  Since there is no real need to put the logo on
- this test page it will be removed.
-
---- a/inst/brew-test-2.html
-+++ b/inst/brew-test-2.html
-@@ -21,7 +21,7 @@ hr {background-color: #cccccc; border: 0
- </head>
- <body>
- <a name="Top"> </a>
--<a href="http://www.r-project.org/"><img class="map" alt="R Language Home Page" src="http://www.r-project.org/Rlogo.jpg"/></a>
-+<a href="http://www.r-project.org/">R Language Home Page</a>
- <div class="h">Everything You Wanted To Know About Your R Session</div>
- <div class="map">
- <p>jump to:</p>
diff --git a/debian/patches/series b/debian/patches/series
deleted file mode 100644
index a4ef7bb..0000000
--- a/debian/patches/series
+++ /dev/null
@@ -1 +0,0 @@
-avoid-privacy-breach-logo.patch
diff --git a/debian/rules b/debian/rules
deleted file mode 100755
index d643f96..0000000
--- a/debian/rules
+++ /dev/null
@@ -1,4 +0,0 @@
-#!/usr/bin/make -f
-# 							-*- makefile -*-
-
-include /usr/share/R/debian/r-cran.mk
diff --git a/debian/source/format b/debian/source/format
deleted file mode 100644
index 163aaf8..0000000
--- a/debian/source/format
+++ /dev/null
@@ -1 +0,0 @@
-3.0 (quilt)
diff --git a/debian/watch b/debian/watch
deleted file mode 100644
index 0974a9a..0000000
--- a/debian/watch
+++ /dev/null
@@ -1,2 +0,0 @@
-version=3
-http://cran.r-project.org/src/contrib/brew_([-\d.]*)\.tar\.gz
diff --git a/inst/Sweave-test-1-006.eps b/inst/Sweave-test-1-006.eps
new file mode 100644
index 0000000..a3fdc28
--- /dev/null
+++ b/inst/Sweave-test-1-006.eps
@@ -0,0 +1,3965 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 432 432 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 432 432
+%%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 fill grestore newpath } def
+/p3  { gsave bg 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
+38.02 322.79 109.21 393.98 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 327.54 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+42.77 327.54 104.46 389.23 cl
+/ps 9 def /Font1 findfont 9 s
+0 setgray
+73.61 356.06 (Sepal.Length) .5 0 0 t
+113.96 327.54 175.65 389.23 cl
+109.21 322.79 180.40 393.98 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+113.96 327.54 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+116.25 389.23 m
+47.60 0 l
+o
+np
+116.25 389.23 m
+0 4.75 l
+o
+np
+128.15 389.23 m
+0 4.75 l
+o
+np
+140.05 389.23 m
+0 4.75 l
+o
+np
+151.95 389.23 m
+0 4.75 l
+o
+np
+163.85 389.23 m
+0 4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+116.25 400.64 (2.0) .5 0 0 t
+140.05 400.64 (3.0) .5 0 0 t
+163.85 400.64 (4.0) .5 0 0 t
+113.96 327.54 175.65 389.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+151.95 342.52 1.78 c p1
+140.05 339.35 1.78 c p1
+144.81 336.17 1.78 c p1
+142.43 334.59 1.78 c p1
+154.33 340.93 1.78 c p1
+161.47 347.28 1.78 c p1
+149.57 334.59 1.78 c p1
+149.57 340.93 1.78 c p1
+137.67 331.41 1.78 c p1
+142.43 339.35 1.78 c p1
+156.71 347.28 1.78 c p1
+149.57 337.76 1.78 c p1
+140.05 337.76 1.78 c p1
+140.05 329.83 1.78 c p1
+163.85 353.63 1.78 c p1
+173.37 352.04 1.78 c p1
+161.47 347.28 1.78 c p1
+151.95 342.52 1.78 c p1
+159.09 352.04 1.78 c p1
+159.09 342.52 1.78 c p1
+149.57 347.28 1.78 c p1
+156.71 342.52 1.78 c p1
+154.33 334.59 1.78 c p1
+147.19 342.52 1.78 c p1
+149.57 337.76 1.78 c p1
+140.05 340.93 1.78 c p1
+149.57 340.93 1.78 c p1
+151.95 344.11 1.78 c p1
+149.57 344.11 1.78 c p1
+144.81 336.17 1.78 c p1
+142.43 337.76 1.78 c p1
+149.57 347.28 1.78 c p1
+166.23 344.11 1.78 c p1
+168.61 348.87 1.78 c p1
+142.43 339.35 1.78 c p1
+144.81 340.93 1.78 c p1
+151.95 348.87 1.78 c p1
+154.33 339.35 1.78 c p1
+140.05 331.41 1.78 c p1
+149.57 342.52 1.78 c p1
+151.95 340.93 1.78 c p1
+123.39 333.00 1.78 c p1
+144.81 331.41 1.78 c p1
+151.95 340.93 1.78 c p1
+159.09 342.52 1.78 c p1
+140.05 337.76 1.78 c p1
+159.09 342.52 1.78 c p1
+144.81 334.59 1.78 c p1
+156.71 345.69 1.78 c p1
+147.19 340.93 1.78 c p1
+144.81 372.67 1.78 c p1
+144.81 363.15 1.78 c p1
+142.43 371.08 1.78 c p1
+123.39 348.87 1.78 c p1
+135.29 364.73 1.78 c p1
+135.29 352.04 1.78 c p1
+147.19 361.56 1.78 c p1
+125.77 339.35 1.78 c p1
+137.67 366.32 1.78 c p1
+132.91 344.11 1.78 c p1
+116.25 340.93 1.78 c p1
+140.05 355.21 1.78 c p1
+121.01 356.80 1.78 c p1
+137.67 358.39 1.78 c p1
+137.67 350.45 1.78 c p1
+142.43 367.91 1.78 c p1
+140.05 350.45 1.78 c p1
+132.91 353.63 1.78 c p1
+121.01 359.97 1.78 c p1
+128.15 350.45 1.78 c p1
+144.81 355.21 1.78 c p1
+135.29 358.39 1.78 c p1
+128.15 361.56 1.78 c p1
+135.29 358.39 1.78 c p1
+137.67 363.15 1.78 c p1
+140.05 366.32 1.78 c p1
+135.29 369.49 1.78 c p1
+140.05 367.91 1.78 c p1
+137.67 356.80 1.78 c p1
+130.53 352.04 1.78 c p1
+125.77 348.87 1.78 c p1
+125.77 348.87 1.78 c p1
+132.91 353.63 1.78 c p1
+132.91 356.80 1.78 c p1
+140.05 347.28 1.78 c p1
+149.57 356.80 1.78 c p1
+142.43 367.91 1.78 c p1
+123.39 361.56 1.78 c p1
+140.05 350.45 1.78 c p1
+128.15 348.87 1.78 c p1
+130.53 348.87 1.78 c p1
+140.05 358.39 1.78 c p1
+130.53 353.63 1.78 c p1
+123.39 340.93 1.78 c p1
+132.91 350.45 1.78 c p1
+140.05 352.04 1.78 c p1
+137.67 352.04 1.78 c p1
+137.67 359.97 1.78 c p1
+128.15 342.52 1.78 c p1
+135.29 352.04 1.78 c p1
+147.19 361.56 1.78 c p1
+132.91 353.63 1.78 c p1
+140.05 374.25 1.78 c p1
+137.67 361.56 1.78 c p1
+140.05 364.73 1.78 c p1
+140.05 382.19 1.78 c p1
+128.15 339.35 1.78 c p1
+137.67 377.43 1.78 c p1
+128.15 367.91 1.78 c p1
+154.33 375.84 1.78 c p1
+144.81 364.73 1.78 c p1
+132.91 363.15 1.78 c p1
+140.05 369.49 1.78 c p1
+128.15 352.04 1.78 c p1
+135.29 353.63 1.78 c p1
+144.81 363.15 1.78 c p1
+140.05 364.73 1.78 c p1
+159.09 383.77 1.78 c p1
+130.53 383.77 1.78 c p1
+121.01 356.80 1.78 c p1
+144.81 371.08 1.78 c p1
+135.29 350.45 1.78 c p1
+135.29 383.77 1.78 c p1
+132.91 361.56 1.78 c p1
+147.19 367.91 1.78 c p1
+144.81 375.84 1.78 c p1
+135.29 359.97 1.78 c p1
+140.05 358.39 1.78 c p1
+135.29 363.15 1.78 c p1
+140.05 375.84 1.78 c p1
+135.29 379.01 1.78 c p1
+159.09 386.95 1.78 c p1
+135.29 363.15 1.78 c p1
+135.29 361.56 1.78 c p1
+130.53 358.39 1.78 c p1
+140.05 383.77 1.78 c p1
+149.57 361.56 1.78 c p1
+142.43 363.15 1.78 c p1
+140.05 356.80 1.78 c p1
+142.43 371.08 1.78 c p1
+142.43 367.91 1.78 c p1
+142.43 371.08 1.78 c p1
+132.91 353.63 1.78 c p1
+144.81 369.49 1.78 c p1
+147.19 367.91 1.78 c p1
+140.05 367.91 1.78 c p1
+128.15 361.56 1.78 c p1
+140.05 364.73 1.78 c p1
+149.57 359.97 1.78 c p1
+140.05 355.21 1.78 c p1
+185.16 327.54 246.84 389.23 cl
+180.40 322.79 251.60 393.98 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+185.16 327.54 m
+61.68 0 l
+0 61.69 l
+-61.68 0 l
+0 -61.69 l
+o
+185.16 327.54 246.84 389.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+191.31 342.52 1.78 c p1
+191.31 339.35 1.78 c p1
+190.34 336.17 1.78 c p1
+192.28 334.59 1.78 c p1
+191.31 340.93 1.78 c p1
+194.22 347.28 1.78 c p1
+191.31 334.59 1.78 c p1
+192.28 340.93 1.78 c p1
+191.31 331.41 1.78 c p1
+192.28 339.35 1.78 c p1
+192.28 347.28 1.78 c p1
+193.25 337.76 1.78 c p1
+191.31 337.76 1.78 c p1
+188.41 329.83 1.78 c p1
+189.38 353.63 1.78 c p1
+192.28 352.04 1.78 c p1
+190.34 347.28 1.78 c p1
+191.31 342.52 1.78 c p1
+194.22 352.04 1.78 c p1
+192.28 342.52 1.78 c p1
+194.22 347.28 1.78 c p1
+192.28 342.52 1.78 c p1
+187.44 334.59 1.78 c p1
+194.22 342.52 1.78 c p1
+196.15 337.76 1.78 c p1
+193.25 340.93 1.78 c p1
+193.25 340.93 1.78 c p1
+192.28 344.11 1.78 c p1
+191.31 344.11 1.78 c p1
+193.25 336.17 1.78 c p1
+193.25 337.76 1.78 c p1
+192.28 347.28 1.78 c p1
+192.28 344.11 1.78 c p1
+191.31 348.87 1.78 c p1
+192.28 339.35 1.78 c p1
+189.38 340.93 1.78 c p1
+190.34 348.87 1.78 c p1
+191.31 339.35 1.78 c p1
+190.34 331.41 1.78 c p1
+192.28 342.52 1.78 c p1
+190.34 340.93 1.78 c p1
+190.34 333.00 1.78 c p1
+190.34 331.41 1.78 c p1
+193.25 340.93 1.78 c p1
+196.15 342.52 1.78 c p1
+191.31 337.76 1.78 c p1
+193.25 342.52 1.78 c p1
+191.31 334.59 1.78 c p1
+192.28 345.69 1.78 c p1
+191.31 340.93 1.78 c p1
+223.26 372.67 1.78 c p1
+221.32 363.15 1.78 c p1
+225.20 371.08 1.78 c p1
+216.48 348.87 1.78 c p1
+222.29 364.73 1.78 c p1
+221.32 352.04 1.78 c p1
+223.26 361.56 1.78 c p1
+209.71 339.35 1.78 c p1
+222.29 366.32 1.78 c p1
+215.52 344.11 1.78 c p1
+211.64 340.93 1.78 c p1
+218.42 355.21 1.78 c p1
+216.48 356.80 1.78 c p1
+223.26 358.39 1.78 c p1
+212.61 350.45 1.78 c p1
+220.36 367.91 1.78 c p1
+221.32 350.45 1.78 c p1
+217.45 353.63 1.78 c p1
+221.32 359.97 1.78 c p1
+215.52 350.45 1.78 c p1
+224.23 355.21 1.78 c p1
+216.48 358.39 1.78 c p1
+225.20 361.56 1.78 c p1
+223.26 358.39 1.78 c p1
+219.39 363.15 1.78 c p1
+220.36 366.32 1.78 c p1
+224.23 369.49 1.78 c p1
+226.17 367.91 1.78 c p1
+221.32 356.80 1.78 c p1
+211.64 352.04 1.78 c p1
+214.55 348.87 1.78 c p1
+213.58 348.87 1.78 c p1
+215.52 353.63 1.78 c p1
+227.13 356.80 1.78 c p1
+221.32 347.28 1.78 c p1
+221.32 356.80 1.78 c p1
+223.26 367.91 1.78 c p1
+220.36 361.56 1.78 c p1
+217.45 350.45 1.78 c p1
+216.48 348.87 1.78 c p1
+220.36 348.87 1.78 c p1
+222.29 358.39 1.78 c p1
+216.48 353.63 1.78 c p1
+209.71 340.93 1.78 c p1
+218.42 350.45 1.78 c p1
+218.42 352.04 1.78 c p1
+218.42 352.04 1.78 c p1
+219.39 359.97 1.78 c p1
+206.80 342.52 1.78 c p1
+217.45 352.04 1.78 c p1
+235.85 361.56 1.78 c p1
+227.13 353.63 1.78 c p1
+234.88 374.25 1.78 c p1
+231.97 361.56 1.78 c p1
+233.91 364.73 1.78 c p1
+241.66 382.19 1.78 c p1
+221.32 339.35 1.78 c p1
+238.75 377.43 1.78 c p1
+233.91 367.91 1.78 c p1
+236.81 375.84 1.78 c p1
+227.13 364.73 1.78 c p1
+229.07 363.15 1.78 c p1
+231.01 369.49 1.78 c p1
+226.17 352.04 1.78 c p1
+227.13 353.63 1.78 c p1
+229.07 363.15 1.78 c p1
+231.01 364.73 1.78 c p1
+242.62 383.77 1.78 c p1
+244.56 383.77 1.78 c p1
+226.17 356.80 1.78 c p1
+232.94 371.08 1.78 c p1
+225.20 350.45 1.78 c p1
+242.62 383.77 1.78 c p1
+225.20 361.56 1.78 c p1
+232.94 367.91 1.78 c p1
+235.85 375.84 1.78 c p1
+224.23 359.97 1.78 c p1
+225.20 358.39 1.78 c p1
+231.97 363.15 1.78 c p1
+233.91 375.84 1.78 c p1
+236.81 379.01 1.78 c p1
+239.72 386.95 1.78 c p1
+231.97 363.15 1.78 c p1
+227.13 361.56 1.78 c p1
+231.97 358.39 1.78 c p1
+236.81 383.77 1.78 c p1
+231.97 361.56 1.78 c p1
+231.01 363.15 1.78 c p1
+224.23 356.80 1.78 c p1
+230.04 371.08 1.78 c p1
+231.97 367.91 1.78 c p1
+227.13 371.08 1.78 c p1
+227.13 353.63 1.78 c p1
+234.88 369.49 1.78 c p1
+232.94 367.91 1.78 c p1
+228.10 367.91 1.78 c p1
+226.17 361.56 1.78 c p1
+228.10 364.73 1.78 c p1
+230.04 359.97 1.78 c p1
+227.13 355.21 1.78 c p1
+256.35 327.54 318.04 389.23 cl
+251.60 322.79 322.79 393.98 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+256.35 327.54 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+268.15 389.23 m
+47.60 0 l
+o
+np
+268.15 389.23 m
+0 4.75 l
+o
+np
+280.05 389.23 m
+0 4.75 l
+o
+np
+291.95 389.23 m
+0 4.75 l
+o
+np
+303.85 389.23 m
+0 4.75 l
+o
+np
+315.75 389.23 m
+0 4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+268.15 400.64 (0.5) .5 0 0 t
+291.95 400.64 (1.5) .5 0 0 t
+315.75 400.64 (2.5) .5 0 0 t
+256.35 327.54 318.04 389.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+261.01 342.52 1.78 c p1
+261.01 339.35 1.78 c p1
+261.01 336.17 1.78 c p1
+261.01 334.59 1.78 c p1
+261.01 340.93 1.78 c p1
+265.77 347.28 1.78 c p1
+263.39 334.59 1.78 c p1
+261.01 340.93 1.78 c p1
+261.01 331.41 1.78 c p1
+258.63 339.35 1.78 c p1
+261.01 347.28 1.78 c p1
+261.01 337.76 1.78 c p1
+258.63 337.76 1.78 c p1
+258.63 329.83 1.78 c p1
+261.01 353.63 1.78 c p1
+265.77 352.04 1.78 c p1
+265.77 347.28 1.78 c p1
+263.39 342.52 1.78 c p1
+263.39 352.04 1.78 c p1
+263.39 342.52 1.78 c p1
+261.01 347.28 1.78 c p1
+265.77 342.52 1.78 c p1
+261.01 334.59 1.78 c p1
+268.15 342.52 1.78 c p1
+261.01 337.76 1.78 c p1
+261.01 340.93 1.78 c p1
+265.77 340.93 1.78 c p1
+261.01 344.11 1.78 c p1
+261.01 344.11 1.78 c p1
+261.01 336.17 1.78 c p1
+261.01 337.76 1.78 c p1
+265.77 347.28 1.78 c p1
+258.63 344.11 1.78 c p1
+261.01 348.87 1.78 c p1
+261.01 339.35 1.78 c p1
+261.01 340.93 1.78 c p1
+261.01 348.87 1.78 c p1
+258.63 339.35 1.78 c p1
+261.01 331.41 1.78 c p1
+261.01 342.52 1.78 c p1
+263.39 340.93 1.78 c p1
+263.39 333.00 1.78 c p1
+261.01 331.41 1.78 c p1
+270.53 340.93 1.78 c p1
+265.77 342.52 1.78 c p1
+263.39 337.76 1.78 c p1
+261.01 342.52 1.78 c p1
+261.01 334.59 1.78 c p1
+261.01 345.69 1.78 c p1
+261.01 340.93 1.78 c p1
+289.57 372.67 1.78 c p1
+291.95 363.15 1.78 c p1
+291.95 371.08 1.78 c p1
+287.19 348.87 1.78 c p1
+291.95 364.73 1.78 c p1
+287.19 352.04 1.78 c p1
+294.33 361.56 1.78 c p1
+280.05 339.35 1.78 c p1
+287.19 366.32 1.78 c p1
+289.57 344.11 1.78 c p1
+280.05 340.93 1.78 c p1
+291.95 355.21 1.78 c p1
+280.05 356.80 1.78 c p1
+289.57 358.39 1.78 c p1
+287.19 350.45 1.78 c p1
+289.57 367.91 1.78 c p1
+291.95 350.45 1.78 c p1
+280.05 353.63 1.78 c p1
+291.95 359.97 1.78 c p1
+282.43 350.45 1.78 c p1
+299.09 355.21 1.78 c p1
+287.19 358.39 1.78 c p1
+291.95 361.56 1.78 c p1
+284.81 358.39 1.78 c p1
+287.19 363.15 1.78 c p1
+289.57 366.32 1.78 c p1
+289.57 369.49 1.78 c p1
+296.71 367.91 1.78 c p1
+291.95 356.80 1.78 c p1
+280.05 352.04 1.78 c p1
+282.43 348.87 1.78 c p1
+280.05 348.87 1.78 c p1
+284.81 353.63 1.78 c p1
+294.33 356.80 1.78 c p1
+291.95 347.28 1.78 c p1
+294.33 356.80 1.78 c p1
+291.95 367.91 1.78 c p1
+287.19 361.56 1.78 c p1
+287.19 350.45 1.78 c p1
+287.19 348.87 1.78 c p1
+284.81 348.87 1.78 c p1
+289.57 358.39 1.78 c p1
+284.81 353.63 1.78 c p1
+280.05 340.93 1.78 c p1
+287.19 350.45 1.78 c p1
+284.81 352.04 1.78 c p1
+287.19 352.04 1.78 c p1
+287.19 359.97 1.78 c p1
+282.43 342.52 1.78 c p1
+287.19 352.04 1.78 c p1
+315.75 361.56 1.78 c p1
+301.47 353.63 1.78 c p1
+306.23 374.25 1.78 c p1
+299.09 361.56 1.78 c p1
+308.61 364.73 1.78 c p1
+306.23 382.19 1.78 c p1
+296.71 339.35 1.78 c p1
+299.09 377.43 1.78 c p1
+299.09 367.91 1.78 c p1
+315.75 375.84 1.78 c p1
+303.85 364.73 1.78 c p1
+301.47 363.15 1.78 c p1
+306.23 369.49 1.78 c p1
+303.85 352.04 1.78 c p1
+313.37 353.63 1.78 c p1
+310.99 363.15 1.78 c p1
+299.09 364.73 1.78 c p1
+308.61 383.77 1.78 c p1
+310.99 383.77 1.78 c p1
+291.95 356.80 1.78 c p1
+310.99 371.08 1.78 c p1
+303.85 350.45 1.78 c p1
+303.85 383.77 1.78 c p1
+299.09 361.56 1.78 c p1
+306.23 367.91 1.78 c p1
+299.09 375.84 1.78 c p1
+299.09 359.97 1.78 c p1
+299.09 358.39 1.78 c p1
+306.23 363.15 1.78 c p1
+294.33 375.84 1.78 c p1
+301.47 379.01 1.78 c p1
+303.85 386.95 1.78 c p1
+308.61 363.15 1.78 c p1
+291.95 361.56 1.78 c p1
+289.57 358.39 1.78 c p1
+310.99 383.77 1.78 c p1
+313.37 361.56 1.78 c p1
+299.09 363.15 1.78 c p1
+299.09 356.80 1.78 c p1
+306.23 371.08 1.78 c p1
+313.37 367.91 1.78 c p1
+310.99 371.08 1.78 c p1
+301.47 353.63 1.78 c p1
+310.99 369.49 1.78 c p1
+315.75 367.91 1.78 c p1
+310.99 367.91 1.78 c p1
+301.47 361.56 1.78 c p1
+303.85 364.73 1.78 c p1
+310.99 359.97 1.78 c p1
+299.09 355.21 1.78 c p1
+327.54 327.54 389.23 389.23 cl
+322.79 322.79 393.98 393.98 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+327.54 327.54 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+389.23 333.00 m
+0 55.53 l
+o
+np
+389.23 333.00 m
+4.75 0 l
+o
+np
+389.23 340.93 m
+4.75 0 l
+o
+np
+389.23 348.87 m
+4.75 0 l
+o
+np
+389.23 356.80 m
+4.75 0 l
+o
+np
+389.23 364.73 m
+4.75 0 l
+o
+np
+389.23 372.67 m
+4.75 0 l
+o
+np
+389.23 380.60 m
+4.75 0 l
+o
+np
+389.23 388.53 m
+4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+406.34 333.00 (4.5) .5 0 90 t
+406.34 356.80 (6.0) .5 0 90 t
+406.34 380.60 (7.5) .5 0 90 t
+327.54 327.54 389.23 389.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+329.83 342.52 1.78 c p1
+329.83 339.35 1.78 c p1
+329.83 336.17 1.78 c p1
+329.83 334.59 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 347.28 1.78 c p1
+329.83 334.59 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 331.41 1.78 c p1
+329.83 339.35 1.78 c p1
+329.83 347.28 1.78 c p1
+329.83 337.76 1.78 c p1
+329.83 337.76 1.78 c p1
+329.83 329.83 1.78 c p1
+329.83 353.63 1.78 c p1
+329.83 352.04 1.78 c p1
+329.83 347.28 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 352.04 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 347.28 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 334.59 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 337.76 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 344.11 1.78 c p1
+329.83 344.11 1.78 c p1
+329.83 336.17 1.78 c p1
+329.83 337.76 1.78 c p1
+329.83 347.28 1.78 c p1
+329.83 344.11 1.78 c p1
+329.83 348.87 1.78 c p1
+329.83 339.35 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 348.87 1.78 c p1
+329.83 339.35 1.78 c p1
+329.83 331.41 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 333.00 1.78 c p1
+329.83 331.41 1.78 c p1
+329.83 340.93 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 337.76 1.78 c p1
+329.83 342.52 1.78 c p1
+329.83 334.59 1.78 c p1
+329.83 345.69 1.78 c p1
+329.83 340.93 1.78 c p1
+358.39 372.67 1.78 c p1
+358.39 363.15 1.78 c p1
+358.39 371.08 1.78 c p1
+358.39 348.87 1.78 c p1
+358.39 364.73 1.78 c p1
+358.39 352.04 1.78 c p1
+358.39 361.56 1.78 c p1
+358.39 339.35 1.78 c p1
+358.39 366.32 1.78 c p1
+358.39 344.11 1.78 c p1
+358.39 340.93 1.78 c p1
+358.39 355.21 1.78 c p1
+358.39 356.80 1.78 c p1
+358.39 358.39 1.78 c p1
+358.39 350.45 1.78 c p1
+358.39 367.91 1.78 c p1
+358.39 350.45 1.78 c p1
+358.39 353.63 1.78 c p1
+358.39 359.97 1.78 c p1
+358.39 350.45 1.78 c p1
+358.39 355.21 1.78 c p1
+358.39 358.39 1.78 c p1
+358.39 361.56 1.78 c p1
+358.39 358.39 1.78 c p1
+358.39 363.15 1.78 c p1
+358.39 366.32 1.78 c p1
+358.39 369.49 1.78 c p1
+358.39 367.91 1.78 c p1
+358.39 356.80 1.78 c p1
+358.39 352.04 1.78 c p1
+358.39 348.87 1.78 c p1
+358.39 348.87 1.78 c p1
+358.39 353.63 1.78 c p1
+358.39 356.80 1.78 c p1
+358.39 347.28 1.78 c p1
+358.39 356.80 1.78 c p1
+358.39 367.91 1.78 c p1
+358.39 361.56 1.78 c p1
+358.39 350.45 1.78 c p1
+358.39 348.87 1.78 c p1
+358.39 348.87 1.78 c p1
+358.39 358.39 1.78 c p1
+358.39 353.63 1.78 c p1
+358.39 340.93 1.78 c p1
+358.39 350.45 1.78 c p1
+358.39 352.04 1.78 c p1
+358.39 352.04 1.78 c p1
+358.39 359.97 1.78 c p1
+358.39 342.52 1.78 c p1
+358.39 352.04 1.78 c p1
+386.95 361.56 1.78 c p1
+386.95 353.63 1.78 c p1
+386.95 374.25 1.78 c p1
+386.95 361.56 1.78 c p1
+386.95 364.73 1.78 c p1
+386.95 382.19 1.78 c p1
+386.95 339.35 1.78 c p1
+386.95 377.43 1.78 c p1
+386.95 367.91 1.78 c p1
+386.95 375.84 1.78 c p1
+386.95 364.73 1.78 c p1
+386.95 363.15 1.78 c p1
+386.95 369.49 1.78 c p1
+386.95 352.04 1.78 c p1
+386.95 353.63 1.78 c p1
+386.95 363.15 1.78 c p1
+386.95 364.73 1.78 c p1
+386.95 383.77 1.78 c p1
+386.95 383.77 1.78 c p1
+386.95 356.80 1.78 c p1
+386.95 371.08 1.78 c p1
+386.95 350.45 1.78 c p1
+386.95 383.77 1.78 c p1
+386.95 361.56 1.78 c p1
+386.95 367.91 1.78 c p1
+386.95 375.84 1.78 c p1
+386.95 359.97 1.78 c p1
+386.95 358.39 1.78 c p1
+386.95 363.15 1.78 c p1
+386.95 375.84 1.78 c p1
+386.95 379.01 1.78 c p1
+386.95 386.95 1.78 c p1
+386.95 363.15 1.78 c p1
+386.95 361.56 1.78 c p1
+386.95 358.39 1.78 c p1
+386.95 383.77 1.78 c p1
+386.95 361.56 1.78 c p1
+386.95 363.15 1.78 c p1
+386.95 356.80 1.78 c p1
+386.95 371.08 1.78 c p1
+386.95 367.91 1.78 c p1
+386.95 371.08 1.78 c p1
+386.95 353.63 1.78 c p1
+386.95 369.49 1.78 c p1
+386.95 367.91 1.78 c p1
+386.95 367.91 1.78 c p1
+386.95 361.56 1.78 c p1
+386.95 364.73 1.78 c p1
+386.95 359.97 1.78 c p1
+386.95 355.21 1.78 c p1
+42.77 256.35 104.46 318.04 cl
+38.02 251.60 109.21 322.79 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 256.35 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+42.77 258.63 m
+0 47.60 l
+o
+np
+42.77 258.63 m
+-4.75 0 l
+o
+np
+42.77 270.53 m
+-4.75 0 l
+o
+np
+42.77 282.43 m
+-4.75 0 l
+o
+np
+42.77 294.33 m
+-4.75 0 l
+o
+np
+42.77 306.23 m
+-4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+31.36 258.63 (2.0) .5 0 90 t
+31.36 282.43 (3.0) .5 0 90 t
+31.36 306.23 (4.0) .5 0 90 t
+42.77 256.35 104.46 318.04 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+57.75 294.33 1.78 c p1
+54.57 282.43 1.78 c p1
+51.40 287.19 1.78 c p1
+49.81 284.81 1.78 c p1
+56.16 296.71 1.78 c p1
+62.51 303.85 1.78 c p1
+49.81 291.95 1.78 c p1
+56.16 291.95 1.78 c p1
+46.64 280.05 1.78 c p1
+54.57 284.81 1.78 c p1
+62.51 299.09 1.78 c p1
+52.99 291.95 1.78 c p1
+52.99 282.43 1.78 c p1
+45.05 282.43 1.78 c p1
+68.85 306.23 1.78 c p1
+67.27 315.75 1.78 c p1
+62.51 303.85 1.78 c p1
+57.75 294.33 1.78 c p1
+67.27 301.47 1.78 c p1
+57.75 301.47 1.78 c p1
+62.51 291.95 1.78 c p1
+57.75 299.09 1.78 c p1
+49.81 296.71 1.78 c p1
+57.75 289.57 1.78 c p1
+52.99 291.95 1.78 c p1
+56.16 282.43 1.78 c p1
+56.16 291.95 1.78 c p1
+59.33 294.33 1.78 c p1
+59.33 291.95 1.78 c p1
+51.40 287.19 1.78 c p1
+52.99 284.81 1.78 c p1
+62.51 291.95 1.78 c p1
+59.33 308.61 1.78 c p1
+64.09 310.99 1.78 c p1
+54.57 284.81 1.78 c p1
+56.16 287.19 1.78 c p1
+64.09 294.33 1.78 c p1
+54.57 296.71 1.78 c p1
+46.64 282.43 1.78 c p1
+57.75 291.95 1.78 c p1
+56.16 294.33 1.78 c p1
+48.23 265.77 1.78 c p1
+46.64 287.19 1.78 c p1
+56.16 294.33 1.78 c p1
+57.75 301.47 1.78 c p1
+52.99 282.43 1.78 c p1
+57.75 301.47 1.78 c p1
+49.81 287.19 1.78 c p1
+60.92 299.09 1.78 c p1
+56.16 289.57 1.78 c p1
+87.89 287.19 1.78 c p1
+78.37 287.19 1.78 c p1
+86.31 284.81 1.78 c p1
+64.09 265.77 1.78 c p1
+79.96 277.67 1.78 c p1
+67.27 277.67 1.78 c p1
+76.79 289.57 1.78 c p1
+54.57 268.15 1.78 c p1
+81.55 280.05 1.78 c p1
+59.33 275.29 1.78 c p1
+56.16 258.63 1.78 c p1
+70.44 282.43 1.78 c p1
+72.03 263.39 1.78 c p1
+73.61 280.05 1.78 c p1
+65.68 280.05 1.78 c p1
+83.13 284.81 1.78 c p1
+65.68 282.43 1.78 c p1
+68.85 275.29 1.78 c p1
+75.20 263.39 1.78 c p1
+65.68 270.53 1.78 c p1
+70.44 287.19 1.78 c p1
+73.61 277.67 1.78 c p1
+76.79 270.53 1.78 c p1
+73.61 277.67 1.78 c p1
+78.37 280.05 1.78 c p1
+81.55 282.43 1.78 c p1
+84.72 277.67 1.78 c p1
+83.13 282.43 1.78 c p1
+72.03 280.05 1.78 c p1
+67.27 272.91 1.78 c p1
+64.09 268.15 1.78 c p1
+64.09 268.15 1.78 c p1
+68.85 275.29 1.78 c p1
+72.03 275.29 1.78 c p1
+62.51 282.43 1.78 c p1
+72.03 291.95 1.78 c p1
+83.13 284.81 1.78 c p1
+76.79 265.77 1.78 c p1
+65.68 282.43 1.78 c p1
+64.09 270.53 1.78 c p1
+64.09 272.91 1.78 c p1
+73.61 282.43 1.78 c p1
+68.85 272.91 1.78 c p1
+56.16 265.77 1.78 c p1
+65.68 275.29 1.78 c p1
+67.27 282.43 1.78 c p1
+67.27 280.05 1.78 c p1
+75.20 280.05 1.78 c p1
+57.75 270.53 1.78 c p1
+67.27 277.67 1.78 c p1
+76.79 289.57 1.78 c p1
+68.85 275.29 1.78 c p1
+89.48 282.43 1.78 c p1
+76.79 280.05 1.78 c p1
+79.96 282.43 1.78 c p1
+97.41 282.43 1.78 c p1
+54.57 270.53 1.78 c p1
+92.65 280.05 1.78 c p1
+83.13 270.53 1.78 c p1
+91.07 296.71 1.78 c p1
+79.96 287.19 1.78 c p1
+78.37 275.29 1.78 c p1
+84.72 282.43 1.78 c p1
+67.27 270.53 1.78 c p1
+68.85 277.67 1.78 c p1
+78.37 287.19 1.78 c p1
+79.96 282.43 1.78 c p1
+99.00 301.47 1.78 c p1
+99.00 272.91 1.78 c p1
+72.03 263.39 1.78 c p1
+86.31 287.19 1.78 c p1
+65.68 277.67 1.78 c p1
+99.00 277.67 1.78 c p1
+76.79 275.29 1.78 c p1
+83.13 289.57 1.78 c p1
+91.07 287.19 1.78 c p1
+75.20 277.67 1.78 c p1
+73.61 282.43 1.78 c p1
+78.37 277.67 1.78 c p1
+91.07 282.43 1.78 c p1
+94.24 277.67 1.78 c p1
+102.17 301.47 1.78 c p1
+78.37 277.67 1.78 c p1
+76.79 277.67 1.78 c p1
+73.61 272.91 1.78 c p1
+99.00 282.43 1.78 c p1
+76.79 291.95 1.78 c p1
+78.37 284.81 1.78 c p1
+72.03 282.43 1.78 c p1
+86.31 284.81 1.78 c p1
+83.13 284.81 1.78 c p1
+86.31 284.81 1.78 c p1
+68.85 275.29 1.78 c p1
+84.72 287.19 1.78 c p1
+83.13 289.57 1.78 c p1
+83.13 282.43 1.78 c p1
+76.79 270.53 1.78 c p1
+79.96 282.43 1.78 c p1
+75.20 291.95 1.78 c p1
+70.44 282.43 1.78 c p1
+113.96 256.35 175.65 318.04 cl
+109.21 251.60 180.40 322.79 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+113.96 256.35 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+113.96 256.35 175.65 318.04 cl
+/ps 9 def /Font1 findfont 9 s
+0 setgray
+144.81 284.81 (Sepal.Width) .5 0 0 t
+185.16 256.35 246.84 318.04 cl
+180.40 251.60 251.60 322.79 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+185.16 256.35 m
+61.68 0 l
+0 61.69 l
+-61.68 0 l
+0 -61.69 l
+o
+185.16 256.35 246.84 318.04 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+191.31 294.33 1.78 c p1
+191.31 282.43 1.78 c p1
+190.34 287.19 1.78 c p1
+192.28 284.81 1.78 c p1
+191.31 296.71 1.78 c p1
+194.22 303.85 1.78 c p1
+191.31 291.95 1.78 c p1
+192.28 291.95 1.78 c p1
+191.31 280.05 1.78 c p1
+192.28 284.81 1.78 c p1
+192.28 299.09 1.78 c p1
+193.25 291.95 1.78 c p1
+191.31 282.43 1.78 c p1
+188.41 282.43 1.78 c p1
+189.38 306.23 1.78 c p1
+192.28 315.75 1.78 c p1
+190.34 303.85 1.78 c p1
+191.31 294.33 1.78 c p1
+194.22 301.47 1.78 c p1
+192.28 301.47 1.78 c p1
+194.22 291.95 1.78 c p1
+192.28 299.09 1.78 c p1
+187.44 296.71 1.78 c p1
+194.22 289.57 1.78 c p1
+196.15 291.95 1.78 c p1
+193.25 282.43 1.78 c p1
+193.25 291.95 1.78 c p1
+192.28 294.33 1.78 c p1
+191.31 291.95 1.78 c p1
+193.25 287.19 1.78 c p1
+193.25 284.81 1.78 c p1
+192.28 291.95 1.78 c p1
+192.28 308.61 1.78 c p1
+191.31 310.99 1.78 c p1
+192.28 284.81 1.78 c p1
+189.38 287.19 1.78 c p1
+190.34 294.33 1.78 c p1
+191.31 296.71 1.78 c p1
+190.34 282.43 1.78 c p1
+192.28 291.95 1.78 c p1
+190.34 294.33 1.78 c p1
+190.34 265.77 1.78 c p1
+190.34 287.19 1.78 c p1
+193.25 294.33 1.78 c p1
+196.15 301.47 1.78 c p1
+191.31 282.43 1.78 c p1
+193.25 301.47 1.78 c p1
+191.31 287.19 1.78 c p1
+192.28 299.09 1.78 c p1
+191.31 289.57 1.78 c p1
+223.26 287.19 1.78 c p1
+221.32 287.19 1.78 c p1
+225.20 284.81 1.78 c p1
+216.48 265.77 1.78 c p1
+222.29 277.67 1.78 c p1
+221.32 277.67 1.78 c p1
+223.26 289.57 1.78 c p1
+209.71 268.15 1.78 c p1
+222.29 280.05 1.78 c p1
+215.52 275.29 1.78 c p1
+211.64 258.63 1.78 c p1
+218.42 282.43 1.78 c p1
+216.48 263.39 1.78 c p1
+223.26 280.05 1.78 c p1
+212.61 280.05 1.78 c p1
+220.36 284.81 1.78 c p1
+221.32 282.43 1.78 c p1
+217.45 275.29 1.78 c p1
+221.32 263.39 1.78 c p1
+215.52 270.53 1.78 c p1
+224.23 287.19 1.78 c p1
+216.48 277.67 1.78 c p1
+225.20 270.53 1.78 c p1
+223.26 277.67 1.78 c p1
+219.39 280.05 1.78 c p1
+220.36 282.43 1.78 c p1
+224.23 277.67 1.78 c p1
+226.17 282.43 1.78 c p1
+221.32 280.05 1.78 c p1
+211.64 272.91 1.78 c p1
+214.55 268.15 1.78 c p1
+213.58 268.15 1.78 c p1
+215.52 275.29 1.78 c p1
+227.13 275.29 1.78 c p1
+221.32 282.43 1.78 c p1
+221.32 291.95 1.78 c p1
+223.26 284.81 1.78 c p1
+220.36 265.77 1.78 c p1
+217.45 282.43 1.78 c p1
+216.48 270.53 1.78 c p1
+220.36 272.91 1.78 c p1
+222.29 282.43 1.78 c p1
+216.48 272.91 1.78 c p1
+209.71 265.77 1.78 c p1
+218.42 275.29 1.78 c p1
+218.42 282.43 1.78 c p1
+218.42 280.05 1.78 c p1
+219.39 280.05 1.78 c p1
+206.80 270.53 1.78 c p1
+217.45 277.67 1.78 c p1
+235.85 289.57 1.78 c p1
+227.13 275.29 1.78 c p1
+234.88 282.43 1.78 c p1
+231.97 280.05 1.78 c p1
+233.91 282.43 1.78 c p1
+241.66 282.43 1.78 c p1
+221.32 270.53 1.78 c p1
+238.75 280.05 1.78 c p1
+233.91 270.53 1.78 c p1
+236.81 296.71 1.78 c p1
+227.13 287.19 1.78 c p1
+229.07 275.29 1.78 c p1
+231.01 282.43 1.78 c p1
+226.17 270.53 1.78 c p1
+227.13 277.67 1.78 c p1
+229.07 287.19 1.78 c p1
+231.01 282.43 1.78 c p1
+242.62 301.47 1.78 c p1
+244.56 272.91 1.78 c p1
+226.17 263.39 1.78 c p1
+232.94 287.19 1.78 c p1
+225.20 277.67 1.78 c p1
+242.62 277.67 1.78 c p1
+225.20 275.29 1.78 c p1
+232.94 289.57 1.78 c p1
+235.85 287.19 1.78 c p1
+224.23 277.67 1.78 c p1
+225.20 282.43 1.78 c p1
+231.97 277.67 1.78 c p1
+233.91 282.43 1.78 c p1
+236.81 277.67 1.78 c p1
+239.72 301.47 1.78 c p1
+231.97 277.67 1.78 c p1
+227.13 277.67 1.78 c p1
+231.97 272.91 1.78 c p1
+236.81 282.43 1.78 c p1
+231.97 291.95 1.78 c p1
+231.01 284.81 1.78 c p1
+224.23 282.43 1.78 c p1
+230.04 284.81 1.78 c p1
+231.97 284.81 1.78 c p1
+227.13 284.81 1.78 c p1
+227.13 275.29 1.78 c p1
+234.88 287.19 1.78 c p1
+232.94 289.57 1.78 c p1
+228.10 282.43 1.78 c p1
+226.17 270.53 1.78 c p1
+228.10 282.43 1.78 c p1
+230.04 291.95 1.78 c p1
+227.13 282.43 1.78 c p1
+256.35 256.35 318.04 318.04 cl
+251.60 251.60 322.79 322.79 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+256.35 256.35 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+256.35 256.35 318.04 318.04 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+261.01 294.33 1.78 c p1
+261.01 282.43 1.78 c p1
+261.01 287.19 1.78 c p1
+261.01 284.81 1.78 c p1
+261.01 296.71 1.78 c p1
+265.77 303.85 1.78 c p1
+263.39 291.95 1.78 c p1
+261.01 291.95 1.78 c p1
+261.01 280.05 1.78 c p1
+258.63 284.81 1.78 c p1
+261.01 299.09 1.78 c p1
+261.01 291.95 1.78 c p1
+258.63 282.43 1.78 c p1
+258.63 282.43 1.78 c p1
+261.01 306.23 1.78 c p1
+265.77 315.75 1.78 c p1
+265.77 303.85 1.78 c p1
+263.39 294.33 1.78 c p1
+263.39 301.47 1.78 c p1
+263.39 301.47 1.78 c p1
+261.01 291.95 1.78 c p1
+265.77 299.09 1.78 c p1
+261.01 296.71 1.78 c p1
+268.15 289.57 1.78 c p1
+261.01 291.95 1.78 c p1
+261.01 282.43 1.78 c p1
+265.77 291.95 1.78 c p1
+261.01 294.33 1.78 c p1
+261.01 291.95 1.78 c p1
+261.01 287.19 1.78 c p1
+261.01 284.81 1.78 c p1
+265.77 291.95 1.78 c p1
+258.63 308.61 1.78 c p1
+261.01 310.99 1.78 c p1
+261.01 284.81 1.78 c p1
+261.01 287.19 1.78 c p1
+261.01 294.33 1.78 c p1
+258.63 296.71 1.78 c p1
+261.01 282.43 1.78 c p1
+261.01 291.95 1.78 c p1
+263.39 294.33 1.78 c p1
+263.39 265.77 1.78 c p1
+261.01 287.19 1.78 c p1
+270.53 294.33 1.78 c p1
+265.77 301.47 1.78 c p1
+263.39 282.43 1.78 c p1
+261.01 301.47 1.78 c p1
+261.01 287.19 1.78 c p1
+261.01 299.09 1.78 c p1
+261.01 289.57 1.78 c p1
+289.57 287.19 1.78 c p1
+291.95 287.19 1.78 c p1
+291.95 284.81 1.78 c p1
+287.19 265.77 1.78 c p1
+291.95 277.67 1.78 c p1
+287.19 277.67 1.78 c p1
+294.33 289.57 1.78 c p1
+280.05 268.15 1.78 c p1
+287.19 280.05 1.78 c p1
+289.57 275.29 1.78 c p1
+280.05 258.63 1.78 c p1
+291.95 282.43 1.78 c p1
+280.05 263.39 1.78 c p1
+289.57 280.05 1.78 c p1
+287.19 280.05 1.78 c p1
+289.57 284.81 1.78 c p1
+291.95 282.43 1.78 c p1
+280.05 275.29 1.78 c p1
+291.95 263.39 1.78 c p1
+282.43 270.53 1.78 c p1
+299.09 287.19 1.78 c p1
+287.19 277.67 1.78 c p1
+291.95 270.53 1.78 c p1
+284.81 277.67 1.78 c p1
+287.19 280.05 1.78 c p1
+289.57 282.43 1.78 c p1
+289.57 277.67 1.78 c p1
+296.71 282.43 1.78 c p1
+291.95 280.05 1.78 c p1
+280.05 272.91 1.78 c p1
+282.43 268.15 1.78 c p1
+280.05 268.15 1.78 c p1
+284.81 275.29 1.78 c p1
+294.33 275.29 1.78 c p1
+291.95 282.43 1.78 c p1
+294.33 291.95 1.78 c p1
+291.95 284.81 1.78 c p1
+287.19 265.77 1.78 c p1
+287.19 282.43 1.78 c p1
+287.19 270.53 1.78 c p1
+284.81 272.91 1.78 c p1
+289.57 282.43 1.78 c p1
+284.81 272.91 1.78 c p1
+280.05 265.77 1.78 c p1
+287.19 275.29 1.78 c p1
+284.81 282.43 1.78 c p1
+287.19 280.05 1.78 c p1
+287.19 280.05 1.78 c p1
+282.43 270.53 1.78 c p1
+287.19 277.67 1.78 c p1
+315.75 289.57 1.78 c p1
+301.47 275.29 1.78 c p1
+306.23 282.43 1.78 c p1
+299.09 280.05 1.78 c p1
+308.61 282.43 1.78 c p1
+306.23 282.43 1.78 c p1
+296.71 270.53 1.78 c p1
+299.09 280.05 1.78 c p1
+299.09 270.53 1.78 c p1
+315.75 296.71 1.78 c p1
+303.85 287.19 1.78 c p1
+301.47 275.29 1.78 c p1
+306.23 282.43 1.78 c p1
+303.85 270.53 1.78 c p1
+313.37 277.67 1.78 c p1
+310.99 287.19 1.78 c p1
+299.09 282.43 1.78 c p1
+308.61 301.47 1.78 c p1
+310.99 272.91 1.78 c p1
+291.95 263.39 1.78 c p1
+310.99 287.19 1.78 c p1
+303.85 277.67 1.78 c p1
+303.85 277.67 1.78 c p1
+299.09 275.29 1.78 c p1
+306.23 289.57 1.78 c p1
+299.09 287.19 1.78 c p1
+299.09 277.67 1.78 c p1
+299.09 282.43 1.78 c p1
+306.23 277.67 1.78 c p1
+294.33 282.43 1.78 c p1
+301.47 277.67 1.78 c p1
+303.85 301.47 1.78 c p1
+308.61 277.67 1.78 c p1
+291.95 277.67 1.78 c p1
+289.57 272.91 1.78 c p1
+310.99 282.43 1.78 c p1
+313.37 291.95 1.78 c p1
+299.09 284.81 1.78 c p1
+299.09 282.43 1.78 c p1
+306.23 284.81 1.78 c p1
+313.37 284.81 1.78 c p1
+310.99 284.81 1.78 c p1
+301.47 275.29 1.78 c p1
+310.99 287.19 1.78 c p1
+315.75 289.57 1.78 c p1
+310.99 282.43 1.78 c p1
+301.47 270.53 1.78 c p1
+303.85 282.43 1.78 c p1
+310.99 291.95 1.78 c p1
+299.09 282.43 1.78 c p1
+327.54 256.35 389.23 318.04 cl
+322.79 251.60 393.98 322.79 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+327.54 256.35 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+327.54 256.35 389.23 318.04 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+329.83 294.33 1.78 c p1
+329.83 282.43 1.78 c p1
+329.83 287.19 1.78 c p1
+329.83 284.81 1.78 c p1
+329.83 296.71 1.78 c p1
+329.83 303.85 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 280.05 1.78 c p1
+329.83 284.81 1.78 c p1
+329.83 299.09 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 282.43 1.78 c p1
+329.83 282.43 1.78 c p1
+329.83 306.23 1.78 c p1
+329.83 315.75 1.78 c p1
+329.83 303.85 1.78 c p1
+329.83 294.33 1.78 c p1
+329.83 301.47 1.78 c p1
+329.83 301.47 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 299.09 1.78 c p1
+329.83 296.71 1.78 c p1
+329.83 289.57 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 282.43 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 294.33 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 287.19 1.78 c p1
+329.83 284.81 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 308.61 1.78 c p1
+329.83 310.99 1.78 c p1
+329.83 284.81 1.78 c p1
+329.83 287.19 1.78 c p1
+329.83 294.33 1.78 c p1
+329.83 296.71 1.78 c p1
+329.83 282.43 1.78 c p1
+329.83 291.95 1.78 c p1
+329.83 294.33 1.78 c p1
+329.83 265.77 1.78 c p1
+329.83 287.19 1.78 c p1
+329.83 294.33 1.78 c p1
+329.83 301.47 1.78 c p1
+329.83 282.43 1.78 c p1
+329.83 301.47 1.78 c p1
+329.83 287.19 1.78 c p1
+329.83 299.09 1.78 c p1
+329.83 289.57 1.78 c p1
+358.39 287.19 1.78 c p1
+358.39 287.19 1.78 c p1
+358.39 284.81 1.78 c p1
+358.39 265.77 1.78 c p1
+358.39 277.67 1.78 c p1
+358.39 277.67 1.78 c p1
+358.39 289.57 1.78 c p1
+358.39 268.15 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 275.29 1.78 c p1
+358.39 258.63 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 263.39 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 284.81 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 275.29 1.78 c p1
+358.39 263.39 1.78 c p1
+358.39 270.53 1.78 c p1
+358.39 287.19 1.78 c p1
+358.39 277.67 1.78 c p1
+358.39 270.53 1.78 c p1
+358.39 277.67 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 277.67 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 272.91 1.78 c p1
+358.39 268.15 1.78 c p1
+358.39 268.15 1.78 c p1
+358.39 275.29 1.78 c p1
+358.39 275.29 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 291.95 1.78 c p1
+358.39 284.81 1.78 c p1
+358.39 265.77 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 270.53 1.78 c p1
+358.39 272.91 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 272.91 1.78 c p1
+358.39 265.77 1.78 c p1
+358.39 275.29 1.78 c p1
+358.39 282.43 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 280.05 1.78 c p1
+358.39 270.53 1.78 c p1
+358.39 277.67 1.78 c p1
+386.95 289.57 1.78 c p1
+386.95 275.29 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 280.05 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 270.53 1.78 c p1
+386.95 280.05 1.78 c p1
+386.95 270.53 1.78 c p1
+386.95 296.71 1.78 c p1
+386.95 287.19 1.78 c p1
+386.95 275.29 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 270.53 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 287.19 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 301.47 1.78 c p1
+386.95 272.91 1.78 c p1
+386.95 263.39 1.78 c p1
+386.95 287.19 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 275.29 1.78 c p1
+386.95 289.57 1.78 c p1
+386.95 287.19 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 301.47 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 277.67 1.78 c p1
+386.95 272.91 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 291.95 1.78 c p1
+386.95 284.81 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 284.81 1.78 c p1
+386.95 284.81 1.78 c p1
+386.95 284.81 1.78 c p1
+386.95 275.29 1.78 c p1
+386.95 287.19 1.78 c p1
+386.95 289.57 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 270.53 1.78 c p1
+386.95 282.43 1.78 c p1
+386.95 291.95 1.78 c p1
+386.95 282.43 1.78 c p1
+42.77 185.16 104.46 246.84 cl
+38.02 180.40 109.21 251.60 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 185.16 m
+61.69 0 l
+0 61.68 l
+-61.69 0 l
+0 -61.68 l
+o
+42.77 185.16 104.46 246.84 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+57.75 191.31 1.78 c p1
+54.57 191.31 1.78 c p1
+51.40 190.34 1.78 c p1
+49.81 192.28 1.78 c p1
+56.16 191.31 1.78 c p1
+62.51 194.22 1.78 c p1
+49.81 191.31 1.78 c p1
+56.16 192.28 1.78 c p1
+46.64 191.31 1.78 c p1
+54.57 192.28 1.78 c p1
+62.51 192.28 1.78 c p1
+52.99 193.25 1.78 c p1
+52.99 191.31 1.78 c p1
+45.05 188.41 1.78 c p1
+68.85 189.38 1.78 c p1
+67.27 192.28 1.78 c p1
+62.51 190.34 1.78 c p1
+57.75 191.31 1.78 c p1
+67.27 194.22 1.78 c p1
+57.75 192.28 1.78 c p1
+62.51 194.22 1.78 c p1
+57.75 192.28 1.78 c p1
+49.81 187.44 1.78 c p1
+57.75 194.22 1.78 c p1
+52.99 196.15 1.78 c p1
+56.16 193.25 1.78 c p1
+56.16 193.25 1.78 c p1
+59.33 192.28 1.78 c p1
+59.33 191.31 1.78 c p1
+51.40 193.25 1.78 c p1
+52.99 193.25 1.78 c p1
+62.51 192.28 1.78 c p1
+59.33 192.28 1.78 c p1
+64.09 191.31 1.78 c p1
+54.57 192.28 1.78 c p1
+56.16 189.38 1.78 c p1
+64.09 190.34 1.78 c p1
+54.57 191.31 1.78 c p1
+46.64 190.34 1.78 c p1
+57.75 192.28 1.78 c p1
+56.16 190.34 1.78 c p1
+48.23 190.34 1.78 c p1
+46.64 190.34 1.78 c p1
+56.16 193.25 1.78 c p1
+57.75 196.15 1.78 c p1
+52.99 191.31 1.78 c p1
+57.75 193.25 1.78 c p1
+49.81 191.31 1.78 c p1
+60.92 192.28 1.78 c p1
+56.16 191.31 1.78 c p1
+87.89 223.26 1.78 c p1
+78.37 221.32 1.78 c p1
+86.31 225.20 1.78 c p1
+64.09 216.48 1.78 c p1
+79.96 222.29 1.78 c p1
+67.27 221.32 1.78 c p1
+76.79 223.26 1.78 c p1
+54.57 209.71 1.78 c p1
+81.55 222.29 1.78 c p1
+59.33 215.52 1.78 c p1
+56.16 211.64 1.78 c p1
+70.44 218.42 1.78 c p1
+72.03 216.48 1.78 c p1
+73.61 223.26 1.78 c p1
+65.68 212.61 1.78 c p1
+83.13 220.36 1.78 c p1
+65.68 221.32 1.78 c p1
+68.85 217.45 1.78 c p1
+75.20 221.32 1.78 c p1
+65.68 215.52 1.78 c p1
+70.44 224.23 1.78 c p1
+73.61 216.48 1.78 c p1
+76.79 225.20 1.78 c p1
+73.61 223.26 1.78 c p1
+78.37 219.39 1.78 c p1
+81.55 220.36 1.78 c p1
+84.72 224.23 1.78 c p1
+83.13 226.17 1.78 c p1
+72.03 221.32 1.78 c p1
+67.27 211.64 1.78 c p1
+64.09 214.55 1.78 c p1
+64.09 213.58 1.78 c p1
+68.85 215.52 1.78 c p1
+72.03 227.13 1.78 c p1
+62.51 221.32 1.78 c p1
+72.03 221.32 1.78 c p1
+83.13 223.26 1.78 c p1
+76.79 220.36 1.78 c p1
+65.68 217.45 1.78 c p1
+64.09 216.48 1.78 c p1
+64.09 220.36 1.78 c p1
+73.61 222.29 1.78 c p1
+68.85 216.48 1.78 c p1
+56.16 209.71 1.78 c p1
+65.68 218.42 1.78 c p1
+67.27 218.42 1.78 c p1
+67.27 218.42 1.78 c p1
+75.20 219.39 1.78 c p1
+57.75 206.80 1.78 c p1
+67.27 217.45 1.78 c p1
+76.79 235.85 1.78 c p1
+68.85 227.13 1.78 c p1
+89.48 234.88 1.78 c p1
+76.79 231.97 1.78 c p1
+79.96 233.91 1.78 c p1
+97.41 241.66 1.78 c p1
+54.57 221.32 1.78 c p1
+92.65 238.75 1.78 c p1
+83.13 233.91 1.78 c p1
+91.07 236.81 1.78 c p1
+79.96 227.13 1.78 c p1
+78.37 229.07 1.78 c p1
+84.72 231.01 1.78 c p1
+67.27 226.17 1.78 c p1
+68.85 227.13 1.78 c p1
+78.37 229.07 1.78 c p1
+79.96 231.01 1.78 c p1
+99.00 242.62 1.78 c p1
+99.00 244.56 1.78 c p1
+72.03 226.17 1.78 c p1
+86.31 232.94 1.78 c p1
+65.68 225.20 1.78 c p1
+99.00 242.62 1.78 c p1
+76.79 225.20 1.78 c p1
+83.13 232.94 1.78 c p1
+91.07 235.85 1.78 c p1
+75.20 224.23 1.78 c p1
+73.61 225.20 1.78 c p1
+78.37 231.97 1.78 c p1
+91.07 233.91 1.78 c p1
+94.24 236.81 1.78 c p1
+102.17 239.72 1.78 c p1
+78.37 231.97 1.78 c p1
+76.79 227.13 1.78 c p1
+73.61 231.97 1.78 c p1
+99.00 236.81 1.78 c p1
+76.79 231.97 1.78 c p1
+78.37 231.01 1.78 c p1
+72.03 224.23 1.78 c p1
+86.31 230.04 1.78 c p1
+83.13 231.97 1.78 c p1
+86.31 227.13 1.78 c p1
+68.85 227.13 1.78 c p1
+84.72 234.88 1.78 c p1
+83.13 232.94 1.78 c p1
+83.13 228.10 1.78 c p1
+76.79 226.17 1.78 c p1
+79.96 228.10 1.78 c p1
+75.20 230.04 1.78 c p1
+70.44 227.13 1.78 c p1
+113.96 185.16 175.65 246.84 cl
+109.21 180.40 180.40 251.60 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+113.96 185.16 m
+61.69 0 l
+0 61.68 l
+-61.69 0 l
+0 -61.68 l
+o
+113.96 185.16 175.65 246.84 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+151.95 191.31 1.78 c p1
+140.05 191.31 1.78 c p1
+144.81 190.34 1.78 c p1
+142.43 192.28 1.78 c p1
+154.33 191.31 1.78 c p1
+161.47 194.22 1.78 c p1
+149.57 191.31 1.78 c p1
+149.57 192.28 1.78 c p1
+137.67 191.31 1.78 c p1
+142.43 192.28 1.78 c p1
+156.71 192.28 1.78 c p1
+149.57 193.25 1.78 c p1
+140.05 191.31 1.78 c p1
+140.05 188.41 1.78 c p1
+163.85 189.38 1.78 c p1
+173.37 192.28 1.78 c p1
+161.47 190.34 1.78 c p1
+151.95 191.31 1.78 c p1
+159.09 194.22 1.78 c p1
+159.09 192.28 1.78 c p1
+149.57 194.22 1.78 c p1
+156.71 192.28 1.78 c p1
+154.33 187.44 1.78 c p1
+147.19 194.22 1.78 c p1
+149.57 196.15 1.78 c p1
+140.05 193.25 1.78 c p1
+149.57 193.25 1.78 c p1
+151.95 192.28 1.78 c p1
+149.57 191.31 1.78 c p1
+144.81 193.25 1.78 c p1
+142.43 193.25 1.78 c p1
+149.57 192.28 1.78 c p1
+166.23 192.28 1.78 c p1
+168.61 191.31 1.78 c p1
+142.43 192.28 1.78 c p1
+144.81 189.38 1.78 c p1
+151.95 190.34 1.78 c p1
+154.33 191.31 1.78 c p1
+140.05 190.34 1.78 c p1
+149.57 192.28 1.78 c p1
+151.95 190.34 1.78 c p1
+123.39 190.34 1.78 c p1
+144.81 190.34 1.78 c p1
+151.95 193.25 1.78 c p1
+159.09 196.15 1.78 c p1
+140.05 191.31 1.78 c p1
+159.09 193.25 1.78 c p1
+144.81 191.31 1.78 c p1
+156.71 192.28 1.78 c p1
+147.19 191.31 1.78 c p1
+144.81 223.26 1.78 c p1
+144.81 221.32 1.78 c p1
+142.43 225.20 1.78 c p1
+123.39 216.48 1.78 c p1
+135.29 222.29 1.78 c p1
+135.29 221.32 1.78 c p1
+147.19 223.26 1.78 c p1
+125.77 209.71 1.78 c p1
+137.67 222.29 1.78 c p1
+132.91 215.52 1.78 c p1
+116.25 211.64 1.78 c p1
+140.05 218.42 1.78 c p1
+121.01 216.48 1.78 c p1
+137.67 223.26 1.78 c p1
+137.67 212.61 1.78 c p1
+142.43 220.36 1.78 c p1
+140.05 221.32 1.78 c p1
+132.91 217.45 1.78 c p1
+121.01 221.32 1.78 c p1
+128.15 215.52 1.78 c p1
+144.81 224.23 1.78 c p1
+135.29 216.48 1.78 c p1
+128.15 225.20 1.78 c p1
+135.29 223.26 1.78 c p1
+137.67 219.39 1.78 c p1
+140.05 220.36 1.78 c p1
+135.29 224.23 1.78 c p1
+140.05 226.17 1.78 c p1
+137.67 221.32 1.78 c p1
+130.53 211.64 1.78 c p1
+125.77 214.55 1.78 c p1
+125.77 213.58 1.78 c p1
+132.91 215.52 1.78 c p1
+132.91 227.13 1.78 c p1
+140.05 221.32 1.78 c p1
+149.57 221.32 1.78 c p1
+142.43 223.26 1.78 c p1
+123.39 220.36 1.78 c p1
+140.05 217.45 1.78 c p1
+128.15 216.48 1.78 c p1
+130.53 220.36 1.78 c p1
+140.05 222.29 1.78 c p1
+130.53 216.48 1.78 c p1
+123.39 209.71 1.78 c p1
+132.91 218.42 1.78 c p1
+140.05 218.42 1.78 c p1
+137.67 218.42 1.78 c p1
+137.67 219.39 1.78 c p1
+128.15 206.80 1.78 c p1
+135.29 217.45 1.78 c p1
+147.19 235.85 1.78 c p1
+132.91 227.13 1.78 c p1
+140.05 234.88 1.78 c p1
+137.67 231.97 1.78 c p1
+140.05 233.91 1.78 c p1
+140.05 241.66 1.78 c p1
+128.15 221.32 1.78 c p1
+137.67 238.75 1.78 c p1
+128.15 233.91 1.78 c p1
+154.33 236.81 1.78 c p1
+144.81 227.13 1.78 c p1
+132.91 229.07 1.78 c p1
+140.05 231.01 1.78 c p1
+128.15 226.17 1.78 c p1
+135.29 227.13 1.78 c p1
+144.81 229.07 1.78 c p1
+140.05 231.01 1.78 c p1
+159.09 242.62 1.78 c p1
+130.53 244.56 1.78 c p1
+121.01 226.17 1.78 c p1
+144.81 232.94 1.78 c p1
+135.29 225.20 1.78 c p1
+135.29 242.62 1.78 c p1
+132.91 225.20 1.78 c p1
+147.19 232.94 1.78 c p1
+144.81 235.85 1.78 c p1
+135.29 224.23 1.78 c p1
+140.05 225.20 1.78 c p1
+135.29 231.97 1.78 c p1
+140.05 233.91 1.78 c p1
+135.29 236.81 1.78 c p1
+159.09 239.72 1.78 c p1
+135.29 231.97 1.78 c p1
+135.29 227.13 1.78 c p1
+130.53 231.97 1.78 c p1
+140.05 236.81 1.78 c p1
+149.57 231.97 1.78 c p1
+142.43 231.01 1.78 c p1
+140.05 224.23 1.78 c p1
+142.43 230.04 1.78 c p1
+142.43 231.97 1.78 c p1
+142.43 227.13 1.78 c p1
+132.91 227.13 1.78 c p1
+144.81 234.88 1.78 c p1
+147.19 232.94 1.78 c p1
+140.05 228.10 1.78 c p1
+128.15 226.17 1.78 c p1
+140.05 228.10 1.78 c p1
+149.57 230.04 1.78 c p1
+140.05 227.13 1.78 c p1
+185.16 185.16 246.84 246.84 cl
+180.40 180.40 251.60 251.60 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+185.16 185.16 m
+61.68 0 l
+0 61.68 l
+-61.68 0 l
+0 -61.68 l
+o
+185.16 185.16 246.84 246.84 cl
+/ps 9 def /Font1 findfont 9 s
+0 setgray
+216.00 213.76 (Petal.Length) .5 0 0 t
+256.35 185.16 318.04 246.84 cl
+251.60 180.40 322.79 251.60 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+256.35 185.16 m
+61.69 0 l
+0 61.68 l
+-61.69 0 l
+0 -61.68 l
+o
+256.35 185.16 318.04 246.84 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+261.01 191.31 1.78 c p1
+261.01 191.31 1.78 c p1
+261.01 190.34 1.78 c p1
+261.01 192.28 1.78 c p1
+261.01 191.31 1.78 c p1
+265.77 194.22 1.78 c p1
+263.39 191.31 1.78 c p1
+261.01 192.28 1.78 c p1
+261.01 191.31 1.78 c p1
+258.63 192.28 1.78 c p1
+261.01 192.28 1.78 c p1
+261.01 193.25 1.78 c p1
+258.63 191.31 1.78 c p1
+258.63 188.41 1.78 c p1
+261.01 189.38 1.78 c p1
+265.77 192.28 1.78 c p1
+265.77 190.34 1.78 c p1
+263.39 191.31 1.78 c p1
+263.39 194.22 1.78 c p1
+263.39 192.28 1.78 c p1
+261.01 194.22 1.78 c p1
+265.77 192.28 1.78 c p1
+261.01 187.44 1.78 c p1
+268.15 194.22 1.78 c p1
+261.01 196.15 1.78 c p1
+261.01 193.25 1.78 c p1
+265.77 193.25 1.78 c p1
+261.01 192.28 1.78 c p1
+261.01 191.31 1.78 c p1
+261.01 193.25 1.78 c p1
+261.01 193.25 1.78 c p1
+265.77 192.28 1.78 c p1
+258.63 192.28 1.78 c p1
+261.01 191.31 1.78 c p1
+261.01 192.28 1.78 c p1
+261.01 189.38 1.78 c p1
+261.01 190.34 1.78 c p1
+258.63 191.31 1.78 c p1
+261.01 190.34 1.78 c p1
+261.01 192.28 1.78 c p1
+263.39 190.34 1.78 c p1
+263.39 190.34 1.78 c p1
+261.01 190.34 1.78 c p1
+270.53 193.25 1.78 c p1
+265.77 196.15 1.78 c p1
+263.39 191.31 1.78 c p1
+261.01 193.25 1.78 c p1
+261.01 191.31 1.78 c p1
+261.01 192.28 1.78 c p1
+261.01 191.31 1.78 c p1
+289.57 223.26 1.78 c p1
+291.95 221.32 1.78 c p1
+291.95 225.20 1.78 c p1
+287.19 216.48 1.78 c p1
+291.95 222.29 1.78 c p1
+287.19 221.32 1.78 c p1
+294.33 223.26 1.78 c p1
+280.05 209.71 1.78 c p1
+287.19 222.29 1.78 c p1
+289.57 215.52 1.78 c p1
+280.05 211.64 1.78 c p1
+291.95 218.42 1.78 c p1
+280.05 216.48 1.78 c p1
+289.57 223.26 1.78 c p1
+287.19 212.61 1.78 c p1
+289.57 220.36 1.78 c p1
+291.95 221.32 1.78 c p1
+280.05 217.45 1.78 c p1
+291.95 221.32 1.78 c p1
+282.43 215.52 1.78 c p1
+299.09 224.23 1.78 c p1
+287.19 216.48 1.78 c p1
+291.95 225.20 1.78 c p1
+284.81 223.26 1.78 c p1
+287.19 219.39 1.78 c p1
+289.57 220.36 1.78 c p1
+289.57 224.23 1.78 c p1
+296.71 226.17 1.78 c p1
+291.95 221.32 1.78 c p1
+280.05 211.64 1.78 c p1
+282.43 214.55 1.78 c p1
+280.05 213.58 1.78 c p1
+284.81 215.52 1.78 c p1
+294.33 227.13 1.78 c p1
+291.95 221.32 1.78 c p1
+294.33 221.32 1.78 c p1
+291.95 223.26 1.78 c p1
+287.19 220.36 1.78 c p1
+287.19 217.45 1.78 c p1
+287.19 216.48 1.78 c p1
+284.81 220.36 1.78 c p1
+289.57 222.29 1.78 c p1
+284.81 216.48 1.78 c p1
+280.05 209.71 1.78 c p1
+287.19 218.42 1.78 c p1
+284.81 218.42 1.78 c p1
+287.19 218.42 1.78 c p1
+287.19 219.39 1.78 c p1
+282.43 206.80 1.78 c p1
+287.19 217.45 1.78 c p1
+315.75 235.85 1.78 c p1
+301.47 227.13 1.78 c p1
+306.23 234.88 1.78 c p1
+299.09 231.97 1.78 c p1
+308.61 233.91 1.78 c p1
+306.23 241.66 1.78 c p1
+296.71 221.32 1.78 c p1
+299.09 238.75 1.78 c p1
+299.09 233.91 1.78 c p1
+315.75 236.81 1.78 c p1
+303.85 227.13 1.78 c p1
+301.47 229.07 1.78 c p1
+306.23 231.01 1.78 c p1
+303.85 226.17 1.78 c p1
+313.37 227.13 1.78 c p1
+310.99 229.07 1.78 c p1
+299.09 231.01 1.78 c p1
+308.61 242.62 1.78 c p1
+310.99 244.56 1.78 c p1
+291.95 226.17 1.78 c p1
+310.99 232.94 1.78 c p1
+303.85 225.20 1.78 c p1
+303.85 242.62 1.78 c p1
+299.09 225.20 1.78 c p1
+306.23 232.94 1.78 c p1
+299.09 235.85 1.78 c p1
+299.09 224.23 1.78 c p1
+299.09 225.20 1.78 c p1
+306.23 231.97 1.78 c p1
+294.33 233.91 1.78 c p1
+301.47 236.81 1.78 c p1
+303.85 239.72 1.78 c p1
+308.61 231.97 1.78 c p1
+291.95 227.13 1.78 c p1
+289.57 231.97 1.78 c p1
+310.99 236.81 1.78 c p1
+313.37 231.97 1.78 c p1
+299.09 231.01 1.78 c p1
+299.09 224.23 1.78 c p1
+306.23 230.04 1.78 c p1
+313.37 231.97 1.78 c p1
+310.99 227.13 1.78 c p1
+301.47 227.13 1.78 c p1
+310.99 234.88 1.78 c p1
+315.75 232.94 1.78 c p1
+310.99 228.10 1.78 c p1
+301.47 226.17 1.78 c p1
+303.85 228.10 1.78 c p1
+310.99 230.04 1.78 c p1
+299.09 227.13 1.78 c p1
+327.54 185.16 389.23 246.84 cl
+322.79 180.40 393.98 251.60 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+327.54 185.16 m
+61.69 0 l
+0 61.68 l
+-61.69 0 l
+0 -61.68 l
+o
+np
+389.23 187.44 m
+0 58.09 l
+o
+np
+389.23 187.44 m
+4.75 0 l
+o
+np
+389.23 197.12 m
+4.75 0 l
+o
+np
+389.23 206.80 m
+4.75 0 l
+o
+np
+389.23 216.48 m
+4.75 0 l
+o
+np
+389.23 226.17 m
+4.75 0 l
+o
+np
+389.23 235.85 m
+4.75 0 l
+o
+np
+389.23 245.53 m
+4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+406.34 187.44 (1) .5 0 90 t
+406.34 206.80 (3) .5 0 90 t
+406.34 226.17 (5) .5 0 90 t
+406.34 245.53 (7) .5 0 90 t
+327.54 185.16 389.23 246.84 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+329.83 191.31 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 194.22 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 188.41 1.78 c p1
+329.83 189.38 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 194.22 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 194.22 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 187.44 1.78 c p1
+329.83 194.22 1.78 c p1
+329.83 196.15 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 189.38 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 190.34 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 196.15 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 193.25 1.78 c p1
+329.83 191.31 1.78 c p1
+329.83 192.28 1.78 c p1
+329.83 191.31 1.78 c p1
+358.39 223.26 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 225.20 1.78 c p1
+358.39 216.48 1.78 c p1
+358.39 222.29 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 223.26 1.78 c p1
+358.39 209.71 1.78 c p1
+358.39 222.29 1.78 c p1
+358.39 215.52 1.78 c p1
+358.39 211.64 1.78 c p1
+358.39 218.42 1.78 c p1
+358.39 216.48 1.78 c p1
+358.39 223.26 1.78 c p1
+358.39 212.61 1.78 c p1
+358.39 220.36 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 217.45 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 215.52 1.78 c p1
+358.39 224.23 1.78 c p1
+358.39 216.48 1.78 c p1
+358.39 225.20 1.78 c p1
+358.39 223.26 1.78 c p1
+358.39 219.39 1.78 c p1
+358.39 220.36 1.78 c p1
+358.39 224.23 1.78 c p1
+358.39 226.17 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 211.64 1.78 c p1
+358.39 214.55 1.78 c p1
+358.39 213.58 1.78 c p1
+358.39 215.52 1.78 c p1
+358.39 227.13 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 221.32 1.78 c p1
+358.39 223.26 1.78 c p1
+358.39 220.36 1.78 c p1
+358.39 217.45 1.78 c p1
+358.39 216.48 1.78 c p1
+358.39 220.36 1.78 c p1
+358.39 222.29 1.78 c p1
+358.39 216.48 1.78 c p1
+358.39 209.71 1.78 c p1
+358.39 218.42 1.78 c p1
+358.39 218.42 1.78 c p1
+358.39 218.42 1.78 c p1
+358.39 219.39 1.78 c p1
+358.39 206.80 1.78 c p1
+358.39 217.45 1.78 c p1
+386.95 235.85 1.78 c p1
+386.95 227.13 1.78 c p1
+386.95 234.88 1.78 c p1
+386.95 231.97 1.78 c p1
+386.95 233.91 1.78 c p1
+386.95 241.66 1.78 c p1
+386.95 221.32 1.78 c p1
+386.95 238.75 1.78 c p1
+386.95 233.91 1.78 c p1
+386.95 236.81 1.78 c p1
+386.95 227.13 1.78 c p1
+386.95 229.07 1.78 c p1
+386.95 231.01 1.78 c p1
+386.95 226.17 1.78 c p1
+386.95 227.13 1.78 c p1
+386.95 229.07 1.78 c p1
+386.95 231.01 1.78 c p1
+386.95 242.62 1.78 c p1
+386.95 244.56 1.78 c p1
+386.95 226.17 1.78 c p1
+386.95 232.94 1.78 c p1
+386.95 225.20 1.78 c p1
+386.95 242.62 1.78 c p1
+386.95 225.20 1.78 c p1
+386.95 232.94 1.78 c p1
+386.95 235.85 1.78 c p1
+386.95 224.23 1.78 c p1
+386.95 225.20 1.78 c p1
+386.95 231.97 1.78 c p1
+386.95 233.91 1.78 c p1
+386.95 236.81 1.78 c p1
+386.95 239.72 1.78 c p1
+386.95 231.97 1.78 c p1
+386.95 227.13 1.78 c p1
+386.95 231.97 1.78 c p1
+386.95 236.81 1.78 c p1
+386.95 231.97 1.78 c p1
+386.95 231.01 1.78 c p1
+386.95 224.23 1.78 c p1
+386.95 230.04 1.78 c p1
+386.95 231.97 1.78 c p1
+386.95 227.13 1.78 c p1
+386.95 227.13 1.78 c p1
+386.95 234.88 1.78 c p1
+386.95 232.94 1.78 c p1
+386.95 228.10 1.78 c p1
+386.95 226.17 1.78 c p1
+386.95 228.10 1.78 c p1
+386.95 230.04 1.78 c p1
+386.95 227.13 1.78 c p1
+42.77 113.96 104.46 175.65 cl
+38.02 109.21 109.21 180.40 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 113.96 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+42.77 125.77 m
+0 47.60 l
+o
+np
+42.77 125.77 m
+-4.75 0 l
+o
+np
+42.77 137.67 m
+-4.75 0 l
+o
+np
+42.77 149.57 m
+-4.75 0 l
+o
+np
+42.77 161.47 m
+-4.75 0 l
+o
+np
+42.77 173.37 m
+-4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+31.36 125.77 (0.5) .5 0 90 t
+31.36 149.57 (1.5) .5 0 90 t
+31.36 173.37 (2.5) .5 0 90 t
+42.77 113.96 104.46 175.65 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+57.75 118.63 1.78 c p1
+54.57 118.63 1.78 c p1
+51.40 118.63 1.78 c p1
+49.81 118.63 1.78 c p1
+56.16 118.63 1.78 c p1
+62.51 123.39 1.78 c p1
+49.81 121.01 1.78 c p1
+56.16 118.63 1.78 c p1
+46.64 118.63 1.78 c p1
+54.57 116.25 1.78 c p1
+62.51 118.63 1.78 c p1
+52.99 118.63 1.78 c p1
+52.99 116.25 1.78 c p1
+45.05 116.25 1.78 c p1
+68.85 118.63 1.78 c p1
+67.27 123.39 1.78 c p1
+62.51 123.39 1.78 c p1
+57.75 121.01 1.78 c p1
+67.27 121.01 1.78 c p1
+57.75 121.01 1.78 c p1
+62.51 118.63 1.78 c p1
+57.75 123.39 1.78 c p1
+49.81 118.63 1.78 c p1
+57.75 125.77 1.78 c p1
+52.99 118.63 1.78 c p1
+56.16 118.63 1.78 c p1
+56.16 123.39 1.78 c p1
+59.33 118.63 1.78 c p1
+59.33 118.63 1.78 c p1
+51.40 118.63 1.78 c p1
+52.99 118.63 1.78 c p1
+62.51 123.39 1.78 c p1
+59.33 116.25 1.78 c p1
+64.09 118.63 1.78 c p1
+54.57 118.63 1.78 c p1
+56.16 118.63 1.78 c p1
+64.09 118.63 1.78 c p1
+54.57 116.25 1.78 c p1
+46.64 118.63 1.78 c p1
+57.75 118.63 1.78 c p1
+56.16 121.01 1.78 c p1
+48.23 121.01 1.78 c p1
+46.64 118.63 1.78 c p1
+56.16 128.15 1.78 c p1
+57.75 123.39 1.78 c p1
+52.99 121.01 1.78 c p1
+57.75 118.63 1.78 c p1
+49.81 118.63 1.78 c p1
+60.92 118.63 1.78 c p1
+56.16 118.63 1.78 c p1
+87.89 147.19 1.78 c p1
+78.37 149.57 1.78 c p1
+86.31 149.57 1.78 c p1
+64.09 144.81 1.78 c p1
+79.96 149.57 1.78 c p1
+67.27 144.81 1.78 c p1
+76.79 151.95 1.78 c p1
+54.57 137.67 1.78 c p1
+81.55 144.81 1.78 c p1
+59.33 147.19 1.78 c p1
+56.16 137.67 1.78 c p1
+70.44 149.57 1.78 c p1
+72.03 137.67 1.78 c p1
+73.61 147.19 1.78 c p1
+65.68 144.81 1.78 c p1
+83.13 147.19 1.78 c p1
+65.68 149.57 1.78 c p1
+68.85 137.67 1.78 c p1
+75.20 149.57 1.78 c p1
+65.68 140.05 1.78 c p1
+70.44 156.71 1.78 c p1
+73.61 144.81 1.78 c p1
+76.79 149.57 1.78 c p1
+73.61 142.43 1.78 c p1
+78.37 144.81 1.78 c p1
+81.55 147.19 1.78 c p1
+84.72 147.19 1.78 c p1
+83.13 154.33 1.78 c p1
+72.03 149.57 1.78 c p1
+67.27 137.67 1.78 c p1
+64.09 140.05 1.78 c p1
+64.09 137.67 1.78 c p1
+68.85 142.43 1.78 c p1
+72.03 151.95 1.78 c p1
+62.51 149.57 1.78 c p1
+72.03 151.95 1.78 c p1
+83.13 149.57 1.78 c p1
+76.79 144.81 1.78 c p1
+65.68 144.81 1.78 c p1
+64.09 144.81 1.78 c p1
+64.09 142.43 1.78 c p1
+73.61 147.19 1.78 c p1
+68.85 142.43 1.78 c p1
+56.16 137.67 1.78 c p1
+65.68 144.81 1.78 c p1
+67.27 142.43 1.78 c p1
+67.27 144.81 1.78 c p1
+75.20 144.81 1.78 c p1
+57.75 140.05 1.78 c p1
+67.27 144.81 1.78 c p1
+76.79 173.37 1.78 c p1
+68.85 159.09 1.78 c p1
+89.48 163.85 1.78 c p1
+76.79 156.71 1.78 c p1
+79.96 166.23 1.78 c p1
+97.41 163.85 1.78 c p1
+54.57 154.33 1.78 c p1
+92.65 156.71 1.78 c p1
+83.13 156.71 1.78 c p1
+91.07 173.37 1.78 c p1
+79.96 161.47 1.78 c p1
+78.37 159.09 1.78 c p1
+84.72 163.85 1.78 c p1
+67.27 161.47 1.78 c p1
+68.85 170.99 1.78 c p1
+78.37 168.61 1.78 c p1
+79.96 156.71 1.78 c p1
+99.00 166.23 1.78 c p1
+99.00 168.61 1.78 c p1
+72.03 149.57 1.78 c p1
+86.31 168.61 1.78 c p1
+65.68 161.47 1.78 c p1
+99.00 161.47 1.78 c p1
+76.79 156.71 1.78 c p1
+83.13 163.85 1.78 c p1
+91.07 156.71 1.78 c p1
+75.20 156.71 1.78 c p1
+73.61 156.71 1.78 c p1
+78.37 163.85 1.78 c p1
+91.07 151.95 1.78 c p1
+94.24 159.09 1.78 c p1
+102.17 161.47 1.78 c p1
+78.37 166.23 1.78 c p1
+76.79 149.57 1.78 c p1
+73.61 147.19 1.78 c p1
+99.00 168.61 1.78 c p1
+76.79 170.99 1.78 c p1
+78.37 156.71 1.78 c p1
+72.03 156.71 1.78 c p1
+86.31 163.85 1.78 c p1
+83.13 170.99 1.78 c p1
+86.31 168.61 1.78 c p1
+68.85 159.09 1.78 c p1
+84.72 168.61 1.78 c p1
+83.13 173.37 1.78 c p1
+83.13 168.61 1.78 c p1
+76.79 159.09 1.78 c p1
+79.96 161.47 1.78 c p1
+75.20 168.61 1.78 c p1
+70.44 156.71 1.78 c p1
+113.96 113.96 175.65 175.65 cl
+109.21 109.21 180.40 180.40 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+113.96 113.96 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+113.96 113.96 175.65 175.65 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+151.95 118.63 1.78 c p1
+140.05 118.63 1.78 c p1
+144.81 118.63 1.78 c p1
+142.43 118.63 1.78 c p1
+154.33 118.63 1.78 c p1
+161.47 123.39 1.78 c p1
+149.57 121.01 1.78 c p1
+149.57 118.63 1.78 c p1
+137.67 118.63 1.78 c p1
+142.43 116.25 1.78 c p1
+156.71 118.63 1.78 c p1
+149.57 118.63 1.78 c p1
+140.05 116.25 1.78 c p1
+140.05 116.25 1.78 c p1
+163.85 118.63 1.78 c p1
+173.37 123.39 1.78 c p1
+161.47 123.39 1.78 c p1
+151.95 121.01 1.78 c p1
+159.09 121.01 1.78 c p1
+159.09 121.01 1.78 c p1
+149.57 118.63 1.78 c p1
+156.71 123.39 1.78 c p1
+154.33 118.63 1.78 c p1
+147.19 125.77 1.78 c p1
+149.57 118.63 1.78 c p1
+140.05 118.63 1.78 c p1
+149.57 123.39 1.78 c p1
+151.95 118.63 1.78 c p1
+149.57 118.63 1.78 c p1
+144.81 118.63 1.78 c p1
+142.43 118.63 1.78 c p1
+149.57 123.39 1.78 c p1
+166.23 116.25 1.78 c p1
+168.61 118.63 1.78 c p1
+142.43 118.63 1.78 c p1
+144.81 118.63 1.78 c p1
+151.95 118.63 1.78 c p1
+154.33 116.25 1.78 c p1
+140.05 118.63 1.78 c p1
+149.57 118.63 1.78 c p1
+151.95 121.01 1.78 c p1
+123.39 121.01 1.78 c p1
+144.81 118.63 1.78 c p1
+151.95 128.15 1.78 c p1
+159.09 123.39 1.78 c p1
+140.05 121.01 1.78 c p1
+159.09 118.63 1.78 c p1
+144.81 118.63 1.78 c p1
+156.71 118.63 1.78 c p1
+147.19 118.63 1.78 c p1
+144.81 147.19 1.78 c p1
+144.81 149.57 1.78 c p1
+142.43 149.57 1.78 c p1
+123.39 144.81 1.78 c p1
+135.29 149.57 1.78 c p1
+135.29 144.81 1.78 c p1
+147.19 151.95 1.78 c p1
+125.77 137.67 1.78 c p1
+137.67 144.81 1.78 c p1
+132.91 147.19 1.78 c p1
+116.25 137.67 1.78 c p1
+140.05 149.57 1.78 c p1
+121.01 137.67 1.78 c p1
+137.67 147.19 1.78 c p1
+137.67 144.81 1.78 c p1
+142.43 147.19 1.78 c p1
+140.05 149.57 1.78 c p1
+132.91 137.67 1.78 c p1
+121.01 149.57 1.78 c p1
+128.15 140.05 1.78 c p1
+144.81 156.71 1.78 c p1
+135.29 144.81 1.78 c p1
+128.15 149.57 1.78 c p1
+135.29 142.43 1.78 c p1
+137.67 144.81 1.78 c p1
+140.05 147.19 1.78 c p1
+135.29 147.19 1.78 c p1
+140.05 154.33 1.78 c p1
+137.67 149.57 1.78 c p1
+130.53 137.67 1.78 c p1
+125.77 140.05 1.78 c p1
+125.77 137.67 1.78 c p1
+132.91 142.43 1.78 c p1
+132.91 151.95 1.78 c p1
+140.05 149.57 1.78 c p1
+149.57 151.95 1.78 c p1
+142.43 149.57 1.78 c p1
+123.39 144.81 1.78 c p1
+140.05 144.81 1.78 c p1
+128.15 144.81 1.78 c p1
+130.53 142.43 1.78 c p1
+140.05 147.19 1.78 c p1
+130.53 142.43 1.78 c p1
+123.39 137.67 1.78 c p1
+132.91 144.81 1.78 c p1
+140.05 142.43 1.78 c p1
+137.67 144.81 1.78 c p1
+137.67 144.81 1.78 c p1
+128.15 140.05 1.78 c p1
+135.29 144.81 1.78 c p1
+147.19 173.37 1.78 c p1
+132.91 159.09 1.78 c p1
+140.05 163.85 1.78 c p1
+137.67 156.71 1.78 c p1
+140.05 166.23 1.78 c p1
+140.05 163.85 1.78 c p1
+128.15 154.33 1.78 c p1
+137.67 156.71 1.78 c p1
+128.15 156.71 1.78 c p1
+154.33 173.37 1.78 c p1
+144.81 161.47 1.78 c p1
+132.91 159.09 1.78 c p1
+140.05 163.85 1.78 c p1
+128.15 161.47 1.78 c p1
+135.29 170.99 1.78 c p1
+144.81 168.61 1.78 c p1
+140.05 156.71 1.78 c p1
+159.09 166.23 1.78 c p1
+130.53 168.61 1.78 c p1
+121.01 149.57 1.78 c p1
+144.81 168.61 1.78 c p1
+135.29 161.47 1.78 c p1
+135.29 161.47 1.78 c p1
+132.91 156.71 1.78 c p1
+147.19 163.85 1.78 c p1
+144.81 156.71 1.78 c p1
+135.29 156.71 1.78 c p1
+140.05 156.71 1.78 c p1
+135.29 163.85 1.78 c p1
+140.05 151.95 1.78 c p1
+135.29 159.09 1.78 c p1
+159.09 161.47 1.78 c p1
+135.29 166.23 1.78 c p1
+135.29 149.57 1.78 c p1
+130.53 147.19 1.78 c p1
+140.05 168.61 1.78 c p1
+149.57 170.99 1.78 c p1
+142.43 156.71 1.78 c p1
+140.05 156.71 1.78 c p1
+142.43 163.85 1.78 c p1
+142.43 170.99 1.78 c p1
+142.43 168.61 1.78 c p1
+132.91 159.09 1.78 c p1
+144.81 168.61 1.78 c p1
+147.19 173.37 1.78 c p1
+140.05 168.61 1.78 c p1
+128.15 159.09 1.78 c p1
+140.05 161.47 1.78 c p1
+149.57 168.61 1.78 c p1
+140.05 156.71 1.78 c p1
+185.16 113.96 246.84 175.65 cl
+180.40 109.21 251.60 180.40 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+185.16 113.96 m
+61.68 0 l
+0 61.69 l
+-61.68 0 l
+0 -61.69 l
+o
+185.16 113.96 246.84 175.65 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+191.31 118.63 1.78 c p1
+191.31 118.63 1.78 c p1
+190.34 118.63 1.78 c p1
+192.28 118.63 1.78 c p1
+191.31 118.63 1.78 c p1
+194.22 123.39 1.78 c p1
+191.31 121.01 1.78 c p1
+192.28 118.63 1.78 c p1
+191.31 118.63 1.78 c p1
+192.28 116.25 1.78 c p1
+192.28 118.63 1.78 c p1
+193.25 118.63 1.78 c p1
+191.31 116.25 1.78 c p1
+188.41 116.25 1.78 c p1
+189.38 118.63 1.78 c p1
+192.28 123.39 1.78 c p1
+190.34 123.39 1.78 c p1
+191.31 121.01 1.78 c p1
+194.22 121.01 1.78 c p1
+192.28 121.01 1.78 c p1
+194.22 118.63 1.78 c p1
+192.28 123.39 1.78 c p1
+187.44 118.63 1.78 c p1
+194.22 125.77 1.78 c p1
+196.15 118.63 1.78 c p1
+193.25 118.63 1.78 c p1
+193.25 123.39 1.78 c p1
+192.28 118.63 1.78 c p1
+191.31 118.63 1.78 c p1
+193.25 118.63 1.78 c p1
+193.25 118.63 1.78 c p1
+192.28 123.39 1.78 c p1
+192.28 116.25 1.78 c p1
+191.31 118.63 1.78 c p1
+192.28 118.63 1.78 c p1
+189.38 118.63 1.78 c p1
+190.34 118.63 1.78 c p1
+191.31 116.25 1.78 c p1
+190.34 118.63 1.78 c p1
+192.28 118.63 1.78 c p1
+190.34 121.01 1.78 c p1
+190.34 121.01 1.78 c p1
+190.34 118.63 1.78 c p1
+193.25 128.15 1.78 c p1
+196.15 123.39 1.78 c p1
+191.31 121.01 1.78 c p1
+193.25 118.63 1.78 c p1
+191.31 118.63 1.78 c p1
+192.28 118.63 1.78 c p1
+191.31 118.63 1.78 c p1
+223.26 147.19 1.78 c p1
+221.32 149.57 1.78 c p1
+225.20 149.57 1.78 c p1
+216.48 144.81 1.78 c p1
+222.29 149.57 1.78 c p1
+221.32 144.81 1.78 c p1
+223.26 151.95 1.78 c p1
+209.71 137.67 1.78 c p1
+222.29 144.81 1.78 c p1
+215.52 147.19 1.78 c p1
+211.64 137.67 1.78 c p1
+218.42 149.57 1.78 c p1
+216.48 137.67 1.78 c p1
+223.26 147.19 1.78 c p1
+212.61 144.81 1.78 c p1
+220.36 147.19 1.78 c p1
+221.32 149.57 1.78 c p1
+217.45 137.67 1.78 c p1
+221.32 149.57 1.78 c p1
+215.52 140.05 1.78 c p1
+224.23 156.71 1.78 c p1
+216.48 144.81 1.78 c p1
+225.20 149.57 1.78 c p1
+223.26 142.43 1.78 c p1
+219.39 144.81 1.78 c p1
+220.36 147.19 1.78 c p1
+224.23 147.19 1.78 c p1
+226.17 154.33 1.78 c p1
+221.32 149.57 1.78 c p1
+211.64 137.67 1.78 c p1
+214.55 140.05 1.78 c p1
+213.58 137.67 1.78 c p1
+215.52 142.43 1.78 c p1
+227.13 151.95 1.78 c p1
+221.32 149.57 1.78 c p1
+221.32 151.95 1.78 c p1
+223.26 149.57 1.78 c p1
+220.36 144.81 1.78 c p1
+217.45 144.81 1.78 c p1
+216.48 144.81 1.78 c p1
+220.36 142.43 1.78 c p1
+222.29 147.19 1.78 c p1
+216.48 142.43 1.78 c p1
+209.71 137.67 1.78 c p1
+218.42 144.81 1.78 c p1
+218.42 142.43 1.78 c p1
+218.42 144.81 1.78 c p1
+219.39 144.81 1.78 c p1
+206.80 140.05 1.78 c p1
+217.45 144.81 1.78 c p1
+235.85 173.37 1.78 c p1
+227.13 159.09 1.78 c p1
+234.88 163.85 1.78 c p1
+231.97 156.71 1.78 c p1
+233.91 166.23 1.78 c p1
+241.66 163.85 1.78 c p1
+221.32 154.33 1.78 c p1
+238.75 156.71 1.78 c p1
+233.91 156.71 1.78 c p1
+236.81 173.37 1.78 c p1
+227.13 161.47 1.78 c p1
+229.07 159.09 1.78 c p1
+231.01 163.85 1.78 c p1
+226.17 161.47 1.78 c p1
+227.13 170.99 1.78 c p1
+229.07 168.61 1.78 c p1
+231.01 156.71 1.78 c p1
+242.62 166.23 1.78 c p1
+244.56 168.61 1.78 c p1
+226.17 149.57 1.78 c p1
+232.94 168.61 1.78 c p1
+225.20 161.47 1.78 c p1
+242.62 161.47 1.78 c p1
+225.20 156.71 1.78 c p1
+232.94 163.85 1.78 c p1
+235.85 156.71 1.78 c p1
+224.23 156.71 1.78 c p1
+225.20 156.71 1.78 c p1
+231.97 163.85 1.78 c p1
+233.91 151.95 1.78 c p1
+236.81 159.09 1.78 c p1
+239.72 161.47 1.78 c p1
+231.97 166.23 1.78 c p1
+227.13 149.57 1.78 c p1
+231.97 147.19 1.78 c p1
+236.81 168.61 1.78 c p1
+231.97 170.99 1.78 c p1
+231.01 156.71 1.78 c p1
+224.23 156.71 1.78 c p1
+230.04 163.85 1.78 c p1
+231.97 170.99 1.78 c p1
+227.13 168.61 1.78 c p1
+227.13 159.09 1.78 c p1
+234.88 168.61 1.78 c p1
+232.94 173.37 1.78 c p1
+228.10 168.61 1.78 c p1
+226.17 159.09 1.78 c p1
+228.10 161.47 1.78 c p1
+230.04 168.61 1.78 c p1
+227.13 156.71 1.78 c p1
+256.35 113.96 318.04 175.65 cl
+251.60 109.21 322.79 180.40 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+256.35 113.96 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+256.35 113.96 318.04 175.65 cl
+/ps 9 def /Font1 findfont 9 s
+0 setgray
+287.19 141.64 (Petal.Width) .5 0 0 t
+327.54 113.96 389.23 175.65 cl
+322.79 109.21 393.98 180.40 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+327.54 113.96 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+327.54 113.96 389.23 175.65 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 116.25 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 116.25 1.78 c p1
+329.83 116.25 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 125.77 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 116.25 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 116.25 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 128.15 1.78 c p1
+329.83 123.39 1.78 c p1
+329.83 121.01 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+329.83 118.63 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 151.95 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 140.05 1.78 c p1
+358.39 156.71 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 142.43 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 154.33 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 140.05 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 142.43 1.78 c p1
+358.39 151.95 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 151.95 1.78 c p1
+358.39 149.57 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 142.43 1.78 c p1
+358.39 147.19 1.78 c p1
+358.39 142.43 1.78 c p1
+358.39 137.67 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 142.43 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 144.81 1.78 c p1
+358.39 140.05 1.78 c p1
+358.39 144.81 1.78 c p1
+386.95 173.37 1.78 c p1
+386.95 159.09 1.78 c p1
+386.95 163.85 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 166.23 1.78 c p1
+386.95 163.85 1.78 c p1
+386.95 154.33 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 173.37 1.78 c p1
+386.95 161.47 1.78 c p1
+386.95 159.09 1.78 c p1
+386.95 163.85 1.78 c p1
+386.95 161.47 1.78 c p1
+386.95 170.99 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 166.23 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 149.57 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 161.47 1.78 c p1
+386.95 161.47 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 163.85 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 163.85 1.78 c p1
+386.95 151.95 1.78 c p1
+386.95 159.09 1.78 c p1
+386.95 161.47 1.78 c p1
+386.95 166.23 1.78 c p1
+386.95 149.57 1.78 c p1
+386.95 147.19 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 170.99 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 156.71 1.78 c p1
+386.95 163.85 1.78 c p1
+386.95 170.99 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 159.09 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 173.37 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 159.09 1.78 c p1
+386.95 161.47 1.78 c p1
+386.95 168.61 1.78 c p1
+386.95 156.71 1.78 c p1
+42.77 42.77 104.46 104.46 cl
+38.02 38.02 109.21 109.21 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 42.77 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+48.23 42.77 m
+55.53 0 l
+o
+np
+48.23 42.77 m
+0 -4.75 l
+o
+np
+56.16 42.77 m
+0 -4.75 l
+o
+np
+64.09 42.77 m
+0 -4.75 l
+o
+np
+72.03 42.77 m
+0 -4.75 l
+o
+np
+79.96 42.77 m
+0 -4.75 l
+o
+np
+87.89 42.77 m
+0 -4.75 l
+o
+np
+95.83 42.77 m
+0 -4.75 l
+o
+np
+103.76 42.77 m
+0 -4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+48.23 25.66 (4.5) .5 0 0 t
+72.03 25.66 (6.0) .5 0 0 t
+95.83 25.66 (7.5) .5 0 0 t
+42.77 42.77 104.46 104.46 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+57.75 45.05 1.78 c p1
+54.57 45.05 1.78 c p1
+51.40 45.05 1.78 c p1
+49.81 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+62.51 45.05 1.78 c p1
+49.81 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+46.64 45.05 1.78 c p1
+54.57 45.05 1.78 c p1
+62.51 45.05 1.78 c p1
+52.99 45.05 1.78 c p1
+52.99 45.05 1.78 c p1
+45.05 45.05 1.78 c p1
+68.85 45.05 1.78 c p1
+67.27 45.05 1.78 c p1
+62.51 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+67.27 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+62.51 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+49.81 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+52.99 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+59.33 45.05 1.78 c p1
+59.33 45.05 1.78 c p1
+51.40 45.05 1.78 c p1
+52.99 45.05 1.78 c p1
+62.51 45.05 1.78 c p1
+59.33 45.05 1.78 c p1
+64.09 45.05 1.78 c p1
+54.57 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+64.09 45.05 1.78 c p1
+54.57 45.05 1.78 c p1
+46.64 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+48.23 45.05 1.78 c p1
+46.64 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+52.99 45.05 1.78 c p1
+57.75 45.05 1.78 c p1
+49.81 45.05 1.78 c p1
+60.92 45.05 1.78 c p1
+56.16 45.05 1.78 c p1
+87.89 73.61 1.78 c p1
+78.37 73.61 1.78 c p1
+86.31 73.61 1.78 c p1
+64.09 73.61 1.78 c p1
+79.96 73.61 1.78 c p1
+67.27 73.61 1.78 c p1
+76.79 73.61 1.78 c p1
+54.57 73.61 1.78 c p1
+81.55 73.61 1.78 c p1
+59.33 73.61 1.78 c p1
+56.16 73.61 1.78 c p1
+70.44 73.61 1.78 c p1
+72.03 73.61 1.78 c p1
+73.61 73.61 1.78 c p1
+65.68 73.61 1.78 c p1
+83.13 73.61 1.78 c p1
+65.68 73.61 1.78 c p1
+68.85 73.61 1.78 c p1
+75.20 73.61 1.78 c p1
+65.68 73.61 1.78 c p1
+70.44 73.61 1.78 c p1
+73.61 73.61 1.78 c p1
+76.79 73.61 1.78 c p1
+73.61 73.61 1.78 c p1
+78.37 73.61 1.78 c p1
+81.55 73.61 1.78 c p1
+84.72 73.61 1.78 c p1
+83.13 73.61 1.78 c p1
+72.03 73.61 1.78 c p1
+67.27 73.61 1.78 c p1
+64.09 73.61 1.78 c p1
+64.09 73.61 1.78 c p1
+68.85 73.61 1.78 c p1
+72.03 73.61 1.78 c p1
+62.51 73.61 1.78 c p1
+72.03 73.61 1.78 c p1
+83.13 73.61 1.78 c p1
+76.79 73.61 1.78 c p1
+65.68 73.61 1.78 c p1
+64.09 73.61 1.78 c p1
+64.09 73.61 1.78 c p1
+73.61 73.61 1.78 c p1
+68.85 73.61 1.78 c p1
+56.16 73.61 1.78 c p1
+65.68 73.61 1.78 c p1
+67.27 73.61 1.78 c p1
+67.27 73.61 1.78 c p1
+75.20 73.61 1.78 c p1
+57.75 73.61 1.78 c p1
+67.27 73.61 1.78 c p1
+76.79 102.17 1.78 c p1
+68.85 102.17 1.78 c p1
+89.48 102.17 1.78 c p1
+76.79 102.17 1.78 c p1
+79.96 102.17 1.78 c p1
+97.41 102.17 1.78 c p1
+54.57 102.17 1.78 c p1
+92.65 102.17 1.78 c p1
+83.13 102.17 1.78 c p1
+91.07 102.17 1.78 c p1
+79.96 102.17 1.78 c p1
+78.37 102.17 1.78 c p1
+84.72 102.17 1.78 c p1
+67.27 102.17 1.78 c p1
+68.85 102.17 1.78 c p1
+78.37 102.17 1.78 c p1
+79.96 102.17 1.78 c p1
+99.00 102.17 1.78 c p1
+99.00 102.17 1.78 c p1
+72.03 102.17 1.78 c p1
+86.31 102.17 1.78 c p1
+65.68 102.17 1.78 c p1
+99.00 102.17 1.78 c p1
+76.79 102.17 1.78 c p1
+83.13 102.17 1.78 c p1
+91.07 102.17 1.78 c p1
+75.20 102.17 1.78 c p1
+73.61 102.17 1.78 c p1
+78.37 102.17 1.78 c p1
+91.07 102.17 1.78 c p1
+94.24 102.17 1.78 c p1
+102.17 102.17 1.78 c p1
+78.37 102.17 1.78 c p1
+76.79 102.17 1.78 c p1
+73.61 102.17 1.78 c p1
+99.00 102.17 1.78 c p1
+76.79 102.17 1.78 c p1
+78.37 102.17 1.78 c p1
+72.03 102.17 1.78 c p1
+86.31 102.17 1.78 c p1
+83.13 102.17 1.78 c p1
+86.31 102.17 1.78 c p1
+68.85 102.17 1.78 c p1
+84.72 102.17 1.78 c p1
+83.13 102.17 1.78 c p1
+83.13 102.17 1.78 c p1
+76.79 102.17 1.78 c p1
+79.96 102.17 1.78 c p1
+75.20 102.17 1.78 c p1
+70.44 102.17 1.78 c p1
+113.96 42.77 175.65 104.46 cl
+109.21 38.02 180.40 109.21 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+113.96 42.77 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+113.96 42.77 175.65 104.46 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+151.95 45.05 1.78 c p1
+140.05 45.05 1.78 c p1
+144.81 45.05 1.78 c p1
+142.43 45.05 1.78 c p1
+154.33 45.05 1.78 c p1
+161.47 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+137.67 45.05 1.78 c p1
+142.43 45.05 1.78 c p1
+156.71 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+140.05 45.05 1.78 c p1
+140.05 45.05 1.78 c p1
+163.85 45.05 1.78 c p1
+173.37 45.05 1.78 c p1
+161.47 45.05 1.78 c p1
+151.95 45.05 1.78 c p1
+159.09 45.05 1.78 c p1
+159.09 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+156.71 45.05 1.78 c p1
+154.33 45.05 1.78 c p1
+147.19 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+140.05 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+151.95 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+144.81 45.05 1.78 c p1
+142.43 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+166.23 45.05 1.78 c p1
+168.61 45.05 1.78 c p1
+142.43 45.05 1.78 c p1
+144.81 45.05 1.78 c p1
+151.95 45.05 1.78 c p1
+154.33 45.05 1.78 c p1
+140.05 45.05 1.78 c p1
+149.57 45.05 1.78 c p1
+151.95 45.05 1.78 c p1
+123.39 45.05 1.78 c p1
+144.81 45.05 1.78 c p1
+151.95 45.05 1.78 c p1
+159.09 45.05 1.78 c p1
+140.05 45.05 1.78 c p1
+159.09 45.05 1.78 c p1
+144.81 45.05 1.78 c p1
+156.71 45.05 1.78 c p1
+147.19 45.05 1.78 c p1
+144.81 73.61 1.78 c p1
+144.81 73.61 1.78 c p1
+142.43 73.61 1.78 c p1
+123.39 73.61 1.78 c p1
+135.29 73.61 1.78 c p1
+135.29 73.61 1.78 c p1
+147.19 73.61 1.78 c p1
+125.77 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+132.91 73.61 1.78 c p1
+116.25 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+121.01 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+142.43 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+132.91 73.61 1.78 c p1
+121.01 73.61 1.78 c p1
+128.15 73.61 1.78 c p1
+144.81 73.61 1.78 c p1
+135.29 73.61 1.78 c p1
+128.15 73.61 1.78 c p1
+135.29 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+135.29 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+130.53 73.61 1.78 c p1
+125.77 73.61 1.78 c p1
+125.77 73.61 1.78 c p1
+132.91 73.61 1.78 c p1
+132.91 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+149.57 73.61 1.78 c p1
+142.43 73.61 1.78 c p1
+123.39 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+128.15 73.61 1.78 c p1
+130.53 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+130.53 73.61 1.78 c p1
+123.39 73.61 1.78 c p1
+132.91 73.61 1.78 c p1
+140.05 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+137.67 73.61 1.78 c p1
+128.15 73.61 1.78 c p1
+135.29 73.61 1.78 c p1
+147.19 102.17 1.78 c p1
+132.91 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+137.67 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+128.15 102.17 1.78 c p1
+137.67 102.17 1.78 c p1
+128.15 102.17 1.78 c p1
+154.33 102.17 1.78 c p1
+144.81 102.17 1.78 c p1
+132.91 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+128.15 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+144.81 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+159.09 102.17 1.78 c p1
+130.53 102.17 1.78 c p1
+121.01 102.17 1.78 c p1
+144.81 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+132.91 102.17 1.78 c p1
+147.19 102.17 1.78 c p1
+144.81 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+159.09 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+135.29 102.17 1.78 c p1
+130.53 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+149.57 102.17 1.78 c p1
+142.43 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+142.43 102.17 1.78 c p1
+142.43 102.17 1.78 c p1
+142.43 102.17 1.78 c p1
+132.91 102.17 1.78 c p1
+144.81 102.17 1.78 c p1
+147.19 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+128.15 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+149.57 102.17 1.78 c p1
+140.05 102.17 1.78 c p1
+185.16 42.77 246.84 104.46 cl
+180.40 38.02 251.60 109.21 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+185.16 42.77 m
+61.68 0 l
+0 61.69 l
+-61.68 0 l
+0 -61.69 l
+o
+np
+187.44 42.77 m
+58.09 0 l
+o
+np
+187.44 42.77 m
+0 -4.75 l
+o
+np
+197.12 42.77 m
+0 -4.75 l
+o
+np
+206.80 42.77 m
+0 -4.75 l
+o
+np
+216.48 42.77 m
+0 -4.75 l
+o
+np
+226.17 42.77 m
+0 -4.75 l
+o
+np
+235.85 42.77 m
+0 -4.75 l
+o
+np
+245.53 42.77 m
+0 -4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+187.44 25.66 (1) .5 0 0 t
+206.80 25.66 (3) .5 0 0 t
+226.17 25.66 (5) .5 0 0 t
+245.53 25.66 (7) .5 0 0 t
+185.16 42.77 246.84 104.46 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+191.31 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+194.22 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+188.41 45.05 1.78 c p1
+189.38 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+194.22 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+194.22 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+187.44 45.05 1.78 c p1
+194.22 45.05 1.78 c p1
+196.15 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+189.38 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+190.34 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+196.15 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+193.25 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+192.28 45.05 1.78 c p1
+191.31 45.05 1.78 c p1
+223.26 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+225.20 73.61 1.78 c p1
+216.48 73.61 1.78 c p1
+222.29 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+223.26 73.61 1.78 c p1
+209.71 73.61 1.78 c p1
+222.29 73.61 1.78 c p1
+215.52 73.61 1.78 c p1
+211.64 73.61 1.78 c p1
+218.42 73.61 1.78 c p1
+216.48 73.61 1.78 c p1
+223.26 73.61 1.78 c p1
+212.61 73.61 1.78 c p1
+220.36 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+217.45 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+215.52 73.61 1.78 c p1
+224.23 73.61 1.78 c p1
+216.48 73.61 1.78 c p1
+225.20 73.61 1.78 c p1
+223.26 73.61 1.78 c p1
+219.39 73.61 1.78 c p1
+220.36 73.61 1.78 c p1
+224.23 73.61 1.78 c p1
+226.17 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+211.64 73.61 1.78 c p1
+214.55 73.61 1.78 c p1
+213.58 73.61 1.78 c p1
+215.52 73.61 1.78 c p1
+227.13 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+221.32 73.61 1.78 c p1
+223.26 73.61 1.78 c p1
+220.36 73.61 1.78 c p1
+217.45 73.61 1.78 c p1
+216.48 73.61 1.78 c p1
+220.36 73.61 1.78 c p1
+222.29 73.61 1.78 c p1
+216.48 73.61 1.78 c p1
+209.71 73.61 1.78 c p1
+218.42 73.61 1.78 c p1
+218.42 73.61 1.78 c p1
+218.42 73.61 1.78 c p1
+219.39 73.61 1.78 c p1
+206.80 73.61 1.78 c p1
+217.45 73.61 1.78 c p1
+235.85 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+234.88 102.17 1.78 c p1
+231.97 102.17 1.78 c p1
+233.91 102.17 1.78 c p1
+241.66 102.17 1.78 c p1
+221.32 102.17 1.78 c p1
+238.75 102.17 1.78 c p1
+233.91 102.17 1.78 c p1
+236.81 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+229.07 102.17 1.78 c p1
+231.01 102.17 1.78 c p1
+226.17 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+229.07 102.17 1.78 c p1
+231.01 102.17 1.78 c p1
+242.62 102.17 1.78 c p1
+244.56 102.17 1.78 c p1
+226.17 102.17 1.78 c p1
+232.94 102.17 1.78 c p1
+225.20 102.17 1.78 c p1
+242.62 102.17 1.78 c p1
+225.20 102.17 1.78 c p1
+232.94 102.17 1.78 c p1
+235.85 102.17 1.78 c p1
+224.23 102.17 1.78 c p1
+225.20 102.17 1.78 c p1
+231.97 102.17 1.78 c p1
+233.91 102.17 1.78 c p1
+236.81 102.17 1.78 c p1
+239.72 102.17 1.78 c p1
+231.97 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+231.97 102.17 1.78 c p1
+236.81 102.17 1.78 c p1
+231.97 102.17 1.78 c p1
+231.01 102.17 1.78 c p1
+224.23 102.17 1.78 c p1
+230.04 102.17 1.78 c p1
+231.97 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+234.88 102.17 1.78 c p1
+232.94 102.17 1.78 c p1
+228.10 102.17 1.78 c p1
+226.17 102.17 1.78 c p1
+228.10 102.17 1.78 c p1
+230.04 102.17 1.78 c p1
+227.13 102.17 1.78 c p1
+256.35 42.77 318.04 104.46 cl
+251.60 38.02 322.79 109.21 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+256.35 42.77 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+256.35 42.77 318.04 104.46 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+258.63 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+258.63 45.05 1.78 c p1
+258.63 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+268.15 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+258.63 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+258.63 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+270.53 45.05 1.78 c p1
+265.77 45.05 1.78 c p1
+263.39 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+261.01 45.05 1.78 c p1
+289.57 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+294.33 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+289.57 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+289.57 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+289.57 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+282.43 73.61 1.78 c p1
+299.09 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+284.81 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+289.57 73.61 1.78 c p1
+289.57 73.61 1.78 c p1
+296.71 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+282.43 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+284.81 73.61 1.78 c p1
+294.33 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+294.33 73.61 1.78 c p1
+291.95 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+284.81 73.61 1.78 c p1
+289.57 73.61 1.78 c p1
+284.81 73.61 1.78 c p1
+280.05 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+284.81 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+282.43 73.61 1.78 c p1
+287.19 73.61 1.78 c p1
+315.75 102.17 1.78 c p1
+301.47 102.17 1.78 c p1
+306.23 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+308.61 102.17 1.78 c p1
+306.23 102.17 1.78 c p1
+296.71 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+315.75 102.17 1.78 c p1
+303.85 102.17 1.78 c p1
+301.47 102.17 1.78 c p1
+306.23 102.17 1.78 c p1
+303.85 102.17 1.78 c p1
+313.37 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+308.61 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+291.95 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+303.85 102.17 1.78 c p1
+303.85 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+306.23 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+306.23 102.17 1.78 c p1
+294.33 102.17 1.78 c p1
+301.47 102.17 1.78 c p1
+303.85 102.17 1.78 c p1
+308.61 102.17 1.78 c p1
+291.95 102.17 1.78 c p1
+289.57 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+313.37 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+306.23 102.17 1.78 c p1
+313.37 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+301.47 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+315.75 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+301.47 102.17 1.78 c p1
+303.85 102.17 1.78 c p1
+310.99 102.17 1.78 c p1
+299.09 102.17 1.78 c p1
+327.54 42.77 389.23 104.46 cl
+322.79 38.02 393.98 109.21 cl
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+327.54 42.77 m
+61.69 0 l
+0 61.69 l
+-61.69 0 l
+0 -61.69 l
+o
+np
+329.83 42.77 m
+57.12 0 l
+o
+np
+329.83 42.77 m
+0 -4.75 l
+o
+np
+344.11 42.77 m
+0 -4.75 l
+o
+np
+358.39 42.77 m
+0 -4.75 l
+o
+np
+372.67 42.77 m
+0 -4.75 l
+o
+np
+386.95 42.77 m
+0 -4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+329.83 25.66 (1.0) .5 0 0 t
+358.39 25.66 (2.0) .5 0 0 t
+386.95 25.66 (3.0) .5 0 0 t
+np
+389.23 45.05 m
+0 57.12 l
+o
+np
+389.23 45.05 m
+4.75 0 l
+o
+np
+389.23 59.33 m
+4.75 0 l
+o
+np
+389.23 73.61 m
+4.75 0 l
+o
+np
+389.23 87.89 m
+4.75 0 l
+o
+np
+389.23 102.17 m
+4.75 0 l
+o
+406.34 45.05 (1.0) .5 0 90 t
+406.34 73.61 (2.0) .5 0 90 t
+406.34 102.17 (3.0) .5 0 90 t
+327.54 42.77 389.23 104.46 cl
+/ps 9 def /Font1 findfont 9 s
+0 setgray
+358.39 71.23 (Species) .5 0 0 t
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/Sweave-test-1-006.pdf b/inst/Sweave-test-1-006.pdf
new file mode 100644
index 0000000..2071b58
--- /dev/null
+++ b/inst/Sweave-test-1-006.pdf
@@ -0,0 +1,3810 @@
+%PDF-1.1
+%���ρ�\r
+1 0 obj
+<<
+/CreationDate (D:20070820105052)
+/ModDate (D:20070820105052)
+/Title (R Graphics Output)
+/Producer (R 2.5.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 38.02 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 327.54 m
+104.46 327.54 l
+104.46 389.23 l
+42.77 389.23 l
+42.77 327.54 l
+S
+Q q 42.77 327.54 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 47.09 356.06 Tm (Sepal.Length) Tj
+ET
+Q q 113.96 327.54 61.69 61.69 re W n
+Q q 109.21 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 327.54 m
+175.65 327.54 l
+175.65 389.23 l
+113.96 389.23 l
+113.96 327.54 l
+S
+116.25 389.23 m 163.85 389.23 l S
+116.25 389.23 m 116.25 393.98 l S
+128.15 389.23 m 128.15 393.98 l S
+140.05 389.23 m 140.05 393.98 l S
+151.95 389.23 m 151.95 393.98 l S
+163.85 389.23 m 163.85 393.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 110.69 400.64 Tm (2.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 134.49 400.64 Tm (3.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 158.29 400.64 Tm (4.0) Tj
+ET
+Q q 113.96 327.54 61.69 61.69 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 149.99 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 327.54 61.69 61.69 re W n
+Q q 180.40 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 327.54 m
+246.84 327.54 l
+246.84 389.23 l
+185.16 389.23 l
+185.16 327.54 l
+S
+Q q 185.16 327.54 61.69 61.69 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 189.36 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 327.54 61.69 61.69 re W n
+Q q 251.60 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 327.54 m
+318.04 327.54 l
+318.04 389.23 l
+256.35 389.23 l
+256.35 327.54 l
+S
+268.15 389.23 m 315.75 389.23 l S
+268.15 389.23 m 268.15 393.98 l S
+280.05 389.23 m 280.05 393.98 l S
+291.95 389.23 m 291.95 393.98 l S
+303.85 389.23 m 303.85 393.98 l S
+315.75 389.23 m 315.75 393.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 262.59 400.64 Tm (0.5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 286.39 400.64 Tm (1.5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 310.19 400.64 Tm (2.5) Tj
+ET
+Q q 256.35 327.54 61.69 61.69 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 259.06 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 327.54 61.69 61.69 re W n
+Q q 322.79 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 327.54 m
+389.23 327.54 l
+389.23 389.23 l
+327.54 389.23 l
+327.54 327.54 l
+S
+389.23 333.00 m 389.23 388.53 l S
+389.23 333.00 m 393.98 333.00 l S
+389.23 340.93 m 393.98 340.93 l S
+389.23 348.87 m 393.98 348.87 l S
+389.23 356.80 m 393.98 356.80 l S
+389.23 364.73 m 393.98 364.73 l S
+389.23 372.67 m 393.98 372.67 l S
+389.23 380.60 m 393.98 380.60 l S
+389.23 388.53 m 393.98 388.53 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 327.44 Tm (4.5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 351.24 Tm (6.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 375.04 Tm (7.5) Tj
+ET
+Q q 327.54 327.54 61.69 61.69 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 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 256.35 61.69 61.69 re W n
+Q q 38.02 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 256.35 m
+104.46 256.35 l
+104.46 318.04 l
+42.77 318.04 l
+42.77 256.35 l
+S
+42.77 258.63 m 42.77 306.23 l S
+42.77 258.63 m 38.02 258.63 l S
+42.77 270.53 m 38.02 270.53 l S
+42.77 282.43 m 38.02 282.43 l S
+42.77 294.33 m 38.02 294.33 l S
+42.77 306.23 m 38.02 306.23 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 253.07 Tm (2.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 276.87 Tm (3.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 300.67 Tm (4.0) Tj
+ET
+Q q 42.77 256.35 61.69 61.69 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 55.79 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 256.35 61.69 61.69 re W n
+Q q 109.21 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 256.35 m
+175.65 256.35 l
+175.65 318.04 l
+113.96 318.04 l
+113.96 256.35 l
+S
+Q q 113.96 256.35 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 120.55 284.81 Tm (Sepal.Width) Tj
+ET
+Q q 185.16 256.35 61.69 61.69 re W n
+Q q 180.40 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 256.35 m
+246.84 256.35 l
+246.84 318.04 l
+185.16 318.04 l
+185.16 256.35 l
+S
+Q q 185.16 256.35 61.69 61.69 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 189.36 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 256.35 61.69 61.69 re W n
+Q q 251.60 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 256.35 m
+318.04 256.35 l
+318.04 318.04 l
+256.35 318.04 l
+256.35 256.35 l
+S
+Q q 256.35 256.35 61.69 61.69 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 259.06 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 256.35 61.69 61.69 re W n
+Q q 322.79 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 256.35 m
+389.23 256.35 l
+389.23 318.04 l
+327.54 318.04 l
+327.54 256.35 l
+S
+Q q 327.54 256.35 61.69 61.69 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 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 185.16 61.69 61.69 re W n
+Q q 38.02 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 185.16 m
+104.46 185.16 l
+104.46 246.84 l
+42.77 246.84 l
+42.77 185.16 l
+S
+Q q 42.77 185.16 61.69 61.69 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 55.79 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 185.16 61.69 61.69 re W n
+Q q 109.21 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 185.16 m
+175.65 185.16 l
+175.65 246.84 l
+113.96 246.84 l
+113.96 185.16 l
+S
+Q q 113.96 185.16 61.69 61.69 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 149.99 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 185.16 61.69 61.69 re W n
+Q q 180.40 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 185.16 m
+246.84 185.16 l
+246.84 246.84 l
+185.16 246.84 l
+185.16 185.16 l
+S
+Q q 185.16 185.16 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 190.96 213.76 Tm (Petal.Length) Tj
+ET
+Q q 256.35 185.16 61.69 61.69 re W n
+Q q 251.60 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 185.16 m
+318.04 185.16 l
+318.04 246.84 l
+256.35 246.84 l
+256.35 185.16 l
+S
+Q q 256.35 185.16 61.69 61.69 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 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 185.16 61.69 61.69 re W n
+Q q 322.79 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 185.16 m
+389.23 185.16 l
+389.23 246.84 l
+327.54 246.84 l
+327.54 185.16 l
+S
+389.23 187.44 m 389.23 245.53 l S
+389.23 187.44 m 393.98 187.44 l S
+389.23 197.12 m 393.98 197.12 l S
+389.23 206.80 m 393.98 206.80 l S
+389.23 216.48 m 393.98 216.48 l S
+389.23 226.17 m 393.98 226.17 l S
+389.23 235.85 m 393.98 235.85 l S
+389.23 245.53 m 393.98 245.53 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 185.22 Tm (1) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 204.58 Tm (3) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 223.94 Tm (5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 243.30 Tm (7) Tj
+ET
+Q q 327.54 185.16 61.69 61.69 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 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 113.96 61.69 61.69 re W n
+Q q 38.02 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 113.96 m
+104.46 113.96 l
+104.46 175.65 l
+42.77 175.65 l
+42.77 113.96 l
+S
+42.77 125.77 m 42.77 173.37 l S
+42.77 125.77 m 38.02 125.77 l S
+42.77 137.67 m 38.02 137.67 l S
+42.77 149.57 m 38.02 149.57 l S
+42.77 161.47 m 38.02 161.47 l S
+42.77 173.37 m 38.02 173.37 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 120.21 Tm (0.5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 144.01 Tm (1.5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 167.81 Tm (2.5) Tj
+ET
+Q q 42.77 113.96 61.69 61.69 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 55.79 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 113.96 61.69 61.69 re W n
+Q q 109.21 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 113.96 m
+175.65 113.96 l
+175.65 175.65 l
+113.96 175.65 l
+113.96 113.96 l
+S
+Q q 113.96 113.96 61.69 61.69 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 149.99 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 113.96 61.69 61.69 re W n
+Q q 180.40 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 113.96 m
+246.84 113.96 l
+246.84 175.65 l
+185.16 175.65 l
+185.16 113.96 l
+S
+Q q 185.16 113.96 61.69 61.69 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 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 113.96 61.69 61.69 re W n
+Q q 251.60 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 113.96 m
+318.04 113.96 l
+318.04 175.65 l
+256.35 175.65 l
+256.35 113.96 l
+S
+Q q 256.35 113.96 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 264.41 141.64 Tm (Petal.Width) Tj
+ET
+Q q 327.54 113.96 61.69 61.69 re W n
+Q q 322.79 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 113.96 m
+389.23 113.96 l
+389.23 175.65 l
+327.54 175.65 l
+327.54 113.96 l
+S
+Q q 327.54 113.96 61.69 61.69 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 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 42.77 61.69 61.69 re W n
+Q q 38.02 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 42.77 m
+104.46 42.77 l
+104.46 104.46 l
+42.77 104.46 l
+42.77 42.77 l
+S
+48.23 42.77 m 103.76 42.77 l S
+48.23 42.77 m 48.23 38.02 l S
+56.16 42.77 m 56.16 38.02 l S
+64.09 42.77 m 64.09 38.02 l S
+72.03 42.77 m 72.03 38.02 l S
+79.96 42.77 m 79.96 38.02 l S
+87.89 42.77 m 87.89 38.02 l S
+95.83 42.77 m 95.83 38.02 l S
+103.76 42.77 m 103.76 38.02 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 42.67 25.66 Tm (4.5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 66.47 25.66 Tm (6.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 90.27 25.66 Tm (7.5) Tj
+ET
+Q q 42.77 42.77 61.69 61.69 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 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 42.77 61.69 61.69 re W n
+Q q 109.21 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 42.77 m
+175.65 42.77 l
+175.65 104.46 l
+113.96 104.46 l
+113.96 42.77 l
+S
+Q q 113.96 42.77 61.69 61.69 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 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 42.77 61.69 61.69 re W n
+Q q 180.40 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 42.77 m
+246.84 42.77 l
+246.84 104.46 l
+185.16 104.46 l
+185.16 42.77 l
+S
+187.44 42.77 m 245.53 42.77 l S
+187.44 42.77 m 187.44 38.02 l S
+197.12 42.77 m 197.12 38.02 l S
+206.80 42.77 m 206.80 38.02 l S
+216.48 42.77 m 216.48 38.02 l S
+226.17 42.77 m 226.17 38.02 l S
+235.85 42.77 m 235.85 38.02 l S
+245.53 42.77 m 245.53 38.02 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 185.22 25.66 Tm (1) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 204.58 25.66 Tm (3) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 223.94 25.66 Tm (5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 243.30 25.66 Tm (7) Tj
+ET
+Q q 185.16 42.77 61.69 61.69 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 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 42.77 61.69 61.69 re W n
+Q q 251.60 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 42.77 m
+318.04 42.77 l
+318.04 104.46 l
+256.35 104.46 l
+256.35 42.77 l
+S
+Q q 256.35 42.77 61.69 61.69 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 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 42.77 61.69 61.69 re W n
+Q q 322.79 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 42.77 m
+389.23 42.77 l
+389.23 104.46 l
+327.54 104.46 l
+327.54 42.77 l
+S
+329.83 42.77 m 386.95 42.77 l S
+329.83 42.77 m 329.83 38.02 l S
+344.11 42.77 m 344.11 38.02 l S
+358.39 42.77 m 358.39 38.02 l S
+372.67 42.77 m 372.67 38.02 l S
+386.95 42.77 m 386.95 38.02 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 324.27 25.66 Tm (1.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 352.83 25.66 Tm (2.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 381.39 25.66 Tm (3.0) Tj
+ET
+389.23 45.05 m 389.23 102.17 l S
+389.23 45.05 m 393.98 45.05 l S
+389.23 59.33 m 393.98 59.33 l S
+389.23 73.61 m 393.98 73.61 l S
+389.23 87.89 m 393.98 87.89 l S
+389.23 102.17 m 393.98 102.17 l S
+BT
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 39.49 Tm (1.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 68.05 Tm (2.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 96.61 Tm (3.0) Tj
+ET
+Q q 327.54 42.77 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 342.38 71.23 Tm (Species) Tj
+ET
+Q
+endstream
+endobj
+8 0 obj
+181992
+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 >>
+/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
+xref
+0 11
+0000000000 65535 f 
+0000000021 00000 n 
+0000000163 00000 n 
+0000182442 00000 n 
+0000182525 00000 n 
+0000000212 00000 n 
+0000000295 00000 n 
+0000000375 00000 n 
+0000182420 00000 n 
+0000182618 00000 n 
+0000182875 00000 n 
+trailer
+<<
+/Size 11
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+182972
+%%EOF
diff --git a/inst/Sweave-test-1-007.eps b/inst/Sweave-test-1-007.eps
new file mode 100644
index 0000000..9c79ad6
--- /dev/null
+++ b/inst/Sweave-test-1-007.eps
@@ -0,0 +1,316 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 432 432 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 432 432
+%%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 fill grestore newpath } def
+/p3  { gsave bg 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
+59.04 73.44 401.76 372.96 cl
+0 setgray
+2.25 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+82.31 138.46 m
+84.62 0 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+124.62 84.53 m
+0 38.52 l
+o
+np
+124.62 200.09 m
+0 -46.22 l
+o
+0.75 setlinewidth
+[] 0 setdash
+np
+103.47 84.53 m
+42.31 0 l
+o
+np
+103.47 200.09 m
+42.31 0 l
+o
+np
+103.47 84.53 m
+42.31 0 l
+o
+np
+103.47 200.09 m
+42.31 0 l
+o
+np
+103.47 84.53 m
+42.31 0 l
+o
+np
+103.47 200.09 m
+42.31 0 l
+o
+np
+82.31 123.05 m
+84.62 0 l
+0 30.82 l
+-84.62 0 l
+0 -30.82 l
+o
+2.25 setlinewidth
+[] 0 setdash
+np
+188.09 207.79 m
+84.62 0 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+230.40 130.76 m
+0 53.92 l
+o
+np
+230.40 292.53 m
+0 -53.92 l
+o
+0.75 setlinewidth
+[] 0 setdash
+np
+209.24 130.76 m
+42.32 0 l
+o
+np
+209.24 292.53 m
+42.32 0 l
+o
+np
+209.24 130.76 m
+42.32 0 l
+o
+np
+209.24 292.53 m
+42.32 0 l
+o
+np
+209.24 130.76 m
+42.32 0 l
+o
+np
+209.24 292.53 m
+42.32 0 l
+o
+np
+188.09 184.68 m
+84.62 0 l
+0 53.93 l
+-84.62 0 l
+0 -53.93 l
+o
+2.25 setlinewidth
+[] 0 setdash
+np
+293.87 254.01 m
+84.62 0 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+336.18 184.68 m
+0 46.22 l
+o
+np
+336.18 361.87 m
+0 -77.04 l
+o
+0.75 setlinewidth
+[] 0 setdash
+np
+315.02 184.68 m
+42.31 0 l
+o
+np
+315.02 361.87 m
+42.31 0 l
+o
+np
+315.02 184.68 m
+42.31 0 l
+o
+np
+315.02 361.87 m
+42.31 0 l
+o
+np
+315.02 184.68 m
+42.31 0 l
+o
+np
+315.02 361.87 m
+42.31 0 l
+o
+np
+293.87 230.90 m
+84.62 0 l
+0 53.93 l
+-84.62 0 l
+0 -53.93 l
+o
+336.18 130.76 2.70 c p1
+0.00 0.00 432.00 432.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+124.62 73.44 m
+211.56 0 l
+o
+np
+124.62 73.44 m
+0 -7.20 l
+o
+np
+230.40 73.44 m
+0 -7.20 l
+o
+np
+336.18 73.44 m
+0 -7.20 l
+o
+/ps 12 def /Font1 findfont 12 s
+124.62 47.52 (setosa) .5 0 0 t
+230.40 47.52 (versicolor) .5 0 0 t
+336.18 47.52 (virginica) .5 0 0 t
+np
+59.04 99.94 m
+0 269.63 l
+o
+np
+59.04 99.94 m
+-7.20 0 l
+o
+np
+59.04 138.46 m
+-7.20 0 l
+o
+np
+59.04 176.98 m
+-7.20 0 l
+o
+np
+59.04 215.50 m
+-7.20 0 l
+o
+np
+59.04 254.01 m
+-7.20 0 l
+o
+np
+59.04 292.53 m
+-7.20 0 l
+o
+np
+59.04 331.05 m
+-7.20 0 l
+o
+np
+59.04 369.57 m
+-7.20 0 l
+o
+41.76 99.94 (4.5) .5 0 90 t
+41.76 138.46 (5.0) .5 0 90 t
+41.76 176.98 (5.5) .5 0 90 t
+41.76 215.50 (6.0) .5 0 90 t
+41.76 254.01 (6.5) .5 0 90 t
+41.76 292.53 (7.0) .5 0 90 t
+41.76 331.05 (7.5) .5 0 90 t
+41.76 369.57 (8.0) .5 0 90 t
+np
+59.04 73.44 m
+342.72 0 l
+0 299.52 l
+-342.72 0 l
+0 -299.52 l
+o
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/Sweave-test-1-007.pdf b/inst/Sweave-test-1-007.pdf
new file mode 100644
index 0000000..46d2b2a
--- /dev/null
+++ b/inst/Sweave-test-1-007.pdf
@@ -0,0 +1,213 @@
+%PDF-1.1
+%���ρ�\r
+1 0 obj
+<<
+/CreationDate (D:20070820105052)
+/ModDate (D:20070820105052)
+/Title (R Graphics Output)
+/Producer (R 2.5.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 59.04 73.44 342.72 299.52 re W n
+0.000 0.000 0.000 RG
+2.25 w
+[] 0 d
+1 J
+1 j
+10.00 M
+82.31 138.46 m 166.93 138.46 l S
+0.75 w
+[ 3.00 5.00] 0 d
+124.62 84.53 m 124.62 123.05 l S
+124.62 200.09 m 124.62 153.87 l S
+0.75 w
+[] 0 d
+103.47 84.53 m 145.78 84.53 l S
+103.47 200.09 m 145.78 200.09 l S
+103.47 84.53 m 145.78 84.53 l S
+103.47 200.09 m 145.78 200.09 l S
+103.47 84.53 m 145.78 84.53 l S
+103.47 200.09 m 145.78 200.09 l S
+82.31 123.05 m
+166.93 123.05 l
+166.93 153.87 l
+82.31 153.87 l
+82.31 123.05 l
+S
+2.25 w
+[] 0 d
+188.09 207.79 m 272.71 207.79 l S
+0.75 w
+[ 3.00 5.00] 0 d
+230.40 130.76 m 230.40 184.68 l S
+230.40 292.53 m 230.40 238.61 l S
+0.75 w
+[] 0 d
+209.24 130.76 m 251.56 130.76 l S
+209.24 292.53 m 251.56 292.53 l S
+209.24 130.76 m 251.56 130.76 l S
+209.24 292.53 m 251.56 292.53 l S
+209.24 130.76 m 251.56 130.76 l S
+209.24 292.53 m 251.56 292.53 l S
+188.09 184.68 m
+272.71 184.68 l
+272.71 238.61 l
+188.09 238.61 l
+188.09 184.68 l
+S
+2.25 w
+[] 0 d
+293.87 254.01 m 378.49 254.01 l S
+0.75 w
+[ 3.00 5.00] 0 d
+336.18 184.68 m 336.18 230.90 l S
+336.18 361.87 m 336.18 284.83 l S
+0.75 w
+[] 0 d
+315.02 184.68 m 357.33 184.68 l S
+315.02 361.87 m 357.33 361.87 l S
+315.02 184.68 m 357.33 184.68 l S
+315.02 361.87 m 357.33 361.87 l S
+315.02 184.68 m 357.33 184.68 l S
+315.02 361.87 m 357.33 361.87 l S
+293.87 230.90 m
+378.49 230.90 l
+378.49 284.83 l
+293.87 284.83 l
+293.87 230.90 l
+S
+BT
+/F1 1 Tf 1 Tr 7.48 0 0 7.48 333.22 128.16 Tm (l) Tj 0 Tr
+ET
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+124.62 73.44 m 336.18 73.44 l S
+124.62 73.44 m 124.62 66.24 l S
+230.40 73.44 m 230.40 66.24 l S
+336.18 73.44 m 336.18 66.24 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 12.00 0.00 -0.00 12.00 106.95 47.52 Tm (setosa) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 204.88 47.52 Tm (versicolor) Tj
+/F2 1 Tf 12.00 0.00 -0.00 12.00 314.18 47.52 Tm (virginica) Tj
+ET
+59.04 99.94 m 59.04 369.57 l S
+59.04 99.94 m 51.84 99.94 l S
+59.04 138.46 m 51.84 138.46 l S
+59.04 176.98 m 51.84 176.98 l S
+59.04 215.50 m 51.84 215.50 l S
+59.04 254.01 m 51.84 254.01 l S
+59.04 292.53 m 51.84 292.53 l S
+59.04 331.05 m 51.84 331.05 l S
+59.04 369.57 m 51.84 369.57 l S
+BT
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 91.60 Tm (4.5) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 130.12 Tm (5.0) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 168.64 Tm (5.5) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 207.16 Tm (6.0) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 245.67 Tm (6.5) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 284.19 Tm (7.0) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 322.71 Tm (7.5) Tj
+/F2 1 Tf 0.00 12.00 -12.00 0.00 41.76 361.23 Tm (8.0) Tj
+ET
+59.04 73.44 m
+401.76 73.44 l
+401.76 372.96 l
+59.04 372.96 l
+59.04 73.44 l
+S
+Q
+endstream
+endobj
+8 0 obj
+2669
+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 >>
+/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
+xref
+0 11
+0000000000 65535 f 
+0000000021 00000 n 
+0000000163 00000 n 
+0000003117 00000 n 
+0000003200 00000 n 
+0000000212 00000 n 
+0000000295 00000 n 
+0000000375 00000 n 
+0000003097 00000 n 
+0000003293 00000 n 
+0000003550 00000 n 
+trailer
+<<
+/Size 11
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+3647
+%%EOF
diff --git a/inst/Sweave-test-1.aux b/inst/Sweave-test-1.aux
new file mode 100644
index 0000000..a1b16b4
--- /dev/null
+++ b/inst/Sweave-test-1.aux
@@ -0,0 +1,3 @@
+\relax 
+\@writefile{lof}{\contentsline {figure}{\numberline {1}{\ignorespaces Pairs plot of the iris data.}}{2}}
+\@writefile{lof}{\contentsline {figure}{\numberline {2}{\ignorespaces Boxplot of sepal length grouped by species.}}{3}}
diff --git a/inst/Sweave-test-1.dvi b/inst/Sweave-test-1.dvi
new file mode 100644
index 0000000..47da025
Binary files /dev/null and b/inst/Sweave-test-1.dvi differ
diff --git a/inst/Sweave-test-1.log b/inst/Sweave-test-1.log
new file mode 100644
index 0000000..9332fe9
--- /dev/null
+++ b/inst/Sweave-test-1.log
@@ -0,0 +1,226 @@
+This is pdfeTeX, Version 3.141592-1.30.5-2.2 (Web2C 7.5.5) (format=latex 2007.3.24)  20 AUG 2007 11:42
+entering extended mode
+**Sweave-test-1
+(./Sweave-test-1.tex
+LaTeX2e <2003/12/01>
+Babel <v3.8g> and hyphenation patterns for english, usenglishmax, dumylang, noh
+yphenation, croatian, ukrainian, russian, bulgarian, czech, slovak, danish, dut
+ch, finnish, french, basque, german, ngerman, greek, monogreek, ancientgreek, i
+bycus, hungarian, italian, latin, mongolian, norsk, slovene, estonian, welsh, i
+nterlingua, icelandic, uppersorbian, romanian, indonesian, coptic, turkish, ser
+bian, polish, portuguese, spanish, catalan, swedish, ukenglish, loaded.
+(/usr/share/texmf-texlive/tex/latex/base/article.cls
+Document Class: article 2004/02/16 v1.4f Standard LaTeX document class
+(/usr/share/texmf-texlive/tex/latex/base/size10.clo
+File: size10.clo 2004/02/16 v1.4f Standard LaTeX file (size option)
+)
+\c at part=\count79
+\c at section=\count80
+\c at subsection=\count81
+\c at subsubsection=\count82
+\c at paragraph=\count83
+\c at subparagraph=\count84
+\c at figure=\count85
+\c at table=\count86
+\abovecaptionskip=\skip41
+\belowcaptionskip=\skip42
+\bibindent=\dimen102
+)
+(/usr/share/texmf-texlive/tex/latex/ltxmisc/a4wide.sty
+Package: a4wide 1994/08/30
+
+(/usr/share/texmf-texlive/tex/latex/ntgclass/a4.sty
+Package: a4 2004/04/15 v1.2g A4 based page layout
+))
+(/usr/share/R/share/texmf/Sweave.sty
+
+LaTeX Warning: You have requested package `/usr/share/R/share/texmf/Sweave',
+               but the package provides `Sweave'.
+
+Package: Sweave 
+(/usr/share/texmf-texlive/tex/latex/base/ifthen.sty
+Package: ifthen 2001/05/26 v1.1c Standard LaTeX ifthen package (DPC)
+)
+(/usr/share/texmf-texlive/tex/latex/graphics/graphicx.sty
+Package: graphicx 1999/02/16 v1.0f Enhanced LaTeX Graphics (DPC,SPQR)
+
+(/usr/share/texmf-texlive/tex/latex/graphics/keyval.sty
+Package: keyval 1999/03/16 v1.13 key=value parser (DPC)
+\KV at toks@=\toks14
+)
+(/usr/share/texmf-texlive/tex/latex/graphics/graphics.sty
+Package: graphics 2001/07/07 v1.0n Standard LaTeX Graphics (DPC,SPQR)
+
+(/usr/share/texmf-texlive/tex/latex/graphics/trig.sty
+Package: trig 1999/03/16 v1.09 sin cos tan (DPC)
+)
+(/usr/share/texmf-texlive/tex/latex/config/graphics.cfg
+File: graphics.cfg 2001/08/31 v1.1 graphics configuration of teTeX/TeXLive
+)
+Package graphics Info: Driver file: dvips.def on input line 80.
+
+(/usr/share/texmf-texlive/tex/latex/graphics/dvips.def
+File: dvips.def 1999/02/16 v3.0i Driver-dependant file (DPC,SPQR)
+))
+\Gin at req@height=\dimen103
+\Gin at req@width=\dimen104
+)
+(/usr/share/texmf-texlive/tex/latex/fancyvrb/fancyvrb.sty
+Package: fancyvrb 1998/07/17
+
+Style option: `fancyvrb' v2.6, with DG/SPQR fixes <1998/07/17> (tvz)
+\FV at CodeLineNo=\count87
+\FV at InFile=\read1
+\FV at TabBox=\box26
+\c at FancyVerbLine=\count88
+\FV at StepNumber=\count89
+\FV at OutFile=\write3
+
+No file fancyvrb.cfg.
+) (/usr/share/texmf/tex/latex/R/upquote.sty
+Package: upquote 2003/08/11 v1.1 Covington's upright-quote modification to verb
+atim and verb
+
+(/usr/share/texmf-texlive/tex/latex/base/textcomp.sty
+Package: textcomp 2004/02/22 v1.99f Standard LaTeX package
+Package textcomp Info: Sub-encoding information:
+(textcomp)               5 = only ISO-Adobe without \textcurrency
+(textcomp)               4 = 5 + \texteuro
+(textcomp)               3 = 4 + \textohm
+(textcomp)               2 = 3 + \textestimated + \textcurrency
+(textcomp)               1 = TS1 - \textcircled - \t
+(textcomp)               0 = TS1 (full)
+(textcomp)             Font families with sub-encoding setting implement
+(textcomp)             only a restricted character set as indicated.
+(textcomp)             Family '?' is the default used for unknown fonts.
+(textcomp)             See the documentation for details.
+Package textcomp Info: Setting ? sub-encoding to TS1/1 on input line 71.
+
+(/usr/share/texmf-texlive/tex/latex/base/ts1enc.def
+File: ts1enc.def 2001/06/05 v3.0e (jk/car/fm) Standard LaTeX file
+)
+LaTeX Info: Redefining \oldstylenums on input line 266.
+Package textcomp Info: Setting cmr sub-encoding to TS1/0 on input line 281.
+Package textcomp Info: Setting cmss sub-encoding to TS1/0 on input line 282.
+Package textcomp Info: Setting cmtt sub-encoding to TS1/0 on input line 283.
+Package textcomp Info: Setting cmvtt sub-encoding to TS1/0 on input line 284.
+Package textcomp Info: Setting cmbr sub-encoding to TS1/0 on input line 285.
+Package textcomp Info: Setting cmtl sub-encoding to TS1/0 on input line 286.
+Package textcomp Info: Setting ccr sub-encoding to TS1/0 on input line 287.
+Package textcomp Info: Setting ptm sub-encoding to TS1/4 on input line 288.
+Package textcomp Info: Setting pcr sub-encoding to TS1/4 on input line 289.
+Package textcomp Info: Setting phv sub-encoding to TS1/4 on input line 290.
+Package textcomp Info: Setting ppl sub-encoding to TS1/3 on input line 291.
+Package textcomp Info: Setting pag sub-encoding to TS1/4 on input line 292.
+Package textcomp Info: Setting pbk sub-encoding to TS1/4 on input line 293.
+Package textcomp Info: Setting pnc sub-encoding to TS1/4 on input line 294.
+Package textcomp Info: Setting pzc sub-encoding to TS1/4 on input line 295.
+Package textcomp Info: Setting bch sub-encoding to TS1/4 on input line 296.
+Package textcomp Info: Setting put sub-encoding to TS1/5 on input line 297.
+Package textcomp Info: Setting uag sub-encoding to TS1/5 on input line 298.
+Package textcomp Info: Setting ugq sub-encoding to TS1/5 on input line 299.
+Package textcomp Info: Setting ul8 sub-encoding to TS1/4 on input line 300.
+Package textcomp Info: Setting ul9 sub-encoding to TS1/4 on input line 301.
+Package textcomp Info: Setting augie sub-encoding to TS1/5 on input line 302.
+Package textcomp Info: Setting dayrom sub-encoding to TS1/3 on input line 303.
+Package textcomp Info: Setting dayroms sub-encoding to TS1/3 on input line 304.
+
+Package textcomp Info: Setting pxr sub-encoding to TS1/0 on input line 305.
+Package textcomp Info: Setting pxss sub-encoding to TS1/0 on input line 306.
+Package textcomp Info: Setting pxtt sub-encoding to TS1/0 on input line 307.
+Package textcomp Info: Setting txr sub-encoding to TS1/0 on input line 308.
+Package textcomp Info: Setting txss sub-encoding to TS1/0 on input line 309.
+Package textcomp Info: Setting txtt sub-encoding to TS1/0 on input line 310.
+Package textcomp Info: Setting futs sub-encoding to TS1/4 on input line 311.
+Package textcomp Info: Setting futx sub-encoding to TS1/4 on input line 312.
+Package textcomp Info: Setting futj sub-encoding to TS1/4 on input line 313.
+Package textcomp Info: Setting hlh sub-encoding to TS1/3 on input line 314.
+Package textcomp Info: Setting hls sub-encoding to TS1/3 on input line 315.
+Package textcomp Info: Setting hlst sub-encoding to TS1/3 on input line 316.
+Package textcomp Info: Setting hlct sub-encoding to TS1/5 on input line 317.
+Package textcomp Info: Setting hlx sub-encoding to TS1/5 on input line 318.
+Package textcomp Info: Setting hlce sub-encoding to TS1/5 on input line 319.
+Package textcomp Info: Setting hlcn sub-encoding to TS1/5 on input line 320.
+Package textcomp Info: Setting hlcw sub-encoding to TS1/5 on input line 321.
+Package textcomp Info: Setting hlcf sub-encoding to TS1/5 on input line 322.
+Package textcomp Info: Setting pplx sub-encoding to TS1/3 on input line 323.
+Package textcomp Info: Setting pplj sub-encoding to TS1/3 on input line 324.
+Package textcomp Info: Setting ptmx sub-encoding to TS1/4 on input line 325.
+Package textcomp Info: Setting ptmj sub-encoding to TS1/4 on input line 326.
+))
+(/usr/share/texmf-texlive/tex/latex/base/fontenc.sty
+Package: fontenc 2004/02/22 v1.99f Standard LaTeX package
+
+(/usr/share/texmf-texlive/tex/latex/base/t1enc.def
+File: t1enc.def 2004/02/22 v1.99f Standard LaTeX file
+LaTeX Font Info:    Redeclaring font encoding T1 on input line 43.
+))
+(/usr/share/texmf-texlive/tex/latex/ae/ae.sty
+Package: ae 2001/02/12 1.3 Almost European Computer Modern
+
+(/usr/share/texmf-texlive/tex/latex/base/fontenc.sty
+Package: fontenc 2004/02/22 v1.99f Standard LaTeX package
+
+(/usr/share/texmf-texlive/tex/latex/base/t1enc.def
+File: t1enc.def 2004/02/22 v1.99f Standard LaTeX file
+LaTeX Font Info:    Redeclaring font encoding T1 on input line 43.
+)
+LaTeX Font Info:    Try loading font information for T1+aer on input line 100.
+
+(/usr/share/texmf-texlive/tex/latex/ae/t1aer.fd
+File: t1aer.fd 1997/11/16 Font definitions for T1/aer.
+)))) (./Sweave-test-1.aux)
+\openout1 = `Sweave-test-1.aux'.
+
+LaTeX Font Info:    Checking defaults for OML/cmm/m/it on input line 11.
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    Checking defaults for T1/cmr/m/n on input line 11.
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    Checking defaults for OT1/cmr/m/n on input line 11.
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    Checking defaults for OMS/cmsy/m/n on input line 11.
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    Checking defaults for OMX/cmex/m/n on input line 11.
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    Checking defaults for U/cmr/m/n on input line 11.
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    Checking defaults for TS1/cmr/m/n on input line 11.
+LaTeX Font Info:    Try loading font information for TS1+cmr on input line 11.
+
+(/usr/share/texmf-texlive/tex/latex/base/ts1cmr.fd
+File: ts1cmr.fd 1999/05/25 v2.5h Standard LaTeX font definitions
+)
+LaTeX Font Info:    ... okay on input line 11.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <12> on input line 13.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <8> on input line 13.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <6> on input line 13.
+LaTeX Font Info:    Try loading font information for T1+aett on input line 17.
+
+(/usr/share/texmf-texlive/tex/latex/ae/t1aett.fd
+File: t1aett.fd 1997/11/16 Font definitions for T1/aett.
+)
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <7> on input line 67.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <5> on input line 67.
+ [1
+
+]
+File: Sweave-test-1-006.eps Graphic file (type eps)
+ <Sweave-test-1-006.eps>
+File: Sweave-test-1-007.eps Graphic file (type eps)
+
+<Sweave-test-1-007.eps> [2] [3] (./Sweave-test-1.aux) ) 
+Here is how much of TeX's memory you used:
+ 1735 strings out of 94313
+ 23639 string characters out of 1171671
+ 68347 words of memory out of 1000000
+ 4961 multiletter control sequences out of 10000+50000
+ 12276 words of font info for 29 fonts, out of 500000 for 2000
+ 647 hyphenation exceptions out of 8191
+ 35i,6n,21p,257b,301s stack positions out of 1500i,500n,5000p,200000b,5000s
+
+Output written on Sweave-test-1.dvi (3 pages, 3120 bytes).
diff --git a/inst/Sweave-test-1.orig.dvi b/inst/Sweave-test-1.orig.dvi
new file mode 100644
index 0000000..317ec2d
Binary files /dev/null and b/inst/Sweave-test-1.orig.dvi differ
diff --git a/inst/Sweave-test-1.tex b/inst/Sweave-test-1.tex
new file mode 100644
index 0000000..757a5c4
--- /dev/null
+++ b/inst/Sweave-test-1.tex
@@ -0,0 +1,127 @@
+% -*- mode: noweb; noweb-default-code-mode: R-mode; -*-
+\documentclass[a4paper]{article}
+
+\title{A Test File}
+\author{Friedrich Leisch}
+
+
+\usepackage{a4wide}
+
+\usepackage{/usr/share/R/share/texmf/Sweave}
+\begin{document}
+
+\maketitle
+
+A simple example that will run in any S engine: The integers from 1 to
+10 are
+\begin{Verbatim}
+ [1]  1  2  3  4  5  6  7  8  9 10
+\end{Verbatim}
+
+We can also emulate a simple calculator:
+\begin{Schunk}
+\begin{Sinput}
+> 1 + 1
+\end{Sinput}
+\begin{Soutput}
+[1] 2
+\end{Soutput}
+\begin{Sinput}
+> 1 + pi
+\end{Sinput}
+\begin{Soutput}
+[1] 4.141593
+\end{Soutput}
+\begin{Sinput}
+> sin(pi/2)
+\end{Sinput}
+\begin{Soutput}
+[1] 1
+\end{Soutput}
+\end{Schunk}
+
+Now we look at Gaussian data:
+
+\begin{Schunk}
+\begin{Soutput}
+ [1]  1.975020082 -0.596560482  0.379859890  1.279714455 -0.305434367
+ [6]  0.001238350 -0.434984359 -0.316102851 -0.050375397  0.541407408
+[11] -0.559675652 -0.269072911  1.352853069 -1.826236281 -0.021364586
+[16]  0.201180022  0.744513870  1.080508219  0.524392703  0.226922429
+\end{Soutput}
+\begin{Soutput}
+	One Sample t-test
+
+data:  x 
+t = 1.0387, df = 19, p-value = 0.312
+alternative hypothesis: true mean is not equal to 0 
+95 percent confidence interval:
+ -0.1993585  0.5921388 
+sample estimates:
+mean of x 
+0.1963902 
+\end{Soutput}
+\end{Schunk}
+Note that we can easily integrate some numbers into standard text: The
+third element of vector \texttt{x} is 0.379859889601437, the
+$p$-value of the test is 0.312. % $
+
+Now we look at a summary of the famous iris data set, and we want to
+see the commands in the code chunks:
+
+
+
+% the following code is R-specific, as data(iris) will not run in Splus. 
+% Hence, we mark it as R code. 
+\begin{Schunk}
+\begin{Sinput}
+> data(iris)
+> summary(iris)
+\end{Sinput}
+\begin{Soutput}
+  Sepal.Length    Sepal.Width     Petal.Length    Petal.Width   
+ Min.   :4.300   Min.   :2.000   Min.   :1.000   Min.   :0.100  
+ 1st Qu.:5.100   1st Qu.:2.800   1st Qu.:1.600   1st Qu.:0.300  
+ Median :5.800   Median :3.000   Median :4.350   Median :1.300  
+ Mean   :5.843   Mean   :3.057   Mean   :3.758   Mean   :1.199  
+ 3rd Qu.:6.400   3rd Qu.:3.300   3rd Qu.:5.100   3rd Qu.:1.800  
+ Max.   :7.900   Max.   :4.400   Max.   :6.900   Max.   :2.500  
+       Species  
+ setosa    :50  
+ versicolor:50  
+ virginica :50  
+\end{Soutput}
+\end{Schunk}
+
+
+\begin{figure}[htbp]
+  \begin{center}
+\begin{Schunk}
+\begin{Sinput}
+> library(graphics)
+> pairs(iris)
+\end{Sinput}
+\end{Schunk}
+\includegraphics{Sweave-test-1-006}
+    \caption{Pairs plot of the iris data.}
+  \end{center}
+\end{figure}
+
+\begin{figure}[htbp]
+  \begin{center}
+\begin{Schunk}
+\begin{Sinput}
+> boxplot(Sepal.Length ~ Species, data = iris)
+\end{Sinput}
+\end{Schunk}
+\includegraphics{Sweave-test-1-007}
+    \caption{Boxplot of sepal length grouped by species.}
+  \end{center}
+\end{figure}
+
+
+% R is not S-PLUS, hence this chunk will be ignored:
+
+\end{document}
+
+
diff --git a/inst/brew-test-1-1.eps b/inst/brew-test-1-1.eps
new file mode 100644
index 0000000..d97caa5
--- /dev/null
+++ b/inst/brew-test-1-1.eps
@@ -0,0 +1,3965 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 360 360 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 360 360
+%%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 fill grestore newpath } def
+/p3  { gsave bg 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
+38.02 265.19 94.81 321.98 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 269.94 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+42.77 269.94 90.06 317.23 cl
+/ps 7 def /Font1 findfont 7 s
+0 setgray
+66.41 291.78 (Sepal.Length) .5 0 0 t
+99.56 269.94 146.85 317.23 cl
+94.81 265.19 151.60 321.98 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+99.56 269.94 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+101.31 317.23 m
+36.49 0 l
+o
+np
+101.31 317.23 m
+0 4.75 l
+o
+np
+110.44 317.23 m
+0 4.75 l
+o
+np
+119.56 317.23 m
+0 4.75 l
+o
+np
+128.68 317.23 m
+0 4.75 l
+o
+np
+137.80 317.23 m
+0 4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+101.31 328.64 (2.0) .5 0 0 t
+119.56 328.64 (3.0) .5 0 0 t
+137.80 328.64 (4.0) .5 0 0 t
+99.56 269.94 146.85 317.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+128.68 281.42 1.78 c p1
+119.56 278.99 1.78 c p1
+123.21 276.56 1.78 c p1
+121.38 275.34 1.78 c p1
+130.50 280.21 1.78 c p1
+135.98 285.07 1.78 c p1
+126.86 275.34 1.78 c p1
+126.86 280.21 1.78 c p1
+117.73 272.91 1.78 c p1
+121.38 278.99 1.78 c p1
+132.33 285.07 1.78 c p1
+126.86 277.78 1.78 c p1
+119.56 277.78 1.78 c p1
+119.56 271.69 1.78 c p1
+137.80 289.94 1.78 c p1
+145.10 288.72 1.78 c p1
+135.98 285.07 1.78 c p1
+128.68 281.42 1.78 c p1
+134.15 288.72 1.78 c p1
+134.15 281.42 1.78 c p1
+126.86 285.07 1.78 c p1
+132.33 281.42 1.78 c p1
+130.50 275.34 1.78 c p1
+125.03 281.42 1.78 c p1
+126.86 277.78 1.78 c p1
+119.56 280.21 1.78 c p1
+126.86 280.21 1.78 c p1
+128.68 282.64 1.78 c p1
+126.86 282.64 1.78 c p1
+123.21 276.56 1.78 c p1
+121.38 277.78 1.78 c p1
+126.86 285.07 1.78 c p1
+139.63 282.64 1.78 c p1
+141.45 286.29 1.78 c p1
+121.38 278.99 1.78 c p1
+123.21 280.21 1.78 c p1
+128.68 286.29 1.78 c p1
+130.50 278.99 1.78 c p1
+119.56 272.91 1.78 c p1
+126.86 281.42 1.78 c p1
+128.68 280.21 1.78 c p1
+106.79 274.13 1.78 c p1
+123.21 272.91 1.78 c p1
+128.68 280.21 1.78 c p1
+134.15 281.42 1.78 c p1
+119.56 277.78 1.78 c p1
+134.15 281.42 1.78 c p1
+123.21 275.34 1.78 c p1
+132.33 283.86 1.78 c p1
+125.03 280.21 1.78 c p1
+123.21 304.53 1.78 c p1
+123.21 297.24 1.78 c p1
+121.38 303.32 1.78 c p1
+106.79 286.29 1.78 c p1
+115.91 298.45 1.78 c p1
+115.91 288.72 1.78 c p1
+125.03 296.02 1.78 c p1
+108.61 278.99 1.78 c p1
+117.73 299.67 1.78 c p1
+114.08 282.64 1.78 c p1
+101.31 280.21 1.78 c p1
+119.56 291.15 1.78 c p1
+104.96 292.37 1.78 c p1
+117.73 293.59 1.78 c p1
+117.73 287.51 1.78 c p1
+121.38 300.88 1.78 c p1
+119.56 287.51 1.78 c p1
+114.08 289.94 1.78 c p1
+104.96 294.80 1.78 c p1
+110.44 287.51 1.78 c p1
+123.21 291.15 1.78 c p1
+115.91 293.59 1.78 c p1
+110.44 296.02 1.78 c p1
+115.91 293.59 1.78 c p1
+117.73 297.24 1.78 c p1
+119.56 299.67 1.78 c p1
+115.91 302.10 1.78 c p1
+119.56 300.88 1.78 c p1
+117.73 292.37 1.78 c p1
+112.26 288.72 1.78 c p1
+108.61 286.29 1.78 c p1
+108.61 286.29 1.78 c p1
+114.08 289.94 1.78 c p1
+114.08 292.37 1.78 c p1
+119.56 285.07 1.78 c p1
+126.86 292.37 1.78 c p1
+121.38 300.88 1.78 c p1
+106.79 296.02 1.78 c p1
+119.56 287.51 1.78 c p1
+110.44 286.29 1.78 c p1
+112.26 286.29 1.78 c p1
+119.56 293.59 1.78 c p1
+112.26 289.94 1.78 c p1
+106.79 280.21 1.78 c p1
+114.08 287.51 1.78 c p1
+119.56 288.72 1.78 c p1
+117.73 288.72 1.78 c p1
+117.73 294.80 1.78 c p1
+110.44 281.42 1.78 c p1
+115.91 288.72 1.78 c p1
+125.03 296.02 1.78 c p1
+114.08 289.94 1.78 c p1
+119.56 305.75 1.78 c p1
+117.73 296.02 1.78 c p1
+119.56 298.45 1.78 c p1
+119.56 311.83 1.78 c p1
+110.44 278.99 1.78 c p1
+117.73 308.18 1.78 c p1
+110.44 300.88 1.78 c p1
+130.50 306.97 1.78 c p1
+123.21 298.45 1.78 c p1
+114.08 297.24 1.78 c p1
+119.56 302.10 1.78 c p1
+110.44 288.72 1.78 c p1
+115.91 289.94 1.78 c p1
+123.21 297.24 1.78 c p1
+119.56 298.45 1.78 c p1
+134.15 313.05 1.78 c p1
+112.26 313.05 1.78 c p1
+104.96 292.37 1.78 c p1
+123.21 303.32 1.78 c p1
+115.91 287.51 1.78 c p1
+115.91 313.05 1.78 c p1
+114.08 296.02 1.78 c p1
+125.03 300.88 1.78 c p1
+123.21 306.97 1.78 c p1
+115.91 294.80 1.78 c p1
+119.56 293.59 1.78 c p1
+115.91 297.24 1.78 c p1
+119.56 306.97 1.78 c p1
+115.91 309.40 1.78 c p1
+134.15 315.48 1.78 c p1
+115.91 297.24 1.78 c p1
+115.91 296.02 1.78 c p1
+112.26 293.59 1.78 c p1
+119.56 313.05 1.78 c p1
+126.86 296.02 1.78 c p1
+121.38 297.24 1.78 c p1
+119.56 292.37 1.78 c p1
+121.38 303.32 1.78 c p1
+121.38 300.88 1.78 c p1
+121.38 303.32 1.78 c p1
+114.08 289.94 1.78 c p1
+123.21 302.10 1.78 c p1
+125.03 300.88 1.78 c p1
+119.56 300.88 1.78 c p1
+110.44 296.02 1.78 c p1
+119.56 298.45 1.78 c p1
+126.86 294.80 1.78 c p1
+119.56 291.15 1.78 c p1
+156.36 269.94 203.64 317.23 cl
+151.60 265.19 208.40 321.98 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+156.36 269.94 m
+47.28 0 l
+0 47.29 l
+-47.28 0 l
+0 -47.29 l
+o
+156.36 269.94 203.64 317.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+161.08 281.42 1.78 c p1
+161.08 278.99 1.78 c p1
+160.33 276.56 1.78 c p1
+161.82 275.34 1.78 c p1
+161.08 280.21 1.78 c p1
+163.30 285.07 1.78 c p1
+161.08 275.34 1.78 c p1
+161.82 280.21 1.78 c p1
+161.08 272.91 1.78 c p1
+161.82 278.99 1.78 c p1
+161.82 285.07 1.78 c p1
+162.56 277.78 1.78 c p1
+161.08 277.78 1.78 c p1
+158.85 271.69 1.78 c p1
+159.59 289.94 1.78 c p1
+161.82 288.72 1.78 c p1
+160.33 285.07 1.78 c p1
+161.08 281.42 1.78 c p1
+163.30 288.72 1.78 c p1
+161.82 281.42 1.78 c p1
+163.30 285.07 1.78 c p1
+161.82 281.42 1.78 c p1
+158.11 275.34 1.78 c p1
+163.30 281.42 1.78 c p1
+164.79 277.78 1.78 c p1
+162.56 280.21 1.78 c p1
+162.56 280.21 1.78 c p1
+161.82 282.64 1.78 c p1
+161.08 282.64 1.78 c p1
+162.56 276.56 1.78 c p1
+162.56 277.78 1.78 c p1
+161.82 285.07 1.78 c p1
+161.82 282.64 1.78 c p1
+161.08 286.29 1.78 c p1
+161.82 278.99 1.78 c p1
+159.59 280.21 1.78 c p1
+160.33 286.29 1.78 c p1
+161.08 278.99 1.78 c p1
+160.33 272.91 1.78 c p1
+161.82 281.42 1.78 c p1
+160.33 280.21 1.78 c p1
+160.33 274.13 1.78 c p1
+160.33 272.91 1.78 c p1
+162.56 280.21 1.78 c p1
+164.79 281.42 1.78 c p1
+161.08 277.78 1.78 c p1
+162.56 281.42 1.78 c p1
+161.08 275.34 1.78 c p1
+161.82 283.86 1.78 c p1
+161.08 280.21 1.78 c p1
+185.57 304.53 1.78 c p1
+184.08 297.24 1.78 c p1
+187.05 303.32 1.78 c p1
+180.37 286.29 1.78 c p1
+184.82 298.45 1.78 c p1
+184.08 288.72 1.78 c p1
+185.57 296.02 1.78 c p1
+175.18 278.99 1.78 c p1
+184.82 299.67 1.78 c p1
+179.63 282.64 1.78 c p1
+176.66 280.21 1.78 c p1
+181.86 291.15 1.78 c p1
+180.37 292.37 1.78 c p1
+185.57 293.59 1.78 c p1
+177.40 287.51 1.78 c p1
+183.34 300.88 1.78 c p1
+184.08 287.51 1.78 c p1
+181.11 289.94 1.78 c p1
+184.08 294.80 1.78 c p1
+179.63 287.51 1.78 c p1
+186.31 291.15 1.78 c p1
+180.37 293.59 1.78 c p1
+187.05 296.02 1.78 c p1
+185.57 293.59 1.78 c p1
+182.60 297.24 1.78 c p1
+183.34 299.67 1.78 c p1
+186.31 302.10 1.78 c p1
+187.79 300.88 1.78 c p1
+184.08 292.37 1.78 c p1
+176.66 288.72 1.78 c p1
+178.89 286.29 1.78 c p1
+178.14 286.29 1.78 c p1
+179.63 289.94 1.78 c p1
+188.53 292.37 1.78 c p1
+184.08 285.07 1.78 c p1
+184.08 292.37 1.78 c p1
+185.57 300.88 1.78 c p1
+183.34 296.02 1.78 c p1
+181.11 287.51 1.78 c p1
+180.37 286.29 1.78 c p1
+183.34 286.29 1.78 c p1
+184.82 293.59 1.78 c p1
+180.37 289.94 1.78 c p1
+175.18 280.21 1.78 c p1
+181.86 287.51 1.78 c p1
+181.86 288.72 1.78 c p1
+181.86 288.72 1.78 c p1
+182.60 294.80 1.78 c p1
+172.95 281.42 1.78 c p1
+181.11 288.72 1.78 c p1
+195.21 296.02 1.78 c p1
+188.53 289.94 1.78 c p1
+194.47 305.75 1.78 c p1
+192.25 296.02 1.78 c p1
+193.73 298.45 1.78 c p1
+199.67 311.83 1.78 c p1
+184.08 278.99 1.78 c p1
+197.44 308.18 1.78 c p1
+193.73 300.88 1.78 c p1
+195.96 306.97 1.78 c p1
+188.53 298.45 1.78 c p1
+190.02 297.24 1.78 c p1
+191.50 302.10 1.78 c p1
+187.79 288.72 1.78 c p1
+188.53 289.94 1.78 c p1
+190.02 297.24 1.78 c p1
+191.50 298.45 1.78 c p1
+200.41 313.05 1.78 c p1
+201.89 313.05 1.78 c p1
+187.79 292.37 1.78 c p1
+192.99 303.32 1.78 c p1
+187.05 287.51 1.78 c p1
+200.41 313.05 1.78 c p1
+187.05 296.02 1.78 c p1
+192.99 300.88 1.78 c p1
+195.21 306.97 1.78 c p1
+186.31 294.80 1.78 c p1
+187.05 293.59 1.78 c p1
+192.25 297.24 1.78 c p1
+193.73 306.97 1.78 c p1
+195.96 309.40 1.78 c p1
+198.18 315.48 1.78 c p1
+192.25 297.24 1.78 c p1
+188.53 296.02 1.78 c p1
+192.25 293.59 1.78 c p1
+195.96 313.05 1.78 c p1
+192.25 296.02 1.78 c p1
+191.50 297.24 1.78 c p1
+186.31 292.37 1.78 c p1
+190.76 303.32 1.78 c p1
+192.25 300.88 1.78 c p1
+188.53 303.32 1.78 c p1
+188.53 289.94 1.78 c p1
+194.47 302.10 1.78 c p1
+192.99 300.88 1.78 c p1
+189.28 300.88 1.78 c p1
+187.79 296.02 1.78 c p1
+189.28 298.45 1.78 c p1
+190.76 294.80 1.78 c p1
+188.53 291.15 1.78 c p1
+213.15 269.94 260.44 317.23 cl
+208.40 265.19 265.19 321.98 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+213.15 269.94 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+222.20 317.23 m
+36.49 0 l
+o
+np
+222.20 317.23 m
+0 4.75 l
+o
+np
+231.32 317.23 m
+0 4.75 l
+o
+np
+240.44 317.23 m
+0 4.75 l
+o
+np
+249.56 317.23 m
+0 4.75 l
+o
+np
+258.69 317.23 m
+0 4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+222.20 328.64 (0.5) .5 0 0 t
+240.44 328.64 (1.5) .5 0 0 t
+258.69 328.64 (2.5) .5 0 0 t
+213.15 269.94 260.44 317.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+216.72 281.42 1.78 c p1
+216.72 278.99 1.78 c p1
+216.72 276.56 1.78 c p1
+216.72 275.34 1.78 c p1
+216.72 280.21 1.78 c p1
+220.37 285.07 1.78 c p1
+218.55 275.34 1.78 c p1
+216.72 280.21 1.78 c p1
+216.72 272.91 1.78 c p1
+214.90 278.99 1.78 c p1
+216.72 285.07 1.78 c p1
+216.72 277.78 1.78 c p1
+214.90 277.78 1.78 c p1
+214.90 271.69 1.78 c p1
+216.72 289.94 1.78 c p1
+220.37 288.72 1.78 c p1
+220.37 285.07 1.78 c p1
+218.55 281.42 1.78 c p1
+218.55 288.72 1.78 c p1
+218.55 281.42 1.78 c p1
+216.72 285.07 1.78 c p1
+220.37 281.42 1.78 c p1
+216.72 275.34 1.78 c p1
+222.20 281.42 1.78 c p1
+216.72 277.78 1.78 c p1
+216.72 280.21 1.78 c p1
+220.37 280.21 1.78 c p1
+216.72 282.64 1.78 c p1
+216.72 282.64 1.78 c p1
+216.72 276.56 1.78 c p1
+216.72 277.78 1.78 c p1
+220.37 285.07 1.78 c p1
+214.90 282.64 1.78 c p1
+216.72 286.29 1.78 c p1
+216.72 278.99 1.78 c p1
+216.72 280.21 1.78 c p1
+216.72 286.29 1.78 c p1
+214.90 278.99 1.78 c p1
+216.72 272.91 1.78 c p1
+216.72 281.42 1.78 c p1
+218.55 280.21 1.78 c p1
+218.55 274.13 1.78 c p1
+216.72 272.91 1.78 c p1
+224.02 280.21 1.78 c p1
+220.37 281.42 1.78 c p1
+218.55 277.78 1.78 c p1
+216.72 281.42 1.78 c p1
+216.72 275.34 1.78 c p1
+216.72 283.86 1.78 c p1
+216.72 280.21 1.78 c p1
+238.62 304.53 1.78 c p1
+240.44 297.24 1.78 c p1
+240.44 303.32 1.78 c p1
+236.79 286.29 1.78 c p1
+240.44 298.45 1.78 c p1
+236.79 288.72 1.78 c p1
+242.27 296.02 1.78 c p1
+231.32 278.99 1.78 c p1
+236.79 299.67 1.78 c p1
+238.62 282.64 1.78 c p1
+231.32 280.21 1.78 c p1
+240.44 291.15 1.78 c p1
+231.32 292.37 1.78 c p1
+238.62 293.59 1.78 c p1
+236.79 287.51 1.78 c p1
+238.62 300.88 1.78 c p1
+240.44 287.51 1.78 c p1
+231.32 289.94 1.78 c p1
+240.44 294.80 1.78 c p1
+233.14 287.51 1.78 c p1
+245.92 291.15 1.78 c p1
+236.79 293.59 1.78 c p1
+240.44 296.02 1.78 c p1
+234.97 293.59 1.78 c p1
+236.79 297.24 1.78 c p1
+238.62 299.67 1.78 c p1
+238.62 302.10 1.78 c p1
+244.09 300.88 1.78 c p1
+240.44 292.37 1.78 c p1
+231.32 288.72 1.78 c p1
+233.14 286.29 1.78 c p1
+231.32 286.29 1.78 c p1
+234.97 289.94 1.78 c p1
+242.27 292.37 1.78 c p1
+240.44 285.07 1.78 c p1
+242.27 292.37 1.78 c p1
+240.44 300.88 1.78 c p1
+236.79 296.02 1.78 c p1
+236.79 287.51 1.78 c p1
+236.79 286.29 1.78 c p1
+234.97 286.29 1.78 c p1
+238.62 293.59 1.78 c p1
+234.97 289.94 1.78 c p1
+231.32 280.21 1.78 c p1
+236.79 287.51 1.78 c p1
+234.97 288.72 1.78 c p1
+236.79 288.72 1.78 c p1
+236.79 294.80 1.78 c p1
+233.14 281.42 1.78 c p1
+236.79 288.72 1.78 c p1
+258.69 296.02 1.78 c p1
+247.74 289.94 1.78 c p1
+251.39 305.75 1.78 c p1
+245.92 296.02 1.78 c p1
+253.21 298.45 1.78 c p1
+251.39 311.83 1.78 c p1
+244.09 278.99 1.78 c p1
+245.92 308.18 1.78 c p1
+245.92 300.88 1.78 c p1
+258.69 306.97 1.78 c p1
+249.56 298.45 1.78 c p1
+247.74 297.24 1.78 c p1
+251.39 302.10 1.78 c p1
+249.56 288.72 1.78 c p1
+256.86 289.94 1.78 c p1
+255.04 297.24 1.78 c p1
+245.92 298.45 1.78 c p1
+253.21 313.05 1.78 c p1
+255.04 313.05 1.78 c p1
+240.44 292.37 1.78 c p1
+255.04 303.32 1.78 c p1
+249.56 287.51 1.78 c p1
+249.56 313.05 1.78 c p1
+245.92 296.02 1.78 c p1
+251.39 300.88 1.78 c p1
+245.92 306.97 1.78 c p1
+245.92 294.80 1.78 c p1
+245.92 293.59 1.78 c p1
+251.39 297.24 1.78 c p1
+242.27 306.97 1.78 c p1
+247.74 309.40 1.78 c p1
+249.56 315.48 1.78 c p1
+253.21 297.24 1.78 c p1
+240.44 296.02 1.78 c p1
+238.62 293.59 1.78 c p1
+255.04 313.05 1.78 c p1
+256.86 296.02 1.78 c p1
+245.92 297.24 1.78 c p1
+245.92 292.37 1.78 c p1
+251.39 303.32 1.78 c p1
+256.86 300.88 1.78 c p1
+255.04 303.32 1.78 c p1
+247.74 289.94 1.78 c p1
+255.04 302.10 1.78 c p1
+258.69 300.88 1.78 c p1
+255.04 300.88 1.78 c p1
+247.74 296.02 1.78 c p1
+249.56 298.45 1.78 c p1
+255.04 294.80 1.78 c p1
+245.92 291.15 1.78 c p1
+269.94 269.94 317.23 317.23 cl
+265.19 265.19 321.98 321.98 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+269.94 269.94 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+317.23 274.13 m
+0 42.57 l
+o
+np
+317.23 274.13 m
+4.75 0 l
+o
+np
+317.23 280.21 m
+4.75 0 l
+o
+np
+317.23 286.29 m
+4.75 0 l
+o
+np
+317.23 292.37 m
+4.75 0 l
+o
+np
+317.23 298.45 m
+4.75 0 l
+o
+np
+317.23 304.53 m
+4.75 0 l
+o
+np
+317.23 310.62 m
+4.75 0 l
+o
+np
+317.23 316.70 m
+4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+334.34 274.13 (4.5) .5 0 90 t
+334.34 292.37 (6.0) .5 0 90 t
+334.34 310.62 (7.5) .5 0 90 t
+269.94 269.94 317.23 317.23 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+271.69 281.42 1.78 c p1
+271.69 278.99 1.78 c p1
+271.69 276.56 1.78 c p1
+271.69 275.34 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 285.07 1.78 c p1
+271.69 275.34 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 272.91 1.78 c p1
+271.69 278.99 1.78 c p1
+271.69 285.07 1.78 c p1
+271.69 277.78 1.78 c p1
+271.69 277.78 1.78 c p1
+271.69 271.69 1.78 c p1
+271.69 289.94 1.78 c p1
+271.69 288.72 1.78 c p1
+271.69 285.07 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 288.72 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 285.07 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 275.34 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 277.78 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 282.64 1.78 c p1
+271.69 282.64 1.78 c p1
+271.69 276.56 1.78 c p1
+271.69 277.78 1.78 c p1
+271.69 285.07 1.78 c p1
+271.69 282.64 1.78 c p1
+271.69 286.29 1.78 c p1
+271.69 278.99 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 286.29 1.78 c p1
+271.69 278.99 1.78 c p1
+271.69 272.91 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 274.13 1.78 c p1
+271.69 272.91 1.78 c p1
+271.69 280.21 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 277.78 1.78 c p1
+271.69 281.42 1.78 c p1
+271.69 275.34 1.78 c p1
+271.69 283.86 1.78 c p1
+271.69 280.21 1.78 c p1
+293.59 304.53 1.78 c p1
+293.59 297.24 1.78 c p1
+293.59 303.32 1.78 c p1
+293.59 286.29 1.78 c p1
+293.59 298.45 1.78 c p1
+293.59 288.72 1.78 c p1
+293.59 296.02 1.78 c p1
+293.59 278.99 1.78 c p1
+293.59 299.67 1.78 c p1
+293.59 282.64 1.78 c p1
+293.59 280.21 1.78 c p1
+293.59 291.15 1.78 c p1
+293.59 292.37 1.78 c p1
+293.59 293.59 1.78 c p1
+293.59 287.51 1.78 c p1
+293.59 300.88 1.78 c p1
+293.59 287.51 1.78 c p1
+293.59 289.94 1.78 c p1
+293.59 294.80 1.78 c p1
+293.59 287.51 1.78 c p1
+293.59 291.15 1.78 c p1
+293.59 293.59 1.78 c p1
+293.59 296.02 1.78 c p1
+293.59 293.59 1.78 c p1
+293.59 297.24 1.78 c p1
+293.59 299.67 1.78 c p1
+293.59 302.10 1.78 c p1
+293.59 300.88 1.78 c p1
+293.59 292.37 1.78 c p1
+293.59 288.72 1.78 c p1
+293.59 286.29 1.78 c p1
+293.59 286.29 1.78 c p1
+293.59 289.94 1.78 c p1
+293.59 292.37 1.78 c p1
+293.59 285.07 1.78 c p1
+293.59 292.37 1.78 c p1
+293.59 300.88 1.78 c p1
+293.59 296.02 1.78 c p1
+293.59 287.51 1.78 c p1
+293.59 286.29 1.78 c p1
+293.59 286.29 1.78 c p1
+293.59 293.59 1.78 c p1
+293.59 289.94 1.78 c p1
+293.59 280.21 1.78 c p1
+293.59 287.51 1.78 c p1
+293.59 288.72 1.78 c p1
+293.59 288.72 1.78 c p1
+293.59 294.80 1.78 c p1
+293.59 281.42 1.78 c p1
+293.59 288.72 1.78 c p1
+315.48 296.02 1.78 c p1
+315.48 289.94 1.78 c p1
+315.48 305.75 1.78 c p1
+315.48 296.02 1.78 c p1
+315.48 298.45 1.78 c p1
+315.48 311.83 1.78 c p1
+315.48 278.99 1.78 c p1
+315.48 308.18 1.78 c p1
+315.48 300.88 1.78 c p1
+315.48 306.97 1.78 c p1
+315.48 298.45 1.78 c p1
+315.48 297.24 1.78 c p1
+315.48 302.10 1.78 c p1
+315.48 288.72 1.78 c p1
+315.48 289.94 1.78 c p1
+315.48 297.24 1.78 c p1
+315.48 298.45 1.78 c p1
+315.48 313.05 1.78 c p1
+315.48 313.05 1.78 c p1
+315.48 292.37 1.78 c p1
+315.48 303.32 1.78 c p1
+315.48 287.51 1.78 c p1
+315.48 313.05 1.78 c p1
+315.48 296.02 1.78 c p1
+315.48 300.88 1.78 c p1
+315.48 306.97 1.78 c p1
+315.48 294.80 1.78 c p1
+315.48 293.59 1.78 c p1
+315.48 297.24 1.78 c p1
+315.48 306.97 1.78 c p1
+315.48 309.40 1.78 c p1
+315.48 315.48 1.78 c p1
+315.48 297.24 1.78 c p1
+315.48 296.02 1.78 c p1
+315.48 293.59 1.78 c p1
+315.48 313.05 1.78 c p1
+315.48 296.02 1.78 c p1
+315.48 297.24 1.78 c p1
+315.48 292.37 1.78 c p1
+315.48 303.32 1.78 c p1
+315.48 300.88 1.78 c p1
+315.48 303.32 1.78 c p1
+315.48 289.94 1.78 c p1
+315.48 302.10 1.78 c p1
+315.48 300.88 1.78 c p1
+315.48 300.88 1.78 c p1
+315.48 296.02 1.78 c p1
+315.48 298.45 1.78 c p1
+315.48 294.80 1.78 c p1
+315.48 291.15 1.78 c p1
+42.77 213.15 90.06 260.44 cl
+38.02 208.40 94.81 265.19 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 213.15 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+42.77 214.90 m
+0 36.49 l
+o
+np
+42.77 214.90 m
+-4.75 0 l
+o
+np
+42.77 224.02 m
+-4.75 0 l
+o
+np
+42.77 233.14 m
+-4.75 0 l
+o
+np
+42.77 242.27 m
+-4.75 0 l
+o
+np
+42.77 251.39 m
+-4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+31.36 214.90 (2.0) .5 0 90 t
+31.36 233.14 (3.0) .5 0 90 t
+31.36 251.39 (4.0) .5 0 90 t
+42.77 213.15 90.06 260.44 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+54.25 242.27 1.78 c p1
+51.82 233.14 1.78 c p1
+49.38 236.79 1.78 c p1
+48.17 234.97 1.78 c p1
+53.03 244.09 1.78 c p1
+57.90 249.56 1.78 c p1
+48.17 240.44 1.78 c p1
+53.03 240.44 1.78 c p1
+45.74 231.32 1.78 c p1
+51.82 234.97 1.78 c p1
+57.90 245.92 1.78 c p1
+50.60 240.44 1.78 c p1
+50.60 233.14 1.78 c p1
+44.52 233.14 1.78 c p1
+62.76 251.39 1.78 c p1
+61.55 258.69 1.78 c p1
+57.90 249.56 1.78 c p1
+54.25 242.27 1.78 c p1
+61.55 247.74 1.78 c p1
+54.25 247.74 1.78 c p1
+57.90 240.44 1.78 c p1
+54.25 245.92 1.78 c p1
+48.17 244.09 1.78 c p1
+54.25 238.62 1.78 c p1
+50.60 240.44 1.78 c p1
+53.03 233.14 1.78 c p1
+53.03 240.44 1.78 c p1
+55.47 242.27 1.78 c p1
+55.47 240.44 1.78 c p1
+49.38 236.79 1.78 c p1
+50.60 234.97 1.78 c p1
+57.90 240.44 1.78 c p1
+55.47 253.21 1.78 c p1
+59.12 255.04 1.78 c p1
+51.82 234.97 1.78 c p1
+53.03 236.79 1.78 c p1
+59.12 242.27 1.78 c p1
+51.82 244.09 1.78 c p1
+45.74 233.14 1.78 c p1
+54.25 240.44 1.78 c p1
+53.03 242.27 1.78 c p1
+46.95 220.37 1.78 c p1
+45.74 236.79 1.78 c p1
+53.03 242.27 1.78 c p1
+54.25 247.74 1.78 c p1
+50.60 233.14 1.78 c p1
+54.25 247.74 1.78 c p1
+48.17 236.79 1.78 c p1
+56.68 245.92 1.78 c p1
+53.03 238.62 1.78 c p1
+77.36 236.79 1.78 c p1
+70.06 236.79 1.78 c p1
+76.14 234.97 1.78 c p1
+59.12 220.37 1.78 c p1
+71.28 229.50 1.78 c p1
+61.55 229.50 1.78 c p1
+68.85 238.62 1.78 c p1
+51.82 222.20 1.78 c p1
+72.49 231.32 1.78 c p1
+55.47 227.67 1.78 c p1
+53.03 214.90 1.78 c p1
+63.98 233.14 1.78 c p1
+65.20 218.55 1.78 c p1
+66.41 231.32 1.78 c p1
+60.33 231.32 1.78 c p1
+73.71 234.97 1.78 c p1
+60.33 233.14 1.78 c p1
+62.76 227.67 1.78 c p1
+67.63 218.55 1.78 c p1
+60.33 224.02 1.78 c p1
+63.98 236.79 1.78 c p1
+66.41 229.50 1.78 c p1
+68.85 224.02 1.78 c p1
+66.41 229.50 1.78 c p1
+70.06 231.32 1.78 c p1
+72.49 233.14 1.78 c p1
+74.93 229.50 1.78 c p1
+73.71 233.14 1.78 c p1
+65.20 231.32 1.78 c p1
+61.55 225.85 1.78 c p1
+59.12 222.20 1.78 c p1
+59.12 222.20 1.78 c p1
+62.76 227.67 1.78 c p1
+65.20 227.67 1.78 c p1
+57.90 233.14 1.78 c p1
+65.20 240.44 1.78 c p1
+73.71 234.97 1.78 c p1
+68.85 220.37 1.78 c p1
+60.33 233.14 1.78 c p1
+59.12 224.02 1.78 c p1
+59.12 225.85 1.78 c p1
+66.41 233.14 1.78 c p1
+62.76 225.85 1.78 c p1
+53.03 220.37 1.78 c p1
+60.33 227.67 1.78 c p1
+61.55 233.14 1.78 c p1
+61.55 231.32 1.78 c p1
+67.63 231.32 1.78 c p1
+54.25 224.02 1.78 c p1
+61.55 229.50 1.78 c p1
+68.85 238.62 1.78 c p1
+62.76 227.67 1.78 c p1
+78.58 233.14 1.78 c p1
+68.85 231.32 1.78 c p1
+71.28 233.14 1.78 c p1
+84.66 233.14 1.78 c p1
+51.82 224.02 1.78 c p1
+81.01 231.32 1.78 c p1
+73.71 224.02 1.78 c p1
+79.79 244.09 1.78 c p1
+71.28 236.79 1.78 c p1
+70.06 227.67 1.78 c p1
+74.93 233.14 1.78 c p1
+61.55 224.02 1.78 c p1
+62.76 229.50 1.78 c p1
+70.06 236.79 1.78 c p1
+71.28 233.14 1.78 c p1
+85.87 247.74 1.78 c p1
+85.87 225.85 1.78 c p1
+65.20 218.55 1.78 c p1
+76.14 236.79 1.78 c p1
+60.33 229.50 1.78 c p1
+85.87 229.50 1.78 c p1
+68.85 227.67 1.78 c p1
+73.71 238.62 1.78 c p1
+79.79 236.79 1.78 c p1
+67.63 229.50 1.78 c p1
+66.41 233.14 1.78 c p1
+70.06 229.50 1.78 c p1
+79.79 233.14 1.78 c p1
+82.22 229.50 1.78 c p1
+88.31 247.74 1.78 c p1
+70.06 229.50 1.78 c p1
+68.85 229.50 1.78 c p1
+66.41 225.85 1.78 c p1
+85.87 233.14 1.78 c p1
+68.85 240.44 1.78 c p1
+70.06 234.97 1.78 c p1
+65.20 233.14 1.78 c p1
+76.14 234.97 1.78 c p1
+73.71 234.97 1.78 c p1
+76.14 234.97 1.78 c p1
+62.76 227.67 1.78 c p1
+74.93 236.79 1.78 c p1
+73.71 238.62 1.78 c p1
+73.71 233.14 1.78 c p1
+68.85 224.02 1.78 c p1
+71.28 233.14 1.78 c p1
+67.63 240.44 1.78 c p1
+63.98 233.14 1.78 c p1
+99.56 213.15 146.85 260.44 cl
+94.81 208.40 151.60 265.19 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+99.56 213.15 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+99.56 213.15 146.85 260.44 cl
+/ps 7 def /Font1 findfont 7 s
+0 setgray
+123.21 234.94 (Sepal.Width) .5 0 0 t
+156.36 213.15 203.64 260.44 cl
+151.60 208.40 208.40 265.19 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+156.36 213.15 m
+47.28 0 l
+0 47.29 l
+-47.28 0 l
+0 -47.29 l
+o
+156.36 213.15 203.64 260.44 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+161.08 242.27 1.78 c p1
+161.08 233.14 1.78 c p1
+160.33 236.79 1.78 c p1
+161.82 234.97 1.78 c p1
+161.08 244.09 1.78 c p1
+163.30 249.56 1.78 c p1
+161.08 240.44 1.78 c p1
+161.82 240.44 1.78 c p1
+161.08 231.32 1.78 c p1
+161.82 234.97 1.78 c p1
+161.82 245.92 1.78 c p1
+162.56 240.44 1.78 c p1
+161.08 233.14 1.78 c p1
+158.85 233.14 1.78 c p1
+159.59 251.39 1.78 c p1
+161.82 258.69 1.78 c p1
+160.33 249.56 1.78 c p1
+161.08 242.27 1.78 c p1
+163.30 247.74 1.78 c p1
+161.82 247.74 1.78 c p1
+163.30 240.44 1.78 c p1
+161.82 245.92 1.78 c p1
+158.11 244.09 1.78 c p1
+163.30 238.62 1.78 c p1
+164.79 240.44 1.78 c p1
+162.56 233.14 1.78 c p1
+162.56 240.44 1.78 c p1
+161.82 242.27 1.78 c p1
+161.08 240.44 1.78 c p1
+162.56 236.79 1.78 c p1
+162.56 234.97 1.78 c p1
+161.82 240.44 1.78 c p1
+161.82 253.21 1.78 c p1
+161.08 255.04 1.78 c p1
+161.82 234.97 1.78 c p1
+159.59 236.79 1.78 c p1
+160.33 242.27 1.78 c p1
+161.08 244.09 1.78 c p1
+160.33 233.14 1.78 c p1
+161.82 240.44 1.78 c p1
+160.33 242.27 1.78 c p1
+160.33 220.37 1.78 c p1
+160.33 236.79 1.78 c p1
+162.56 242.27 1.78 c p1
+164.79 247.74 1.78 c p1
+161.08 233.14 1.78 c p1
+162.56 247.74 1.78 c p1
+161.08 236.79 1.78 c p1
+161.82 245.92 1.78 c p1
+161.08 238.62 1.78 c p1
+185.57 236.79 1.78 c p1
+184.08 236.79 1.78 c p1
+187.05 234.97 1.78 c p1
+180.37 220.37 1.78 c p1
+184.82 229.50 1.78 c p1
+184.08 229.50 1.78 c p1
+185.57 238.62 1.78 c p1
+175.18 222.20 1.78 c p1
+184.82 231.32 1.78 c p1
+179.63 227.67 1.78 c p1
+176.66 214.90 1.78 c p1
+181.86 233.14 1.78 c p1
+180.37 218.55 1.78 c p1
+185.57 231.32 1.78 c p1
+177.40 231.32 1.78 c p1
+183.34 234.97 1.78 c p1
+184.08 233.14 1.78 c p1
+181.11 227.67 1.78 c p1
+184.08 218.55 1.78 c p1
+179.63 224.02 1.78 c p1
+186.31 236.79 1.78 c p1
+180.37 229.50 1.78 c p1
+187.05 224.02 1.78 c p1
+185.57 229.50 1.78 c p1
+182.60 231.32 1.78 c p1
+183.34 233.14 1.78 c p1
+186.31 229.50 1.78 c p1
+187.79 233.14 1.78 c p1
+184.08 231.32 1.78 c p1
+176.66 225.85 1.78 c p1
+178.89 222.20 1.78 c p1
+178.14 222.20 1.78 c p1
+179.63 227.67 1.78 c p1
+188.53 227.67 1.78 c p1
+184.08 233.14 1.78 c p1
+184.08 240.44 1.78 c p1
+185.57 234.97 1.78 c p1
+183.34 220.37 1.78 c p1
+181.11 233.14 1.78 c p1
+180.37 224.02 1.78 c p1
+183.34 225.85 1.78 c p1
+184.82 233.14 1.78 c p1
+180.37 225.85 1.78 c p1
+175.18 220.37 1.78 c p1
+181.86 227.67 1.78 c p1
+181.86 233.14 1.78 c p1
+181.86 231.32 1.78 c p1
+182.60 231.32 1.78 c p1
+172.95 224.02 1.78 c p1
+181.11 229.50 1.78 c p1
+195.21 238.62 1.78 c p1
+188.53 227.67 1.78 c p1
+194.47 233.14 1.78 c p1
+192.25 231.32 1.78 c p1
+193.73 233.14 1.78 c p1
+199.67 233.14 1.78 c p1
+184.08 224.02 1.78 c p1
+197.44 231.32 1.78 c p1
+193.73 224.02 1.78 c p1
+195.96 244.09 1.78 c p1
+188.53 236.79 1.78 c p1
+190.02 227.67 1.78 c p1
+191.50 233.14 1.78 c p1
+187.79 224.02 1.78 c p1
+188.53 229.50 1.78 c p1
+190.02 236.79 1.78 c p1
+191.50 233.14 1.78 c p1
+200.41 247.74 1.78 c p1
+201.89 225.85 1.78 c p1
+187.79 218.55 1.78 c p1
+192.99 236.79 1.78 c p1
+187.05 229.50 1.78 c p1
+200.41 229.50 1.78 c p1
+187.05 227.67 1.78 c p1
+192.99 238.62 1.78 c p1
+195.21 236.79 1.78 c p1
+186.31 229.50 1.78 c p1
+187.05 233.14 1.78 c p1
+192.25 229.50 1.78 c p1
+193.73 233.14 1.78 c p1
+195.96 229.50 1.78 c p1
+198.18 247.74 1.78 c p1
+192.25 229.50 1.78 c p1
+188.53 229.50 1.78 c p1
+192.25 225.85 1.78 c p1
+195.96 233.14 1.78 c p1
+192.25 240.44 1.78 c p1
+191.50 234.97 1.78 c p1
+186.31 233.14 1.78 c p1
+190.76 234.97 1.78 c p1
+192.25 234.97 1.78 c p1
+188.53 234.97 1.78 c p1
+188.53 227.67 1.78 c p1
+194.47 236.79 1.78 c p1
+192.99 238.62 1.78 c p1
+189.28 233.14 1.78 c p1
+187.79 224.02 1.78 c p1
+189.28 233.14 1.78 c p1
+190.76 240.44 1.78 c p1
+188.53 233.14 1.78 c p1
+213.15 213.15 260.44 260.44 cl
+208.40 208.40 265.19 265.19 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+213.15 213.15 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+213.15 213.15 260.44 260.44 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+216.72 242.27 1.78 c p1
+216.72 233.14 1.78 c p1
+216.72 236.79 1.78 c p1
+216.72 234.97 1.78 c p1
+216.72 244.09 1.78 c p1
+220.37 249.56 1.78 c p1
+218.55 240.44 1.78 c p1
+216.72 240.44 1.78 c p1
+216.72 231.32 1.78 c p1
+214.90 234.97 1.78 c p1
+216.72 245.92 1.78 c p1
+216.72 240.44 1.78 c p1
+214.90 233.14 1.78 c p1
+214.90 233.14 1.78 c p1
+216.72 251.39 1.78 c p1
+220.37 258.69 1.78 c p1
+220.37 249.56 1.78 c p1
+218.55 242.27 1.78 c p1
+218.55 247.74 1.78 c p1
+218.55 247.74 1.78 c p1
+216.72 240.44 1.78 c p1
+220.37 245.92 1.78 c p1
+216.72 244.09 1.78 c p1
+222.20 238.62 1.78 c p1
+216.72 240.44 1.78 c p1
+216.72 233.14 1.78 c p1
+220.37 240.44 1.78 c p1
+216.72 242.27 1.78 c p1
+216.72 240.44 1.78 c p1
+216.72 236.79 1.78 c p1
+216.72 234.97 1.78 c p1
+220.37 240.44 1.78 c p1
+214.90 253.21 1.78 c p1
+216.72 255.04 1.78 c p1
+216.72 234.97 1.78 c p1
+216.72 236.79 1.78 c p1
+216.72 242.27 1.78 c p1
+214.90 244.09 1.78 c p1
+216.72 233.14 1.78 c p1
+216.72 240.44 1.78 c p1
+218.55 242.27 1.78 c p1
+218.55 220.37 1.78 c p1
+216.72 236.79 1.78 c p1
+224.02 242.27 1.78 c p1
+220.37 247.74 1.78 c p1
+218.55 233.14 1.78 c p1
+216.72 247.74 1.78 c p1
+216.72 236.79 1.78 c p1
+216.72 245.92 1.78 c p1
+216.72 238.62 1.78 c p1
+238.62 236.79 1.78 c p1
+240.44 236.79 1.78 c p1
+240.44 234.97 1.78 c p1
+236.79 220.37 1.78 c p1
+240.44 229.50 1.78 c p1
+236.79 229.50 1.78 c p1
+242.27 238.62 1.78 c p1
+231.32 222.20 1.78 c p1
+236.79 231.32 1.78 c p1
+238.62 227.67 1.78 c p1
+231.32 214.90 1.78 c p1
+240.44 233.14 1.78 c p1
+231.32 218.55 1.78 c p1
+238.62 231.32 1.78 c p1
+236.79 231.32 1.78 c p1
+238.62 234.97 1.78 c p1
+240.44 233.14 1.78 c p1
+231.32 227.67 1.78 c p1
+240.44 218.55 1.78 c p1
+233.14 224.02 1.78 c p1
+245.92 236.79 1.78 c p1
+236.79 229.50 1.78 c p1
+240.44 224.02 1.78 c p1
+234.97 229.50 1.78 c p1
+236.79 231.32 1.78 c p1
+238.62 233.14 1.78 c p1
+238.62 229.50 1.78 c p1
+244.09 233.14 1.78 c p1
+240.44 231.32 1.78 c p1
+231.32 225.85 1.78 c p1
+233.14 222.20 1.78 c p1
+231.32 222.20 1.78 c p1
+234.97 227.67 1.78 c p1
+242.27 227.67 1.78 c p1
+240.44 233.14 1.78 c p1
+242.27 240.44 1.78 c p1
+240.44 234.97 1.78 c p1
+236.79 220.37 1.78 c p1
+236.79 233.14 1.78 c p1
+236.79 224.02 1.78 c p1
+234.97 225.85 1.78 c p1
+238.62 233.14 1.78 c p1
+234.97 225.85 1.78 c p1
+231.32 220.37 1.78 c p1
+236.79 227.67 1.78 c p1
+234.97 233.14 1.78 c p1
+236.79 231.32 1.78 c p1
+236.79 231.32 1.78 c p1
+233.14 224.02 1.78 c p1
+236.79 229.50 1.78 c p1
+258.69 238.62 1.78 c p1
+247.74 227.67 1.78 c p1
+251.39 233.14 1.78 c p1
+245.92 231.32 1.78 c p1
+253.21 233.14 1.78 c p1
+251.39 233.14 1.78 c p1
+244.09 224.02 1.78 c p1
+245.92 231.32 1.78 c p1
+245.92 224.02 1.78 c p1
+258.69 244.09 1.78 c p1
+249.56 236.79 1.78 c p1
+247.74 227.67 1.78 c p1
+251.39 233.14 1.78 c p1
+249.56 224.02 1.78 c p1
+256.86 229.50 1.78 c p1
+255.04 236.79 1.78 c p1
+245.92 233.14 1.78 c p1
+253.21 247.74 1.78 c p1
+255.04 225.85 1.78 c p1
+240.44 218.55 1.78 c p1
+255.04 236.79 1.78 c p1
+249.56 229.50 1.78 c p1
+249.56 229.50 1.78 c p1
+245.92 227.67 1.78 c p1
+251.39 238.62 1.78 c p1
+245.92 236.79 1.78 c p1
+245.92 229.50 1.78 c p1
+245.92 233.14 1.78 c p1
+251.39 229.50 1.78 c p1
+242.27 233.14 1.78 c p1
+247.74 229.50 1.78 c p1
+249.56 247.74 1.78 c p1
+253.21 229.50 1.78 c p1
+240.44 229.50 1.78 c p1
+238.62 225.85 1.78 c p1
+255.04 233.14 1.78 c p1
+256.86 240.44 1.78 c p1
+245.92 234.97 1.78 c p1
+245.92 233.14 1.78 c p1
+251.39 234.97 1.78 c p1
+256.86 234.97 1.78 c p1
+255.04 234.97 1.78 c p1
+247.74 227.67 1.78 c p1
+255.04 236.79 1.78 c p1
+258.69 238.62 1.78 c p1
+255.04 233.14 1.78 c p1
+247.74 224.02 1.78 c p1
+249.56 233.14 1.78 c p1
+255.04 240.44 1.78 c p1
+245.92 233.14 1.78 c p1
+269.94 213.15 317.23 260.44 cl
+265.19 208.40 321.98 265.19 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+269.94 213.15 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+269.94 213.15 317.23 260.44 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+271.69 242.27 1.78 c p1
+271.69 233.14 1.78 c p1
+271.69 236.79 1.78 c p1
+271.69 234.97 1.78 c p1
+271.69 244.09 1.78 c p1
+271.69 249.56 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 231.32 1.78 c p1
+271.69 234.97 1.78 c p1
+271.69 245.92 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 233.14 1.78 c p1
+271.69 233.14 1.78 c p1
+271.69 251.39 1.78 c p1
+271.69 258.69 1.78 c p1
+271.69 249.56 1.78 c p1
+271.69 242.27 1.78 c p1
+271.69 247.74 1.78 c p1
+271.69 247.74 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 245.92 1.78 c p1
+271.69 244.09 1.78 c p1
+271.69 238.62 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 233.14 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 242.27 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 236.79 1.78 c p1
+271.69 234.97 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 253.21 1.78 c p1
+271.69 255.04 1.78 c p1
+271.69 234.97 1.78 c p1
+271.69 236.79 1.78 c p1
+271.69 242.27 1.78 c p1
+271.69 244.09 1.78 c p1
+271.69 233.14 1.78 c p1
+271.69 240.44 1.78 c p1
+271.69 242.27 1.78 c p1
+271.69 220.37 1.78 c p1
+271.69 236.79 1.78 c p1
+271.69 242.27 1.78 c p1
+271.69 247.74 1.78 c p1
+271.69 233.14 1.78 c p1
+271.69 247.74 1.78 c p1
+271.69 236.79 1.78 c p1
+271.69 245.92 1.78 c p1
+271.69 238.62 1.78 c p1
+293.59 236.79 1.78 c p1
+293.59 236.79 1.78 c p1
+293.59 234.97 1.78 c p1
+293.59 220.37 1.78 c p1
+293.59 229.50 1.78 c p1
+293.59 229.50 1.78 c p1
+293.59 238.62 1.78 c p1
+293.59 222.20 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 227.67 1.78 c p1
+293.59 214.90 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 218.55 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 234.97 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 227.67 1.78 c p1
+293.59 218.55 1.78 c p1
+293.59 224.02 1.78 c p1
+293.59 236.79 1.78 c p1
+293.59 229.50 1.78 c p1
+293.59 224.02 1.78 c p1
+293.59 229.50 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 229.50 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 225.85 1.78 c p1
+293.59 222.20 1.78 c p1
+293.59 222.20 1.78 c p1
+293.59 227.67 1.78 c p1
+293.59 227.67 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 240.44 1.78 c p1
+293.59 234.97 1.78 c p1
+293.59 220.37 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 224.02 1.78 c p1
+293.59 225.85 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 225.85 1.78 c p1
+293.59 220.37 1.78 c p1
+293.59 227.67 1.78 c p1
+293.59 233.14 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 231.32 1.78 c p1
+293.59 224.02 1.78 c p1
+293.59 229.50 1.78 c p1
+315.48 238.62 1.78 c p1
+315.48 227.67 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 231.32 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 224.02 1.78 c p1
+315.48 231.32 1.78 c p1
+315.48 224.02 1.78 c p1
+315.48 244.09 1.78 c p1
+315.48 236.79 1.78 c p1
+315.48 227.67 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 224.02 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 236.79 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 247.74 1.78 c p1
+315.48 225.85 1.78 c p1
+315.48 218.55 1.78 c p1
+315.48 236.79 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 227.67 1.78 c p1
+315.48 238.62 1.78 c p1
+315.48 236.79 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 247.74 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 229.50 1.78 c p1
+315.48 225.85 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 240.44 1.78 c p1
+315.48 234.97 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 234.97 1.78 c p1
+315.48 234.97 1.78 c p1
+315.48 234.97 1.78 c p1
+315.48 227.67 1.78 c p1
+315.48 236.79 1.78 c p1
+315.48 238.62 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 224.02 1.78 c p1
+315.48 233.14 1.78 c p1
+315.48 240.44 1.78 c p1
+315.48 233.14 1.78 c p1
+42.77 156.36 90.06 203.64 cl
+38.02 151.60 94.81 208.40 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 156.36 m
+47.29 0 l
+0 47.28 l
+-47.29 0 l
+0 -47.28 l
+o
+42.77 156.36 90.06 203.64 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+54.25 161.08 1.78 c p1
+51.82 161.08 1.78 c p1
+49.38 160.33 1.78 c p1
+48.17 161.82 1.78 c p1
+53.03 161.08 1.78 c p1
+57.90 163.30 1.78 c p1
+48.17 161.08 1.78 c p1
+53.03 161.82 1.78 c p1
+45.74 161.08 1.78 c p1
+51.82 161.82 1.78 c p1
+57.90 161.82 1.78 c p1
+50.60 162.56 1.78 c p1
+50.60 161.08 1.78 c p1
+44.52 158.85 1.78 c p1
+62.76 159.59 1.78 c p1
+61.55 161.82 1.78 c p1
+57.90 160.33 1.78 c p1
+54.25 161.08 1.78 c p1
+61.55 163.30 1.78 c p1
+54.25 161.82 1.78 c p1
+57.90 163.30 1.78 c p1
+54.25 161.82 1.78 c p1
+48.17 158.11 1.78 c p1
+54.25 163.30 1.78 c p1
+50.60 164.79 1.78 c p1
+53.03 162.56 1.78 c p1
+53.03 162.56 1.78 c p1
+55.47 161.82 1.78 c p1
+55.47 161.08 1.78 c p1
+49.38 162.56 1.78 c p1
+50.60 162.56 1.78 c p1
+57.90 161.82 1.78 c p1
+55.47 161.82 1.78 c p1
+59.12 161.08 1.78 c p1
+51.82 161.82 1.78 c p1
+53.03 159.59 1.78 c p1
+59.12 160.33 1.78 c p1
+51.82 161.08 1.78 c p1
+45.74 160.33 1.78 c p1
+54.25 161.82 1.78 c p1
+53.03 160.33 1.78 c p1
+46.95 160.33 1.78 c p1
+45.74 160.33 1.78 c p1
+53.03 162.56 1.78 c p1
+54.25 164.79 1.78 c p1
+50.60 161.08 1.78 c p1
+54.25 162.56 1.78 c p1
+48.17 161.08 1.78 c p1
+56.68 161.82 1.78 c p1
+53.03 161.08 1.78 c p1
+77.36 185.57 1.78 c p1
+70.06 184.08 1.78 c p1
+76.14 187.05 1.78 c p1
+59.12 180.37 1.78 c p1
+71.28 184.82 1.78 c p1
+61.55 184.08 1.78 c p1
+68.85 185.57 1.78 c p1
+51.82 175.18 1.78 c p1
+72.49 184.82 1.78 c p1
+55.47 179.63 1.78 c p1
+53.03 176.66 1.78 c p1
+63.98 181.86 1.78 c p1
+65.20 180.37 1.78 c p1
+66.41 185.57 1.78 c p1
+60.33 177.40 1.78 c p1
+73.71 183.34 1.78 c p1
+60.33 184.08 1.78 c p1
+62.76 181.11 1.78 c p1
+67.63 184.08 1.78 c p1
+60.33 179.63 1.78 c p1
+63.98 186.31 1.78 c p1
+66.41 180.37 1.78 c p1
+68.85 187.05 1.78 c p1
+66.41 185.57 1.78 c p1
+70.06 182.60 1.78 c p1
+72.49 183.34 1.78 c p1
+74.93 186.31 1.78 c p1
+73.71 187.79 1.78 c p1
+65.20 184.08 1.78 c p1
+61.55 176.66 1.78 c p1
+59.12 178.89 1.78 c p1
+59.12 178.14 1.78 c p1
+62.76 179.63 1.78 c p1
+65.20 188.53 1.78 c p1
+57.90 184.08 1.78 c p1
+65.20 184.08 1.78 c p1
+73.71 185.57 1.78 c p1
+68.85 183.34 1.78 c p1
+60.33 181.11 1.78 c p1
+59.12 180.37 1.78 c p1
+59.12 183.34 1.78 c p1
+66.41 184.82 1.78 c p1
+62.76 180.37 1.78 c p1
+53.03 175.18 1.78 c p1
+60.33 181.86 1.78 c p1
+61.55 181.86 1.78 c p1
+61.55 181.86 1.78 c p1
+67.63 182.60 1.78 c p1
+54.25 172.95 1.78 c p1
+61.55 181.11 1.78 c p1
+68.85 195.21 1.78 c p1
+62.76 188.53 1.78 c p1
+78.58 194.47 1.78 c p1
+68.85 192.25 1.78 c p1
+71.28 193.73 1.78 c p1
+84.66 199.67 1.78 c p1
+51.82 184.08 1.78 c p1
+81.01 197.44 1.78 c p1
+73.71 193.73 1.78 c p1
+79.79 195.96 1.78 c p1
+71.28 188.53 1.78 c p1
+70.06 190.02 1.78 c p1
+74.93 191.50 1.78 c p1
+61.55 187.79 1.78 c p1
+62.76 188.53 1.78 c p1
+70.06 190.02 1.78 c p1
+71.28 191.50 1.78 c p1
+85.87 200.41 1.78 c p1
+85.87 201.89 1.78 c p1
+65.20 187.79 1.78 c p1
+76.14 192.99 1.78 c p1
+60.33 187.05 1.78 c p1
+85.87 200.41 1.78 c p1
+68.85 187.05 1.78 c p1
+73.71 192.99 1.78 c p1
+79.79 195.21 1.78 c p1
+67.63 186.31 1.78 c p1
+66.41 187.05 1.78 c p1
+70.06 192.25 1.78 c p1
+79.79 193.73 1.78 c p1
+82.22 195.96 1.78 c p1
+88.31 198.18 1.78 c p1
+70.06 192.25 1.78 c p1
+68.85 188.53 1.78 c p1
+66.41 192.25 1.78 c p1
+85.87 195.96 1.78 c p1
+68.85 192.25 1.78 c p1
+70.06 191.50 1.78 c p1
+65.20 186.31 1.78 c p1
+76.14 190.76 1.78 c p1
+73.71 192.25 1.78 c p1
+76.14 188.53 1.78 c p1
+62.76 188.53 1.78 c p1
+74.93 194.47 1.78 c p1
+73.71 192.99 1.78 c p1
+73.71 189.28 1.78 c p1
+68.85 187.79 1.78 c p1
+71.28 189.28 1.78 c p1
+67.63 190.76 1.78 c p1
+63.98 188.53 1.78 c p1
+99.56 156.36 146.85 203.64 cl
+94.81 151.60 151.60 208.40 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+99.56 156.36 m
+47.29 0 l
+0 47.28 l
+-47.29 0 l
+0 -47.28 l
+o
+99.56 156.36 146.85 203.64 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+128.68 161.08 1.78 c p1
+119.56 161.08 1.78 c p1
+123.21 160.33 1.78 c p1
+121.38 161.82 1.78 c p1
+130.50 161.08 1.78 c p1
+135.98 163.30 1.78 c p1
+126.86 161.08 1.78 c p1
+126.86 161.82 1.78 c p1
+117.73 161.08 1.78 c p1
+121.38 161.82 1.78 c p1
+132.33 161.82 1.78 c p1
+126.86 162.56 1.78 c p1
+119.56 161.08 1.78 c p1
+119.56 158.85 1.78 c p1
+137.80 159.59 1.78 c p1
+145.10 161.82 1.78 c p1
+135.98 160.33 1.78 c p1
+128.68 161.08 1.78 c p1
+134.15 163.30 1.78 c p1
+134.15 161.82 1.78 c p1
+126.86 163.30 1.78 c p1
+132.33 161.82 1.78 c p1
+130.50 158.11 1.78 c p1
+125.03 163.30 1.78 c p1
+126.86 164.79 1.78 c p1
+119.56 162.56 1.78 c p1
+126.86 162.56 1.78 c p1
+128.68 161.82 1.78 c p1
+126.86 161.08 1.78 c p1
+123.21 162.56 1.78 c p1
+121.38 162.56 1.78 c p1
+126.86 161.82 1.78 c p1
+139.63 161.82 1.78 c p1
+141.45 161.08 1.78 c p1
+121.38 161.82 1.78 c p1
+123.21 159.59 1.78 c p1
+128.68 160.33 1.78 c p1
+130.50 161.08 1.78 c p1
+119.56 160.33 1.78 c p1
+126.86 161.82 1.78 c p1
+128.68 160.33 1.78 c p1
+106.79 160.33 1.78 c p1
+123.21 160.33 1.78 c p1
+128.68 162.56 1.78 c p1
+134.15 164.79 1.78 c p1
+119.56 161.08 1.78 c p1
+134.15 162.56 1.78 c p1
+123.21 161.08 1.78 c p1
+132.33 161.82 1.78 c p1
+125.03 161.08 1.78 c p1
+123.21 185.57 1.78 c p1
+123.21 184.08 1.78 c p1
+121.38 187.05 1.78 c p1
+106.79 180.37 1.78 c p1
+115.91 184.82 1.78 c p1
+115.91 184.08 1.78 c p1
+125.03 185.57 1.78 c p1
+108.61 175.18 1.78 c p1
+117.73 184.82 1.78 c p1
+114.08 179.63 1.78 c p1
+101.31 176.66 1.78 c p1
+119.56 181.86 1.78 c p1
+104.96 180.37 1.78 c p1
+117.73 185.57 1.78 c p1
+117.73 177.40 1.78 c p1
+121.38 183.34 1.78 c p1
+119.56 184.08 1.78 c p1
+114.08 181.11 1.78 c p1
+104.96 184.08 1.78 c p1
+110.44 179.63 1.78 c p1
+123.21 186.31 1.78 c p1
+115.91 180.37 1.78 c p1
+110.44 187.05 1.78 c p1
+115.91 185.57 1.78 c p1
+117.73 182.60 1.78 c p1
+119.56 183.34 1.78 c p1
+115.91 186.31 1.78 c p1
+119.56 187.79 1.78 c p1
+117.73 184.08 1.78 c p1
+112.26 176.66 1.78 c p1
+108.61 178.89 1.78 c p1
+108.61 178.14 1.78 c p1
+114.08 179.63 1.78 c p1
+114.08 188.53 1.78 c p1
+119.56 184.08 1.78 c p1
+126.86 184.08 1.78 c p1
+121.38 185.57 1.78 c p1
+106.79 183.34 1.78 c p1
+119.56 181.11 1.78 c p1
+110.44 180.37 1.78 c p1
+112.26 183.34 1.78 c p1
+119.56 184.82 1.78 c p1
+112.26 180.37 1.78 c p1
+106.79 175.18 1.78 c p1
+114.08 181.86 1.78 c p1
+119.56 181.86 1.78 c p1
+117.73 181.86 1.78 c p1
+117.73 182.60 1.78 c p1
+110.44 172.95 1.78 c p1
+115.91 181.11 1.78 c p1
+125.03 195.21 1.78 c p1
+114.08 188.53 1.78 c p1
+119.56 194.47 1.78 c p1
+117.73 192.25 1.78 c p1
+119.56 193.73 1.78 c p1
+119.56 199.67 1.78 c p1
+110.44 184.08 1.78 c p1
+117.73 197.44 1.78 c p1
+110.44 193.73 1.78 c p1
+130.50 195.96 1.78 c p1
+123.21 188.53 1.78 c p1
+114.08 190.02 1.78 c p1
+119.56 191.50 1.78 c p1
+110.44 187.79 1.78 c p1
+115.91 188.53 1.78 c p1
+123.21 190.02 1.78 c p1
+119.56 191.50 1.78 c p1
+134.15 200.41 1.78 c p1
+112.26 201.89 1.78 c p1
+104.96 187.79 1.78 c p1
+123.21 192.99 1.78 c p1
+115.91 187.05 1.78 c p1
+115.91 200.41 1.78 c p1
+114.08 187.05 1.78 c p1
+125.03 192.99 1.78 c p1
+123.21 195.21 1.78 c p1
+115.91 186.31 1.78 c p1
+119.56 187.05 1.78 c p1
+115.91 192.25 1.78 c p1
+119.56 193.73 1.78 c p1
+115.91 195.96 1.78 c p1
+134.15 198.18 1.78 c p1
+115.91 192.25 1.78 c p1
+115.91 188.53 1.78 c p1
+112.26 192.25 1.78 c p1
+119.56 195.96 1.78 c p1
+126.86 192.25 1.78 c p1
+121.38 191.50 1.78 c p1
+119.56 186.31 1.78 c p1
+121.38 190.76 1.78 c p1
+121.38 192.25 1.78 c p1
+121.38 188.53 1.78 c p1
+114.08 188.53 1.78 c p1
+123.21 194.47 1.78 c p1
+125.03 192.99 1.78 c p1
+119.56 189.28 1.78 c p1
+110.44 187.79 1.78 c p1
+119.56 189.28 1.78 c p1
+126.86 190.76 1.78 c p1
+119.56 188.53 1.78 c p1
+156.36 156.36 203.64 203.64 cl
+151.60 151.60 208.40 208.40 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+156.36 156.36 m
+47.28 0 l
+0 47.28 l
+-47.28 0 l
+0 -47.28 l
+o
+156.36 156.36 203.64 203.64 cl
+/ps 7 def /Font1 findfont 7 s
+0 setgray
+180.00 178.26 (Petal.Length) .5 0 0 t
+213.15 156.36 260.44 203.64 cl
+208.40 151.60 265.19 208.40 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+213.15 156.36 m
+47.29 0 l
+0 47.28 l
+-47.29 0 l
+0 -47.28 l
+o
+213.15 156.36 260.44 203.64 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+216.72 161.08 1.78 c p1
+216.72 161.08 1.78 c p1
+216.72 160.33 1.78 c p1
+216.72 161.82 1.78 c p1
+216.72 161.08 1.78 c p1
+220.37 163.30 1.78 c p1
+218.55 161.08 1.78 c p1
+216.72 161.82 1.78 c p1
+216.72 161.08 1.78 c p1
+214.90 161.82 1.78 c p1
+216.72 161.82 1.78 c p1
+216.72 162.56 1.78 c p1
+214.90 161.08 1.78 c p1
+214.90 158.85 1.78 c p1
+216.72 159.59 1.78 c p1
+220.37 161.82 1.78 c p1
+220.37 160.33 1.78 c p1
+218.55 161.08 1.78 c p1
+218.55 163.30 1.78 c p1
+218.55 161.82 1.78 c p1
+216.72 163.30 1.78 c p1
+220.37 161.82 1.78 c p1
+216.72 158.11 1.78 c p1
+222.20 163.30 1.78 c p1
+216.72 164.79 1.78 c p1
+216.72 162.56 1.78 c p1
+220.37 162.56 1.78 c p1
+216.72 161.82 1.78 c p1
+216.72 161.08 1.78 c p1
+216.72 162.56 1.78 c p1
+216.72 162.56 1.78 c p1
+220.37 161.82 1.78 c p1
+214.90 161.82 1.78 c p1
+216.72 161.08 1.78 c p1
+216.72 161.82 1.78 c p1
+216.72 159.59 1.78 c p1
+216.72 160.33 1.78 c p1
+214.90 161.08 1.78 c p1
+216.72 160.33 1.78 c p1
+216.72 161.82 1.78 c p1
+218.55 160.33 1.78 c p1
+218.55 160.33 1.78 c p1
+216.72 160.33 1.78 c p1
+224.02 162.56 1.78 c p1
+220.37 164.79 1.78 c p1
+218.55 161.08 1.78 c p1
+216.72 162.56 1.78 c p1
+216.72 161.08 1.78 c p1
+216.72 161.82 1.78 c p1
+216.72 161.08 1.78 c p1
+238.62 185.57 1.78 c p1
+240.44 184.08 1.78 c p1
+240.44 187.05 1.78 c p1
+236.79 180.37 1.78 c p1
+240.44 184.82 1.78 c p1
+236.79 184.08 1.78 c p1
+242.27 185.57 1.78 c p1
+231.32 175.18 1.78 c p1
+236.79 184.82 1.78 c p1
+238.62 179.63 1.78 c p1
+231.32 176.66 1.78 c p1
+240.44 181.86 1.78 c p1
+231.32 180.37 1.78 c p1
+238.62 185.57 1.78 c p1
+236.79 177.40 1.78 c p1
+238.62 183.34 1.78 c p1
+240.44 184.08 1.78 c p1
+231.32 181.11 1.78 c p1
+240.44 184.08 1.78 c p1
+233.14 179.63 1.78 c p1
+245.92 186.31 1.78 c p1
+236.79 180.37 1.78 c p1
+240.44 187.05 1.78 c p1
+234.97 185.57 1.78 c p1
+236.79 182.60 1.78 c p1
+238.62 183.34 1.78 c p1
+238.62 186.31 1.78 c p1
+244.09 187.79 1.78 c p1
+240.44 184.08 1.78 c p1
+231.32 176.66 1.78 c p1
+233.14 178.89 1.78 c p1
+231.32 178.14 1.78 c p1
+234.97 179.63 1.78 c p1
+242.27 188.53 1.78 c p1
+240.44 184.08 1.78 c p1
+242.27 184.08 1.78 c p1
+240.44 185.57 1.78 c p1
+236.79 183.34 1.78 c p1
+236.79 181.11 1.78 c p1
+236.79 180.37 1.78 c p1
+234.97 183.34 1.78 c p1
+238.62 184.82 1.78 c p1
+234.97 180.37 1.78 c p1
+231.32 175.18 1.78 c p1
+236.79 181.86 1.78 c p1
+234.97 181.86 1.78 c p1
+236.79 181.86 1.78 c p1
+236.79 182.60 1.78 c p1
+233.14 172.95 1.78 c p1
+236.79 181.11 1.78 c p1
+258.69 195.21 1.78 c p1
+247.74 188.53 1.78 c p1
+251.39 194.47 1.78 c p1
+245.92 192.25 1.78 c p1
+253.21 193.73 1.78 c p1
+251.39 199.67 1.78 c p1
+244.09 184.08 1.78 c p1
+245.92 197.44 1.78 c p1
+245.92 193.73 1.78 c p1
+258.69 195.96 1.78 c p1
+249.56 188.53 1.78 c p1
+247.74 190.02 1.78 c p1
+251.39 191.50 1.78 c p1
+249.56 187.79 1.78 c p1
+256.86 188.53 1.78 c p1
+255.04 190.02 1.78 c p1
+245.92 191.50 1.78 c p1
+253.21 200.41 1.78 c p1
+255.04 201.89 1.78 c p1
+240.44 187.79 1.78 c p1
+255.04 192.99 1.78 c p1
+249.56 187.05 1.78 c p1
+249.56 200.41 1.78 c p1
+245.92 187.05 1.78 c p1
+251.39 192.99 1.78 c p1
+245.92 195.21 1.78 c p1
+245.92 186.31 1.78 c p1
+245.92 187.05 1.78 c p1
+251.39 192.25 1.78 c p1
+242.27 193.73 1.78 c p1
+247.74 195.96 1.78 c p1
+249.56 198.18 1.78 c p1
+253.21 192.25 1.78 c p1
+240.44 188.53 1.78 c p1
+238.62 192.25 1.78 c p1
+255.04 195.96 1.78 c p1
+256.86 192.25 1.78 c p1
+245.92 191.50 1.78 c p1
+245.92 186.31 1.78 c p1
+251.39 190.76 1.78 c p1
+256.86 192.25 1.78 c p1
+255.04 188.53 1.78 c p1
+247.74 188.53 1.78 c p1
+255.04 194.47 1.78 c p1
+258.69 192.99 1.78 c p1
+255.04 189.28 1.78 c p1
+247.74 187.79 1.78 c p1
+249.56 189.28 1.78 c p1
+255.04 190.76 1.78 c p1
+245.92 188.53 1.78 c p1
+269.94 156.36 317.23 203.64 cl
+265.19 151.60 321.98 208.40 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+269.94 156.36 m
+47.29 0 l
+0 47.28 l
+-47.29 0 l
+0 -47.28 l
+o
+np
+317.23 158.11 m
+0 44.53 l
+o
+np
+317.23 158.11 m
+4.75 0 l
+o
+np
+317.23 165.53 m
+4.75 0 l
+o
+np
+317.23 172.95 m
+4.75 0 l
+o
+np
+317.23 180.37 m
+4.75 0 l
+o
+np
+317.23 187.79 m
+4.75 0 l
+o
+np
+317.23 195.21 m
+4.75 0 l
+o
+np
+317.23 202.64 m
+4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+334.34 158.11 (1) .5 0 90 t
+334.34 172.95 (3) .5 0 90 t
+334.34 187.79 (5) .5 0 90 t
+334.34 202.64 (7) .5 0 90 t
+269.94 156.36 317.23 203.64 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+271.69 161.08 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 163.30 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 158.85 1.78 c p1
+271.69 159.59 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 163.30 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 163.30 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 158.11 1.78 c p1
+271.69 163.30 1.78 c p1
+271.69 164.79 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 159.59 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 160.33 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 164.79 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 162.56 1.78 c p1
+271.69 161.08 1.78 c p1
+271.69 161.82 1.78 c p1
+271.69 161.08 1.78 c p1
+293.59 185.57 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 187.05 1.78 c p1
+293.59 180.37 1.78 c p1
+293.59 184.82 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 185.57 1.78 c p1
+293.59 175.18 1.78 c p1
+293.59 184.82 1.78 c p1
+293.59 179.63 1.78 c p1
+293.59 176.66 1.78 c p1
+293.59 181.86 1.78 c p1
+293.59 180.37 1.78 c p1
+293.59 185.57 1.78 c p1
+293.59 177.40 1.78 c p1
+293.59 183.34 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 181.11 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 179.63 1.78 c p1
+293.59 186.31 1.78 c p1
+293.59 180.37 1.78 c p1
+293.59 187.05 1.78 c p1
+293.59 185.57 1.78 c p1
+293.59 182.60 1.78 c p1
+293.59 183.34 1.78 c p1
+293.59 186.31 1.78 c p1
+293.59 187.79 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 176.66 1.78 c p1
+293.59 178.89 1.78 c p1
+293.59 178.14 1.78 c p1
+293.59 179.63 1.78 c p1
+293.59 188.53 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 184.08 1.78 c p1
+293.59 185.57 1.78 c p1
+293.59 183.34 1.78 c p1
+293.59 181.11 1.78 c p1
+293.59 180.37 1.78 c p1
+293.59 183.34 1.78 c p1
+293.59 184.82 1.78 c p1
+293.59 180.37 1.78 c p1
+293.59 175.18 1.78 c p1
+293.59 181.86 1.78 c p1
+293.59 181.86 1.78 c p1
+293.59 181.86 1.78 c p1
+293.59 182.60 1.78 c p1
+293.59 172.95 1.78 c p1
+293.59 181.11 1.78 c p1
+315.48 195.21 1.78 c p1
+315.48 188.53 1.78 c p1
+315.48 194.47 1.78 c p1
+315.48 192.25 1.78 c p1
+315.48 193.73 1.78 c p1
+315.48 199.67 1.78 c p1
+315.48 184.08 1.78 c p1
+315.48 197.44 1.78 c p1
+315.48 193.73 1.78 c p1
+315.48 195.96 1.78 c p1
+315.48 188.53 1.78 c p1
+315.48 190.02 1.78 c p1
+315.48 191.50 1.78 c p1
+315.48 187.79 1.78 c p1
+315.48 188.53 1.78 c p1
+315.48 190.02 1.78 c p1
+315.48 191.50 1.78 c p1
+315.48 200.41 1.78 c p1
+315.48 201.89 1.78 c p1
+315.48 187.79 1.78 c p1
+315.48 192.99 1.78 c p1
+315.48 187.05 1.78 c p1
+315.48 200.41 1.78 c p1
+315.48 187.05 1.78 c p1
+315.48 192.99 1.78 c p1
+315.48 195.21 1.78 c p1
+315.48 186.31 1.78 c p1
+315.48 187.05 1.78 c p1
+315.48 192.25 1.78 c p1
+315.48 193.73 1.78 c p1
+315.48 195.96 1.78 c p1
+315.48 198.18 1.78 c p1
+315.48 192.25 1.78 c p1
+315.48 188.53 1.78 c p1
+315.48 192.25 1.78 c p1
+315.48 195.96 1.78 c p1
+315.48 192.25 1.78 c p1
+315.48 191.50 1.78 c p1
+315.48 186.31 1.78 c p1
+315.48 190.76 1.78 c p1
+315.48 192.25 1.78 c p1
+315.48 188.53 1.78 c p1
+315.48 188.53 1.78 c p1
+315.48 194.47 1.78 c p1
+315.48 192.99 1.78 c p1
+315.48 189.28 1.78 c p1
+315.48 187.79 1.78 c p1
+315.48 189.28 1.78 c p1
+315.48 190.76 1.78 c p1
+315.48 188.53 1.78 c p1
+42.77 99.56 90.06 146.85 cl
+38.02 94.81 94.81 151.60 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 99.56 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+42.77 108.61 m
+0 36.49 l
+o
+np
+42.77 108.61 m
+-4.75 0 l
+o
+np
+42.77 117.73 m
+-4.75 0 l
+o
+np
+42.77 126.86 m
+-4.75 0 l
+o
+np
+42.77 135.98 m
+-4.75 0 l
+o
+np
+42.77 145.10 m
+-4.75 0 l
+o
+/ps 8 def /Font1 findfont 8 s
+31.36 108.61 (0.5) .5 0 90 t
+31.36 126.86 (1.5) .5 0 90 t
+31.36 145.10 (2.5) .5 0 90 t
+42.77 99.56 90.06 146.85 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+54.25 103.14 1.78 c p1
+51.82 103.14 1.78 c p1
+49.38 103.14 1.78 c p1
+48.17 103.14 1.78 c p1
+53.03 103.14 1.78 c p1
+57.90 106.79 1.78 c p1
+48.17 104.96 1.78 c p1
+53.03 103.14 1.78 c p1
+45.74 103.14 1.78 c p1
+51.82 101.31 1.78 c p1
+57.90 103.14 1.78 c p1
+50.60 103.14 1.78 c p1
+50.60 101.31 1.78 c p1
+44.52 101.31 1.78 c p1
+62.76 103.14 1.78 c p1
+61.55 106.79 1.78 c p1
+57.90 106.79 1.78 c p1
+54.25 104.96 1.78 c p1
+61.55 104.96 1.78 c p1
+54.25 104.96 1.78 c p1
+57.90 103.14 1.78 c p1
+54.25 106.79 1.78 c p1
+48.17 103.14 1.78 c p1
+54.25 108.61 1.78 c p1
+50.60 103.14 1.78 c p1
+53.03 103.14 1.78 c p1
+53.03 106.79 1.78 c p1
+55.47 103.14 1.78 c p1
+55.47 103.14 1.78 c p1
+49.38 103.14 1.78 c p1
+50.60 103.14 1.78 c p1
+57.90 106.79 1.78 c p1
+55.47 101.31 1.78 c p1
+59.12 103.14 1.78 c p1
+51.82 103.14 1.78 c p1
+53.03 103.14 1.78 c p1
+59.12 103.14 1.78 c p1
+51.82 101.31 1.78 c p1
+45.74 103.14 1.78 c p1
+54.25 103.14 1.78 c p1
+53.03 104.96 1.78 c p1
+46.95 104.96 1.78 c p1
+45.74 103.14 1.78 c p1
+53.03 110.44 1.78 c p1
+54.25 106.79 1.78 c p1
+50.60 104.96 1.78 c p1
+54.25 103.14 1.78 c p1
+48.17 103.14 1.78 c p1
+56.68 103.14 1.78 c p1
+53.03 103.14 1.78 c p1
+77.36 125.03 1.78 c p1
+70.06 126.86 1.78 c p1
+76.14 126.86 1.78 c p1
+59.12 123.21 1.78 c p1
+71.28 126.86 1.78 c p1
+61.55 123.21 1.78 c p1
+68.85 128.68 1.78 c p1
+51.82 117.73 1.78 c p1
+72.49 123.21 1.78 c p1
+55.47 125.03 1.78 c p1
+53.03 117.73 1.78 c p1
+63.98 126.86 1.78 c p1
+65.20 117.73 1.78 c p1
+66.41 125.03 1.78 c p1
+60.33 123.21 1.78 c p1
+73.71 125.03 1.78 c p1
+60.33 126.86 1.78 c p1
+62.76 117.73 1.78 c p1
+67.63 126.86 1.78 c p1
+60.33 119.56 1.78 c p1
+63.98 132.33 1.78 c p1
+66.41 123.21 1.78 c p1
+68.85 126.86 1.78 c p1
+66.41 121.38 1.78 c p1
+70.06 123.21 1.78 c p1
+72.49 125.03 1.78 c p1
+74.93 125.03 1.78 c p1
+73.71 130.50 1.78 c p1
+65.20 126.86 1.78 c p1
+61.55 117.73 1.78 c p1
+59.12 119.56 1.78 c p1
+59.12 117.73 1.78 c p1
+62.76 121.38 1.78 c p1
+65.20 128.68 1.78 c p1
+57.90 126.86 1.78 c p1
+65.20 128.68 1.78 c p1
+73.71 126.86 1.78 c p1
+68.85 123.21 1.78 c p1
+60.33 123.21 1.78 c p1
+59.12 123.21 1.78 c p1
+59.12 121.38 1.78 c p1
+66.41 125.03 1.78 c p1
+62.76 121.38 1.78 c p1
+53.03 117.73 1.78 c p1
+60.33 123.21 1.78 c p1
+61.55 121.38 1.78 c p1
+61.55 123.21 1.78 c p1
+67.63 123.21 1.78 c p1
+54.25 119.56 1.78 c p1
+61.55 123.21 1.78 c p1
+68.85 145.10 1.78 c p1
+62.76 134.15 1.78 c p1
+78.58 137.80 1.78 c p1
+68.85 132.33 1.78 c p1
+71.28 139.63 1.78 c p1
+84.66 137.80 1.78 c p1
+51.82 130.50 1.78 c p1
+81.01 132.33 1.78 c p1
+73.71 132.33 1.78 c p1
+79.79 145.10 1.78 c p1
+71.28 135.98 1.78 c p1
+70.06 134.15 1.78 c p1
+74.93 137.80 1.78 c p1
+61.55 135.98 1.78 c p1
+62.76 143.28 1.78 c p1
+70.06 141.45 1.78 c p1
+71.28 132.33 1.78 c p1
+85.87 139.63 1.78 c p1
+85.87 141.45 1.78 c p1
+65.20 126.86 1.78 c p1
+76.14 141.45 1.78 c p1
+60.33 135.98 1.78 c p1
+85.87 135.98 1.78 c p1
+68.85 132.33 1.78 c p1
+73.71 137.80 1.78 c p1
+79.79 132.33 1.78 c p1
+67.63 132.33 1.78 c p1
+66.41 132.33 1.78 c p1
+70.06 137.80 1.78 c p1
+79.79 128.68 1.78 c p1
+82.22 134.15 1.78 c p1
+88.31 135.98 1.78 c p1
+70.06 139.63 1.78 c p1
+68.85 126.86 1.78 c p1
+66.41 125.03 1.78 c p1
+85.87 141.45 1.78 c p1
+68.85 143.28 1.78 c p1
+70.06 132.33 1.78 c p1
+65.20 132.33 1.78 c p1
+76.14 137.80 1.78 c p1
+73.71 143.28 1.78 c p1
+76.14 141.45 1.78 c p1
+62.76 134.15 1.78 c p1
+74.93 141.45 1.78 c p1
+73.71 145.10 1.78 c p1
+73.71 141.45 1.78 c p1
+68.85 134.15 1.78 c p1
+71.28 135.98 1.78 c p1
+67.63 141.45 1.78 c p1
+63.98 132.33 1.78 c p1
+99.56 99.56 146.85 146.85 cl
+94.81 94.81 151.60 151.60 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+99.56 99.56 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+99.56 99.56 146.85 146.85 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+128.68 103.14 1.78 c p1
+119.56 103.14 1.78 c p1
+123.21 103.14 1.78 c p1
+121.38 103.14 1.78 c p1
+130.50 103.14 1.78 c p1
+135.98 106.79 1.78 c p1
+126.86 104.96 1.78 c p1
+126.86 103.14 1.78 c p1
+117.73 103.14 1.78 c p1
+121.38 101.31 1.78 c p1
+132.33 103.14 1.78 c p1
+126.86 103.14 1.78 c p1
+119.56 101.31 1.78 c p1
+119.56 101.31 1.78 c p1
+137.80 103.14 1.78 c p1
+145.10 106.79 1.78 c p1
+135.98 106.79 1.78 c p1
+128.68 104.96 1.78 c p1
+134.15 104.96 1.78 c p1
+134.15 104.96 1.78 c p1
+126.86 103.14 1.78 c p1
+132.33 106.79 1.78 c p1
+130.50 103.14 1.78 c p1
+125.03 108.61 1.78 c p1
+126.86 103.14 1.78 c p1
+119.56 103.14 1.78 c p1
+126.86 106.79 1.78 c p1
+128.68 103.14 1.78 c p1
+126.86 103.14 1.78 c p1
+123.21 103.14 1.78 c p1
+121.38 103.14 1.78 c p1
+126.86 106.79 1.78 c p1
+139.63 101.31 1.78 c p1
+141.45 103.14 1.78 c p1
+121.38 103.14 1.78 c p1
+123.21 103.14 1.78 c p1
+128.68 103.14 1.78 c p1
+130.50 101.31 1.78 c p1
+119.56 103.14 1.78 c p1
+126.86 103.14 1.78 c p1
+128.68 104.96 1.78 c p1
+106.79 104.96 1.78 c p1
+123.21 103.14 1.78 c p1
+128.68 110.44 1.78 c p1
+134.15 106.79 1.78 c p1
+119.56 104.96 1.78 c p1
+134.15 103.14 1.78 c p1
+123.21 103.14 1.78 c p1
+132.33 103.14 1.78 c p1
+125.03 103.14 1.78 c p1
+123.21 125.03 1.78 c p1
+123.21 126.86 1.78 c p1
+121.38 126.86 1.78 c p1
+106.79 123.21 1.78 c p1
+115.91 126.86 1.78 c p1
+115.91 123.21 1.78 c p1
+125.03 128.68 1.78 c p1
+108.61 117.73 1.78 c p1
+117.73 123.21 1.78 c p1
+114.08 125.03 1.78 c p1
+101.31 117.73 1.78 c p1
+119.56 126.86 1.78 c p1
+104.96 117.73 1.78 c p1
+117.73 125.03 1.78 c p1
+117.73 123.21 1.78 c p1
+121.38 125.03 1.78 c p1
+119.56 126.86 1.78 c p1
+114.08 117.73 1.78 c p1
+104.96 126.86 1.78 c p1
+110.44 119.56 1.78 c p1
+123.21 132.33 1.78 c p1
+115.91 123.21 1.78 c p1
+110.44 126.86 1.78 c p1
+115.91 121.38 1.78 c p1
+117.73 123.21 1.78 c p1
+119.56 125.03 1.78 c p1
+115.91 125.03 1.78 c p1
+119.56 130.50 1.78 c p1
+117.73 126.86 1.78 c p1
+112.26 117.73 1.78 c p1
+108.61 119.56 1.78 c p1
+108.61 117.73 1.78 c p1
+114.08 121.38 1.78 c p1
+114.08 128.68 1.78 c p1
+119.56 126.86 1.78 c p1
+126.86 128.68 1.78 c p1
+121.38 126.86 1.78 c p1
+106.79 123.21 1.78 c p1
+119.56 123.21 1.78 c p1
+110.44 123.21 1.78 c p1
+112.26 121.38 1.78 c p1
+119.56 125.03 1.78 c p1
+112.26 121.38 1.78 c p1
+106.79 117.73 1.78 c p1
+114.08 123.21 1.78 c p1
+119.56 121.38 1.78 c p1
+117.73 123.21 1.78 c p1
+117.73 123.21 1.78 c p1
+110.44 119.56 1.78 c p1
+115.91 123.21 1.78 c p1
+125.03 145.10 1.78 c p1
+114.08 134.15 1.78 c p1
+119.56 137.80 1.78 c p1
+117.73 132.33 1.78 c p1
+119.56 139.63 1.78 c p1
+119.56 137.80 1.78 c p1
+110.44 130.50 1.78 c p1
+117.73 132.33 1.78 c p1
+110.44 132.33 1.78 c p1
+130.50 145.10 1.78 c p1
+123.21 135.98 1.78 c p1
+114.08 134.15 1.78 c p1
+119.56 137.80 1.78 c p1
+110.44 135.98 1.78 c p1
+115.91 143.28 1.78 c p1
+123.21 141.45 1.78 c p1
+119.56 132.33 1.78 c p1
+134.15 139.63 1.78 c p1
+112.26 141.45 1.78 c p1
+104.96 126.86 1.78 c p1
+123.21 141.45 1.78 c p1
+115.91 135.98 1.78 c p1
+115.91 135.98 1.78 c p1
+114.08 132.33 1.78 c p1
+125.03 137.80 1.78 c p1
+123.21 132.33 1.78 c p1
+115.91 132.33 1.78 c p1
+119.56 132.33 1.78 c p1
+115.91 137.80 1.78 c p1
+119.56 128.68 1.78 c p1
+115.91 134.15 1.78 c p1
+134.15 135.98 1.78 c p1
+115.91 139.63 1.78 c p1
+115.91 126.86 1.78 c p1
+112.26 125.03 1.78 c p1
+119.56 141.45 1.78 c p1
+126.86 143.28 1.78 c p1
+121.38 132.33 1.78 c p1
+119.56 132.33 1.78 c p1
+121.38 137.80 1.78 c p1
+121.38 143.28 1.78 c p1
+121.38 141.45 1.78 c p1
+114.08 134.15 1.78 c p1
+123.21 141.45 1.78 c p1
+125.03 145.10 1.78 c p1
+119.56 141.45 1.78 c p1
+110.44 134.15 1.78 c p1
+119.56 135.98 1.78 c p1
+126.86 141.45 1.78 c p1
+119.56 132.33 1.78 c p1
+156.36 99.56 203.64 146.85 cl
+151.60 94.81 208.40 151.60 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+156.36 99.56 m
+47.28 0 l
+0 47.29 l
+-47.28 0 l
+0 -47.29 l
+o
+156.36 99.56 203.64 146.85 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+161.08 103.14 1.78 c p1
+161.08 103.14 1.78 c p1
+160.33 103.14 1.78 c p1
+161.82 103.14 1.78 c p1
+161.08 103.14 1.78 c p1
+163.30 106.79 1.78 c p1
+161.08 104.96 1.78 c p1
+161.82 103.14 1.78 c p1
+161.08 103.14 1.78 c p1
+161.82 101.31 1.78 c p1
+161.82 103.14 1.78 c p1
+162.56 103.14 1.78 c p1
+161.08 101.31 1.78 c p1
+158.85 101.31 1.78 c p1
+159.59 103.14 1.78 c p1
+161.82 106.79 1.78 c p1
+160.33 106.79 1.78 c p1
+161.08 104.96 1.78 c p1
+163.30 104.96 1.78 c p1
+161.82 104.96 1.78 c p1
+163.30 103.14 1.78 c p1
+161.82 106.79 1.78 c p1
+158.11 103.14 1.78 c p1
+163.30 108.61 1.78 c p1
+164.79 103.14 1.78 c p1
+162.56 103.14 1.78 c p1
+162.56 106.79 1.78 c p1
+161.82 103.14 1.78 c p1
+161.08 103.14 1.78 c p1
+162.56 103.14 1.78 c p1
+162.56 103.14 1.78 c p1
+161.82 106.79 1.78 c p1
+161.82 101.31 1.78 c p1
+161.08 103.14 1.78 c p1
+161.82 103.14 1.78 c p1
+159.59 103.14 1.78 c p1
+160.33 103.14 1.78 c p1
+161.08 101.31 1.78 c p1
+160.33 103.14 1.78 c p1
+161.82 103.14 1.78 c p1
+160.33 104.96 1.78 c p1
+160.33 104.96 1.78 c p1
+160.33 103.14 1.78 c p1
+162.56 110.44 1.78 c p1
+164.79 106.79 1.78 c p1
+161.08 104.96 1.78 c p1
+162.56 103.14 1.78 c p1
+161.08 103.14 1.78 c p1
+161.82 103.14 1.78 c p1
+161.08 103.14 1.78 c p1
+185.57 125.03 1.78 c p1
+184.08 126.86 1.78 c p1
+187.05 126.86 1.78 c p1
+180.37 123.21 1.78 c p1
+184.82 126.86 1.78 c p1
+184.08 123.21 1.78 c p1
+185.57 128.68 1.78 c p1
+175.18 117.73 1.78 c p1
+184.82 123.21 1.78 c p1
+179.63 125.03 1.78 c p1
+176.66 117.73 1.78 c p1
+181.86 126.86 1.78 c p1
+180.37 117.73 1.78 c p1
+185.57 125.03 1.78 c p1
+177.40 123.21 1.78 c p1
+183.34 125.03 1.78 c p1
+184.08 126.86 1.78 c p1
+181.11 117.73 1.78 c p1
+184.08 126.86 1.78 c p1
+179.63 119.56 1.78 c p1
+186.31 132.33 1.78 c p1
+180.37 123.21 1.78 c p1
+187.05 126.86 1.78 c p1
+185.57 121.38 1.78 c p1
+182.60 123.21 1.78 c p1
+183.34 125.03 1.78 c p1
+186.31 125.03 1.78 c p1
+187.79 130.50 1.78 c p1
+184.08 126.86 1.78 c p1
+176.66 117.73 1.78 c p1
+178.89 119.56 1.78 c p1
+178.14 117.73 1.78 c p1
+179.63 121.38 1.78 c p1
+188.53 128.68 1.78 c p1
+184.08 126.86 1.78 c p1
+184.08 128.68 1.78 c p1
+185.57 126.86 1.78 c p1
+183.34 123.21 1.78 c p1
+181.11 123.21 1.78 c p1
+180.37 123.21 1.78 c p1
+183.34 121.38 1.78 c p1
+184.82 125.03 1.78 c p1
+180.37 121.38 1.78 c p1
+175.18 117.73 1.78 c p1
+181.86 123.21 1.78 c p1
+181.86 121.38 1.78 c p1
+181.86 123.21 1.78 c p1
+182.60 123.21 1.78 c p1
+172.95 119.56 1.78 c p1
+181.11 123.21 1.78 c p1
+195.21 145.10 1.78 c p1
+188.53 134.15 1.78 c p1
+194.47 137.80 1.78 c p1
+192.25 132.33 1.78 c p1
+193.73 139.63 1.78 c p1
+199.67 137.80 1.78 c p1
+184.08 130.50 1.78 c p1
+197.44 132.33 1.78 c p1
+193.73 132.33 1.78 c p1
+195.96 145.10 1.78 c p1
+188.53 135.98 1.78 c p1
+190.02 134.15 1.78 c p1
+191.50 137.80 1.78 c p1
+187.79 135.98 1.78 c p1
+188.53 143.28 1.78 c p1
+190.02 141.45 1.78 c p1
+191.50 132.33 1.78 c p1
+200.41 139.63 1.78 c p1
+201.89 141.45 1.78 c p1
+187.79 126.86 1.78 c p1
+192.99 141.45 1.78 c p1
+187.05 135.98 1.78 c p1
+200.41 135.98 1.78 c p1
+187.05 132.33 1.78 c p1
+192.99 137.80 1.78 c p1
+195.21 132.33 1.78 c p1
+186.31 132.33 1.78 c p1
+187.05 132.33 1.78 c p1
+192.25 137.80 1.78 c p1
+193.73 128.68 1.78 c p1
+195.96 134.15 1.78 c p1
+198.18 135.98 1.78 c p1
+192.25 139.63 1.78 c p1
+188.53 126.86 1.78 c p1
+192.25 125.03 1.78 c p1
+195.96 141.45 1.78 c p1
+192.25 143.28 1.78 c p1
+191.50 132.33 1.78 c p1
+186.31 132.33 1.78 c p1
+190.76 137.80 1.78 c p1
+192.25 143.28 1.78 c p1
+188.53 141.45 1.78 c p1
+188.53 134.15 1.78 c p1
+194.47 141.45 1.78 c p1
+192.99 145.10 1.78 c p1
+189.28 141.45 1.78 c p1
+187.79 134.15 1.78 c p1
+189.28 135.98 1.78 c p1
+190.76 141.45 1.78 c p1
+188.53 132.33 1.78 c p1
+213.15 99.56 260.44 146.85 cl
+208.40 94.81 265.19 151.60 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+213.15 99.56 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+213.15 99.56 260.44 146.85 cl
+/ps 7 def /Font1 findfont 7 s
+0 setgray
+236.79 120.75 (Petal.Width) .5 0 0 t
+269.94 99.56 317.23 146.85 cl
+265.19 94.81 321.98 151.60 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+269.94 99.56 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+269.94 99.56 317.23 146.85 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 101.31 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 101.31 1.78 c p1
+271.69 101.31 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 108.61 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 101.31 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 101.31 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 110.44 1.78 c p1
+271.69 106.79 1.78 c p1
+271.69 104.96 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+271.69 103.14 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 128.68 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 119.56 1.78 c p1
+293.59 132.33 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 121.38 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 130.50 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 119.56 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 121.38 1.78 c p1
+293.59 128.68 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 128.68 1.78 c p1
+293.59 126.86 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 121.38 1.78 c p1
+293.59 125.03 1.78 c p1
+293.59 121.38 1.78 c p1
+293.59 117.73 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 121.38 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 123.21 1.78 c p1
+293.59 119.56 1.78 c p1
+293.59 123.21 1.78 c p1
+315.48 145.10 1.78 c p1
+315.48 134.15 1.78 c p1
+315.48 137.80 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 139.63 1.78 c p1
+315.48 137.80 1.78 c p1
+315.48 130.50 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 145.10 1.78 c p1
+315.48 135.98 1.78 c p1
+315.48 134.15 1.78 c p1
+315.48 137.80 1.78 c p1
+315.48 135.98 1.78 c p1
+315.48 143.28 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 139.63 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 126.86 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 135.98 1.78 c p1
+315.48 135.98 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 137.80 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 137.80 1.78 c p1
+315.48 128.68 1.78 c p1
+315.48 134.15 1.78 c p1
+315.48 135.98 1.78 c p1
+315.48 139.63 1.78 c p1
+315.48 126.86 1.78 c p1
+315.48 125.03 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 143.28 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 132.33 1.78 c p1
+315.48 137.80 1.78 c p1
+315.48 143.28 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 134.15 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 145.10 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 134.15 1.78 c p1
+315.48 135.98 1.78 c p1
+315.48 141.45 1.78 c p1
+315.48 132.33 1.78 c p1
+42.77 42.77 90.06 90.06 cl
+38.02 38.02 94.81 94.81 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+42.77 42.77 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+46.95 42.77 m
+42.57 0 l
+o
+np
+46.95 42.77 m
+0 -4.75 l
+o
+np
+53.03 42.77 m
+0 -4.75 l
+o
+np
+59.12 42.77 m
+0 -4.75 l
+o
+np
+65.20 42.77 m
+0 -4.75 l
+o
+np
+71.28 42.77 m
+0 -4.75 l
+o
+np
+77.36 42.77 m
+0 -4.75 l
+o
+np
+83.44 42.77 m
+0 -4.75 l
+o
+np
+89.52 42.77 m
+0 -4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+46.95 25.66 (4.5) .5 0 0 t
+65.20 25.66 (6.0) .5 0 0 t
+83.44 25.66 (7.5) .5 0 0 t
+42.77 42.77 90.06 90.06 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+54.25 44.52 1.78 c p1
+51.82 44.52 1.78 c p1
+49.38 44.52 1.78 c p1
+48.17 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+57.90 44.52 1.78 c p1
+48.17 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+45.74 44.52 1.78 c p1
+51.82 44.52 1.78 c p1
+57.90 44.52 1.78 c p1
+50.60 44.52 1.78 c p1
+50.60 44.52 1.78 c p1
+44.52 44.52 1.78 c p1
+62.76 44.52 1.78 c p1
+61.55 44.52 1.78 c p1
+57.90 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+61.55 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+57.90 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+48.17 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+50.60 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+55.47 44.52 1.78 c p1
+55.47 44.52 1.78 c p1
+49.38 44.52 1.78 c p1
+50.60 44.52 1.78 c p1
+57.90 44.52 1.78 c p1
+55.47 44.52 1.78 c p1
+59.12 44.52 1.78 c p1
+51.82 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+59.12 44.52 1.78 c p1
+51.82 44.52 1.78 c p1
+45.74 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+46.95 44.52 1.78 c p1
+45.74 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+50.60 44.52 1.78 c p1
+54.25 44.52 1.78 c p1
+48.17 44.52 1.78 c p1
+56.68 44.52 1.78 c p1
+53.03 44.52 1.78 c p1
+77.36 66.41 1.78 c p1
+70.06 66.41 1.78 c p1
+76.14 66.41 1.78 c p1
+59.12 66.41 1.78 c p1
+71.28 66.41 1.78 c p1
+61.55 66.41 1.78 c p1
+68.85 66.41 1.78 c p1
+51.82 66.41 1.78 c p1
+72.49 66.41 1.78 c p1
+55.47 66.41 1.78 c p1
+53.03 66.41 1.78 c p1
+63.98 66.41 1.78 c p1
+65.20 66.41 1.78 c p1
+66.41 66.41 1.78 c p1
+60.33 66.41 1.78 c p1
+73.71 66.41 1.78 c p1
+60.33 66.41 1.78 c p1
+62.76 66.41 1.78 c p1
+67.63 66.41 1.78 c p1
+60.33 66.41 1.78 c p1
+63.98 66.41 1.78 c p1
+66.41 66.41 1.78 c p1
+68.85 66.41 1.78 c p1
+66.41 66.41 1.78 c p1
+70.06 66.41 1.78 c p1
+72.49 66.41 1.78 c p1
+74.93 66.41 1.78 c p1
+73.71 66.41 1.78 c p1
+65.20 66.41 1.78 c p1
+61.55 66.41 1.78 c p1
+59.12 66.41 1.78 c p1
+59.12 66.41 1.78 c p1
+62.76 66.41 1.78 c p1
+65.20 66.41 1.78 c p1
+57.90 66.41 1.78 c p1
+65.20 66.41 1.78 c p1
+73.71 66.41 1.78 c p1
+68.85 66.41 1.78 c p1
+60.33 66.41 1.78 c p1
+59.12 66.41 1.78 c p1
+59.12 66.41 1.78 c p1
+66.41 66.41 1.78 c p1
+62.76 66.41 1.78 c p1
+53.03 66.41 1.78 c p1
+60.33 66.41 1.78 c p1
+61.55 66.41 1.78 c p1
+61.55 66.41 1.78 c p1
+67.63 66.41 1.78 c p1
+54.25 66.41 1.78 c p1
+61.55 66.41 1.78 c p1
+68.85 88.31 1.78 c p1
+62.76 88.31 1.78 c p1
+78.58 88.31 1.78 c p1
+68.85 88.31 1.78 c p1
+71.28 88.31 1.78 c p1
+84.66 88.31 1.78 c p1
+51.82 88.31 1.78 c p1
+81.01 88.31 1.78 c p1
+73.71 88.31 1.78 c p1
+79.79 88.31 1.78 c p1
+71.28 88.31 1.78 c p1
+70.06 88.31 1.78 c p1
+74.93 88.31 1.78 c p1
+61.55 88.31 1.78 c p1
+62.76 88.31 1.78 c p1
+70.06 88.31 1.78 c p1
+71.28 88.31 1.78 c p1
+85.87 88.31 1.78 c p1
+85.87 88.31 1.78 c p1
+65.20 88.31 1.78 c p1
+76.14 88.31 1.78 c p1
+60.33 88.31 1.78 c p1
+85.87 88.31 1.78 c p1
+68.85 88.31 1.78 c p1
+73.71 88.31 1.78 c p1
+79.79 88.31 1.78 c p1
+67.63 88.31 1.78 c p1
+66.41 88.31 1.78 c p1
+70.06 88.31 1.78 c p1
+79.79 88.31 1.78 c p1
+82.22 88.31 1.78 c p1
+88.31 88.31 1.78 c p1
+70.06 88.31 1.78 c p1
+68.85 88.31 1.78 c p1
+66.41 88.31 1.78 c p1
+85.87 88.31 1.78 c p1
+68.85 88.31 1.78 c p1
+70.06 88.31 1.78 c p1
+65.20 88.31 1.78 c p1
+76.14 88.31 1.78 c p1
+73.71 88.31 1.78 c p1
+76.14 88.31 1.78 c p1
+62.76 88.31 1.78 c p1
+74.93 88.31 1.78 c p1
+73.71 88.31 1.78 c p1
+73.71 88.31 1.78 c p1
+68.85 88.31 1.78 c p1
+71.28 88.31 1.78 c p1
+67.63 88.31 1.78 c p1
+63.98 88.31 1.78 c p1
+99.56 42.77 146.85 90.06 cl
+94.81 38.02 151.60 94.81 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+99.56 42.77 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+99.56 42.77 146.85 90.06 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+128.68 44.52 1.78 c p1
+119.56 44.52 1.78 c p1
+123.21 44.52 1.78 c p1
+121.38 44.52 1.78 c p1
+130.50 44.52 1.78 c p1
+135.98 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+117.73 44.52 1.78 c p1
+121.38 44.52 1.78 c p1
+132.33 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+119.56 44.52 1.78 c p1
+119.56 44.52 1.78 c p1
+137.80 44.52 1.78 c p1
+145.10 44.52 1.78 c p1
+135.98 44.52 1.78 c p1
+128.68 44.52 1.78 c p1
+134.15 44.52 1.78 c p1
+134.15 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+132.33 44.52 1.78 c p1
+130.50 44.52 1.78 c p1
+125.03 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+119.56 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+128.68 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+123.21 44.52 1.78 c p1
+121.38 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+139.63 44.52 1.78 c p1
+141.45 44.52 1.78 c p1
+121.38 44.52 1.78 c p1
+123.21 44.52 1.78 c p1
+128.68 44.52 1.78 c p1
+130.50 44.52 1.78 c p1
+119.56 44.52 1.78 c p1
+126.86 44.52 1.78 c p1
+128.68 44.52 1.78 c p1
+106.79 44.52 1.78 c p1
+123.21 44.52 1.78 c p1
+128.68 44.52 1.78 c p1
+134.15 44.52 1.78 c p1
+119.56 44.52 1.78 c p1
+134.15 44.52 1.78 c p1
+123.21 44.52 1.78 c p1
+132.33 44.52 1.78 c p1
+125.03 44.52 1.78 c p1
+123.21 66.41 1.78 c p1
+123.21 66.41 1.78 c p1
+121.38 66.41 1.78 c p1
+106.79 66.41 1.78 c p1
+115.91 66.41 1.78 c p1
+115.91 66.41 1.78 c p1
+125.03 66.41 1.78 c p1
+108.61 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+114.08 66.41 1.78 c p1
+101.31 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+104.96 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+121.38 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+114.08 66.41 1.78 c p1
+104.96 66.41 1.78 c p1
+110.44 66.41 1.78 c p1
+123.21 66.41 1.78 c p1
+115.91 66.41 1.78 c p1
+110.44 66.41 1.78 c p1
+115.91 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+115.91 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+112.26 66.41 1.78 c p1
+108.61 66.41 1.78 c p1
+108.61 66.41 1.78 c p1
+114.08 66.41 1.78 c p1
+114.08 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+126.86 66.41 1.78 c p1
+121.38 66.41 1.78 c p1
+106.79 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+110.44 66.41 1.78 c p1
+112.26 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+112.26 66.41 1.78 c p1
+106.79 66.41 1.78 c p1
+114.08 66.41 1.78 c p1
+119.56 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+117.73 66.41 1.78 c p1
+110.44 66.41 1.78 c p1
+115.91 66.41 1.78 c p1
+125.03 88.31 1.78 c p1
+114.08 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+117.73 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+110.44 88.31 1.78 c p1
+117.73 88.31 1.78 c p1
+110.44 88.31 1.78 c p1
+130.50 88.31 1.78 c p1
+123.21 88.31 1.78 c p1
+114.08 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+110.44 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+123.21 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+134.15 88.31 1.78 c p1
+112.26 88.31 1.78 c p1
+104.96 88.31 1.78 c p1
+123.21 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+114.08 88.31 1.78 c p1
+125.03 88.31 1.78 c p1
+123.21 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+134.15 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+115.91 88.31 1.78 c p1
+112.26 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+126.86 88.31 1.78 c p1
+121.38 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+121.38 88.31 1.78 c p1
+121.38 88.31 1.78 c p1
+121.38 88.31 1.78 c p1
+114.08 88.31 1.78 c p1
+123.21 88.31 1.78 c p1
+125.03 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+110.44 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+126.86 88.31 1.78 c p1
+119.56 88.31 1.78 c p1
+156.36 42.77 203.64 90.06 cl
+151.60 38.02 208.40 94.81 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+156.36 42.77 m
+47.28 0 l
+0 47.29 l
+-47.28 0 l
+0 -47.29 l
+o
+np
+158.11 42.77 m
+44.53 0 l
+o
+np
+158.11 42.77 m
+0 -4.75 l
+o
+np
+165.53 42.77 m
+0 -4.75 l
+o
+np
+172.95 42.77 m
+0 -4.75 l
+o
+np
+180.37 42.77 m
+0 -4.75 l
+o
+np
+187.79 42.77 m
+0 -4.75 l
+o
+np
+195.21 42.77 m
+0 -4.75 l
+o
+np
+202.64 42.77 m
+0 -4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+158.11 25.66 (1) .5 0 0 t
+172.95 25.66 (3) .5 0 0 t
+187.79 25.66 (5) .5 0 0 t
+202.64 25.66 (7) .5 0 0 t
+156.36 42.77 203.64 90.06 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+161.08 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+163.30 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+158.85 44.52 1.78 c p1
+159.59 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+163.30 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+163.30 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+158.11 44.52 1.78 c p1
+163.30 44.52 1.78 c p1
+164.79 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+159.59 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+160.33 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+164.79 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+162.56 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+161.82 44.52 1.78 c p1
+161.08 44.52 1.78 c p1
+185.57 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+187.05 66.41 1.78 c p1
+180.37 66.41 1.78 c p1
+184.82 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+185.57 66.41 1.78 c p1
+175.18 66.41 1.78 c p1
+184.82 66.41 1.78 c p1
+179.63 66.41 1.78 c p1
+176.66 66.41 1.78 c p1
+181.86 66.41 1.78 c p1
+180.37 66.41 1.78 c p1
+185.57 66.41 1.78 c p1
+177.40 66.41 1.78 c p1
+183.34 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+181.11 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+179.63 66.41 1.78 c p1
+186.31 66.41 1.78 c p1
+180.37 66.41 1.78 c p1
+187.05 66.41 1.78 c p1
+185.57 66.41 1.78 c p1
+182.60 66.41 1.78 c p1
+183.34 66.41 1.78 c p1
+186.31 66.41 1.78 c p1
+187.79 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+176.66 66.41 1.78 c p1
+178.89 66.41 1.78 c p1
+178.14 66.41 1.78 c p1
+179.63 66.41 1.78 c p1
+188.53 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+184.08 66.41 1.78 c p1
+185.57 66.41 1.78 c p1
+183.34 66.41 1.78 c p1
+181.11 66.41 1.78 c p1
+180.37 66.41 1.78 c p1
+183.34 66.41 1.78 c p1
+184.82 66.41 1.78 c p1
+180.37 66.41 1.78 c p1
+175.18 66.41 1.78 c p1
+181.86 66.41 1.78 c p1
+181.86 66.41 1.78 c p1
+181.86 66.41 1.78 c p1
+182.60 66.41 1.78 c p1
+172.95 66.41 1.78 c p1
+181.11 66.41 1.78 c p1
+195.21 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+194.47 88.31 1.78 c p1
+192.25 88.31 1.78 c p1
+193.73 88.31 1.78 c p1
+199.67 88.31 1.78 c p1
+184.08 88.31 1.78 c p1
+197.44 88.31 1.78 c p1
+193.73 88.31 1.78 c p1
+195.96 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+190.02 88.31 1.78 c p1
+191.50 88.31 1.78 c p1
+187.79 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+190.02 88.31 1.78 c p1
+191.50 88.31 1.78 c p1
+200.41 88.31 1.78 c p1
+201.89 88.31 1.78 c p1
+187.79 88.31 1.78 c p1
+192.99 88.31 1.78 c p1
+187.05 88.31 1.78 c p1
+200.41 88.31 1.78 c p1
+187.05 88.31 1.78 c p1
+192.99 88.31 1.78 c p1
+195.21 88.31 1.78 c p1
+186.31 88.31 1.78 c p1
+187.05 88.31 1.78 c p1
+192.25 88.31 1.78 c p1
+193.73 88.31 1.78 c p1
+195.96 88.31 1.78 c p1
+198.18 88.31 1.78 c p1
+192.25 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+192.25 88.31 1.78 c p1
+195.96 88.31 1.78 c p1
+192.25 88.31 1.78 c p1
+191.50 88.31 1.78 c p1
+186.31 88.31 1.78 c p1
+190.76 88.31 1.78 c p1
+192.25 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+194.47 88.31 1.78 c p1
+192.99 88.31 1.78 c p1
+189.28 88.31 1.78 c p1
+187.79 88.31 1.78 c p1
+189.28 88.31 1.78 c p1
+190.76 88.31 1.78 c p1
+188.53 88.31 1.78 c p1
+213.15 42.77 260.44 90.06 cl
+208.40 38.02 265.19 94.81 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+213.15 42.77 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+213.15 42.77 260.44 90.06 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+214.90 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+214.90 44.52 1.78 c p1
+214.90 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+222.20 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+214.90 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+214.90 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+224.02 44.52 1.78 c p1
+220.37 44.52 1.78 c p1
+218.55 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+216.72 44.52 1.78 c p1
+238.62 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+242.27 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+238.62 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+238.62 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+238.62 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+233.14 66.41 1.78 c p1
+245.92 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+234.97 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+238.62 66.41 1.78 c p1
+238.62 66.41 1.78 c p1
+244.09 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+233.14 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+234.97 66.41 1.78 c p1
+242.27 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+242.27 66.41 1.78 c p1
+240.44 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+234.97 66.41 1.78 c p1
+238.62 66.41 1.78 c p1
+234.97 66.41 1.78 c p1
+231.32 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+234.97 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+233.14 66.41 1.78 c p1
+236.79 66.41 1.78 c p1
+258.69 88.31 1.78 c p1
+247.74 88.31 1.78 c p1
+251.39 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+253.21 88.31 1.78 c p1
+251.39 88.31 1.78 c p1
+244.09 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+258.69 88.31 1.78 c p1
+249.56 88.31 1.78 c p1
+247.74 88.31 1.78 c p1
+251.39 88.31 1.78 c p1
+249.56 88.31 1.78 c p1
+256.86 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+253.21 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+240.44 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+249.56 88.31 1.78 c p1
+249.56 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+251.39 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+251.39 88.31 1.78 c p1
+242.27 88.31 1.78 c p1
+247.74 88.31 1.78 c p1
+249.56 88.31 1.78 c p1
+253.21 88.31 1.78 c p1
+240.44 88.31 1.78 c p1
+238.62 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+256.86 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+251.39 88.31 1.78 c p1
+256.86 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+247.74 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+258.69 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+247.74 88.31 1.78 c p1
+249.56 88.31 1.78 c p1
+255.04 88.31 1.78 c p1
+245.92 88.31 1.78 c p1
+269.94 42.77 317.23 90.06 cl
+265.19 38.02 321.98 94.81 cl
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+269.94 42.77 m
+47.29 0 l
+0 47.29 l
+-47.29 0 l
+0 -47.29 l
+o
+np
+271.69 42.77 m
+43.79 0 l
+o
+np
+271.69 42.77 m
+0 -4.75 l
+o
+np
+282.64 42.77 m
+0 -4.75 l
+o
+np
+293.59 42.77 m
+0 -4.75 l
+o
+np
+304.53 42.77 m
+0 -4.75 l
+o
+np
+315.48 42.77 m
+0 -4.75 l
+o
+/ps 8 def /Font1 findfont 8 s
+271.69 25.66 (1.0) .5 0 0 t
+293.59 25.66 (2.0) .5 0 0 t
+315.48 25.66 (3.0) .5 0 0 t
+np
+317.23 44.52 m
+0 43.79 l
+o
+np
+317.23 44.52 m
+4.75 0 l
+o
+np
+317.23 55.47 m
+4.75 0 l
+o
+np
+317.23 66.41 m
+4.75 0 l
+o
+np
+317.23 77.36 m
+4.75 0 l
+o
+np
+317.23 88.31 m
+4.75 0 l
+o
+334.34 44.52 (1.0) .5 0 90 t
+334.34 66.41 (2.0) .5 0 90 t
+334.34 88.31 (3.0) .5 0 90 t
+269.94 42.77 317.23 90.06 cl
+/ps 7 def /Font1 findfont 7 s
+0 setgray
+293.59 64.56 (Species) .5 0 0 t
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/brew-test-1-1.pdf b/inst/brew-test-1-1.pdf
new file mode 100644
index 0000000..5909148
--- /dev/null
+++ b/inst/brew-test-1-1.pdf
@@ -0,0 +1,3810 @@
+%PDF-1.1
+%���ρ�\r
+1 0 obj
+<<
+/CreationDate (D:20070820151536)
+/ModDate (D:20070820151536)
+/Title (R Graphics Output)
+/Producer (R 2.5.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 38.02 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 327.54 m
+104.46 327.54 l
+104.46 389.23 l
+42.77 389.23 l
+42.77 327.54 l
+S
+Q q 42.77 327.54 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 47.09 356.06 Tm (Sepal.Length) Tj
+ET
+Q q 113.96 327.54 61.69 61.69 re W n
+Q q 109.21 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 327.54 m
+175.65 327.54 l
+175.65 389.23 l
+113.96 389.23 l
+113.96 327.54 l
+S
+116.25 389.23 m 163.85 389.23 l S
+116.25 389.23 m 116.25 393.98 l S
+128.15 389.23 m 128.15 393.98 l S
+140.05 389.23 m 140.05 393.98 l S
+151.95 389.23 m 151.95 393.98 l S
+163.85 389.23 m 163.85 393.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 110.69 400.64 Tm (2.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 134.49 400.64 Tm (3.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 158.29 400.64 Tm (4.0) Tj
+ET
+Q q 113.96 327.54 61.69 61.69 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 149.99 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 327.54 61.69 61.69 re W n
+Q q 180.40 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 327.54 m
+246.84 327.54 l
+246.84 389.23 l
+185.16 389.23 l
+185.16 327.54 l
+S
+Q q 185.16 327.54 61.69 61.69 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 189.36 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 327.54 61.69 61.69 re W n
+Q q 251.60 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 327.54 m
+318.04 327.54 l
+318.04 389.23 l
+256.35 389.23 l
+256.35 327.54 l
+S
+268.15 389.23 m 315.75 389.23 l S
+268.15 389.23 m 268.15 393.98 l S
+280.05 389.23 m 280.05 393.98 l S
+291.95 389.23 m 291.95 393.98 l S
+303.85 389.23 m 303.85 393.98 l S
+315.75 389.23 m 315.75 393.98 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 262.59 400.64 Tm (0.5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 286.39 400.64 Tm (1.5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 310.19 400.64 Tm (2.5) Tj
+ET
+Q q 256.35 327.54 61.69 61.69 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 259.06 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 327.54 61.69 61.69 re W n
+Q q 322.79 322.79 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 327.54 m
+389.23 327.54 l
+389.23 389.23 l
+327.54 389.23 l
+327.54 327.54 l
+S
+389.23 333.00 m 389.23 388.53 l S
+389.23 333.00 m 393.98 333.00 l S
+389.23 340.93 m 393.98 340.93 l S
+389.23 348.87 m 393.98 348.87 l S
+389.23 356.80 m 393.98 356.80 l S
+389.23 364.73 m 393.98 364.73 l S
+389.23 372.67 m 393.98 372.67 l S
+389.23 380.60 m 393.98 380.60 l S
+389.23 388.53 m 393.98 388.53 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 327.44 Tm (4.5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 351.24 Tm (6.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 375.04 Tm (7.5) Tj
+ET
+Q q 327.54 327.54 61.69 61.69 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 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 328.11 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 334.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 331.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 329.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 336.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 332.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 343.98 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 370.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 342.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 353.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 364.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 345.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 347.15 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 339.22 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 340.81 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 372.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 380.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 337.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 375.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 350.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 348.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 374.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 377.30 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 385.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 356.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 382.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 361.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 355.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 369.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 351.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 367.78 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 366.19 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 359.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 363.02 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 358.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 353.50 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 256.35 61.69 61.69 re W n
+Q q 38.02 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 256.35 m
+104.46 256.35 l
+104.46 318.04 l
+42.77 318.04 l
+42.77 256.35 l
+S
+42.77 258.63 m 42.77 306.23 l S
+42.77 258.63 m 38.02 258.63 l S
+42.77 270.53 m 38.02 270.53 l S
+42.77 282.43 m 38.02 282.43 l S
+42.77 294.33 m 38.02 294.33 l S
+42.77 306.23 m 38.02 306.23 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 253.07 Tm (2.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 276.87 Tm (3.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 300.67 Tm (4.0) Tj
+ET
+Q q 42.77 256.35 61.69 61.69 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 55.79 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 256.35 61.69 61.69 re W n
+Q q 109.21 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 256.35 m
+175.65 256.35 l
+175.65 318.04 l
+113.96 318.04 l
+113.96 256.35 l
+S
+Q q 113.96 256.35 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 120.55 284.81 Tm (Sepal.Width) Tj
+ET
+Q q 185.16 256.35 61.69 61.69 re W n
+Q q 180.40 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 256.35 m
+246.84 256.35 l
+246.84 318.04 l
+185.16 318.04 l
+185.16 256.35 l
+S
+Q q 185.16 256.35 61.69 61.69 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 189.36 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 256.35 61.69 61.69 re W n
+Q q 251.60 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 256.35 m
+318.04 256.35 l
+318.04 318.04 l
+256.35 318.04 l
+256.35 256.35 l
+S
+Q q 256.35 256.35 61.69 61.69 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 259.06 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 256.35 61.69 61.69 re W n
+Q q 322.79 251.60 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 256.35 m
+389.23 256.35 l
+389.23 318.04 l
+327.54 318.04 l
+327.54 256.35 l
+S
+Q q 327.54 256.35 61.69 61.69 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 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 304.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 314.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 302.14 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 306.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 309.28 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 292.62 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 297.38 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 256.92 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 266.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 264.06 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 278.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 295.00 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 261.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 299.76 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 275.96 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 271.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 283.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 273.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 285.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 287.86 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 268.82 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 290.24 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 280.72 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 185.16 61.69 61.69 re W n
+Q q 38.02 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 185.16 m
+104.46 185.16 l
+104.46 246.84 l
+42.77 246.84 l
+42.77 185.16 l
+S
+Q q 42.77 185.16 61.69 61.69 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 55.79 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 185.16 61.69 61.69 re W n
+Q q 109.21 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 185.16 m
+175.65 185.16 l
+175.65 246.84 l
+113.96 246.84 l
+113.96 185.16 l
+S
+Q q 113.96 185.16 61.69 61.69 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 149.99 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 185.16 61.69 61.69 re W n
+Q q 180.40 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 185.16 m
+246.84 185.16 l
+246.84 246.84 l
+185.16 246.84 l
+185.16 185.16 l
+S
+Q q 185.16 185.16 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 190.96 213.76 Tm (Petal.Length) Tj
+ET
+Q q 256.35 185.16 61.69 61.69 re W n
+Q q 251.60 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 185.16 m
+318.04 185.16 l
+318.04 246.84 l
+256.35 246.84 l
+256.35 185.16 l
+S
+Q q 256.35 185.16 61.69 61.69 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 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 185.16 61.69 61.69 re W n
+Q q 322.79 180.40 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 185.16 m
+389.23 185.16 l
+389.23 246.84 l
+327.54 246.84 l
+327.54 185.16 l
+S
+389.23 187.44 m 389.23 245.53 l S
+389.23 187.44 m 393.98 187.44 l S
+389.23 197.12 m 393.98 197.12 l S
+389.23 206.80 m 393.98 206.80 l S
+389.23 216.48 m 393.98 216.48 l S
+389.23 226.17 m 393.98 226.17 l S
+389.23 235.85 m 393.98 235.85 l S
+389.23 245.53 m 393.98 245.53 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 185.22 Tm (1) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 204.58 Tm (3) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 223.94 Tm (5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 243.30 Tm (7) Tj
+ET
+Q q 327.54 185.16 61.69 61.69 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 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 186.70 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 185.73 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 192.50 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 187.66 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 188.63 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 194.44 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 191.54 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 190.57 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 189.60 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 210.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 209.93 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 212.83 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 211.87 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 213.80 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 221.55 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 218.64 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 220.58 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 214.77 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 207.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 216.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 217.68 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 205.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 215.74 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 239.94 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 219.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 237.04 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 227.36 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 242.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 240.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 234.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 223.48 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 232.20 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 238.01 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 235.10 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 229.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 222.52 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 230.26 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 233.17 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 231.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 224.45 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 226.39 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 228.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 225.42 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 113.96 61.69 61.69 re W n
+Q q 38.02 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 113.96 m
+104.46 113.96 l
+104.46 175.65 l
+42.77 175.65 l
+42.77 113.96 l
+S
+42.77 125.77 m 42.77 173.37 l S
+42.77 125.77 m 38.02 125.77 l S
+42.77 137.67 m 38.02 137.67 l S
+42.77 149.57 m 38.02 149.57 l S
+42.77 161.47 m 38.02 161.47 l S
+42.77 173.37 m 38.02 173.37 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 120.21 Tm (0.5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 144.01 Tm (1.5) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 31.36 167.81 Tm (2.5) Tj
+ET
+Q q 42.77 113.96 61.69 61.69 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 55.79 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 113.96 61.69 61.69 re W n
+Q q 109.21 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 113.96 m
+175.65 113.96 l
+175.65 175.65 l
+113.96 175.65 l
+113.96 113.96 l
+S
+Q q 113.96 113.96 61.69 61.69 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 149.99 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 113.96 61.69 61.69 re W n
+Q q 180.40 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 113.96 m
+246.84 113.96 l
+246.84 175.65 l
+185.16 175.65 l
+185.16 113.96 l
+S
+Q q 185.16 113.96 61.69 61.69 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 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 113.96 61.69 61.69 re W n
+Q q 251.60 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 113.96 m
+318.04 113.96 l
+318.04 175.65 l
+256.35 175.65 l
+256.35 113.96 l
+S
+Q q 256.35 113.96 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 264.41 141.64 Tm (Petal.Width) Tj
+ET
+Q q 327.54 113.96 61.69 61.69 re W n
+Q q 322.79 109.21 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 113.96 m
+389.23 113.96 l
+389.23 175.65 l
+327.54 175.65 l
+327.54 113.96 l
+S
+Q q 327.54 113.96 61.69 61.69 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 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 124.05 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 114.53 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 126.43 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 121.67 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 119.29 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 327.87 116.91 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 135.95 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 140.71 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 138.33 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 356.43 143.09 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 152.61 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 150.23 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 164.51 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 147.85 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 145.47 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 162.13 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 169.27 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 171.65 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 157.37 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 159.75 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 166.89 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 384.99 154.99 Tm (l) Tj 0 Tr
+ET
+Q q 42.77 42.77 61.69 61.69 re W n
+Q q 38.02 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+42.77 42.77 m
+104.46 42.77 l
+104.46 104.46 l
+42.77 104.46 l
+42.77 42.77 l
+S
+48.23 42.77 m 103.76 42.77 l S
+48.23 42.77 m 48.23 38.02 l S
+56.16 42.77 m 56.16 38.02 l S
+64.09 42.77 m 64.09 38.02 l S
+72.03 42.77 m 72.03 38.02 l S
+79.96 42.77 m 79.96 38.02 l S
+87.89 42.77 m 87.89 38.02 l S
+95.83 42.77 m 95.83 38.02 l S
+103.76 42.77 m 103.76 38.02 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 42.67 25.66 Tm (4.5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 66.47 25.66 Tm (6.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 90.27 25.66 Tm (7.5) Tj
+ET
+Q q 42.77 42.77 61.69 61.69 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 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 43.10 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 49.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 46.27 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 44.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 51.03 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 47.86 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 58.96 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 85.94 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 57.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 79.59 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 60.55 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 62.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 54.20 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 55.79 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 87.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 95.46 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 52.62 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 90.70 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 65.31 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 63.72 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 89.11 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 92.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 100.22 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 71.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 97.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 76.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 70.07 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 84.35 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 66.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 82.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 81.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 74.83 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 78.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 73.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 68.48 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 113.96 42.77 61.69 61.69 re W n
+Q q 109.21 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+113.96 42.77 m
+175.65 42.77 l
+175.65 104.46 l
+113.96 104.46 l
+113.96 42.77 l
+S
+Q q 113.96 42.77 61.69 61.69 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 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 161.89 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 171.41 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 159.51 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 164.27 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 166.65 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 149.99 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 154.75 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 114.29 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 123.81 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 121.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 135.71 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 152.37 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 119.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 157.13 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 133.33 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 128.57 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 140.47 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 130.95 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 142.85 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 145.23 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 126.19 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 147.61 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 138.09 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 185.16 42.77 61.69 61.69 re W n
+Q q 180.40 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+185.16 42.77 m
+246.84 42.77 l
+246.84 104.46 l
+185.16 104.46 l
+185.16 42.77 l
+S
+187.44 42.77 m 245.53 42.77 l S
+187.44 42.77 m 187.44 38.02 l S
+197.12 42.77 m 197.12 38.02 l S
+206.80 42.77 m 206.80 38.02 l S
+216.48 42.77 m 216.48 38.02 l S
+226.17 42.77 m 226.17 38.02 l S
+235.85 42.77 m 235.85 38.02 l S
+245.53 42.77 m 245.53 38.02 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 185.22 25.66 Tm (1) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 204.58 25.66 Tm (3) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 223.94 25.66 Tm (5) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 243.30 25.66 Tm (7) Tj
+ET
+Q q 185.16 42.77 61.69 61.69 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 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 186.45 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 185.49 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 192.26 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 187.42 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 188.39 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 194.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 191.29 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 190.33 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 189.36 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 210.66 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 209.69 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 212.59 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 211.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 213.56 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 221.31 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 218.40 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 220.34 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 214.53 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 207.75 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 216.47 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 217.43 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 204.85 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 215.50 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 239.70 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 219.37 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 236.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 227.12 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 242.61 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 240.67 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 233.89 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 223.24 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 231.96 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 237.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 234.86 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 229.05 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 222.27 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.02 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 232.92 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 230.99 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 224.21 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 226.15 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 228.08 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 225.18 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 256.35 42.77 61.69 61.69 re W n
+Q q 251.60 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+256.35 42.77 m
+318.04 42.77 l
+318.04 104.46 l
+256.35 104.46 l
+256.35 42.77 l
+S
+Q q 256.35 42.77 61.69 61.69 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 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 266.20 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 256.68 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 268.58 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 263.82 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 261.44 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 259.06 43.34 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 278.10 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 282.86 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 280.48 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 285.24 71.90 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 294.76 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 292.38 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 306.66 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 290.00 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 287.62 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 304.28 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 311.42 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 313.80 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 299.52 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 301.90 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 309.04 100.46 Tm (l) Tj 0 Tr
+/F1 1 Tf 1 Tr 4.94 0 0 4.94 297.14 100.46 Tm (l) Tj 0 Tr
+ET
+Q q 327.54 42.77 61.69 61.69 re W n
+Q q 322.79 38.02 71.19 71.19 re W n
+Q q
+0.000 0.000 0.000 RG
+0.75 w
+[] 0 d
+1 J
+1 j
+10.00 M
+327.54 42.77 m
+389.23 42.77 l
+389.23 104.46 l
+327.54 104.46 l
+327.54 42.77 l
+S
+329.83 42.77 m 386.95 42.77 l S
+329.83 42.77 m 329.83 38.02 l S
+344.11 42.77 m 344.11 38.02 l S
+358.39 42.77 m 358.39 38.02 l S
+372.67 42.77 m 372.67 38.02 l S
+386.95 42.77 m 386.95 38.02 l S
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 8.00 0.00 -0.00 8.00 324.27 25.66 Tm (1.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 352.83 25.66 Tm (2.0) Tj
+/F2 1 Tf 8.00 0.00 -0.00 8.00 381.39 25.66 Tm (3.0) Tj
+ET
+389.23 45.05 m 389.23 102.17 l S
+389.23 45.05 m 393.98 45.05 l S
+389.23 59.33 m 393.98 59.33 l S
+389.23 73.61 m 393.98 73.61 l S
+389.23 87.89 m 393.98 87.89 l S
+389.23 102.17 m 393.98 102.17 l S
+BT
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 39.49 Tm (1.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 68.05 Tm (2.0) Tj
+/F2 1 Tf 0.00 8.00 -8.00 0.00 406.34 96.61 Tm (3.0) Tj
+ET
+Q q 327.54 42.77 61.69 61.69 re W n
+BT
+0.000 0.000 0.000 rg
+/F2 1 Tf 9.00 0.00 -0.00 9.00 342.38 71.23 Tm (Species) Tj
+ET
+Q
+endstream
+endobj
+8 0 obj
+181992
+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 >>
+/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
+xref
+0 11
+0000000000 65535 f 
+0000000021 00000 n 
+0000000163 00000 n 
+0000182442 00000 n 
+0000182525 00000 n 
+0000000212 00000 n 
+0000000295 00000 n 
+0000000375 00000 n 
+0000182420 00000 n 
+0000182618 00000 n 
+0000182875 00000 n 
+trailer
+<<
+/Size 11
+/Info 1 0 R
+/Root 2 0 R
+>>
+startxref
+182972
+%%EOF
diff --git a/inst/brew-test-1-2.eps b/inst/brew-test-1-2.eps
new file mode 100644
index 0000000..e98d255
--- /dev/null
+++ b/inst/brew-test-1-2.eps
@@ -0,0 +1,316 @@
+%!PS-Adobe-3.0
+%%DocumentNeededResources: font Helvetica
+%%+ font Helvetica-Bold
+%%+ font Helvetica-Oblique
+%%+ font Helvetica-BoldOblique
+%%+ font Symbol
+%%DocumentMedia: special 360 360 0 () ()
+%%Title: R Graphics Output
+%%Creator: R Software
+%%Pages: (atend)
+%%BoundingBox: 0 0 360 360
+%%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 fill grestore newpath } def
+/p3  { gsave bg 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
+59.04 73.44 329.76 300.96 cl
+0 setgray
+2.25 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+77.42 122.83 m
+66.85 0 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+110.84 81.87 m
+0 29.26 l
+o
+np
+110.84 169.64 m
+0 -35.11 l
+o
+0.75 setlinewidth
+[] 0 setdash
+np
+94.13 81.87 m
+33.43 0 l
+o
+np
+94.13 169.64 m
+33.43 0 l
+o
+np
+94.13 81.87 m
+33.43 0 l
+o
+np
+94.13 169.64 m
+33.43 0 l
+o
+np
+94.13 81.87 m
+33.43 0 l
+o
+np
+94.13 169.64 m
+33.43 0 l
+o
+np
+77.42 111.13 m
+66.85 0 l
+0 23.40 l
+-66.85 0 l
+0 -23.40 l
+o
+2.25 setlinewidth
+[] 0 setdash
+np
+160.98 175.50 m
+66.84 0 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+194.40 116.98 m
+0 40.96 l
+o
+np
+194.40 239.87 m
+0 -40.97 l
+o
+0.75 setlinewidth
+[] 0 setdash
+np
+177.69 116.98 m
+33.42 0 l
+o
+np
+177.69 239.87 m
+33.42 0 l
+o
+np
+177.69 116.98 m
+33.42 0 l
+o
+np
+177.69 239.87 m
+33.42 0 l
+o
+np
+177.69 116.98 m
+33.42 0 l
+o
+np
+177.69 239.87 m
+33.42 0 l
+o
+np
+160.98 157.94 m
+66.84 0 l
+0 40.96 l
+-66.84 0 l
+0 -40.96 l
+o
+2.25 setlinewidth
+[] 0 setdash
+np
+244.53 210.61 m
+66.85 0 l
+o
+0.75 setlinewidth
+[ 3.00 5.00] 0 setdash
+np
+277.96 157.94 m
+0 35.11 l
+o
+np
+277.96 292.53 m
+0 -58.52 l
+o
+0.75 setlinewidth
+[] 0 setdash
+np
+261.24 157.94 m
+33.43 0 l
+o
+np
+261.24 292.53 m
+33.43 0 l
+o
+np
+261.24 157.94 m
+33.43 0 l
+o
+np
+261.24 292.53 m
+33.43 0 l
+o
+np
+261.24 157.94 m
+33.43 0 l
+o
+np
+261.24 292.53 m
+33.43 0 l
+o
+np
+244.53 193.05 m
+66.85 0 l
+0 40.96 l
+-66.85 0 l
+0 -40.96 l
+o
+277.96 116.98 2.70 c p1
+0.00 0.00 360.00 360.00 cl
+0 setgray
+0.75 setlinewidth
+[] 0 setdash
+1 setlinecap
+1 setlinejoin
+10.00 setmiterlimit
+np
+110.84 73.44 m
+167.12 0 l
+o
+np
+110.84 73.44 m
+0 -7.20 l
+o
+np
+194.40 73.44 m
+0 -7.20 l
+o
+np
+277.96 73.44 m
+0 -7.20 l
+o
+/ps 12 def /Font1 findfont 12 s
+110.84 47.52 (setosa) .5 0 0 t
+194.40 47.52 (versicolor) .5 0 0 t
+277.96 47.52 (virginica) .5 0 0 t
+np
+59.04 93.57 m
+0 204.82 l
+o
+np
+59.04 93.57 m
+-7.20 0 l
+o
+np
+59.04 122.83 m
+-7.20 0 l
+o
+np
+59.04 152.09 m
+-7.20 0 l
+o
+np
+59.04 181.35 m
+-7.20 0 l
+o
+np
+59.04 210.61 m
+-7.20 0 l
+o
+np
+59.04 239.87 m
+-7.20 0 l
+o
+np
+59.04 269.13 m
+-7.20 0 l
+o
+np
+59.04 298.39 m
+-7.20 0 l
+o
+41.76 93.57 (4.5) .5 0 90 t
+41.76 122.83 (5.0) .5 0 90 t
+41.76 152.09 (5.5) .5 0 90 t
+41.76 181.35 (6.0) .5 0 90 t
+41.76 210.61 (6.5) .5 0 90 t
+41.76 239.87 (7.0) .5 0 90 t
+41.76 269.13 (7.5) .5 0 90 t
+41.76 298.39 (8.0) .5 0 90 t
+np
+59.04 73.44 m
+270.72 0 l
+0 227.52 l
+-270.72 0 l
+0 -227.52 l
+o
+ep
+%%Trailer
+%%Pages: 1
+%%EOF
diff --git a/inst/brew-test-1.aux b/inst/brew-test-1.aux
new file mode 100644
index 0000000..a1b16b4
--- /dev/null
+++ b/inst/brew-test-1.aux
@@ -0,0 +1,3 @@
+\relax 
+\@writefile{lof}{\contentsline {figure}{\numberline {1}{\ignorespaces Pairs plot of the iris data.}}{2}}
+\@writefile{lof}{\contentsline {figure}{\numberline {2}{\ignorespaces Boxplot of sepal length grouped by species.}}{3}}
diff --git a/inst/brew-test-1.brew b/inst/brew-test-1.brew
new file mode 100644
index 0000000..4570456
--- /dev/null
+++ b/inst/brew-test-1.brew
@@ -0,0 +1,83 @@
+\documentclass[a4paper]{article}
+
+\title{A \emph{brew} Test File}
+\author{\emph{Jeffrey Horner}}
+
+\usepackage{a4wide,graphicx}
+
+\begin{document}
+
+\maketitle
+
+A simple example that will run in any \emph{R} engine \emph{(brew may work with S, but this is untested)}: The integers from 1 to
+10 are
+\begin{verbatim}
+<%=format(1:10)%>
+\end{verbatim}
+
+We can also emulate a simple calculator \emph{(although the syntax is not as elegant as Sweave)}:
+\begin{verbatim}
+<% for (i in c('1+1','1+pi','1+pi','sin(pi/2)')) { -%>
+> <%=i%>
+<% print(eval(parse(text=i))) %>
+<% } -%>
+\end{verbatim}
+
+Now we look at Gaussian data:
+
+\begin{verbatim}
+<%
+library(stats)
+x <- rnorm(20)
+print(x)
+print(t1 <- t.test(x))
+%>
+\end{verbatim}
+
+Note that we can easily integrate some numbers into standard text: The
+third element of vector \texttt{x} is <%=x[3]%>, the
+$p$-value of the test is <%=format.pval(t1$p.value)%>. % $
+
+Now we look at a summary of the famous iris data set, and we want to
+see the commands in the code chunks \emph{(brew can't show you the code, so
+don't look for it)}:
+
+\begin{verbatim}
+<% 
+	library(datasets)
+	data(iris) 
+	print(summary(iris))
+%>
+\end{verbatim}
+
+<%
+	library(grDevices)
+	library(graphics)
+	postscript(file='brew-test-1-1.eps',
+		width=5,height=5,paper='special',horizontal=FALSE)
+	pairs(iris)
+	dev.off()
+%>
+\begin{figure}[htbp]
+  \begin{center}
+\includegraphics{brew-test-1-1}
+    \caption{Pairs plot of the iris data.}
+  \end{center}
+\end{figure}
+
+<%
+	postscript(file='brew-test-1-2.eps',
+		width=5,height=5,paper='special',horizontal=FALSE)
+	boxplot(Sepal.Length~Species, data=iris)
+	dev.off()
+%>
+\begin{figure}[htbp]
+  \begin{center}
+\includegraphics{brew-test-1-2}
+    \caption{Boxplot of sepal length grouped by species.}
+  \end{center}
+\end{figure}
+
+\end{document}
+
+
diff --git a/inst/brew-test-1.dvi b/inst/brew-test-1.dvi
new file mode 100644
index 0000000..f31581b
Binary files /dev/null and b/inst/brew-test-1.dvi differ
diff --git a/inst/brew-test-1.log b/inst/brew-test-1.log
new file mode 100644
index 0000000..fd6300b
--- /dev/null
+++ b/inst/brew-test-1.log
@@ -0,0 +1,100 @@
+This is pdfeTeX, Version 3.141592-1.30.5-2.2 (Web2C 7.5.5) (format=latex 2007.3.24)  21 AUG 2007 11:12
+entering extended mode
+**brew-test-1
+(./brew-test-1.tex
+LaTeX2e <2003/12/01>
+Babel <v3.8g> and hyphenation patterns for english, usenglishmax, dumylang, noh
+yphenation, croatian, ukrainian, russian, bulgarian, czech, slovak, danish, dut
+ch, finnish, french, basque, german, ngerman, greek, monogreek, ancientgreek, i
+bycus, hungarian, italian, latin, mongolian, norsk, slovene, estonian, welsh, i
+nterlingua, icelandic, uppersorbian, romanian, indonesian, coptic, turkish, ser
+bian, polish, portuguese, spanish, catalan, swedish, ukenglish, loaded.
+(/usr/share/texmf-texlive/tex/latex/base/article.cls
+Document Class: article 2004/02/16 v1.4f Standard LaTeX document class
+(/usr/share/texmf-texlive/tex/latex/base/size10.clo
+File: size10.clo 2004/02/16 v1.4f Standard LaTeX file (size option)
+)
+\c at part=\count79
+\c at section=\count80
+\c at subsection=\count81
+\c at subsubsection=\count82
+\c at paragraph=\count83
+\c at subparagraph=\count84
+\c at figure=\count85
+\c at table=\count86
+\abovecaptionskip=\skip41
+\belowcaptionskip=\skip42
+\bibindent=\dimen102
+)
+(/usr/share/texmf-texlive/tex/latex/ltxmisc/a4wide.sty
+Package: a4wide 1994/08/30
+
+(/usr/share/texmf-texlive/tex/latex/ntgclass/a4.sty
+Package: a4 2004/04/15 v1.2g A4 based page layout
+))
+(/usr/share/texmf-texlive/tex/latex/graphics/graphicx.sty
+Package: graphicx 1999/02/16 v1.0f Enhanced LaTeX Graphics (DPC,SPQR)
+
+(/usr/share/texmf-texlive/tex/latex/graphics/keyval.sty
+Package: keyval 1999/03/16 v1.13 key=value parser (DPC)
+\KV at toks@=\toks14
+)
+(/usr/share/texmf-texlive/tex/latex/graphics/graphics.sty
+Package: graphics 2001/07/07 v1.0n Standard LaTeX Graphics (DPC,SPQR)
+
+(/usr/share/texmf-texlive/tex/latex/graphics/trig.sty
+Package: trig 1999/03/16 v1.09 sin cos tan (DPC)
+)
+(/usr/share/texmf-texlive/tex/latex/config/graphics.cfg
+File: graphics.cfg 2001/08/31 v1.1 graphics configuration of teTeX/TeXLive
+)
+Package graphics Info: Driver file: dvips.def on input line 80.
+
+(/usr/share/texmf-texlive/tex/latex/graphics/dvips.def
+File: dvips.def 1999/02/16 v3.0i Driver-dependant file (DPC,SPQR)
+))
+\Gin at req@height=\dimen103
+\Gin at req@width=\dimen104
+) (./brew-test-1.aux)
+\openout1 = `brew-test-1.aux'.
+
+LaTeX Font Info:    Checking defaults for OML/cmm/m/it on input line 8.
+LaTeX Font Info:    ... okay on input line 8.
+LaTeX Font Info:    Checking defaults for T1/cmr/m/n on input line 8.
+LaTeX Font Info:    ... okay on input line 8.
+LaTeX Font Info:    Checking defaults for OT1/cmr/m/n on input line 8.
+LaTeX Font Info:    ... okay on input line 8.
+LaTeX Font Info:    Checking defaults for OMS/cmsy/m/n on input line 8.
+LaTeX Font Info:    ... okay on input line 8.
+LaTeX Font Info:    Checking defaults for OMX/cmex/m/n on input line 8.
+LaTeX Font Info:    ... okay on input line 8.
+LaTeX Font Info:    Checking defaults for U/cmr/m/n on input line 8.
+LaTeX Font Info:    ... okay on input line 8.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <12> on input line 10.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <8> on input line 10.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <6> on input line 10.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <7> on input line 58.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <5> on input line 58.
+
+[1
+
+]
+File: brew-test-1-1.eps Graphic file (type eps)
+ <brew-test-1-1.eps>
+File: brew-test-1-2.eps Graphic file (type eps)
+ <brew-test-1-2.eps> [2] [3] (./brew-test-1.aux) ) 
+Here is how much of TeX's memory you used:
+ 561 strings out of 94313
+ 6875 string characters out of 1171671
+ 55939 words of memory out of 1000000
+ 3831 multiletter control sequences out of 10000+50000
+ 7883 words of font info for 28 fonts, out of 500000 for 2000
+ 647 hyphenation exceptions out of 8191
+ 25i,6n,19p,184b,275s stack positions out of 1500i,500n,5000p,200000b,5000s
+
+Output written on brew-test-1.dvi (3 pages, 3132 bytes).
diff --git a/inst/brew-test-1.tex b/inst/brew-test-1.tex
new file mode 100644
index 0000000..09fea1a
--- /dev/null
+++ b/inst/brew-test-1.tex
@@ -0,0 +1,100 @@
+\documentclass[a4paper]{article}
+
+\title{A \emph{brew} Test File}
+\author{\emph{Jeffrey Horner}}
+
+\usepackage{a4wide,graphicx}
+
+\begin{document}
+
+\maketitle
+
+A simple example that will run in any \emph{R} engine \emph{(brew may work with S, but this is untested)}: The integers from 1 to
+10 are
+\begin{verbatim}
+ 1  2  3  4  5  6  7  8  9 10
+\end{verbatim}
+
+We can also emulate a simple calculator \emph{(although the syntax is not as elegant as Sweave)}:
+\begin{verbatim}
+> 1+1
+[1] 2
+
+> 1+pi
+[1] 4.141593
+
+> 1+pi
+[1] 4.141593
+
+> sin(pi/2)
+[1] 1
+
+\end{verbatim}
+
+Now we look at Gaussian data:
+
+\begin{verbatim}
+ [1]  0.4850072  0.5299571 -0.1913293 -1.4806540  0.3611630  0.6089846
+ [7] -0.6045145 -1.5165037  0.3995648 -0.7620245 -0.2342828  0.0914568
+[13] -0.6350603  1.4255549  1.4350150 -2.0392190  0.8070093  1.5085753
+[19]  0.9188515  1.4485650
+
+	One Sample t-test
+
+data:  x 
+t = 0.5448, df = 19, p-value = 0.5922
+alternative hypothesis: true mean is not equal to 0 
+95 percent confidence interval:
+ -0.3631849  0.6187965 
+sample estimates:
+mean of x 
+0.1278058 
+
+
+\end{verbatim}
+
+Note that we can easily integrate some numbers into standard text: The
+third element of vector \texttt{x} is -0.1913293, the
+$p$-value of the test is 0.59222. % $
+
+Now we look at a summary of the famous iris data set, and we want to
+see the commands in the code chunks \emph{(brew can't show you the code, so
+don't try to find them)}:
+
+\begin{verbatim}
+  Sepal.Length    Sepal.Width     Petal.Length    Petal.Width   
+ Min.   :4.300   Min.   :2.000   Min.   :1.000   Min.   :0.100  
+ 1st Qu.:5.100   1st Qu.:2.800   1st Qu.:1.600   1st Qu.:0.300  
+ Median :5.800   Median :3.000   Median :4.350   Median :1.300  
+ Mean   :5.843   Mean   :3.057   Mean   :3.758   Mean   :1.199  
+ 3rd Qu.:6.400   3rd Qu.:3.300   3rd Qu.:5.100   3rd Qu.:1.800  
+ Max.   :7.900   Max.   :4.400   Max.   :6.900   Max.   :2.500  
+       Species  
+ setosa    :50  
+ versicolor:50  
+ virginica :50  
+                
+                
+                
+
+\end{verbatim}
+
+
+\begin{figure}[htbp]
+  \begin{center}
+\includegraphics{brew-test-1-1}
+    \caption{Pairs plot of the iris data.}
+  \end{center}
+\end{figure}
+
+
+\begin{figure}[htbp]
+  \begin{center}
+\includegraphics{brew-test-1-2}
+    \caption{Boxplot of sepal length grouped by species.}
+  \end{center}
+\end{figure}
+
+\end{document}
+
+
diff --git a/inst/brew-test-2-table.brew b/inst/brew-test-2-table.brew
new file mode 100644
index 0000000..776d473
--- /dev/null
+++ b/inst/brew-test-2-table.brew
@@ -0,0 +1,9 @@
+\begin{tabular} {ll}
+ & \\
+<%=caption%> & \\
+\hline
+<% for (n in names(l)) { -%>
+<%=n%> & <%=unlist(l[[n]])%> \\
+<% } %>
+\hline
+\end{tabular}
diff --git a/inst/brew-test-2.aux b/inst/brew-test-2.aux
new file mode 100644
index 0000000..f23e546
--- /dev/null
+++ b/inst/brew-test-2.aux
@@ -0,0 +1 @@
+\relax 
diff --git a/inst/brew-test-2.brew b/inst/brew-test-2.brew
new file mode 100644
index 0000000..99b5c37
--- /dev/null
+++ b/inst/brew-test-2.brew
@@ -0,0 +1,89 @@
+<% 
+hrefify <- function(title) gsub('[\\.()]','_',title,perl=TRUE)
+scrub <- function(obj){ 
+	if (is.null(obj)) return('NULL')
+	if (length(obj) == 0) return ('length 0 objing')
+	if (typeof(obj) == 'closure')
+		obj <- paste(deparse(obj),collapse='\n')
+	else 
+		obj <- as.character(obj)
+	obj <- gsub('&','&',obj); obj <- gsub('@','_at_',obj); 
+	obj <- gsub('<','<',obj); obj <- gsub('>','>',obj); 
+	if (length(obj) == 0 || is.null(obj) || obj == '')
+		obj <- ' ' 
+	obj
+}
+cl<-'e' 
+zebelem <- function(n,v) {
+	cl <<- ifelse(cl=='e','o','e')
+	cat('<tr class="',cl,'">')
+	if(!is.na(n)) cat('<td class="l">',n,'</td>')
+	cat('<td>');
+	if (length(v)>1) zebra(NULL,v)
+	else cat(scrub(v))
+	cat('</td></tr>\n');
+}
+zebra <- function(title,l){
+	if (!is.null(title)) cat('<h2><a name="',hrefify(title),'"> </a>',title,'</h2>',sep='')
+	cat('<table><tbody>',sep='')
+	n <- names(l)
+	mapply(zebelem,if(is.null(n)) rep(NA,length(l)) else n, l)
+	cat('</tbody></table>\n')
+}
+zebrifyPackage <-function(package){
+	zebra(package,unclass(packageDescription(package)))
+	cat('<br/><hr/>\n')
+}
+-%>
+<!DOCTYPE html PUBLIC "-//W3C//DTD XHTML 1.0 Transitional//EN" "DTD/xhtml1-transitional.dtd">
+<html><head>
+<meta http-equiv="Content-Type" content="text/html;charset=utf-8" />
+<style type="text/css">
+body { font-family: "lucida grande",verdana,sans-serif; margin-left: 210px; margin-right: 18px; }
+table { border: 1px solid #8897be; border-spacing: 0px; font-size: 10pt; }
+td { border-bottom:1px solid #d9d9d9; border-left:1px solid #d9d9d9; border-spacing: 0px; padding: 3px 8px; }
+td.l { font-weight: bold; width: 10%; }
+tr.e { background-color: #eeeeee; border-spacing: 0px; }
+tr.o { background-color: #ffffff; border-spacing: 0px; }
+div a { text-decoration: none; color: white; }
+a:hover { color: #8897be; background: white; }
+tr:hover { background: #8897be; /* color: white;*/ }
+img.map { position: fixed; border: 0px; left: 50px; right: auto; top: 10px; }
+div.map { background: #8897be; font-weight: bold; color: white; position: fixed; bottom: 30px; height: auto; left: 15px; right: auto; top: 110px; width: 150px; padding: 0 13px; text-align: right; font-size: 12pt; }
+div.map p { font-size: 10pt; font-family: serif; font-style: italic; }
+div.h { font-size: 20pt; font-weight: bold; }
+hr {background-color: #cccccc; border: 0px; height: 1px; color: #000000;}
+</style>
+<title>Everything You Wanted To Know About Your R Session</title>
+</head>
+<body>
+<a name="Top"> </a>
+<a href="http://www.r-project.org/"><img class="map" alt="R Language Home Page" src="http://www.r-project.org/Rlogo.jpg"/></a>
+<div class="h">Everything You Wanted To Know About Your R Session</div>
+<div class="map">
+<p>jump to:</p>
+<a href="#Top">Top</a><br/><hr/>
+<a href="#<%=hrefify("R.version")%>">R.version</a><br/>
+<a href="#<%=hrefify("search()")%>">search()</a><br/>
+<a href="#<%=hrefify(".libPaths()")%>">.libPaths()</a><br/>
+<a href="#<%=hrefify("options()")%>">options()</a><br/>
+<a href="#<%=hrefify("Sys.getenv()")%>">Sys.getenv()</a><br/>
+<a href="#<%=hrefify("Sys.info()")%>">Sys.info()</a><br/>
+<a href="#<%=hrefify(".Machine")%>">.Machine</a><br/>
+<a href="#<%=hrefify(".Platform")%>">.Platform</a><br/><hr/>
+<a href="#Attached_Packages">Attached Packages</a><br/><hr/>
+<a href="#Installed_Packages">Installed Packages</a><br/><hr/>
+</div>
+<% zebra('R.version',R.version) %><br/><hr/>
+<% zebra('search()',search()) %><br/><hr/>
+<% zebra('.libPaths()',.libPaths()) %><br/><hr/>
+<% zebra('options()',options()) %><br/><hr/>
+<% zebra('Sys.getenv()',as.list(Sys.getenv())) %><br/><hr/>
+<% zebra('Sys.info()',as.list(Sys.info())) %><br/><hr/>
+<% zebra('.Machine',.Machine) %><br/><hr/>
+<% zebra('.Platform',.Platform) %><br/><hr/>
+<h1><a name="Attached_Packages"></a>Attached Packages</h1>
+<% lapply(sub('package:','',search()[grep('package:',search())]),zebrifyPackage) %>
+<h1><a name="Installed_Packages"></a>Installed Packages</h1>
+<% lapply(attr(installed.packages(),'dimnames')[[1]],zebrifyPackage) %>
+</body></html>
diff --git a/inst/brew-test-2.dvi b/inst/brew-test-2.dvi
new file mode 100644
index 0000000..fb96535
Binary files /dev/null and b/inst/brew-test-2.dvi differ
diff --git a/inst/brew-test-2.html b/inst/brew-test-2.html
new file mode 100644
index 0000000..7cf1ec6
--- /dev/null
+++ b/inst/brew-test-2.html
@@ -0,0 +1,688 @@
+<!DOCTYPE html PUBLIC "-//W3C//DTD XHTML 1.0 Transitional//EN" "DTD/xhtml1-transitional.dtd">
+<html><head>
+<meta http-equiv="Content-Type" content="text/html;charset=utf-8" />
+<style type="text/css">
+body { font-family: "lucida grande",verdana,sans-serif; margin-left: 210px; margin-right: 18px; }
+table { border: 1px solid #8897be; border-spacing: 0px; font-size: 10pt; }
+td { border-bottom:1px solid #d9d9d9; border-left:1px solid #d9d9d9; border-spacing: 0px; padding: 3px 8px; }
+td.l { font-weight: bold; width: 10%; }
+tr.e { background-color: #eeeeee; border-spacing: 0px; }
+tr.o { background-color: #ffffff; border-spacing: 0px; }
+div a { text-decoration: none; color: white; }
+a:hover { color: #8897be; background: white; }
+tr:hover { background: #8897be; /* color: white;*/ }
+img.map { position: fixed; border: 0px; left: 50px; right: auto; top: 10px; }
+div.map { background: #8897be; font-weight: bold; color: white; position: fixed; bottom: 30px; height: auto; left: 15px; right: auto; top: 110px; width: 150px; padding: 0 13px; text-align: right; font-size: 12pt; }
+div.map p { font-size: 10pt; font-family: serif; font-style: italic; }
+div.h { font-size: 20pt; font-weight: bold; }
+hr {background-color: #cccccc; border: 0px; height: 1px; color: #000000;}
+</style>
+<title>Everything You Wanted To Know About Your R Session</title>
+</head>
+<body>
+<a name="Top"> </a>
+<a href="http://www.r-project.org/"><img class="map" alt="R Language Home Page" src="http://www.r-project.org/Rlogo.jpg"/></a>
+<div class="h">Everything You Wanted To Know About Your R Session</div>
+<div class="map">
+<p>jump to:</p>
+<a href="#Top">Top</a><br/><hr/>
+<a href="#R_version">R.version</a><br/>
+<a href="#search__">search()</a><br/>
+<a href="#_libPaths__">.libPaths()</a><br/>
+<a href="#options__">options()</a><br/>
+<a href="#Sys_getenv__">Sys.getenv()</a><br/>
+<a href="#Sys_info__">Sys.info()</a><br/>
+<a href="#_Machine">.Machine</a><br/>
+<a href="#_Platform">.Platform</a><br/><hr/>
+<a href="#Attached_Packages">Attached Packages</a><br/><hr/>
+<a href="#Installed_Packages">Installed Packages</a><br/><hr/>
+</div>
+<h2><a name="R_version"> </a>R.version</h2><table><tbody><tr class=" o "><td class="l"> platform </td><td>i486-pc-linux-gnu</td></tr>
+<tr class=" e "><td class="l"> arch </td><td>i486</td></tr>
+<tr class=" o "><td class="l"> os </td><td>linux-gnu</td></tr>
+<tr class=" e "><td class="l"> system </td><td>i486, linux-gnu</td></tr>
+<tr class=" o "><td class="l"> status </td><td> </td></tr>
+<tr class=" e "><td class="l"> major </td><td>2</td></tr>
+<tr class=" o "><td class="l"> minor </td><td>5.1</td></tr>
+<tr class=" e "><td class="l"> year </td><td>2007</td></tr>
+<tr class=" o "><td class="l"> month </td><td>06</td></tr>
+<tr class=" e "><td class="l"> day </td><td>27</td></tr>
+<tr class=" o "><td class="l"> svn rev </td><td>42083</td></tr>
+<tr class=" e "><td class="l"> language </td><td>R</td></tr>
+<tr class=" o "><td class="l"> version.string </td><td>R version 2.5.1 (2007-06-27)</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="search__"> </a>search()</h2><table><tbody><tr class=" e "><td>.GlobalEnv</td></tr>
+<tr class=" o "><td>package:graphics</td></tr>
+<tr class=" e "><td>package:grDevices</td></tr>
+<tr class=" o "><td>package:datasets</td></tr>
+<tr class=" e "><td>package:stats</td></tr>
+<tr class=" o "><td>package:brew</td></tr>
+<tr class=" e "><td>package:utils</td></tr>
+<tr class=" o "><td>package:methods</td></tr>
+<tr class=" e "><td>Autoloads</td></tr>
+<tr class=" o "><td>package:base</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="_libPaths__"> </a>.libPaths()</h2><table><tbody><tr class=" e "><td>/usr/local/lib/R/site-library</td></tr>
+<tr class=" o "><td>/usr/lib/R/site-library</td></tr>
+<tr class=" e "><td>/usr/lib/R/library</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="options__"> </a>options()</h2><table><tbody><tr class=" o "><td class="l"> add.smooth </td><td>TRUE</td></tr>
+<tr class=" e "><td class="l"> browser </td><td>firefox</td></tr>
+<tr class=" o "><td class="l"> check.bounds </td><td>FALSE</td></tr>
+<tr class=" e "><td class="l"> continue </td><td>+ </td></tr>
+<tr class=" o "><td class="l"> contrasts </td><td><table><tbody><tr class=" e "><td class="l"> unordered </td><td>contr.treatment</td></tr>
+<tr class=" o "><td class="l"> ordered </td><td>contr.poly</td></tr>
+</tbody></table>
+</td></tr>
+<tr class=" e "><td class="l"> device </td><td>X11</td></tr>
+<tr class=" o "><td class="l"> digits </td><td>7</td></tr>
+<tr class=" e "><td class="l"> dvipscmd </td><td>/usr/bin/dvips</td></tr>
+<tr class=" o "><td class="l"> echo </td><td>TRUE</td></tr>
+<tr class=" e "><td class="l"> editor </td><td>vi</td></tr>
+<tr class=" o "><td class="l"> encoding </td><td>native.enc</td></tr>
+<tr class=" e "><td class="l"> example.ask </td><td>default</td></tr>
+<tr class=" o "><td class="l"> expressions </td><td>5000</td></tr>
+<tr class=" e "><td class="l"> help.try.all.packages </td><td>FALSE</td></tr>
+<tr class=" o "><td class="l"> HTTPUserAgent </td><td>R (2.5.1 i486-pc-linux-gnu i486 linux-gnu)</td></tr>
+<tr class=" e "><td class="l"> internet.info </td><td>2</td></tr>
+<tr class=" o "><td class="l"> keep.source </td><td>TRUE</td></tr>
+<tr class=" e "><td class="l"> keep.source.pkgs </td><td>FALSE</td></tr>
+<tr class=" o "><td class="l"> latexcmd </td><td>/usr/bin/latex</td></tr>
+<tr class=" e "><td class="l"> locatorBell </td><td>TRUE</td></tr>
+<tr class=" o "><td class="l"> mailer </td><td>mailx</td></tr>
+<tr class=" e "><td class="l"> max.print </td><td>99999</td></tr>
+<tr class=" o "><td class="l"> menu.graphics </td><td>TRUE</td></tr>
+<tr class=" e "><td class="l"> na.action </td><td>na.omit</td></tr>
+<tr class=" o "><td class="l"> OutDec </td><td>.</td></tr>
+<tr class=" e "><td class="l"> pager </td><td>/usr/lib/R/bin/pager</td></tr>
+<tr class=" o "><td class="l"> papersize </td><td>a4</td></tr>
+<tr class=" e "><td class="l"> par.ask.default </td><td>FALSE</td></tr>
+<tr class=" o "><td class="l"> pdfviewer </td><td>/usr/bin/open</td></tr>
+<tr class=" e "><td class="l"> pkgType </td><td>source</td></tr>
+<tr class=" o "><td class="l"> printcmd </td><td>/usr/bin/lpr</td></tr>
+<tr class=" e "><td class="l"> prompt </td><td>> </td></tr>
+<tr class=" o "><td class="l"> repos </td><td>_at_CRAN_at_</td></tr>
+<tr class=" e "><td class="l"> rl_word_breaks </td><td> 	
+"\'`><=%;,|&{()}</td></tr>
+<tr class=" o "><td class="l"> scipen </td><td>0</td></tr>
+<tr class=" e "><td class="l"> show.coef.Pvalues </td><td>TRUE</td></tr>
+<tr class=" o "><td class="l"> show.error.messages </td><td>TRUE</td></tr>
+<tr class=" e "><td class="l"> show.signif.stars </td><td>TRUE</td></tr>
+<tr class=" o "><td class="l"> str </td><td><table><tbody><tr class=" e "><td class="l"> strict.width </td><td>no</td></tr>
+<tr class=" o "><td class="l"> digits.d </td><td>3</td></tr>
+<tr class=" e "><td class="l"> vec.len </td><td>4</td></tr>
+</tbody></table>
+</td></tr>
+<tr class=" o "><td class="l"> stringsAsFactors </td><td>TRUE</td></tr>
+<tr class=" e "><td class="l"> timeout </td><td>60</td></tr>
+<tr class=" o "><td class="l"> ts.eps </td><td>1e-05</td></tr>
+<tr class=" e "><td class="l"> ts.S.compat </td><td>FALSE</td></tr>
+<tr class=" o "><td class="l"> unzip </td><td>/usr/bin/unzip</td></tr>
+<tr class=" e "><td class="l"> verbose </td><td>FALSE</td></tr>
+<tr class=" o "><td class="l"> warn </td><td>0</td></tr>
+<tr class=" e "><td class="l"> warnings.length </td><td>1000</td></tr>
+<tr class=" o "><td class="l"> width </td><td>80</td></tr>
+<tr class=" e "><td class="l"> X11colortype </td><td>true</td></tr>
+<tr class=" o "><td class="l"> X11fonts </td><td><table><tbody><tr class=" e "><td>-adobe-helvetica-%s-%s-*-*-%d-*-*-*-*-*-*-*</td></tr>
+<tr class=" o "><td>-adobe-symbol-medium-r-*-*-%d-*-*-*-*-*-*-*</td></tr>
+</tbody></table>
+</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="Sys_getenv__"> </a>Sys.getenv()</h2><table><tbody><tr class=" e "><td class="l"> _ </td><td>/usr/bin/R</td></tr>
+<tr class=" o "><td class="l"> AWK </td><td>/usr/bin/awk</td></tr>
+<tr class=" e "><td class="l"> COLORTERM </td><td> </td></tr>
+<tr class=" o "><td class="l"> COLUMNS </td><td>109</td></tr>
+<tr class=" e "><td class="l"> DBUS_SESSION_BUS_ADDRESS </td><td>unix:abstract=/tmp/dbus-a5GuEcBU6j,guid=2e4415081a439b1a0b19d20046c07833</td></tr>
+<tr class=" o "><td class="l"> DESKTOP_SESSION </td><td>kde</td></tr>
+<tr class=" e "><td class="l"> DISPLAY </td><td>:0.0</td></tr>
+<tr class=" o "><td class="l"> DM_CONTROL </td><td>/var/run/xdmctl</td></tr>
+<tr class=" e "><td class="l"> EDITOR </td><td>vi</td></tr>
+<tr class=" o "><td class="l"> EGREP </td><td>/bin/grep -E</td></tr>
+<tr class=" e "><td class="l"> GS_LIB </td><td>/home/hornerj/.fonts</td></tr>
+<tr class=" o "><td class="l"> GTK2_RC_FILES </td><td>/home/hornerj/.gtkrc-2.0-kde:/home/hornerj/.kde/share/config/gtkrc-2.0</td></tr>
+<tr class=" e "><td class="l"> GTK_RC_FILES </td><td>/etc/gtk/gtkrc:/home/hornerj/.gtkrc:/home/hornerj/.kde/share/config/gtkrc</td></tr>
+<tr class=" o "><td class="l"> HOME </td><td>/home/hornerj</td></tr>
+<tr class=" e "><td class="l"> INPUTRC </td><td>/home/hornerj/.inputrc</td></tr>
+<tr class=" o "><td class="l"> KDE_FULL_SESSION </td><td>true</td></tr>
+<tr class=" e "><td class="l"> KDE_MULTIHEAD </td><td>false</td></tr>
+<tr class=" o "><td class="l"> KONSOLE_DCOP </td><td>DCOPRef(konsole-25719,konsole)</td></tr>
+<tr class=" e "><td class="l"> KONSOLE_DCOP_SESSION </td><td>DCOPRef(konsole-25719,session-1)</td></tr>
+<tr class=" o "><td class="l"> LANG </td><td>en_US.UTF-8</td></tr>
+<tr class=" e "><td class="l"> LD_LIBRARY_PATH </td><td>/usr/lib/R/lib::/usr/lib/j2se/1.4/jre/lib/i386/client:/usr/lib/j2se/1.4/jre/lib/i386:/usr/lib/j2se/1.4/jre/../lib/i386::/usr/lib:/lib:/usr/lib/j2se/i386:/usr/lib/jni</td></tr>
+<tr class=" o "><td class="l"> LINES </td><td>77</td></tr>
+<tr class=" e "><td class="l"> LN_S </td><td>ln -s</td></tr>
+<tr class=" o "><td class="l"> LOGNAME </td><td>hornerj</td></tr>
+<tr class=" e "><td class="l"> LS_COLORS </td><td>no=00:fi=00:di=01;34:ln=01;36:pi=40;33:so=01;35:do=01;35:bd=40;33;01:cd=40;33;01:or=40;31;01:su=37;41:sg=30;43:tw=30;42:ow=34;42:st=37;44:ex=01;32:*.tar=01;31:*.tgz=01;31:*.arj=01;31:*.taz=01;31:*.lzh=01;31:*.zip=01;31:*.z=01;31:*.Z=01;31:*.gz=01;31:*.bz2=01;31:*.deb=01;31:*.rpm=01;31:*.jar=01;31:*.jpg=01;35:*.jpeg=01;35:*.gif=01;35:*.bmp=01;35:*.pbm=01;35:*.pgm=01;35:*.ppm=01;35:*.tga=01;35:*.xbm=01;35:*.xpm=01;35:*.tif=01;35:*.tiff=01;3 [...]
+<tr class=" o "><td class="l"> MAKE </td><td>make</td></tr>
+<tr class=" e "><td class="l"> OLDPWD </td><td>/home/hornerj/DISCHARGE/PROJECTA</td></tr>
+<tr class=" o "><td class="l"> PAGER </td><td>/usr/bin/pager</td></tr>
+<tr class=" e "><td class="l"> PATH </td><td>/home/hornerj/bin:/home/hornerj/bin:/usr/local/sbin:/usr/local/bin:/usr/sbin:/usr/bin:/sbin:/bin:/usr/bin/X11:/usr/games</td></tr>
+<tr class=" o "><td class="l"> PERL </td><td>/usr/bin/perl</td></tr>
+<tr class=" e "><td class="l"> PWD </td><td>/home/hornerj/brew_rforge/trunk/inst</td></tr>
+<tr class=" o "><td class="l"> R_ARCH </td><td> </td></tr>
+<tr class=" e "><td class="l"> R_BROWSER </td><td>sensible-browser</td></tr>
+<tr class=" o "><td class="l"> R_DOC_DIR </td><td>/usr/share/R/doc</td></tr>
+<tr class=" e "><td class="l"> R_DVIPSCMD </td><td>/usr/bin/dvips</td></tr>
+<tr class=" o "><td class="l"> R_HISTFILE </td><td>/home/hornerj/.Rhistory</td></tr>
+<tr class=" e "><td class="l"> R_HOME </td><td>/usr/lib/R</td></tr>
+<tr class=" o "><td class="l"> R_INCLUDE_DIR </td><td>/usr/share/R/include</td></tr>
+<tr class=" e "><td class="l"> R_LATEXCMD </td><td>/usr/bin/latex</td></tr>
+<tr class=" o "><td class="l"> R_LIBS_SITE </td><td>/usr/local/lib/R/site-library:/usr/lib/R/site-library:/usr/lib/R/library</td></tr>
+<tr class=" e "><td class="l"> R_LIBS_USER </td><td>~/R/i486-pc-linux-gnu-library/2.5</td></tr>
+<tr class=" o "><td class="l"> R_MAKEINDEXCMD </td><td>/usr/bin/makeindex</td></tr>
+<tr class=" e "><td class="l"> R_PAPERSIZE </td><td>letter</td></tr>
+<tr class=" o "><td class="l"> R_PAPERSIZE_USER </td><td>a4</td></tr>
+<tr class=" e "><td class="l"> R_PDFVIEWER </td><td>/usr/bin/open</td></tr>
+<tr class=" o "><td class="l"> R_PLATFORM </td><td>i486-pc-linux-gnu</td></tr>
+<tr class=" e "><td class="l"> R_PRINTCMD </td><td>/usr/bin/lpr</td></tr>
+<tr class=" o "><td class="l"> R_RD4DVI </td><td>ae</td></tr>
+<tr class=" e "><td class="l"> R_RD4PDF </td><td>times,hyper</td></tr>
+<tr class=" o "><td class="l"> R_SESSION_TMPDIR </td><td>/tmp/RtmpEI2P1C</td></tr>
+<tr class=" e "><td class="l"> R_SHARE_DIR </td><td>/usr/share/R/share</td></tr>
+<tr class=" o "><td class="l"> R_UNZIPCMD </td><td>/usr/bin/unzip</td></tr>
+<tr class=" e "><td class="l"> R_USE_AQUA_SUBDIRS </td><td>no</td></tr>
+<tr class=" o "><td class="l"> R_ZIPCMD </td><td>/usr/bin/zip</td></tr>
+<tr class=" e "><td class="l"> SESSION_MANAGER </td><td>local/biostat028:/tmp/.ICE-unix/30462</td></tr>
+<tr class=" o "><td class="l"> SHELL </td><td>/bin/bash</td></tr>
+<tr class=" e "><td class="l"> SHLVL </td><td>1</td></tr>
+<tr class=" o "><td class="l"> SSH_AGENT_PID </td><td>30393</td></tr>
+<tr class=" e "><td class="l"> SSH_AUTH_SOCK </td><td>/tmp/ssh-qqVJQ30347/agent.30347</td></tr>
+<tr class=" o "><td class="l"> TAR </td><td>tar</td></tr>
+<tr class=" e "><td class="l"> TERM </td><td>xterm</td></tr>
+<tr class=" o "><td class="l"> USER </td><td>hornerj</td></tr>
+<tr class=" e "><td class="l"> WINDOWID </td><td>33554439</td></tr>
+<tr class=" o "><td class="l"> XCURSOR_THEME </td><td>kubuntu</td></tr>
+<tr class=" e "><td class="l"> XDM_MANAGED </td><td>/var/run/xdmctl/xdmctl-:0,maysd,mayfn,sched,rsvd,method=classic</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="Sys_info__"> </a>Sys.info()</h2><table><tbody><tr class=" o "><td class="l"> sysname </td><td>Linux</td></tr>
+<tr class=" e "><td class="l"> release </td><td>2.6.20-16-generic</td></tr>
+<tr class=" o "><td class="l"> version </td><td>#2 SMP Thu Jun 7 20:19:32 UTC 2007</td></tr>
+<tr class=" e "><td class="l"> nodename </td><td>biostat028</td></tr>
+<tr class=" o "><td class="l"> machine </td><td>i686</td></tr>
+<tr class=" e "><td class="l"> login </td><td>unknown</td></tr>
+<tr class=" o "><td class="l"> user </td><td>hornerj</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="_Machine"> </a>.Machine</h2><table><tbody><tr class=" e "><td class="l"> double.eps </td><td>2.22044604925031e-16</td></tr>
+<tr class=" o "><td class="l"> double.neg.eps </td><td>1.11022302462516e-16</td></tr>
+<tr class=" e "><td class="l"> double.xmin </td><td>2.2250738585072e-308</td></tr>
+<tr class=" o "><td class="l"> double.xmax </td><td>1.79769313486232e+308</td></tr>
+<tr class=" e "><td class="l"> double.base </td><td>2</td></tr>
+<tr class=" o "><td class="l"> double.digits </td><td>53</td></tr>
+<tr class=" e "><td class="l"> double.rounding </td><td>5</td></tr>
+<tr class=" o "><td class="l"> double.guard </td><td>0</td></tr>
+<tr class=" e "><td class="l"> double.ulp.digits </td><td>-52</td></tr>
+<tr class=" o "><td class="l"> double.neg.ulp.digits </td><td>-53</td></tr>
+<tr class=" e "><td class="l"> double.exponent </td><td>11</td></tr>
+<tr class=" o "><td class="l"> double.min.exp </td><td>-1022</td></tr>
+<tr class=" e "><td class="l"> double.max.exp </td><td>1024</td></tr>
+<tr class=" o "><td class="l"> integer.max </td><td>2147483647</td></tr>
+<tr class=" e "><td class="l"> sizeof.long </td><td>4</td></tr>
+<tr class=" o "><td class="l"> sizeof.longlong </td><td>8</td></tr>
+<tr class=" e "><td class="l"> sizeof.longdouble </td><td>12</td></tr>
+<tr class=" o "><td class="l"> sizeof.pointer </td><td>4</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="_Platform"> </a>.Platform</h2><table><tbody><tr class=" e "><td class="l"> OS.type </td><td>unix</td></tr>
+<tr class=" o "><td class="l"> file.sep </td><td>/</td></tr>
+<tr class=" e "><td class="l"> dynlib.ext </td><td>.so</td></tr>
+<tr class=" o "><td class="l"> GUI </td><td>X11</td></tr>
+<tr class=" e "><td class="l"> endian </td><td>little</td></tr>
+<tr class=" o "><td class="l"> pkgType </td><td>source</td></tr>
+<tr class=" e "><td class="l"> path.sep </td><td>:</td></tr>
+<tr class=" o "><td class="l"> r_arch </td><td> </td></tr>
+</tbody></table>
+<br/><hr/>
+<h1><a name="Attached_Packages"></a>Attached Packages</h1>
+<h2><a name="graphics"> </a>graphics</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>graphics</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>The R Graphics Package</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>R functions for base graphics</td></tr>
+<tr class=" o "><td class="l"> Imports </td><td>grDevices</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:16; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="grDevices"> </a>grDevices</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>grDevices</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>The R Graphics Devices and Support for Colours and Fonts</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Graphics devices and support for base and grid graphics</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="datasets"> </a>datasets</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>datasets</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The R Datasets Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Base R datasets</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:18; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="stats"> </a>stats</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>stats</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>The R Stats Package</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>R statistical functions</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:17; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="brew"> </a>brew</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>brew</td></tr>
+<tr class=" e "><td class="l"> Type </td><td>Package</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Templating Framework for Report Generation</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>0.1-2</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2007-04-16</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Jeffrey Horner</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>Jeffrey Horner <jeff.horner_at_vanderbilt.edu></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>brew implements a templating framework for mixing text and
+R code for report generation. brew template syntax is similar
+to PHP, Ruby's erb module, Java Server Pages, and Python's psp
+module.</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL 2.0</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; ; 2007-08-20 15:33:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="utils"> </a>utils</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>utils</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The R Utils Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>R utility functions</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="methods"> </a>methods</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>methods</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Imports </td><td>utils</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Formal Methods and Classes</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Formally defined methods and classes for R objects, plus
+other programming tools, as described in the reference</td></tr>
+<tr class=" e "><td class="l"> References </td><td>``Programming with Data'' (1998), John M. Chambers,
+Springer NY. http://www.omegahat.org/RSMethods/Intro.ps and
+.../Intro.pdf</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:21; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="base"> </a>base</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The R Base Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Base R functions</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; Thu Jul 19 14:31:13 EDT 2007; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+
+<h1><a name="Installed_Packages"></a>Installed Packages</h1>
+<h2><a name="brew"> </a>brew</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>brew</td></tr>
+<tr class=" o "><td class="l"> Type </td><td>Package</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Templating Framework for Report Generation</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>0.1-2</td></tr>
+<tr class=" e "><td class="l"> Date </td><td>2007-04-16</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Jeffrey Horner</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>Jeffrey Horner <jeff.horner_at_vanderbilt.edu></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>brew implements a templating framework for mixing text and
+R code for report generation. brew template syntax is similar
+to PHP, Ruby's erb module, Java Server Pages, and Python's psp
+module.</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL 2.0</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-08-20 15:33:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="Cairo"> </a>Cairo</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>Cairo</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>1.3-5</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>R graphics device using cairo graphics library for creating
+high-quality bitmap (PNG, JPEG, TIFF), vector (PDF, SVG,
+PostScript) and display (X11 and Win32) output.</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Simon Urbanek <Simon.Urbanek_at_r-project.org>, Jeffrey Horner
+<jeff.horner_at_vanderbilt.edu></td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>Simon Urbanek <Simon.Urbanek_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>R (>= 1.9.0)</td></tr>
+<tr class=" e "><td class="l"> Description </td><td>This package provides a Cairo graphics device that can be
+use to create high-quality vector (PDF, PostScript and SVG) and
+bitmap output (PNG,JPEG,TIFF), and high-quality rendering in
+displays (X11 and Win32). Since it uses the same back-end for
+all output, copying across formats is WYSIWYG. Files are
+created without the dependence on X11 or other external
+programs. This device supports alpha channel (semi-transparent
+drawing) and resulting images can contain transparent and
+semi-transparent regions. It is ideal for use in server
+environemnts (file output) and as a replacement for other
+devices that don't have Cairo's capabilities such as alpha
+support or anti-aliasing. Backends are modular such that any
+subset of backends is supported.</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL version 2</td></tr>
+<tr class=" e "><td class="l"> SystemRequirements </td><td>cairo (>= 1.2 http://www.cairographics.org/)</td></tr>
+<tr class=" o "><td class="l"> URL </td><td>http://www.rforge.net/Cairo/</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.0; i486-pc-linux-gnu; 2007-06-26 16:04:52; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="Hmisc"> </a>Hmisc</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>Hmisc</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>3.4-2</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2007-5-02</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Harrell Miscellaneous</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Frank E Harrell Jr <f.harrell_at_vanderbilt.edu>, with
+contributions from many other users.</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>Charles Dupont <charles.dupont_at_vanderbilt.edu></td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>R (>= 2.4.0), methods</td></tr>
+<tr class=" e "><td class="l"> Imports </td><td>lattice, cluster</td></tr>
+<tr class=" o "><td class="l"> Suggests </td><td>lattice, grid, nnet, foreign, survival, chron, acepack,
+TeachingDemos, Design, cluster</td></tr>
+<tr class=" e "><td class="l"> Description </td><td>The Hmisc library contains many functions useful for data
+analysis, high-level graphics, utility operations, functions
+for computing sample size and power, importing datasets,
+imputing missing values, advanced table making, variable
+clustering, character string manipulation, conversion of S
+objects to LaTeX code, and recoding variables.  Please submit
+bug reports to 'http://biostat.mc.vanderbilt.edu/trac/Hmisc'.</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL version 2 or newer</td></tr>
+<tr class=" e "><td class="l"> URL </td><td>http://biostat.mc.vanderbilt.edu/s/Hmisc,
+http://biostat.mc.vanderbilt.edu/twiki/pub/Main/RS/sintro.pdf,
+http://biostat.mc.vanderbilt.edu/twiki/pub/Main/StatReport/summary.pdf,
+http://biostat.mc.vanderbilt.edu/trac/Hmisc</td></tr>
+<tr class=" o "><td class="l"> Packaged </td><td>Tue Jul 3 10:20:33 2007; dupontct</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-08-06 14:10:50; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="lattice"> </a>lattice</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>lattice</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>0.16-2</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2007/07/19</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>recommended</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Lattice Graphics</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Deepayan Sarkar <deepayan.sarkar_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>Deepayan Sarkar <deepayan.sarkar_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Implementation of Trellis Graphics. See ?Lattice for a
+brief introduction</td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>R (>= 2.5.0)</td></tr>
+<tr class=" e "><td class="l"> Suggests </td><td>grid</td></tr>
+<tr class=" o "><td class="l"> Imports </td><td>grid, grDevices, graphics, stats, utils</td></tr>
+<tr class=" e "><td class="l"> Enhances </td><td>chron</td></tr>
+<tr class=" o "><td class="l"> LazyLoad </td><td>yes</td></tr>
+<tr class=" e "><td class="l"> LazyData </td><td>yes</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL version 2 or later</td></tr>
+<tr class=" e "><td class="l"> Packaged </td><td>Thu Jul 19 16:59:51 2007; dsarkar</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-08-06 14:09:52; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="RColorBrewer"> </a>RColorBrewer</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>RColorBrewer</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>0.2-3</td></tr>
+<tr class=" e "><td class="l"> Date </td><td>2005-04-16</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>ColorBrewer palettes</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Erich Neuwirth <erich.neuwirth_at_univie.ac.at></td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>Erich Neuwirth <erich.neuwirth_at_univie.ac.at></td></tr>
+<tr class=" e "><td class="l"> Depends </td><td>R (>= 1.7.0)</td></tr>
+<tr class=" o "><td class="l"> Description </td><td>The packages provides palettes for drawing nice maps
+shaded according to a variable.</td></tr>
+<tr class=" e "><td class="l"> License </td><td>Apache-Style Software License</td></tr>
+<tr class=" o "><td class="l"> Packaged </td><td>Sun Apr 17 11:31:50 2005; neuwirth</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.0; ; 2007-06-25 16:56:52; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="xtable"> </a>xtable</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>xtable</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>1.4-6</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2007/05/21</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Export tables to LaTeX or HTML</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>David B. Dahl <dahl_at_stat.tamu.edu> with contributions from many
+others</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>David B. Dahl <dahl_at_stat.tamu.edu></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Coerce data to LaTeX and HTML tables</td></tr>
+<tr class=" e "><td class="l"> Depends </td><td> </td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL version 2 or later</td></tr>
+<tr class=" e "><td class="l"> Packaged </td><td>Mon May 21 10:51:03 2007; dahl</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-24 10:50:18; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="brew"> </a>brew</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>brew</td></tr>
+<tr class=" o "><td class="l"> Type </td><td>Package</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Templating Framework for Report Generation</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>0.1-2</td></tr>
+<tr class=" e "><td class="l"> Date </td><td>2007-04-16</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Jeffrey Horner</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>Jeffrey Horner <jeff.horner_at_vanderbilt.edu></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>brew implements a templating framework for mixing text and
+R code for report generation. brew template syntax is similar
+to PHP, Ruby's erb module, Java Server Pages, and Python's psp
+module.</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL 2.0</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-08-20 15:33:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="mapdata"> </a>mapdata</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>mapdata</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Extra Map Databases</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.0-17</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2005-12-20</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Original S code by Richard A. Becker and Allan R. Wilks. R
+version by Ray Brownrigg <Ray.Brownrigg_at_mcs.vuw.ac.nz></td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>R (>= 1.7.0), maps (>= 2.0-7)</td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Supplement to maps package, providing the larger and/or
+higher-resolution databases.</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL2</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>Ray Brownrigg <Ray.Brownrigg_at_mcs.vuw.ac.nz></td></tr>
+<tr class=" o "><td class="l"> Packaged </td><td>Tue Dec 20 22:29:07 2005; ray</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.2.1; i486-pc-linux-gnu; 2006-01-12 03:10:12; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="mapproj"> </a>mapproj</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>mapproj</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Map Projections</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>1.1-7.1</td></tr>
+<tr class=" e "><td class="l"> Date </td><td>2005-04-26</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Doug McIlroy.  Packaged for R by Ray Brownrigg and Thomas P
+Minka.</td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Converts latitude/longitude into projected coordinates.</td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>maps</td></tr>
+<tr class=" e "><td class="l"> License </td><td>Distribution and use for non-commercial purposes only.</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>Thomas P Minka <tpminka_at_media.mit.edu></td></tr>
+<tr class=" e "><td class="l"> Packaged </td><td>Tue Apr 26 11:03:59 2005; hornik</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.1.0; i386-pc-linux-gnu; 2005-06-02 17:18:58; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="maps"> </a>maps</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>maps</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Draw Geographical Maps</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.0-32</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2006-09-26</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Original S code by Richard A. Becker and Allan R. Wilks. R
+version by Ray Brownrigg <Ray.Brownrigg_at_mcs.vuw.ac.nz>
+Enhancements by Thomas P Minka <surname_at_stat.cmu.edu></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Display of maps.  Projection code and larger maps are in
+separate packages (mapproj and mapdata).</td></tr>
+<tr class=" e "><td class="l"> Depends </td><td>R (>= 1.7.0)</td></tr>
+<tr class=" o "><td class="l"> Suggests </td><td>mapproj</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL2</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>Ray Brownrigg <Ray.Brownrigg_at_mcs.vuw.ac.nz></td></tr>
+<tr class=" e "><td class="l"> Packaged </td><td>Tue Sep 26 15:24:36 2006; ray</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.3.1; i486-pc-linux-gnu; 2006-11-10 03:07:02; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="base"> </a>base</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>The R Base Package</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Base R functions</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; ; Thu Jul 19 14:31:13 EDT 2007; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="cluster"> </a>cluster</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>cluster</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>1.11.7</td></tr>
+<tr class=" o "><td class="l"> Date </td><td>2007-06-05</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>recommended</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Martin Maechler, based on S original by Peter Rousseeuw
+<rousse_at_uia.ua.ac.be>, Anja.Struyf_at_uia.ua.ac.be and
+Mia.Hubert_at_uia.ua.ac.be, and initial R port by
+Kurt.Hornik_at_R-project.org</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>Martin Maechler <maechler_at_stat.math.ethz.ch></td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Cluster Analysis Extended Rousseeuw et al.</td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Cluster Analysis, extended original from Peter Rousseeuw,
+Anja Struyf and Mia Hubert.</td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>R (>= 2.2.1), stats, graphics, utils</td></tr>
+<tr class=" e "><td class="l"> LazyLoad </td><td>yes</td></tr>
+<tr class=" o "><td class="l"> LazyData </td><td>yes</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL version 2 or later</td></tr>
+<tr class=" o "><td class="l"> Packaged </td><td>Tue Jun 5 14:44:06 2007; maechler</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.0; i486-pc-linux-gnu; 2007-06-06 12:10:01; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="datasets"> </a>datasets</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>datasets</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The R Datasets Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Base R datasets</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:18; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="graphics"> </a>graphics</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>graphics</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>The R Graphics Package</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>R functions for base graphics</td></tr>
+<tr class=" o "><td class="l"> Imports </td><td>grDevices</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:16; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="grDevices"> </a>grDevices</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>grDevices</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>The R Graphics Devices and Support for Colours and Fonts</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Graphics devices and support for base and grid graphics</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="grid"> </a>grid</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>grid</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The Grid Graphics Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>Paul Murrell <paul_at_stat.auckland.ac.nz></td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>A rewrite of the graphics layout capabilities, plus some
+support for interaction</td></tr>
+<tr class=" e "><td class="l"> Imports </td><td>grDevices</td></tr>
+<tr class=" o "><td class="l"> Suggests </td><td>lattice</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:21; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="methods"> </a>methods</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>methods</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Imports </td><td>utils</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Formal Methods and Classes</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Formally defined methods and classes for R objects, plus
+other programming tools, as described in the reference</td></tr>
+<tr class=" e "><td class="l"> References </td><td>``Programming with Data'' (1998), John M. Chambers,
+Springer NY. http://www.omegahat.org/RSMethods/Intro.ps and
+.../Intro.pdf</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:21; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="splines"> </a>splines</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>splines</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Imports </td><td>graphics, stats</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Regression Spline Functions and Classes</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Douglas M. Bates <bates_at_stat.wisc.edu> and William N. Venables
+<Bill.Venables_at_cmis.csiro.au></td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Regression spline functions and classes</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:22; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="stats"> </a>stats</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>stats</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The R Stats Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>R statistical functions</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:17; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="stats4"> </a>stats4</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>stats4</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Statistical Functions using S4 Classes</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Statistical Functions using S4 classes</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Depends </td><td>graphics, stats, methods</td></tr>
+<tr class=" e "><td class="l"> SaveImage </td><td>yes</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:23; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="tcltk"> </a>tcltk</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>tcltk</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>Tcl/Tk Interface</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>Interface and language bindings to Tcl/Tk GUI elements</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:23; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="tools"> </a>tools</h2><table><tbody><tr class=" e "><td class="l"> Package </td><td>tools</td></tr>
+<tr class=" o "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" e "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" o "><td class="l"> Title </td><td>Tools for Package Development</td></tr>
+<tr class=" e "><td class="l"> Author </td><td>Kurt Hornik and Friedrich Leisch</td></tr>
+<tr class=" o "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" e "><td class="l"> Description </td><td>Tools for package development, administration and
+documentation</td></tr>
+<tr class=" o "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" e "><td class="l"> Built </td><td>R 2.5.1; i486-pc-linux-gnu; 2007-07-19 14:31:14; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+<h2><a name="utils"> </a>utils</h2><table><tbody><tr class=" o "><td class="l"> Package </td><td>utils</td></tr>
+<tr class=" e "><td class="l"> Version </td><td>2.5.1</td></tr>
+<tr class=" o "><td class="l"> Priority </td><td>base</td></tr>
+<tr class=" e "><td class="l"> Title </td><td>The R Utils Package</td></tr>
+<tr class=" o "><td class="l"> Author </td><td>R Development Core Team and contributors worldwide</td></tr>
+<tr class=" e "><td class="l"> Maintainer </td><td>R Core Team <R-core_at_r-project.org></td></tr>
+<tr class=" o "><td class="l"> Description </td><td>R utility functions</td></tr>
+<tr class=" e "><td class="l"> License </td><td>GPL Version 2 or later.</td></tr>
+<tr class=" o "><td class="l"> Built </td><td>R 2.5.1; ; 2007-07-19 14:31:15; unix</td></tr>
+</tbody></table>
+<br/><hr/>
+
+</body></html>
diff --git a/inst/brew-test-2.log b/inst/brew-test-2.log
new file mode 100644
index 0000000..8e84254
--- /dev/null
+++ b/inst/brew-test-2.log
@@ -0,0 +1,75 @@
+This is pdfeTeX, Version 3.141592-1.30.5-2.2 (Web2C 7.5.5) (format=latex 2007.3.24)  21 AUG 2007 11:38
+entering extended mode
+**brew-test-2.tex
+(./brew-test-2.tex
+LaTeX2e <2003/12/01>
+Babel <v3.8g> and hyphenation patterns for english, usenglishmax, dumylang, noh
+yphenation, croatian, ukrainian, russian, bulgarian, czech, slovak, danish, dut
+ch, finnish, french, basque, german, ngerman, greek, monogreek, ancientgreek, i
+bycus, hungarian, italian, latin, mongolian, norsk, slovene, estonian, welsh, i
+nterlingua, icelandic, uppersorbian, romanian, indonesian, coptic, turkish, ser
+bian, polish, portuguese, spanish, catalan, swedish, ukenglish, loaded.
+(/usr/share/texmf-texlive/tex/latex/base/article.cls
+Document Class: article 2004/02/16 v1.4f Standard LaTeX document class
+(/usr/share/texmf-texlive/tex/latex/base/size10.clo
+File: size10.clo 2004/02/16 v1.4f Standard LaTeX file (size option)
+)
+\c at part=\count79
+\c at section=\count80
+\c at subsection=\count81
+\c at subsubsection=\count82
+\c at paragraph=\count83
+\c at subparagraph=\count84
+\c at figure=\count85
+\c at table=\count86
+\abovecaptionskip=\skip41
+\belowcaptionskip=\skip42
+\bibindent=\dimen102
+) (./brew-test-2.aux)
+\openout1 = `brew-test-2.aux'.
+
+LaTeX Font Info:    Checking defaults for OML/cmm/m/it on input line 7.
+LaTeX Font Info:    ... okay on input line 7.
+LaTeX Font Info:    Checking defaults for T1/cmr/m/n on input line 7.
+LaTeX Font Info:    ... okay on input line 7.
+LaTeX Font Info:    Checking defaults for OT1/cmr/m/n on input line 7.
+LaTeX Font Info:    ... okay on input line 7.
+LaTeX Font Info:    Checking defaults for OMS/cmsy/m/n on input line 7.
+LaTeX Font Info:    ... okay on input line 7.
+LaTeX Font Info:    Checking defaults for OMX/cmex/m/n on input line 7.
+LaTeX Font Info:    ... okay on input line 7.
+LaTeX Font Info:    Checking defaults for U/cmr/m/n on input line 7.
+LaTeX Font Info:    ... okay on input line 7.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <12> on input line 9.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <8> on input line 9.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <6> on input line 9.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <7> on input line 12.
+LaTeX Font Info:    External font `cmex10' loaded for size
+(Font)              <5> on input line 12.
+
+! Missing $ inserted.
+<inserted text> 
+                $
+l.99 rl_
+        word_breaks &
+? 
+! Interruption.
+<to be read again> 
+                   _
+l.99 rl_
+        word_breaks &
+? X
+ 
+Here is how much of TeX's memory you used:
+ 223 strings out of 94313
+ 2399 string characters out of 1171671
+ 52601 words of memory out of 1000000
+ 3528 multiletter control sequences out of 10000+50000
+ 7022 words of font info for 25 fonts, out of 500000 for 2000
+ 647 hyphenation exceptions out of 8191
+ 23i,6n,17p,119b,234s stack positions out of 1500i,500n,5000p,200000b,5000s
+No pages of output.
diff --git a/inst/brew-test-2.tex b/inst/brew-test-2.tex
new file mode 100644
index 0000000..62f3e7f
--- /dev/null
+++ b/inst/brew-test-2.tex
@@ -0,0 +1,125 @@
+
+\documentclass[a4paper]{article}
+
+\title{Everything you wanted to know about your R session.}
+\author{\emph{Jeffrey Horner}}
+
+\begin{document}
+
+\maketitle
+
+
+\begin{tabular} {ll}
+ & \\
+R.version & \\
+\hline
+platform & i486-pc-linux-gnu \\
+arch & i486 \\
+os & linux-gnu \\
+system & i486, linux-gnu \\
+status &  \\
+major & 2 \\
+minor & 5.1 \\
+year & 2007 \\
+month & 06 \\
+day & 27 \\
+svn rev & 42083 \\
+language & R \\
+version.string & R version 2.5.1 (2007-06-27) \\
+
+\hline
+\end{tabular}
+
+\begin{tabular} {ll}
+ & \\
+search() & \\
+\hline
+1 & .GlobalEnv \\
+2 & package:graphics \\
+3 & package:grDevices \\
+4 & package:datasets \\
+5 & package:stats \\
+6 & package:brew \\
+7 & package:utils \\
+8 & package:methods \\
+9 & Autoloads \\
+10 & package:base \\
+
+\hline
+\end{tabular}
+
+\begin{tabular} {ll}
+ & \\
+.libPaths() & \\
+\hline
+1 & /usr/local/lib/R/site-library \\
+2 & /usr/lib/R/site-library \\
+3 & /usr/lib/R/library \\
+
+\hline
+\end{tabular}
+
+\begin{tabular} {ll}
+ & \\
+options() & \\
+\hline
+add.smooth & TRUE \\
+browser & firefox \\
+check.bounds & FALSE \\
+continue & +  \\
+contrasts & contr.treatment contr.poly \\
+device & X11 \\
+digits & 7 \\
+dvipscmd & /usr/bin/dvips \\
+echo & TRUE \\
+editor & vi \\
+encoding & native.enc \\
+example.ask & default \\
+expressions & 5000 \\
+help.try.all.packages & FALSE \\
+HTTPUserAgent & R (2.5.1 i486-pc-linux-gnu i486 linux-gnu) \\
+internet.info & 2 \\
+keep.source & TRUE \\
+keep.source.pkgs & FALSE \\
+latexcmd & /usr/bin/latex \\
+locatorBell & TRUE \\
+mailer & mailx \\
+max.print & 99999 \\
+menu.graphics & TRUE \\
+na.action & na.omit \\
+OutDec & . \\
+pager & /usr/lib/R/bin/pager \\
+papersize & a4 \\
+par.ask.default & FALSE \\
+pdfviewer & /usr/bin/open \\
+pkgType & source \\
+printcmd & /usr/bin/lpr \\
+prompt & >  \\
+repos & @CRAN@ \\
+rl_word_breaks &  	
+"\'`><=%;,|&{()} \\
+scipen & 0 \\
+show.coef.Pvalues & TRUE \\
+show.error.messages & TRUE \\
+show.signif.stars & TRUE \\
+str & no 3 4 \\
+stringsAsFactors & TRUE \\
+timeout & 60 \\
+ts.eps & 1e-05 \\
+ts.S.compat & FALSE \\
+unzip & /usr/bin/unzip \\
+verbose & FALSE \\
+warn & 0 \\
+warnings.length & 1000 \\
+width & 80 \\
+X11colortype & true \\
+X11fonts & -adobe-helvetica-%s-%s-*-*-%d-*-*-*-*-*-*-* -adobe-symbol-medium-r-*-*-%d-*-*-*-*-*-*-* \\
+
+\hline
+\end{tabular}
+
+
+
+\end{document}
+
+
diff --git a/inst/brew-test-3.brew b/inst/brew-test-3.brew
new file mode 100644
index 0000000..aa23f06
--- /dev/null
+++ b/inst/brew-test-3.brew
@@ -0,0 +1,6 @@
+This is a test of "brew".
+<%
+library(RODBC)
+library(stats)
+%>
+End of test.
diff --git a/inst/broken.brew b/inst/broken.brew
new file mode 100644
index 0000000..af42cc5
--- /dev/null
+++ b/inst/broken.brew
@@ -0,0 +1,8 @@
+<%
+	foo <- 'bar'
+%>
+hello <%=foo
+<%
+	baz <- 5
+%>
+bye <%=baz%>
diff --git a/inst/catprint.brew b/inst/catprint.brew
new file mode 100644
index 0000000..316ff8a
--- /dev/null
+++ b/inst/catprint.brew
@@ -0,0 +1,35 @@
+DATA FRAME OUTPUT (LISTS TOO)
+
+Let's run this: <%% data(iris) %%>
+<% data(iris) %>
+Let's look at some R output:
+
+If we say this: <%% head(iris) %%>
+the output is this:
+<% head(iris) %>
+nothing right?
+
+if we say this: <%%= head(iris) %%>
+it's an error because cat() cannot handle lists.
+
+But if we say this: <%% print(head(iris)) %%>
+the output is this:
+<% print(head(iris)) %>
+
+VECTOR OUTPUT
+
+We'll work with v: <%% v <- head(iris)$Sepal.Length %%>
+<% v <- head(iris)$Sepal.Length %>
+
+If we say this: <%%= v %%>
+the output is this:
+<%= v %>
+because 'cat()' coerces v to a character vector
+
+How about <%%= v > 5 %%>
+<%= v > 5 %>
+So cat() can deal with any vector 
+
+And if we say this: <%% print(v) %%>
+the output is:
+<% print(v) %>
diff --git a/inst/example1.brew b/inst/example1.brew
new file mode 100644
index 0000000..3b68877
--- /dev/null
+++ b/inst/example1.brew
@@ -0,0 +1,9 @@
+Title: brew test
+<% foo<-'bar' -%>
+current time: <%= format(Sys.time()) %>
+value of foo: <%=foo%>
+<% for (i in 1:10) { -%> 
+i is <%=i%>
+<% foo <- paste(foo,i,sep='')
+   brew((system.file("example2.brew",package='brew'))) -%>
+<% } -%>
diff --git a/inst/example2.brew b/inst/example2.brew
new file mode 100644
index 0000000..e04aa76
--- /dev/null
+++ b/inst/example2.brew
@@ -0,0 +1 @@
+from example2.brew, foo is: <%=foo%>
diff --git a/inst/featurefull.brew b/inst/featurefull.brew
new file mode 100644
index 0000000..787848f
--- /dev/null
+++ b/inst/featurefull.brew
@@ -0,0 +1,14 @@
+You won't see this R output, but it will run. <% foo <- 'bar' %>
+Now foo is <%=foo%> and today is <%=format(Sys.time(),'%B %d, %Y')%>.
+<%# Comment -- ignored -- useful in testing. 
+    Also notice the dash-percent-gt.
+    It chops off the trailing newline. 
+    You can add it to any percent-gt. -%>
+How about generating a template from a template?
+<%% 
+	foo <- 'fee fi fo fum' 
+	brew <- 'haha'
+%%>
+foo is still <%=foo%>.
+Contents of current directory:
+<% print(dir()) %>
diff --git a/man/brew.Rd b/man/brew.Rd
new file mode 100644
index 0000000..7703e0d
--- /dev/null
+++ b/man/brew.Rd
@@ -0,0 +1,116 @@
+\name{brew}
+\alias{brew}
+\title{Report Brewing For Text and R Output}
+\description{
+  \code{brew} provides a templating system for text reporting. The syntax is similar to PHP,
+  Java Server Pages, Ruby's erb module, and Python's psp module.
+}
+\usage{
+brew(file=stdin(),output=stdout(),text=NULL,envir=parent.frame(),
+     run=TRUE,parseCode=TRUE,tplParser=NULL,chdir=FALSE)
+}
+\arguments{
+  \item{file}{A connection, or a character string naming the file
+    to read from. stdin() is the default.}
+  \item{output}{A connection, or a character string naming the file
+    to print to. stdout() is the default.}
+  \item{text}{ A character string treated as if it contained lines of a file
+    to read from. Only one of \code{file} or \code{text} is used as input. 
+    Default is \code{NULL}.}
+  \item{envir}{the \code{\link{environment}} in which the input is to
+    be evaluated.  Default is the caller's environment, useful for 
+    nested \code{brew} calls.}
+  \item{run}{Logical to determine if \code{brew} should evaluate the input (\code{run=TRUE}) or 
+    just parse it (\code{run=FALSE}). Useful for debugging.}
+  \item{parseCode}{Logical. only relevant when run=FALSE. When TRUE the brewed code is parsed and then silently returned. When FALSE, the brewed code is returned as a list. See the Value section for details.}
+  \item{tplParser}{a function to parse the text between '<\%\%' and '\%\%>' and return the result as
+    a character vector. The template text is passed to the function as a variable
+    length character vector in the first argument position.}
+  \item{chdir}{logical; if \code{TRUE} and \code{file} is a pathname, the R working
+          directory is temporarily changed to the directory containing
+          \code{file} for evaluating. \code{brew} will also honor the global option \code{brew.chdir}.}
+}
+\details{
+	brew syntax is quite simple and there are very few delimiters to learn:
+
+	\itemize{
+	\item{1.}{All text that falls outside of the delimiters is printed as-is.}
+	\item{2.}{R expressions between the '<\%' and '\%>' delimiters are executed in-place.}
+    \item{3.}{The value of the R expression between the '<\%=' and '\%>' delimiters is printed.}
+	\item{4.}{All text between the '<\%\#' and '\%>' delimiters is thrown away. Use it as a comment.}
+	\item{5.}{If you place a '-' just before the '\%>' delimiter, and it's placed at the end of a line, then the newline is omitted from the output.}
+	}
+    
+	The following template contains syntax to exercise all \code{brew} functionality:
+
+\preformatted{
+---------------
+You won't see this R output, but it will run. <\% foo <- 'bar' \%>
+Now foo is <\%=foo\%> and today is <\%=format(Sys.time(),'\%B \%d, \%Y')\%>.
+<\%# Comment -- ignored -- useful in testing. 
+    Also notice the dash-percent-gt.
+    It chops off the trailing newline. 
+    You can add it to any percent-gt. -\%>
+How about generating a template from a template?
+<\%\% foo <- 'fee fi fo fum' \%\%>
+foo is still <\%=foo\%>.
+---------------
+}
+
+	The output is:
+
+\preformatted{
+--------------
+You won't see this R output, but it will run.
+Now foo is bar and today is April 20, 2007.
+How about generating a template from a template?
+<\% foo <- 'fee fi fo fum' \%>
+foo is still bar.
+--------------
+}
+
+	Also, for power users, there's one more thing:
+
+	\itemize{
+	\item{6.}{Text between the '<\%\%' and '\%\%>' delimiters is treated as a brew template and
+      is printed as-is, but the delimiters are changed to '<\%' and '\%>'. This happens when tplParser=NULL. But if tplParser is a valid function, then the text is passed to tplParser which should return a character vector to replace the text.}
+	}
+
+	NOTE: brew calls can be nested and rely on placing a function named '.brew.cat' in the environment in which it is passed. Each time brew is called, a check for the existence of this function is made. If it exists, then it is replaced with a new copy that is lexically scoped to the current brew frame. Once the brew call is done, the function is replaced with the previous function. The function is finally removed from the environment once all brew calls return.
+
+}
+\value{
+	When \code{run=TRUE}, the value of the last expression after brewing the input or an object of class 'try-error' containing the error message if brewing failed.
+
+    When \code{run=FALSE} and \code{parseCode=TRUE}, a function whose environment contains the text vector and the code vector of the parsed expressions after brewing the input. It takes brew's output and envir arguments.
+
+    When \code{run=FALSE} and \code{parseCode=FALSE}, a list containing the text vector and the unparsed code vector.
+}
+\author{ Jeffrey Horner <jeff.horner at vanderbilt.edu> }
+\seealso{ \code{\link{Sweave}} for the original report generator. }
+\examples{
+
+## A port of the Sweave test file.
+brew(system.file("brew-test-1.brew",package="brew"),"brew-test-1.tex",envir=new.env())
+
+## Everything you wanted to know about your R session.
+brew(system.file("brew-test-2.brew",package="brew"),"brew-test-2.html",envir=new.env())
+browseURL(paste('file://',file.path(getwd(),'brew-test-2.html'),sep=''))
+
+## Don't sully up environment, so use envir=new.env(). Nested brew calls will still work.
+brew(system.file("example1.brew",package="brew"),envir=new.env())
+
+## Various ways to print R output 
+library(datasets)
+brew(system.file("catprint.brew",package="brew"),envir=new.env())
+rm(iris)
+
+## The example from the Details section
+brew(system.file("featurefull.brew",package="brew"),envir=new.env())
+
+## Using the tplParser argument
+tParse <- function(text) paste('Got this: <',text,'>\n',sep='',collapse='')
+brew(system.file("featurefull.brew",package="brew"),envir=new.env(),tplParser=tParse)
+rm(tParse)
+}
+\keyword{utilities}
diff --git a/man/brewCache.rd b/man/brewCache.rd
new file mode 100644
index 0000000..f624b1f
--- /dev/null
+++ b/man/brewCache.rd
@@ -0,0 +1,81 @@
+\name{brewCache}
+\alias{brewCache}
+\alias{setBufLen}
+\alias{brewCacheOn}
+\alias{brewCacheOff}
+\title{Caching Brew Templates}
+\description{
+	These functions provide a cache system for brew templates.
+}
+\usage{
+brewCache(envir=NULL)
+
+brewCacheOn()
+brewCacheOff()
+
+setBufLen(len=0)
+}
+\arguments{
+  \item{envir}{the \code{\link{environment}} to store text and R expressions for
+	each brewed template.}
+  \item{len}{length of internal buffers for parsing the templates.}
+}
+\details{
+
+	brew can cache parsed templates for potential speedup but only when brew
+	calls are passed filenames, not connections, and when tplParser
+	is NULL.
+
+	brew caching is implemented by storing file names, modification
+	times, and the associated text and R expressions in an internal
+	environment. Calling \code{brewCache()} with an appropriate
+	environment sets the internal cache. Calling without arguments
+	returns the internal cache. The cache is exposed this way mainly
+	for testing, debugging, performance improvement, etc. and this
+	may be off-limits in future releases.
+
+	Simple enough, \code{brewCacheOn()} turns on
+	caching of brew templates and is equivalent to calling
+	\code{brewCache(envir=new.env(hash=TRUE,parent=globalenv()))}.
+	\code{brewCache()} without arguments returns the internal
+	environment. Calling \code{brewCacheOff()} turns off caching by
+	setting the internal environment to \code{NULL}.
+
+	One thing to note: filenames act as keys in the internal cache
+	environment, and brew does nothing to expand them to their full
+	paths. Thus, '/home/user/brew.html' and '~usr/brew.html' will
+	act as separate keys, although on-disk they may actually point
+	to the same file.
+
+	\code{setBufLen()} initializes internal parsing vectors to length \code{len}. Default is 0.
+}
+\value{
+	\code{brewCache()} without arguments returns the internal cache. All others invisibly return \code{NULL}.
+}
+\author{ Jeffrey Horner <jeff.horner at vanderbilt.edu> }
+\seealso{ \code{\link{Sweave}} for the original report generator. }
+\examples{
+
+## Turn on caching
+brewCacheOn()
+
+## Brew a template
+brew(system.file("featurefull.brew",package="brew"),envir=new.env())
+
+## Get the internal cache
+cache <- brewCache()
+
+## Inspect
+as.list(cache)
+
+## Inspect first file cached in list
+as.list(cache)[[1]]
+
+## Inspect environment that contains text and parsed code
+as.list(as.list(cache)[[1]]$env)
+
+## Turn off brew caching
+brewCacheOff()
+rm(cache)
+}
+\keyword{utilities}

-- 
Alioth's /usr/local/bin/git-commit-notice on /srv/git.debian.org/git/debian-med/r-cran-brew.git



More information about the debian-med-commit mailing list