[cig-commits] commit: add stress output for observation plane, add anatolia colour scale, update documentation, add the Chi-Chi postseismic relaxation preferred model

Mercurial hg at geodynamics.org
Wed Mar 14 13:08:57 PDT 2012


changeset:   72:14d5d55245bd
tag:         tip
user:        Sylvain Barbot <sbarbot at caltech.edu>
date:        Wed Mar 14 13:08:45 2012 -0700
files:       INSTALL elastic3d.f90 examples/chichi/.gmtcommands4 examples/chichi/.gmtdefaults4 examples/chichi/coupled.sh examples/chichi/ecoast.sh examples/chichi/econtour.sh examples/chichi/eopts.sh examples/chichi/epgps.sh examples/chichi/gmt/coasts_km.xyz examples/chichi/gps/gps.dat examples/chichi/gps/postseismic_neu_today_km.dat examples/chichi/readme.txt examples/mojave/landers.sh export.f90 friction3d.f90 input.f90 latex/graphics/paraview-cgrid-1.png latex/graphics/paraview-cgrid-2.png latex/graphics/paraview-coulomb.png latex/graphics/paraview-disp-1.png latex/graphics/paraview-disp-2.png latex/graphics/paraview-disp-relax.png latex/graphics/paraview-extract.png latex/graphics/paraview-rfaults.png latex/relax.tex relax.f90 types.f90 util/anatolia.cpt util/grdmap.sh
description:
add stress output for observation plane, add anatolia colour scale, update documentation, add the Chi-Chi postseismic relaxation preferred model


diff -r 5e029e7246d8 -r 14d5d55245bd INSTALL
--- a/INSTALL	Mon Feb 06 10:49:06 2012 -0800
+++ b/INSTALL	Wed Mar 14 13:08:45 2012 -0700
@@ -1,7 +1,7 @@ Before building Relax, you must have
 Before building Relax, you must have
 
-  GMT
-  Proj
+  GMT 4.5 or greater
+  Proj 4.7.1 or greater
   Python 2.4 or greater
 
 A fast fft library, such as FFTW or MKL, is also highly recommended.
diff -r 5e029e7246d8 -r 14d5d55245bd elastic3d.f90
--- a/elastic3d.f90	Mon Feb 06 10:49:06 2012 -0800
+++ b/elastic3d.f90	Wed Mar 14 13:08:45 2012 -0700
@@ -2664,6 +2664,183 @@ CONTAINS
   END SUBROUTINE plane
 
   !---------------------------------------------------------------------
+  !> function MonitorStressField
+  !! samples a stress field along a specified planar surface.
+  !!
+  !! \author sylvain barbot (10-16-07) - original form
+  !---------------------------------------------------------------------
+  SUBROUTINE monitorstressfield(x,y,z,L,W,strike,dip,beta, &
+       sx1,sx2,sx3,dx1,dx2,dx3,sig,patch)
+    INTEGER, INTENT(IN) :: sx1,sx2,sx3
+    REAL*8, INTENT(IN) :: x,y,z,L,W,strike,dip,beta,dx1,dx2,dx3
+    TYPE(TENSOR), INTENT(IN), DIMENSION(sx1,sx2,sx3) :: sig
+    TYPE(SLIPPATCH_STRUCT), ALLOCATABLE, DIMENSION(:,:), INTENT(OUT) :: patch
+
+    INTEGER :: px2,px3,j2,j3,status
+    REAL*8 :: x1,x2,x3,xr,yr,zr,Wp,Lp, &
+         cstrike,sstrike,cdip,sdip
+    TYPE(TENSOR) :: lsig
+
+    cstrike=cos(strike)
+    sstrike=sin(strike)
+    cdip=cos(dip)
+    sdip=sin(dip)
+
+    ! effective tapered dimensions
+    Wp=W*(1._8+2._8*beta) ! horizontal dimension for vertical fault
+    Lp=L*(1._8+2._8*beta) ! depth for a vertical fault
+
+    px3=fix(Lp/dx3)
+    px2=fix(Wp/dx2)
+
+    ALLOCATE(patch(px2+1,px3+1),STAT=status)
+    IF (status>0) STOP "could not allocate the slip patches for export"
+
+    DO j3=1,px3+1
+       DO j2=1,px2+1
+
+          CALL ref2local(x,y,z,xr,yr,zr)
+          
+          ! no translation in out of plane direction
+          yr=REAL(yr)+REAL((DBLE(j2)-DBLE(px2)/2._8-1._8)*dx2)
+          zr=REAL(zr)+REAL((DBLE(j3)-DBLE(px3)/2._8-1._8)*dx3)
+          
+          CALL local2ref(xr,yr,zr,x1,x2,x3)
+          
+          ! discard out-of-bound locations
+          IF (  (x1 .gt. DBLE(sx1/2-1)*dx1) .or. (x1 .lt. -DBLE(sx1/2)*dx1) &
+           .or. (x2 .gt. DBLE(sx2/2-1)*dx2) .or. (x2 .lt. -DBLE(sx2/2)*dx2) &
+           .or. (x3 .gt. DBLE(sx3-1)*dx3) .or. (x3 .lt. 0._8)  ) THEN
+             lsig=TENSOR(0._8,0._8,0._8,0._8,0._8,0._8)
+          ELSE
+             CALL sampletensor(x1,x2,x3,dx1,dx2,dx3,sx1,sx2,sx3,sig,lsig)
+          END IF
+
+          patch(j2,j3)=SLIPPATCH_STRUCT(x1,x2,x3,yr,zr,0._8,0._8,0._8,lsig)
+
+       END DO
+    END DO
+
+  CONTAINS
+
+    !--------------------------------------------------------------
+    !> subroutine sample
+    !! interpolates the value of a discretized 3-dimensional field
+    !! at a subpixel location. method consists in correlating the
+    !! 3D field with a delta function filter. the delta function is
+    !! approximated with a narrow normalized gaussian.
+    !!
+    !! \author sylvain barbot (10-17-07) - original form
+    !--------------------------------------------------------------
+    SUBROUTINE sampletensor(x1,x2,x3,dx1,dx2,dx3,sx1,sx2,sx3,sig,lsig)
+      INTEGER, INTENT(IN) :: sx1,sx2,sx3
+      REAL*8, INTENT(IN) :: x1,x2,x3,dx1,dx2,dx3
+      TYPE(TENSOR), INTENT(IN), DIMENSION(sx1,sx2,sx3) :: sig
+      TYPE(TENSOR), INTENT(OUT) :: lsig
+    
+      INTEGER :: i1,i2,i3,i,j,k,l1,l2,l3,i1p,i2p,i3p
+      INTEGER, PARAMETER :: RANGE=2
+      REAL*8 :: sum,weight,x,y,z
+      REAL*8, PARAMETER :: EPS=1e-2
+
+      sum=0._8
+      lsig=TENSOR(0._8,0._8,0._8,0._8,0._8,0._8)
+
+      ! closest sample
+      CALL shiftedindex(x1,x2,x3,sx1,sx2,sx3,dx1,dx2,dx3,i,j,k)
+      ! rounded coordinates of closest sample
+      CALL shiftedcoordinates(i,j,k,sx1,sx2,2*sx3,dx1,dx2,dx3,x,y,z)
+
+      ! no interpolation for node points
+      IF ( (abs(x-x1) .lt. EPS*dx1) .and. &
+           (abs(y-x2) .lt. EPS*dx2) .and. &
+           (abs(z-x3) .lt. EPS*dx3) ) THEN
+         lsig=sig(i,j,k)
+         RETURN
+      END IF
+
+      DO l3=-RANGE,+RANGE
+         ! no periodicity in the 3-direction
+         IF ((k+l3 .le. 0) .or. (k+l3 .gt. sx3)) CYCLE
+
+         IF (l3 .ge. 0) THEN
+            i3p=mod(k-1+l3,sx3)+1
+         ELSE
+            i3p=mod(sx3+k-1+l3,sx3)+1
+         END IF
+
+         DO l2=-RANGE,+RANGE
+            IF (l2 .ge. 0) THEN
+               i2p=mod(j-1+l2,sx2)+1
+            ELSE
+               i2p=mod(sx2+j-1+l2,sx2)+1
+            END IF
+
+            DO l1=-RANGE,+RANGE
+               IF (l1 .ge. 0) THEN
+                  i1p=mod(i-1+l1,sx1)+1
+               ELSE
+                  i1p=mod(sx1+i-1+l1,sx1)+1
+               END IF
+
+               weight=sinc(((x+l1*dx1)-x1)/dx1)*dx1 &
+                     *sinc(((y+l2*dx2)-x2)/dx2)*dx2 &
+                     *sinc(((z+l3*dx3)-x3)/dx3)*dx3
+
+               !weight=gauss((x+l1*dx1)-x1,dx1)*dx1 &
+               !      *gauss((y+l2*dx2)-x2,dx2)*dx2 &
+               !      *gauss((z+l3*dx3)-x3,dx3)*dx3
+
+               lsig=lsig.plus.(REAL(weight).times.sig(i1p,i2p,i3p))
+               sum  =sum  +weight
+
+            END DO
+         END DO
+      END DO
+      IF (sum .gt. 1e-6) lsig=REAL(1._8/sum).times.lsig
+
+    END SUBROUTINE sampletensor
+
+    !-----------------------------------------------
+    ! subroutine ref2local
+    ! convert reference Cartesian coordinates into
+    ! the rotated, local fault coordinates system.
+    !-----------------------------------------------
+    SUBROUTINE ref2local(x,y,z,xp,yp,zp)
+      REAL*8, INTENT(IN) :: x,y,z
+      REAL*8, INTENT(OUT) :: xp,yp,zp
+
+      REAL*8 :: x2
+
+      x2 = cstrike*x  -sstrike*y
+      xp = cdip   *x2 -sdip   *z
+      yp = sstrike*x  +cstrike*y
+      zp = sdip   *x2 +cdip   *z
+
+    END SUBROUTINE ref2local
+
+    !-----------------------------------------------
+    ! subroutine local2ref
+    ! converts a set of coordinates from the rotated
+    ! fault-aligned coordinate system into the
+    ! reference, Cartesian coordinates system.
+    !-----------------------------------------------
+    SUBROUTINE local2ref(xp,yp,zp,x,y,z)
+      REAL*8, INTENT(IN) :: xp,yp,zp
+      REAL*8, INTENT(OUT) :: x,y,z
+
+      REAL*8 :: x2p
+
+      x2p=  cdip*xp+sdip*zp
+      x  =  cstrike*x2p+sstrike*yp
+      y  = -sstrike*x2p+cstrike*yp
+      z  = -sdip*xp    +cdip*zp
+
+    END SUBROUTINE local2ref
+
+  END SUBROUTINE monitorstressfield
+
+  !---------------------------------------------------------------------
   !> function MonitorField
   !! samples a scalar field along a specified planar surface.
   !!
@@ -2683,6 +2860,9 @@ CONTAINS
     INTEGER :: px2,px3,j2,j3,status
     REAL*8 :: x1,x2,x3,xr,yr,zr,Wp,Lp, &
          cstrike,sstrike,cdip,sdip,value
+    TYPE(TENSOR) :: sig0
+
+    sig0=TENSOR(0._8,0._8,0._8,0._8,0._8,0._8)
 
     cstrike=cos(strike)
     sstrike=sin(strike)
@@ -2719,7 +2899,7 @@ CONTAINS
              CALL sample(x1,x2,x3,dx1,dx2,dx3,sx1,sx2,sx3,slip,value)
           END IF
 
-          patch(j2,j3)=SLIPPATCH_STRUCT(x1,x2,x3,yr,zr,value,0._8,0._8)
+          patch(j2,j3)=SLIPPATCH_STRUCT(x1,x2,x3,yr,zr,value,0._8,0._8,sig0)
 
        END DO
     END DO
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/.gmtcommands4
--- a/examples/chichi/.gmtcommands4	Mon Feb 06 10:49:06 2012 -0800
+++ /dev/null	Thu Jan 01 00:00:00 1970 +0000
@@ -1,27 +0,0 @@
-# GMT common arguments shelf
--Ba0.059574/::
--JX4i/4.000000i
--R-100/50/-50/100
--X1.2i
--xa-0.9i
--Y2.0i
--ya-0.3i
--jX4i/4.000000i
-EOF
-.9i
--Y2.0i
--ya0.3i
--jX4i/4.000000i
-EOF
-
-
-
-
-00i
-EOF
-
-
-4i/1.348835i
-EOF
-
-
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/.gmtdefaults4
--- a/examples/chichi/.gmtdefaults4	Mon Feb 06 10:49:06 2012 -0800
+++ /dev/null	Thu Jan 01 00:00:00 1970 +0000
@@ -1,107 +0,0 @@
-#
-#	GMT-SYSTEM 4.5.6 [64-bit] Defaults file
-#
-#-------- Plot Media Parameters -------------
-PAGE_COLOR		= white
-PAGE_ORIENTATION	= landscape
-PAPER_MEDIA		= a5
-#-------- Basemap Annotation Parameters ------
-ANNOT_MIN_ANGLE		= 20
-ANNOT_MIN_SPACING	= 0
-ANNOT_FONT_PRIMARY	= Helvetica
-ANNOT_FONT_SIZE_PRIMARY	= 12p
-ANNOT_OFFSET_PRIMARY	= 0.2c
-ANNOT_FONT_SECONDARY	= Helvetica
-ANNOT_FONT_SIZE_SECONDARY	= 16p
-ANNOT_OFFSET_SECONDARY	= 0.2c
-DEGREE_SYMBOL		= ring
-HEADER_FONT		= Helvetica
-HEADER_FONT_SIZE	= 12p
-HEADER_OFFSET		= 0.5c
-LABEL_FONT		= Helvetica
-LABEL_FONT_SIZE		= 12p
-LABEL_OFFSET		= 0.3c
-OBLIQUE_ANNOTATION	= 1
-PLOT_CLOCK_FORMAT	= hh:mm:ss
-PLOT_DATE_FORMAT	= yyyy-mm-dd
-PLOT_DEGREE_FORMAT	= ddd:mm:ss
-Y_AXIS_TYPE		= hor_text
-#-------- Basemap Layout Parameters ---------
-BASEMAP_AXES		= WESN
-BASEMAP_FRAME_RGB	= black
-BASEMAP_TYPE		= fancy
-FRAME_PEN		= 1.25p
-FRAME_WIDTH		= 0.2c
-GRID_CROSS_SIZE_PRIMARY	= 0c
-GRID_PEN_PRIMARY	= 0.25p
-GRID_CROSS_SIZE_SECONDARY	= 0c
-GRID_PEN_SECONDARY	= 0.5p
-MAP_SCALE_HEIGHT	= 0.2c
-POLAR_CAP		= 85/90
-TICK_LENGTH		= 0.2c
-TICK_PEN		= 0.5p
-X_AXIS_LENGTH		= 25c
-Y_AXIS_LENGTH		= 15c
-X_ORIGIN		= 2.5c
-Y_ORIGIN		= 2.5c
-UNIX_TIME		= FALSE
-UNIX_TIME_POS		= BL/-2c/-2c
-UNIX_TIME_FORMAT	= %Y %b %d %H:%M:%S
-#-------- Color System Parameters -----------
-COLOR_BACKGROUND	= blue
-COLOR_FOREGROUND	= red
-COLOR_NAN		= white
-COLOR_IMAGE		= adobe
-COLOR_MODEL		= rgb
-HSV_MIN_SATURATION	= 1
-HSV_MAX_SATURATION	= 0.1
-HSV_MIN_VALUE		= 0.3
-HSV_MAX_VALUE		= 1
-#-------- PostScript Parameters -------------
-CHAR_ENCODING		= ISOLatin1+
-DOTS_PR_INCH		= 300
-GLOBAL_X_SCALE		= 1
-GLOBAL_Y_SCALE		= 1
-N_COPIES		= 1
-PS_COLOR		= rgb
-PS_IMAGE_COMPRESS	= lzw
-PS_IMAGE_FORMAT		= ascii
-PS_LINE_CAP		= butt
-PS_LINE_JOIN		= miter
-PS_MITER_LIMIT		= 35
-PS_VERBOSE		= FALSE
-TRANSPARENCY		= 0
-#-------- I/O Format Parameters -------------
-D_FORMAT		= %.12lg
-FIELD_DELIMITER		= tab
-GRIDFILE_FORMAT		= nf
-GRIDFILE_SHORTHAND	= FALSE
-INPUT_CLOCK_FORMAT	= hh:mm:ss
-INPUT_DATE_FORMAT	= yyyy-mm-dd
-IO_HEADER		= FALSE
-N_HEADER_RECS		= 1
-NAN_RECORDS		= pass
-OUTPUT_CLOCK_FORMAT	= hh:mm:ss
-OUTPUT_DATE_FORMAT	= yyyy-mm-dd
-OUTPUT_DEGREE_FORMAT	= D
-XY_TOGGLE		= FALSE
-#-------- Projection Parameters -------------
-ELLIPSOID		= WGS-84
-MAP_SCALE_FACTOR	= default
-MEASURE_UNIT		= cm
-#-------- Calendar/Time Parameters ----------
-TIME_FORMAT_PRIMARY	= full
-TIME_FORMAT_SECONDARY	= full
-TIME_EPOCH		= 2000-01-01T12:00:00
-TIME_IS_INTERVAL	= OFF
-TIME_INTERVAL_FRACTION	= 0.5
-TIME_LANGUAGE		= us
-TIME_UNIT		= d
-TIME_WEEK_START		= Sunday
-Y2K_OFFSET_YEAR		= 1950
-#-------- Miscellaneous Parameters ----------
-HISTORY			= TRUE
-INTERPOLANT		= akima
-LINE_STEP		= 0.025c
-VECTOR_SHAPE		= 0
-VERBOSE			= FALSE
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/coupled.sh
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/coupled.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,84 @@
+#/bin/sh
+
+# this is Rousset et al. (in prep. 2012) preferred model for the 1999 Mw 7.1 
+# Chi-Chi earthquake including viscoelastic relaxation in a three-dimensional 
+# domain and afterslip. The original model is referred to as
+#
+#   mixed_H30_T40_W15_EC10_FW20_51017-51018_V030
+#
+#
+
+FLT=faults/chichi.flt
+WDIR=coupled
+OBS=gps/gps.dat
+
+if [ ! -e $WDIR ]; then
+	echo $(basename $0): creating directory $WDIR
+	mkdir $WDIR
+fi
+
+OMP_NUM_THREADS=4 time relax --no-proj-output --no-vtk-output --no-stress-output $* <<EOF | tee $WDIR/in.param
+# grid dimension (sx1,sx2,sx3)
+512 512 512
+# sampling (dx1,dx2,dx3), smoothing (beta, nyquist)
+1 1 1 0.2  1
+# origin position (x0,y0) and rotation
+0 0 0
+# geographic origin (longitude, latitude, UTM zone, unit)
+#120.982 23.772 51 1e3
+# observation depth (displacement and stress)
+0 5
+# output directory
+$WDIR
+# lambda, mu, gamma (gamma = (1 - nu) rho g / mu)
+1 1 8.33e-4
+# time interval, (positive time step) or (negative skip, scaling)
+20 -1 1 
+# number of observation planes
+1
+# no. x1  x2 x3 length width strike dip
+    1 30 -60  0    100    50    120  90
+# number of observation points
+`grep -v "#" $OBS | wc`
+# no NAME x1 x2 x3
+`grep -v "#" $OBS`
+# number of Coulomb planes
+0
+# number of prestress interfaces
+0
+# number of linear viscous interfaces
+1
+# no. x3 gammadot0 (1/tm) cohesion
+    1 30       0.5               0 
+# number of viscous zone
+1
+# no. dgammadot0      x1    x2 x3 length width thickness strike dip
+   1           5 -101.48 -0.90 15    200    15        40     20  90
+# number of nonlinear viscous interfaces
+0
+# number of fault creep interfaces
+1
+# no. x3  Vo (a-b)sigma friction cohesion
+    1  0  30          1      0.6        0
+# number of creeping faults
+2
+# no.     x1     x2 x3 length width strike dip rake
+    1 -25.00 -32.00  0     80    20      5  30   90
+    2 -26.51 -14.75 10     80    20      5   5   90
+# number of inter-seismic strike-slip segments
+0
+# number of inter-seismic opening segments
+0
+# number of events
+1
+# number of coseismic shear-slip segments (ns)
+`grep -v "#" $FLT | wc `
+# no.     slip       xs       ys       zs  length   width strike   dip   rake
+`grep -v "#" $FLT`
+# number of tensile cracks 
+0
+# number of mogi source
+0
+# number of surface traction
+0
+EOF
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/ecoast.sh
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/ecoast.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,25 @@
+#!/bin/sh
+
+set -e
+self=$(basename $0)
+trap 'echo $self: Some errors occurred. Exiting.; exit' ERR
+
+if [ "$#" -lt "2" ]; then
+	echo $self": expected $self file.ps xmin/xmax/ymin/ymax. exiting."
+	exit 1
+fi
+
+echo $self: $*
+PSFILE=$1
+bds=$2
+
+WDIR=./gmt
+
+#psxy -O -K -JX -R$bds -P -M \
+#         -W1.5p/050/050/050  \
+#       $WDIR/twcoasts_km.xy >> $PSFILE
+
+
+psxy -O -K -JX -R$bds -P -M \
+         -W0.8p/050/050/050  \
+       $WDIR/coasts_km.xyz>> $PSFILE
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/econtour.sh
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/econtour.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,23 @@
+#!/bin/sh
+
+set -e
+self=$(basename $0)
+trap 'echo $self: Some errors occurred. Exiting.; exit' ERR
+
+if [ "$#" -lt "2" ]; then
+	echo $self": expected $self file.ps xmin/xmax/ymin/ymax. exiting."
+	exit 1
+fi
+
+echo $self: $*
+PSFILE=$1
+bds=$2
+
+WDIR=$(dirname $PSFILE)
+INDEX=`echo $(basename $PSFILE) | awk '{print substr($0,0,3)}'`
+GRD=$WDIR/$(basename $PSFILE -plot.ps)
+
+echo $GRD
+grdcontour $GRD -O -K -C0.05 -JX -R$bds -P \
+         -W0.3p/100/100/100 >> $PSFILE
+
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/eopts.sh
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/eopts.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,55 @@
+#!/bin/sh
+
+set -e
+self=$(basename $0)
+trap 'echo $self: Some errors occurred. Exiting.; exit' ERR
+
+if [ "$#" -lt "2" ]; then
+	echo $self": expected $self file.ps xmin/xmax/ymin/ymax. exiting."
+	exit 1
+fi
+
+echo $self: $*
+PSFILE=$1
+bds=$2
+iscale=$3
+oscale=`echo $iscale | awk -F "c" '{print 1/$1}'`
+
+WDIR=$(dirname $PSFILE)
+INDEX=`echo $(basename $PSFILE) | awk '{print substr($0,0,3)}'`
+
+psxy -O -K -JX -R$bds -P \
+         -W0.5p/10/10/10 -St0.1c -G10/10/10 \
+        <<EOF >> $PSFILE
+`awk '{print $2,$1}' $WDIR/opts.dat`
+EOF
+
+#if [ "0" == "0" ]; then
+#pstext -O -K -JX -R$bds -P \
+#        -G0/0/0 -D0/0.1i \
+#        <<EOF >> $PSFILE
+#`awk '{print $2,$1," 08 0 4 CM ",$4}' $WDIR/opts.dat`
+#EOF
+#fi
+
+for i in `awk '{print $4}' $WDIR/opts.dat | xargs `; do
+	DISP=`grep -v "#" $WDIR/${i}-relax.txt | awk -v i=$INDEX '{if (NR==i){print $3,$2}}'`
+	COOR=`grep "$i" $WDIR/opts.dat | awk '{print $2,$1}'`
+	#echo $i $COOR $DISP
+psvelo -O -K -JX -R$bds  \
+        -A0.05/0.3/0.15 -W0.5px,0/0/0 \
+        -G200/100/0 -Se${oscale}/0.91/06 \
+        <<EOF >> $PSFILE
+`echo $COOR $DISP 0 0 0`
+EOF
+done
+
+psvelo -O -K -JX -R$bds -A0.05/0.3/0.15 -W0.5px,0/0/0 -G200/100/0 -Se${oscale}/0.91/06 \
+<<EOF >> $PSFILE
+-90 160 0.2 0 0 0 0
+EOF
+
+pstext  -K -O -R$bds -JX -P -G0/0/0 \
+  <<EOF >>$PSFILE
+-80 165 10 0 0.5 CM model
+EOF
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/epgps.sh
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/epgps.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,51 @@
+#!/bin/sh
+
+set -e
+self=$(basename $0)
+trap 'echo $self: Some errors occurred. Exiting.; exit' ERR
+
+if [ "$#" -lt "2" ]; then
+	echo $self": expected $self file.ps xmin/xmax/ymin/ymax. exiting."
+	exit 1
+fi
+
+echo $self: $*
+PSFILE=$1
+bds=$2
+iscale=$3
+oscale=`echo $iscale | awk -F "c" '{print 1/$1}'`
+
+WDIR=$(dirname $PSFILE)
+INDEX=`echo $(basename $PSFILE) | awk '{print substr($0,0,3)}'`
+DDIR=./gps
+
+psvelo -O -K -JX -R$bds -P \
+        -A0.05/0.3/0.15 -W0.5px,0/0/0 \
+        -G158/33/106 -Se${oscale}/0.91/06 \
+        <<EOF >> $PSFILE
+`awk '{print $2,$1,$3/1e3,$4/1e3," 0 0 0"}' $DDIR/postseismic_neu_today_km.dat`
+EOF
+
+psxy -O -K -JX -R$bds -P -D0.4c/0 \
+        -Sc0.4c -W0.5px,0/0/0 -C$WDIR/palette.cpt \
+        <<EOF >> $PSFILE
+`awk '{print $2,$1,$5/1e3}' $DDIR/postseismic_neu_today_km.dat`
+EOF
+
+if [ "1" == "0" ]; then
+pstext -O -K -JX -R$bds -P \
+        -G0/0/0 -D0/0.1i \
+        <<EOF >> $PSFILE
+`awk '{print $2,$1," 08 0 4 CM ",$4}' $WDIR/opts.dat`
+EOF
+fi
+
+psvelo -O -K -JX -R$bds -P -A0.05/0.3/0.15 -W0.5px,0/0/0 -G158/33/106 -Se${oscale}/0.91/06 \
+<<EOF >> $PSFILE
+-90 145 0.2 0 0 0 0
+EOF
+
+pstext  -K -O -R$bds -JX -P -G0/0/0 \
+  <<EOF >>$PSFILE
+-80 150 10 0 0.5 CM data
+EOF
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/gmt/coasts_km.xyz
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/gmt/coasts_km.xyz	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,7418 @@
+>
+>
+-873.118 626.068 0
+-870.344 626.021 0
+-865.21 621.498 0
+-855.729 618.865 0
+-849.798 623.979 0
+-849.424 634.446 0
+-844.142 633.698 0
+-842.508 632.081 0
+-842.057 625.127 0
+-843.905 620.12 0
+-843.011 609.291 0
+-839.818 610.567 0
+-841.099 612.838 0
+-838.886 616.436 0
+-837.512 616.276 0
+-830.147 609.972 0
+-829.335 604.669 0
+-823.84 606.181 0
+-824.208 609.821 0
+-821.471 612.696 0
+-813.59 613.243 0
+-809.046 609.709 0
+-796.853 608.614 0
+-785.705 614.928 0
+-783.049 621.597 0
+-780.47 622.826 0
+-780.063 621.812 0
+-782.958 619.226 0
+-785.024 613.653 0
+-786.821 603.172 0
+-791.11 600.571 0
+-794.395 600.417 0
+-795.834 602.107 0
+-793.969 604.174 0
+-787.505 605.572 0
+-787.058 608.449 0
+-789.066 610.435 0
+-803.598 604.036 0
+-805.79 605.04 0
+-806.481 600.573 0
+-811.026 597.403 0
+-812.459 598.037 0
+-812.1 600.979 0
+-814.131 601.564 0
+-814.455 604.623 0
+-818.713 599.143 0
+-825.892 598.792 0
+-836.695 612.166 0
+-837.857 603.748 0
+-839.474 606.714 0
+-841.018 606.11 0
+-841.325 602.744 0
+-839.239 599.465 0
+-842.493 601.915 0
+-842.28 598.794 0
+-844.641 600.137 0
+-845.834 597.957 0
+-846.012 600.364 0
+-842.201 605.113 0
+-843.732 605.749 0
+-844.58 604.078 0
+-845.653 605.372 0
+-848.458 601.862 0
+-849.305 604.545 0
+-847.609 606.791 0
+-849.822 607.57 0
+-852.133 605.12 0
+-853.286 607.697 0
+-851.958 611.331 0
+-862.375 617.847 0
+-872.297 621.103 0
+-873.13 625.945 0
+-873.118 626.068 0
+>
+-786.549 647.207 0
+-778.374 660.561 0
+-781.524 665.114 0
+-782.574 661.019 0
+-783.878 660.762 0
+-783.96 666.556 0
+-779.808 668.937 0
+-783.173 673.241 0
+-788.566 673.527 0
+-787.345 675.085 0
+-783.174 675.459 0
+-776.902 668.378 0
+-772.684 665.905 0
+-767.801 658.584 0
+-760.717 661.877 0
+-763.193 650.267 0
+-770.291 635.418 0
+-769.62 647.793 0
+-766.376 649.955 0
+-767.013 656.288 0
+-776.33 653.472 0
+-786.854 642.606 0
+-786.661 647.059 0
+-786.549 647.207 0
+>
+-653.8 721.86 0
+-649.044 705.139 0
+-650.769 704.33 0
+-651.733 707.029 0
+-654.365 704.609 0
+-653.329 711.628 0
+-655.839 713.271 0
+-658.478 719.49 0
+-658.312 712.892 0
+-660.553 712.979 0
+-661.152 710.322 0
+-666.273 709.851 0
+-668.373 708.02 0
+-668.979 710.255 0
+-669.556 711.603 0
+-664.549 713.114 0
+-663.945 717.049 0
+-665.88 719.76 0
+-669.815 716.953 0
+-669.249 719.153 0
+-670.875 719.596 0
+-671.235 722.43 0
+-666.013 720.545 0
+-663.504 722.624 0
+>
+-739.68 708.928 0
+-741.465 714.399 0
+-740.023 718.649 0
+-733.356 717.573 0
+-732.479 715.216 0
+-733.925 714.339 0
+-728.948 710.645 0
+-728.121 712.317 0
+-729.706 714.418 0
+-728.061 721.113 0
+-722.324 722.976 0
+-721.107 721.154 0
+-716.572 720.391 0
+-718.371 712.935 0
+-725.348 710.341 0
+-724.602 706.401 0
+-732.531 698.426 0
+-737.707 702.17 0
+-736.73 705.584 0
+-739.197 706.548 0
+-739.782 708.88 0
+-739.68 708.928 0
+>
+-635.464 720.441 0
+-636.567 718.777 0
+-640.949 718.9 0
+-641.431 716.448 0
+-645.755 716.087 0
+-641.658 712.227 0
+-638.918 712.297 0
+-639.994 708.456 0
+-646.158 709.614 0
+-650.206 714.099 0
+-650.194 714.255 0
+-651.374 721.671 0
+>
+-822.756 639.104 0
+-827.24 642.025 0
+-823.715 648.151 0
+-815.144 653.29 0
+-812.615 652.848 0
+-813.356 642.425 0
+-818.345 641.939 0
+-816.346 636.677 0
+-819.404 632.389 0
+-818.469 637.274 0
+-822.916 639.524 0
+-822.756 639.104 0
+>
+-791.16 583.916 0
+-793.172 585.902 0
+-789.909 588.063 0
+-788.969 583.997 0
+-791.16 583.916 0
+>
+-663.407 722.616 0
+-660.905 720.915 0
+-659.622 722.317 0
+>
+-199.624 140.509 0
+-196.216 146.325 0
+-199.585 145.226 0
+-200.5 141.69 0
+-203.037 141.388 0
+-205.226 142.619 0
+-203.673 143.816 0
+-207.215 143.745 0
+-210.67 146.526 0
+-212.966 150.804 0
+-210.152 153.548 0
+-203.712 152.609 0
+-201.148 153.831 0
+-203.785 156.907 0
+-199.562 159.567 0
+-199.472 162.606 0
+-201.328 161.329 0
+-201.068 163.253 0
+-203.77 164.089 0
+-205.866 161.555 0
+-206.633 162.922 0
+-203.615 165.872 0
+-205.639 165.711 0
+-204.509 166.365 0
+-206.779 168.055 0
+-208.853 166.276 0
+-210.507 168.314 0
+-198.958 173.003 0
+-195.427 172.986 0
+-193.963 171.278 0
+-192.383 173.54 0
+-192.255 171.05 0
+-190.206 172.088 0
+-193.124 168.944 0
+-198.024 170.477 0
+-197.812 167.463 0
+-199.868 166.225 0
+-198.992 165.133 0
+-196.254 165.518 0
+-195.6 167.164 0
+-191.568 166.956 0
+-188.969 169.51 0
+-188.807 164.699 0
+-190.673 159.582 0
+-194.294 160.099 0
+-195.043 158.689 0
+-193.185 156.592 0
+-194.721 155.904 0
+-194.153 154.589 0
+-191.969 153.271 0
+-193.01 155.665 0
+-191.119 158.152 0
+-188.801 157.951 0
+-189.171 155.653 0
+-190.579 155.872 0
+-187.337 152.681 0
+-186.167 154.723 0
+-188.178 155.058 0
+-187.01 157.022 0
+-186.862 155.164 0
+-181.526 154.501 0
+-181.453 157.04 0
+-184.275 157.265 0
+-183.411 159.227 0
+-187.145 159.335 0
+-188.909 161.184 0
+-184.644 165.5 0
+-184.427 169.523 0
+-180.686 166.23 0
+-182.582 163.498 0
+-179.64 160.418 0
+-174.554 161.75 0
+-175.49 160.767 0
+-169.188 158.638 0
+-166.288 161.288 0
+-168.672 166.347 0
+-164.052 165.532 0
+-160.182 166.802 0
+-159.712 169.253 0
+-166.369 172.985 0
+-166.58 176.32 0
+-168.946 174.633 0
+-171.714 176.663 0
+-171.832 172.449 0
+-174.081 171.403 0
+-174.444 169.238 0
+-175.949 169.558 0
+-178.064 173.269 0
+-173.698 174.244 0
+-175.353 179.939 0
+-176.537 180.85 0
+-178.23 178.046 0
+-178.586 179.709 0
+-180.395 179.906 0
+-180.511 182.905 0
+-181.646 182.017 0
+-183.624 183.328 0
+-185.513 187.69 0
+-187.951 187.051 0
+-185.304 187.95 0
+-183.548 185.957 0
+-180.285 190.768 0
+-176.209 192.36 0
+-176.239 194.814 0
+-173.892 192.338 0
+-167.457 199.149 0
+-167.637 203.493 0
+-165.459 202.189 0
+-162.171 204.639 0
+-163.093 207.671 0
+-161.067 208.17 0
+-160.03 205.645 0
+-159.198 206.632 0
+-159.885 203.599 0
+-157.932 205.077 0
+-160.48 200.242 0
+-159.735 198.047 0
+-152.954 195.644 0
+-149.821 196.071 0
+-153.07 187.559 0
+-150.078 190.208 0
+-146.367 189.6 0
+-147.616 188.069 0
+-144.846 186.143 0
+-146.68 185.359 0
+-145.247 182.359 0
+-148.038 179.703 0
+-140.735 181.466 0
+-139.638 184.943 0
+-141.604 182.953 0
+-144.525 182.995 0
+-142.533 185.983 0
+-143.506 187.306 0
+-141.932 189.717 0
+-141.278 187.77 0
+-140.214 189.95 0
+-137.497 189.88 0
+-138.578 187.001 0
+-136.732 188.296 0
+-135.675 186.273 0
+-138.307 185.796 0
+-135.919 180.644 0
+-137.428 176.799 0
+-131.045 178.114 0
+-131.018 179.178 0
+-134.554 178.845 0
+-130.661 181.343 0
+-131.154 185.792 0
+-131.931 186.965 0
+-135.364 186.631 0
+-132.798 188.518 0
+-132.215 191.643 0
+-132.956 190.23 0
+-135.664 190.665 0
+-134.383 193.506 0
+-137.647 191.87 0
+-135.539 195.565 0
+-140.795 194.724 0
+-136.115 196.645 0
+-138.325 196.835 0
+-139.377 198.947 0
+-138.068 202.885 0
+-135.921 204.217 0
+-139.999 202.148 0
+-141.499 202.519 0
+-139.858 203.719 0
+-142.362 204.15 0
+-144.367 200.597 0
+-145.954 201.471 0
+-147.983 204.62 0
+-145.877 208.17 0
+-147.055 209.267 0
+-149.39 208.452 0
+-149.036 214.179 0
+-151.273 217.002 0
+-148.42 214.662 0
+-146.469 216.185 0
+-144.274 215.572 0
+-141.692 218.189 0
+-139.84 216.011 0
+-135.727 215.682 0
+-135.852 218.636 0
+-132.118 223.166 0
+-134.181 224.972 0
+-133.962 229.581 0
+-136.729 231.317 0
+-136.601 236.217 0
+-138.301 236.45 0
+-136.738 238.673 0
+-134.783 232.798 0
+-131.899 239.557 0
+-127.473 239.998 0
+-126.599 238.878 0
+-122.708 250.017 0
+-124.647 252.595 0
+-128.198 250.932 0
+-133.411 254.761 0
+-139.205 255.468 0
+-143.34 258.218 0
+-138.67 264.329 0
+-133.737 265.309 0
+-134.449 268.711 0
+-126.666 275.532 0
+-129.799 278.164 0
+-134.744 276.529 0
+-129.361 279.617 0
+-118.927 280.926 0
+-118.188 282.482 0
+-115.692 282.331 0
+-113.958 279.693 0
+-112.705 281.836 0
+-114.605 281.838 0
+-114.859 283.686 0
+-109.201 286.142 0
+-107.565 283.518 0
+-105.736 284.771 0
+-103.658 283.878 0
+-97.8063 290.438 0
+-103.883 287.022 0
+-104.648 288.427 0
+-107.56 287.843 0
+-106.497 290.468 0
+-109.464 291.728 0
+-108.018 293.644 0
+-110.89 294.635 0
+-109.743 296.604 0
+-112.05 296.195 0
+-115.122 293.176 0
+-114.165 291.489 0
+-116.081 290.793 0
+-115.009 289.713 0
+-117.301 289.948 0
+-117.073 291.051 0
+-119.209 289.574 0
+-117.332 288.695 0
+-118.754 287.81 0
+-117.592 286.305 0
+-122.352 283.874 0
+-125.491 286.229 0
+-123.756 287.604 0
+-126.558 287.499 0
+-128.307 289.441 0
+-126.659 291.329 0
+-127.845 291.825 0
+-127.766 298.713 0
+-134.358 298.708 0
+-135.51 296.697 0
+-136.286 301.289 0
+-134.658 302.455 0
+-136.532 303.293 0
+-133.243 303.106 0
+-131.794 301.226 0
+-128.583 305.668 0
+-125.357 303.043 0
+-125.498 301.438 0
+-121.916 300.969 0
+-121.864 299.115 0
+-118.753 299.691 0
+-116.698 298.063 0
+-116.895 294.186 0
+-114.064 295.546 0
+-113.124 297.198 0
+-114.293 298.369 0
+-112.021 297.392 0
+-110.384 298.971 0
+-111.683 298.948 0
+-111.539 300.708 0
+-112.751 300.15 0
+-111.615 301.686 0
+-113.408 301.819 0
+-113.053 304.073 0
+-116.132 304.661 0
+-113.224 305.231 0
+-116.079 306.778 0
+-114.353 307.944 0
+-116.892 310.137 0
+-115.755 311.717 0
+-113.495 310.329 0
+-114.797 314.1 0
+-118.779 314.39 0
+-118.05 315.613 0
+-120.393 317.581 0
+-122.716 316.432 0
+-125.898 316.792 0
+-124.981 317.544 0
+-126.064 318.094 0
+-130.92 315.437 0
+-133 312.263 0
+-132.738 314.609 0
+-138.392 319.476 0
+-137.954 320.939 0
+-140.088 323.128 0
+-137.454 324.676 0
+-133.939 321.908 0
+-131.819 322.905 0
+-133.143 329.32 0
+-136.46 328.255 0
+-137.706 330.087 0
+-136.998 334.14 0
+-134.428 337.132 0
+-135.745 339.986 0
+-138.034 339.993 0
+-135.74 340.164 0
+-133.641 336.778 0
+-129.915 338.343 0
+-131.234 333.652 0
+-126.738 334.187 0
+-126.437 330.485 0
+-123.12 327.814 0
+-119.94 327.454 0
+-118.982 329.87 0
+-122.242 330.919 0
+-124.654 333.911 0
+-123.138 338.586 0
+-127.255 348.557 0
+-125.089 347.69 0
+-123.384 340.623 0
+-119.69 337.199 0
+-118.6 333.1 0
+-119.835 331.567 0
+-118.265 330.639 0
+-115.922 332.665 0
+-116.572 334.523 0
+-115.26 335.233 0
+-117.006 337.03 0
+-114.025 340.737 0
+-114.889 341.979 0
+-111.756 343.886 0
+-111.215 341.654 0
+-107.467 344.322 0
+-106.706 342.928 0
+-114.078 338.631 0
+-113.735 336.448 0
+-107.198 339.102 0
+-108.346 337 0
+-107.188 335.496 0
+-111.063 335.826 0
+-113.538 332.416 0
+-111.719 329.508 0
+-114.153 327.817 0
+-112.221 325.406 0
+-108.146 328.998 0
+-109.316 326.021 0
+-105.973 324.186 0
+-106.153 320.907 0
+-102.517 322.903 0
+-104.185 323.964 0
+-99.4151 331.702 0
+-100.834 334.775 0
+-99.1872 337.02 0
+-95.1086 336.922 0
+-95.4472 335.244 0
+-92.6453 335.866 0
+>
+-128.796 191.468 0
+-123.312 193.406 0
+-124.505 189.919 0
+-126.203 190.472 0
+-125.89 186.859 0
+-119.451 182.409 0
+-118.3 184.189 0
+-120.3 184.781 0
+-120.147 186.951 0
+-113.821 190.403 0
+-110.832 189.079 0
+-110.16 191.936 0
+-111.585 191.282 0
+-115.76 193.489 0
+-115.587 196.501 0
+-112.197 199.426 0
+-110.122 197.801 0
+-107.33 201.018 0
+-114.149 201.923 0
+-112.065 204.923 0
+-117.931 207.738 0
+-116.513 212.273 0
+-119.246 211.519 0
+-120.823 208.685 0
+-122.198 210.016 0
+-127.339 205.474 0
+-126.397 202.922 0
+-122.634 204.57 0
+-121.858 203.397 0
+-123.349 195.991 0
+-121.65 195.495 0
+-120.281 197.957 0
+-119.509 196.64 0
+-117.885 197.2 0
+-118.135 195.176 0
+-121.096 193.441 0
+-123.662 195.544 0
+-126.38 195.523 0
+-128.792 191.645 0
+-128.796 191.468 0
+>
+-92.851 327.142 0
+-94.8484 326.923 0
+-95.8824 325.328 0
+-93.8132 324.359 0
+-95.9462 322.646 0
+-94.1094 320.251 0
+-96.3029 320.214 0
+-98.7867 316.381 0
+-103.13 318.16 0
+-108.911 314.186 0
+-106.791 311.173 0
+-109.772 311.623 0
+-109.002 310.484 0
+-110.861 307.956 0
+-109.561 308.057 0
+-109.89 306.856 0
+-104.104 306.815 0
+-103.456 308.829 0
+-98.8094 311.257 0
+-100.355 313.335 0
+-97.6925 316.277 0
+-93.1202 315.692 0
+>
+-153.063 165.103 0
+-152.038 161.869 0
+-148.343 160.385 0
+-148.306 161.771 0
+-146.282 162.007 0
+-144.714 160.169 0
+-146.458 159.094 0
+-144.696 156.974 0
+-141.859 157.355 0
+-142.908 159.745 0
+-139.641 161.226 0
+-139.712 162.381 0
+-143.467 161.568 0
+-146.258 162.927 0
+-149.755 168.1 0
+-151.345 165.19 0
+-153.061 165.18 0
+-153.063 165.103 0
+>
+-168.977 191.601 0
+-166.724 185.668 0
+-165.15 187.943 0
+-162.032 187.713 0
+-163.496 193.113 0
+-160.571 200.611 0
+-161.292 203.638 0
+-165.819 200.113 0
+-168.959 192.255 0
+-168.977 191.601 0
+>
+-188.552 145.635 0
+-185.387 143.191 0
+-183.379 146.23 0
+-184.097 149.403 0
+-181.909 151.693 0
+-187.03 149.343 0
+-185.915 145.925 0
+-188.549 145.735 0
+-188.552 145.635 0
+>
+-127.538 322.703 0
+-126.706 320.23 0
+-123.518 320.147 0
+-116.942 323.905 0
+-119.115 324.66 0
+-120.367 322.473 0
+-123.617 324.021 0
+-127.529 323.069 0
+-127.538 322.703 0
+>
+-94.0925 273.993 0
+-94.7676 275.073 0
+-97.513 273.152 0
+-97.5822 270.192 0
+-94.2138 273.075 0
+-94.213 273.108 0
+-94.1148 273.028 0
+>
+-140.612 259.066 0
+-132.266 256.406 0
+-129.23 257.57 0
+-131.411 262.342 0
+-134.964 264.331 0
+-140.607 259.255 0
+-140.612 259.066 0
+>
+-108.771 203.914 0
+-105.458 203.658 0
+-106.111 205.847 0
+-106.453 204.092 0
+-108.429 205.625 0
+-108.764 204.191 0
+-108.771 203.914 0
+>
+-103.212 264.869 0
+-99.8137 264.655 0
+-97.3467 267.425 0
+-100.781 266.064 0
+-102.432 268.233 0
+-103.201 265.334 0
+-103.212 264.869 0
+>
+-126.984 179.299 0
+-126.005 178.133 0
+-123.159 179.127 0
+-124.325 180.864 0
+-126.977 179.587 0
+-126.984 179.299 0
+>
+-134.09 267.126 0
+-130.459 264.303 0
+-127.991 266.791 0
+-132.342 268.878 0
+-134.171 267.872 0
+-134.09 267.126 0
+>
+-102.461 325.209 0
+-98.5419 322.442 0
+-99.4076 323.738 0
+-98.1579 325.993 0
+-102.454 325.486 0
+-102.461 325.209 0
+>
+-134.528 333.418 0
+-132.839 333.24 0
+-131.575 335.802 0
+-133.456 336.219 0
+-134.523 333.607 0
+-134.528 333.418 0
+>
+-139.892 210.143 0
+-137.505 209.105 0
+-134.689 213.049 0
+-138.697 209.691 0
+-139.887 210.332 0
+-139.892 210.143 0
+>
+-116.992 317.994 0
+-115.441 316.246 0
+-111.503 318.222 0
+-113.27 319.331 0
+-116.99 318.083 0
+-116.992 317.994 0
+>
+-135.971 331.615 0
+-131.755 329.061 0
+-129.095 331.709 0
+-133.448 332.801 0
+-135.966 331.804 0
+-135.971 331.615 0
+>
+-128.009 174.522 0
+-127.85 172.821 0
+-125.593 174.373 0
+-126.644 176.751 0
+-128.002 174.81 0
+-128.009 174.522 0
+>
+-138.538 180.71 0
+-137.562 179.443 0
+-137.106 181.506 0
+-138.533 180.899 0
+-138.538 180.71 0
+>
+-131.004 211.668 0
+-128.672 212.441 0
+-129.748 213.633 0
+-130.997 211.956 0
+-131.004 211.668 0
+>
+-127.743 189.312 0
+-126.978 187.673 0
+-126.411 190.2 0
+-127.729 189.866 0
+-127.743 189.312 0
+>
+-128.561 264.11 0
+-127.006 262.273 0
+-125.935 264.974 0
+-128.556 264.309 0
+-128.561 264.11 0
+>
+-101.849 246.271 0
+-100.976 244.997 0
+-99.3399 246.39 0
+-101.84 246.626 0
+-101.849 246.271 0
+>
+-113.146 312.351 0
+-111.964 311.722 0
+-111.634 312.956 0
+-113.141 312.539 0
+-113.146 312.351 0
+>
+-143.329 205.607 0
+-141.8 206.399 0
+-142.233 209.051 0
+-143.226 205.704 0
+-143.329 205.607 0
+>
+-139.738 258.033 0
+-137.581 256.257 0
+-134.26 256.78 0
+-139.726 258.488 0
+-139.738 258.033 0
+>
+-150.341 176.48 0
+-148.236 176.014 0
+-148.279 178.19 0
+-150.029 176.849 0
+-150.341 176.48 0
+>
+-113.326 325.012 0
+-111.776 323.265 0
+-110.359 324.117 0
+-113.322 325.2 0
+-113.326 325.012 0
+>
+-129.434 210.153 0
+-124.226 209.323 0
+-123.551 212.224 0
+-129.417 210.807 0
+-129.434 210.153 0
+>
+-145.798 168.972 0
+-143.882 168.923 0
+-145.053 170.473 0
+-145.793 169.15 0
+-145.798 168.972 0
+>
+-137.426 200.461 0
+-134.559 198.447 0
+-135.175 201.923 0
+-137.414 200.927 0
+-137.426 200.461 0
+>
+-110.283 203.772 0
+-110.28 203.861 0
+-109.556 204.72 0
+-110.283 203.772 0
+>
+-129.349 252.948 0
+-128.361 252.368 0
+-129.346 253.047 0
+-129.349 252.948 0
+>
+-113.658 315.78 0
+-112.647 316.32 0
+-113.653 315.968 0
+-113.658 315.78 0
+>
+-139.192 166.949 0
+-138.412 165.876 0
+-139.19 167.038 0
+-139.192 166.949 0
+>
+-128.591 223.62 0
+-127.288 223.499 0
+-128.586 223.82 0
+-128.591 223.62 0
+>
+-196.213 160.111 0
+-194.884 160.627 0
+-196.109 160.197 0
+-196.213 160.111 0
+>
+-136.763 320.73 0
+-135.355 321.158 0
+-136.76 320.818 0
+-136.763 320.73 0
+>
+-103.608 294.281 0
+-102.467 296.05 0
+-103.606 294.369 0
+-103.608 294.281 0
+>
+-131.81 187.739 0
+-130.808 187.536 0
+-131.796 188.304 0
+-131.81 187.739 0
+>
+-138.424 321.973 0
+-137.326 322.032 0
+-138.419 322.161 0
+-138.424 321.973 0
+>
+-116.095 187.918 0
+-115.213 186.921 0
+-116.091 188.095 0
+-116.095 187.918 0
+>
+-105.891 294.879 0
+-105.166 295.926 0
+-105.888 294.979 0
+-105.891 294.879 0
+>
+-122.555 275.892 0
+-121.541 276.41 0
+-122.553 275.981 0
+-122.555 275.892 0
+>
+-128.697 327.904 0
+-127.182 328.696 0
+-128.692 328.092 0
+-128.697 327.904 0
+>
+-161.029 176.49 0
+-159.331 175.889 0
+-161.026 176.578 0
+-161.029 176.49 0
+>
+-197.292 164.572 0
+-196.275 164.83 0
+-197.286 164.761 0
+-197.292 164.572 0
+>
+-131.297 262.882 0
+-130.412 262.216 0
+-131.292 263.071 0
+-131.297 262.882 0
+>
+-100.132 268.123 0
+-99.1385 267.833 0
+-100.13 268.212 0
+-100.132 268.123 0
+>
+-96.0883 278.475 0
+-94.7472 280.252 0
+-96.0795 278.852 0
+-96.0883 278.475 0
+>
+-128.701 331.51 0
+-127.601 331.669 0
+-128.696 331.698 0
+-128.701 331.51 0
+>
+-137.577 320.108 0
+-136.573 320.359 0
+-137.575 320.197 0
+-137.577 320.108 0
+>
+-143.082 184.244 0
+-140.323 185.737 0
+-143.072 184.621 0
+-143.082 184.244 0
+>
+-120.828 288.783 0
+-119.725 288.944 0
+-120.825 288.883 0
+-120.828 288.783 0
+>
+-138.315 165.729 0
+-137.098 165.975 0
+-138.313 165.818 0
+-138.315 165.729 0
+>
+-140.066 168.27 0
+-139.042 168.887 0
+-140.064 168.358 0
+-140.066 168.27 0
+>
+-133.672 213.488 0
+-132.658 213.84 0
+-133.663 213.865 0
+-133.672 213.488 0
+>
+-92.8074 328.993 0
+-92.909 328.907 0
+-93.912 328.609 0
+-92.8179 328.55 0
+>
+-115.418 325.065 0
+-113.82 325.213 0
+-115.41 325.353 0
+-115.418 325.065 0
+>
+-93.265 309.518 0
+-93.264 309.562 0
+-93.9936 308.226 0
+-93.2655 309.495 0
+>
+-130.69 184.205 0
+-129.737 186.078 0
+-130.688 184.305 0
+-130.69 184.205 0
+>
+-129.255 329.405 0
+-126.854 329.797 0
+-129.253 329.494 0
+-129.255 329.405 0
+>
+-160.863 152.829 0
+-159.75 152.877 0
+-160.853 153.184 0
+-160.863 152.829 0
+>
+-138.156 160.09 0
+-137.039 160.339 0
+-138.153 160.178 0
+-138.156 160.09 0
+>
+-121.32 289.084 0
+-119.411 289.491 0
+-121.318 289.173 0
+-121.32 289.084 0
+>
+-121.019 171.766 0
+-120.232 170.96 0
+-121.017 171.866 0
+-121.019 171.766 0
+>
+-163.394 174.801 0
+-162.376 175.151 0
+-163.392 174.89 0
+-163.394 174.801 0
+>
+-143.61 179.443 0
+-142.075 180.336 0
+-143.604 179.643 0
+-143.61 179.443 0
+>
+-97.4927 320.476 0
+-95.9967 320.518 0
+-97.4906 320.564 0
+-97.4927 320.476 0
+>
+-140.461 257.221 0
+-139.081 256.352 0
+-140.359 257.295 0
+-140.461 257.221 0
+>
+-132.876 263.766 0
+-130.884 263.337 0
+-132.871 263.955 0
+-132.876 263.766 0
+>
+-170.631 193.689 0
+-170.528 193.775 0
+-169.693 194.817 0
+-170.631 193.689 0
+>
+-157.995 187.969 0
+-157.264 188.926 0
+-157.99 188.146 0
+-157.995 187.969 0
+>
+-98.2148 243.036 0
+-95.2556 245.286 0
+-98.2105 243.225 0
+-98.2148 243.036 0
+>
+-131.668 213.26 0
+-129.724 214.597 0
+-131.665 213.349 0
+-131.668 213.26 0
+>
+-198.63 160.361 0
+-198.526 160.457 0
+-197.689 161.409 0
+-198.63 160.361 0
+>
+-195.954 144.93 0
+-194.761 144.24 0
+-195.948 145.118 0
+-195.954 144.93 0
+>
+-138.21 212.962 0
+-136.77 214.212 0
+-138.205 213.139 0
+-138.21 212.962 0
+>
+-99.9456 317.939 0
+-99.2737 316.858 0
+-99.9435 318.028 0
+-99.9456 317.939 0
+>
+-193.719 152.179 0
+-192.109 151.943 0
+-193.614 152.309 0
+-193.719 152.179 0
+>
+-94.0404 276.243 0
+-94.1401 276.256 0
+-94.0406 276.232 0
+>
+-407.626 705.382 0
+-409.814 702.683 0
+-416.071 700.191 0
+-420.64 693.256 0
+-425.825 690.952 0
+-438.577 689.02 0
+-453.687 677.019 0
+-453.192 673.854 0
+-448.56 674.753 0
+-446.682 673.56 0
+-449.78 672.225 0
+-449.228 668.354 0
+-451.718 670.765 0
+-453.022 670.128 0
+-452.797 665.673 0
+-454.989 663.236 0
+-452.493 657.566 0
+-457.348 661.266 0
+-459.617 655.91 0
+-457.133 651.701 0
+-459.273 650.187 0
+-459.858 645.233 0
+-461.723 646.738 0
+-463.909 646.12 0
+-468.739 640.493 0
+-468.394 638.083 0
+-464.34 637.217 0
+-461.004 639.062 0
+-458.701 638.346 0
+-453.511 641.858 0
+-453.34 634.741 0
+-455.29 636.506 0
+-455.905 634.343 0
+-463.308 633.161 0
+-459.341 627.436 0
+-463.546 625.82 0
+-463.153 624.19 0
+-456.437 623.551 0
+-452.909 625.332 0
+-451.943 621.739 0
+-446.633 618.767 0
+-445.463 622.102 0
+-444.459 620.84 0
+-442.507 622.468 0
+-441.426 619.116 0
+-438.835 621.668 0
+-439.47 617.365 0
+-443.677 613.957 0
+-443.869 610.588 0
+-441.02 614.207 0
+-440.55 612.128 0
+-437.45 611.529 0
+-437.58 616.176 0
+-434.139 614.711 0
+-432.22 619.254 0
+-433.169 626.735 0
+-429.308 624.098 0
+-427.88 616.38 0
+-426.23 617.894 0
+-426.841 622.734 0
+-424.582 617.624 0
+-422.473 620.384 0
+-423.193 623.268 0
+-421.977 622.275 0
+-420.518 623.9 0
+-419.387 621.363 0
+-416.209 622.258 0
+-415.722 616.858 0
+-413.94 619.046 0
+-413.614 623.232 0
+-408.838 617.532 0
+-412.685 616.938 0
+-415.721 611.495 0
+-413.621 610.512 0
+-409.343 613.624 0
+-406.299 608.355 0
+-407.056 603.38 0
+-408.979 602.212 0
+-409.276 607.612 0
+-411.842 609.022 0
+-415.466 601.782 0
+-415.667 608.884 0
+-419.007 606.881 0
+-420.111 609.963 0
+-424.13 608.087 0
+-426.735 612.324 0
+-430.092 611.797 0
+-429.393 608.524 0
+-424.24 602.541 0
+-426.882 602.597 0
+-428.809 599.637 0
+-432.11 600.2 0
+-432.085 597.12 0
+-430.067 596.395 0
+-430.206 593.894 0
+-427.354 590.48 0
+-427.765 583.009 0
+-426.345 582.062 0
+-424.515 583.232 0
+-423.608 581.878 0
+-426.55 578.326 0
+-425.007 574.217 0
+-427.413 569.732 0
+-428.195 571.603 0
+-433.186 571.945 0
+-436.767 578.21 0
+-436.394 581.379 0
+-433.703 583.895 0
+-438.132 581.911 0
+-442.312 575.642 0
+-436.497 586.593 0
+-436.13 591.402 0
+-437.797 587.903 0
+-439.546 588.213 0
+-439.362 584.489 0
+-442.036 578.817 0
+-445.582 578.637 0
+-442.613 584.27 0
+-445.83 586.403 0
+-442.781 593.482 0
+-451.616 593.359 0
+-452.067 599.186 0
+-456.006 600.596 0
+-457.336 599.646 0
+-458.273 602.088 0
+-459.242 600.594 0
+-461.83 601.615 0
+-462.653 605.992 0
+-465.952 604.913 0
+-468.588 611.743 0
+-470.44 611.908 0
+-472.306 618.437 0
+-468.547 617.41 0
+-467.938 619.428 0
+-462.523 618.26 0
+-459.607 619.551 0
+-474.624 623.889 0
+-476.024 628.304 0
+-479.046 626.879 0
+-478.089 620 0
+-483.896 621.177 0
+-482.278 628.47 0
+-474.776 631.143 0
+-472.328 634.445 0
+-473.279 643.031 0
+-476.861 645.223 0
+-467.559 648.793 0
+-466.243 652.833 0
+-467.909 654.362 0
+-464.151 656.805 0
+-464.661 659.715 0
+-462.6 661.545 0
+-460.122 668.752 0
+-459.973 671.254 0
+-463.119 672.425 0
+-462.231 674.235 0
+-466.98 674.677 0
+-462.993 677.786 0
+-459.244 676.936 0
+-454.297 679.867 0
+-467.764 681.054 0
+-473.227 679.332 0
+-489.416 679.158 0
+-493.594 682.48 0
+-486.3 680.662 0
+-495.906 685.988 0
+-504.227 693.03 0
+-518.642 693.092 0
+-525.384 695.77 0
+-530.15 703.23 0
+-530.119 706.615 0
+-535.127 713.223 0
+>
+-215.571 631.732 0
+-218.745 632.684 0
+-212.751 631.694 0
+-210.64 633.527 0
+-210.856 635.602 0
+-215.033 638.324 0
+-209.619 637.501 0
+-209.328 640.112 0
+-188.301 649.421 0
+-190.206 655.964 0
+-199.113 653.85 0
+-196.405 656.274 0
+-203.653 659.792 0
+-208.373 665.944 0
+-205.154 663.814 0
+-201.979 665.775 0
+-203.701 663.76 0
+-202.309 662.054 0
+-194.131 657.47 0
+-189.363 657.845 0
+-186.993 653.507 0
+-183.11 653.528 0
+-180.275 656.951 0
+-181.619 660.174 0
+-175.87 658.121 0
+-177.616 663.768 0
+-173.452 660.76 0
+-173.477 671.434 0
+-168.068 673.839 0
+-171.692 669.796 0
+-171.972 667.252 0
+-170.126 664.502 0
+-165.048 665.631 0
+-164.116 664.512 0
+-170.026 661.722 0
+-178.382 652.743 0
+-174.382 647.642 0
+-169.134 650.708 0
+-172.172 644.058 0
+-168.609 643.161 0
+-164.073 645.265 0
+-164.773 641.702 0
+-163.315 638.767 0
+-167.692 638.6 0
+-168.621 636.965 0
+-170.992 638.71 0
+-173.181 637.151 0
+-176.104 639.804 0
+-178.944 639.134 0
+-180.769 642.584 0
+-182.791 643.12 0
+-190.745 637.91 0
+-199.167 638.887 0
+-199.341 634.038 0
+-204.289 637.028 0
+-209.652 631.302 0
+-215.262 629.565 0
+-215.571 631.732 0
+>
+-448.497 530.1 0
+-450.231 532.618 0
+-448.376 535.816 0
+-452.043 537.237 0
+-454.192 541.072 0
+-451.876 547.211 0
+-452.007 548.39 0
+-453.535 547.483 0
+-453.249 552.554 0
+-451.084 554.283 0
+-446.306 551.729 0
+-446.797 546.458 0
+-444.588 545.465 0
+-441.636 548.959 0
+-442.45 544.944 0
+-440.111 546.276 0
+-434.906 538.831 0
+-436.141 536.077 0
+-436.866 539.027 0
+-439.413 539.29 0
+-440.146 542.085 0
+-447.195 542.855 0
+-445.851 538.687 0
+-442.029 536.523 0
+-445.012 536.041 0
+-446.717 533.749 0
+-444.798 529.237 0
+-448.403 530.028 0
+-448.497 530.1 0
+>
+-467.509 544.307 0
+-469.261 544.687 0
+-471.679 538.667 0
+-470.493 545.54 0
+-459.862 550.542 0
+-456.879 549.312 0
+-456.722 543.39 0
+-459.747 547.378 0
+-464.626 543.026 0
+-461.914 533.543 0
+-457.612 532.876 0
+-456.54 529.156 0
+-463.148 530.925 0
+-466.74 537.111 0
+-468.497 535.694 0
+-467.278 531.16 0
+-470.186 533.771 0
+-467.509 544.307 0
+>
+-532.511 713.047 0
+-529.98 710.15 0
+-525.547 699.201 0
+-517.463 696.211 0
+-501.333 697.158 0
+-496.346 695.969 0
+-492.935 692.938 0
+-495.367 689.897 0
+-492.563 686.481 0
+-479.97 680.594 0
+-473.871 681.548 0
+-457.29 690.09 0
+-452.558 689.495 0
+-447.097 684.743 0
+-441.719 688.522 0
+-436.354 695.495 0
+-420.354 696.585 0
+-417.785 705.953 0
+>
+-466.659 708.828 0
+-466.495 708.326 0
+-464.939 708.343 0
+-464.647 705.166 0
+-462.187 705.664 0
+-463.543 707.332 0
+-462.721 708.063 0
+-460.432 705.748 0
+-456.172 705.491 0
+-455.363 707.653 0
+-458.034 706.853 0
+-460.099 708.049 0
+-459.495 708.392 0
+>
+-420.107 706.084 0
+-419.562 703.7 0
+-421.251 701.32 0
+-424.518 700.235 0
+-432.788 701.692 0
+-433.11 704.51 0
+-435.458 705.885 0
+-435.861 702.305 0
+-439.3 701.646 0
+-441.223 703.644 0
+-440.999 705.796 0
+-443.613 705.949 0
+-443.138 707.417 0
+>
+-446.235 707.6 0
+-444.675 704.405 0
+-444.987 699.124 0
+-450.729 695.714 0
+-456.061 695.998 0
+-458.963 697.88 0
+-467.755 694.036 0
+-471.072 697.063 0
+-471.255 697.264 0
+-471.641 703.651 0
+-476.97 708.658 0
+-476.921 709.459 0
+>
+-173.626 261.007 0
+-168.087 254.954 0
+-162.289 254.367 0
+-154.595 249.803 0
+-154.878 246.826 0
+-157.708 246.061 0
+-162.243 248.873 0
+-167.738 249.617 0
+-173.492 258.717 0
+-173.626 261.007 0
+>
+-451.707 558.948 0
+-453.903 563.591 0
+-451.3 562.662 0
+-449.371 565.465 0
+-445.821 563.904 0
+-445.556 559.863 0
+-451.516 558.837 0
+-451.707 558.948 0
+>
+-398.919 704.901 0
+-402.954 702.124 0
+-406.003 696.128 0
+-407.312 698.798 0
+-407.412 698.748 0
+-404.046 705.184 0
+>
+-451.171 707.893 0
+-451.111 707.264 0
+-449.051 705.97 0
+-448.171 707.714 0
+>
+-474.21 709.291 0
+-470.859 706.885 0
+-469.177 707.374 0
+-469.757 709.017 0
+>
+-198.243 642.953 0
+-199.351 641.882 0
+-195.812 640.3 0
+-190.404 642.086 0
+-194.1 644.716 0
+-198.241 643.009 0
+-198.243 642.953 0
+>
+-465.142 684.144 0
+-465.97 683.334 0
+-449.538 682.967 0
+-453.326 686.383 0
+-460.716 686.511 0
+-464.728 684.554 0
+-465.142 684.144 0
+>
+-500.083 693.86 0
+-496.45 691.261 0
+-494.663 693.327 0
+-497.859 695.138 0
+-500.042 694.506 0
+-500.083 693.86 0
+>
+-435.717 693.071 0
+-436.361 692.026 0
+-434.231 691.869 0
+-430.508 694.042 0
+-435.305 693.471 0
+-435.717 693.071 0
+>
+-177.817 643.716 0
+-175.331 642.554 0
+-176.584 645.684 0
+-179.007 645.833 0
+-177.914 643.719 0
+-177.817 643.716 0
+>
+-465.409 629.066 0
+-464.778 628.158 0
+-463.717 629.558 0
+-465.088 629.538 0
+-465.409 629.066 0
+>
+-186.593 645.507 0
+-181.517 646.253 0
+-178.504 649.17 0
+-182.273 649.667 0
+-186.593 645.507 0
+>
+-444.364 608.786 0
+-441.633 608.564 0
+-441.139 610.366 0
+-443.954 609.098 0
+-444.364 608.786 0
+>
+-435.787 606.283 0
+-433.834 607.913 0
+-436.153 606.738 0
+-435.787 606.283 0
+>
+-461.991 652.089 0
+-459.884 653.047 0
+-461.763 652.656 0
+-461.991 652.089 0
+>
+-414.688 705.778 0
+-415.503 703.37 0
+-415.534 702.826 0
+-409.657 705.496 0
+>
+-93.1202 315.692 0
+-92.3252 315.584 0
+-85.3336 320.513 0
+-84.1417 320.341 0
+-85.4915 317.966 0
+-84.4177 316.976 0
+-80.9848 318.928 0
+-79.9563 320.346 0
+-82.4653 319.56 0
+-80.7158 322.016 0
+-82.0124 321.956 0
+-83.3309 325.313 0
+-77.3701 329.071 0
+-79.8542 329.304 0
+-78.5323 330.528 0
+-81.8354 329.76 0
+-83.2617 332.709 0
+-79.186 336.863 0
+-83.0789 336.353 0
+-84.4945 339.713 0
+-88.9718 339.728 0
+-89.8396 345.149 0
+-85.9604 345.158 0
+-88.4804 347.979 0
+-84.8993 348.039 0
+-84.9431 346.144 0
+-82.8675 345.586 0
+-80.9357 347.438 0
+-81.9695 350.057 0
+-80.2395 351.814 0
+-79.6791 350.227 0
+-78.1552 351.678 0
+-69.4482 349.865 0
+-68.14 355.148 0
+-73.7242 354.262 0
+-73.2073 355.16 0
+-76.2622 356.293 0
+-68.1056 356.722 0
+-65.6835 358.466 0
+-65.7025 362.17 0
+-68.4698 362.773 0
+-66.1708 363.466 0
+-67.3104 365.842 0
+-63.4744 364.184 0
+-63.5068 367.289 0
+-64.3548 369.381 0
+-66.9369 369.304 0
+-66.4745 372.299 0
+-62.8647 369.449 0
+-60.4622 370.418 0
+-52.9577 368.641 0
+-55.0274 369.327 0
+-53.3105 370.766 0
+-55.2871 371.14 0
+-54.7692 372.182 0
+-50.3046 372.189 0
+-54.3357 373.936 0
+-49.0892 373.406 0
+-47.9539 375.567 0
+-51.4289 375.395 0
+-53.5328 379.142 0
+-55.1516 377.601 0
+-57.0205 378.328 0
+-54.088 381.038 0
+-54.0376 383.443 0
+-56.7602 385.94 0
+-55.0643 386.47 0
+-52.0427 384.045 0
+-53.3865 381.4 0
+-50.4708 378.568 0
+-50.5117 376.584 0
+-48.6123 377.321 0
+-49.8401 380.307 0
+-46.705 383.336 0
+-44.7512 377.01 0
+-40.0312 380.009 0
+-40.8788 382.254 0
+-37.6358 385.882 0
+-40.1103 386.02 0
+-40.0498 389.067 0
+-37.9729 388.893 0
+-35.4531 391.105 0
+-37.8166 391.795 0
+-35.2813 394.838 0
+-37.6786 393.777 0
+-37.455 395.069 0
+-40.9017 396.014 0
+-38.2339 395.739 0
+-38.4843 398.094 0
+-35.6703 400.256 0
+-38.0319 400.946 0
+-36.3336 401.755 0
+-37.2003 402.969 0
+-32.4027 400.337 0
+-30.5001 401.497 0
+-29.9629 398.538 0
+-27.3904 398.489 0
+-27.7548 405.369 0
+-22.8079 410.731 0
+-25.454 411.977 0
+-25.1202 413.956 0
+-28.7966 412.972 0
+-31.2727 422.942 0
+-35.0315 422.694 0
+-27.4886 424.532 0
+-23.7546 428.763 0
+-25.283 431.464 0
+-23.2261 435.859 0
+-27.4661 441.15 0
+-22.2041 437.736 0
+-18.4393 438.597 0
+-13.6448 447.333 0
+-5.11753 455.861 0
+-4.14619 460.733 0
+-5.68439 462.844 0
+-15.8476 466.907 0
+-19.6047 471.223 0
+-29.9314 471.421 0
+-31.2746 473.155 0
+-31.8161 480.561 0
+-30.2838 478.502 0
+-30.7372 475.462 0
+-28.3234 473.153 0
+-24.6798 473.348 0
+-22.0686 476.17 0
+-23.1852 474.351 0
+-12.917 471.11 0
+-9.73312 467.627 0
+-2.83274 468.337 0
+4.80548 466.178 0
+8.57055 473.73 0
+9.1973 481.945 0
+11.2095 484.816 0
+12.7721 484.236 0
+18.4173 487.106 0
+18.359 489.645 0
+20.744 491.458 0
+21.9819 495.319 0
+20.1772 499.171 0
+12.2545 500.727 0
+14.1564 503.057 0
+15.3109 501.653 0
+17.094 502.733 0
+17.1466 499.872 0
+21.0718 499.91 0
+23.7819 503.881 0
+22.8326 505.924 0
+27.5761 508.345 0
+25.8441 510.5 0
+26.5505 511.83 0
+29.2859 511.235 0
+28.9712 509.854 0
+30.4523 510.574 0
+30.0321 508.685 0
+31.4852 507.5 0
+36.8864 508.12 0
+30.2617 504.337 0
+35.6822 499.359 0
+34.269 496.609 0
+36.2333 489.842 0
+41.1983 486.769 0
+42.4331 483.705 0
+44.4919 483.4 0
+47.0841 486.268 0
+47.6082 488.755 0
+45.0508 488.423 0
+46.4487 490.156 0
+45.005 492.303 0
+49.7359 493.769 0
+52.1333 497.007 0
+49.1203 499.185 0
+50.2077 499.814 0
+48.7622 501.772 0
+53.0595 500.364 0
+55.0798 504.96 0
+60.3726 504.805 0
+66.416 501.784 0
+67.6557 498.756 0
+66.6321 495.122 0
+70.7744 496.969 0
+70.2006 498.272 0
+72.3678 499.079 0
+73.109 503.957 0
+75.3883 506.148 0
+71.3617 505.506 0
+67.8668 508.461 0
+68.8799 511.308 0
+65.9974 516.14 0
+67.3249 520.745 0
+65.1955 522.81 0
+66.7844 524.719 0
+63.3937 527.619 0
+59.7426 540.874 0
+53.7198 543.777 0
+44.8368 544.539 0
+44.0758 546.045 0
+62.2273 544.212 0
+68.421 547.384 0
+74.8644 547.022 0
+72.8199 547.644 0
+72.5681 551.248 0
+74.1685 554.599 0
+77.0019 554.8 0
+76.9213 556.33 0
+73.4082 556.414 0
+76.7532 558.77 0
+76.9617 559.975 0
+75.4037 560.27 0
+76.5027 562.563 0
+72.8844 561.817 0
+73.3126 565.136 0
+70.1203 567.39 0
+67.9641 566.495 0
+61.8492 568.875 0
+62.2697 571.319 0
+60.6206 571.982 0
+63.4753 574.219 0
+66.5481 570.391 0
+75.4884 567.793 0
+82.064 571.733 0
+79.3405 572.272 0
+79.6531 574.119 0
+78.177 572.839 0
+78.3964 575.053 0
+75.7681 575.315 0
+75.6957 577.532 0
+77.3478 577.148 0
+76.7958 580.069 0
+80.0104 580.067 0
+77.0009 580.986 0
+76.92 582.461 0
+74.7694 581.754 0
+75.385 584.507 0
+68.5421 582.281 0
+64.7692 584.366 0
+63.6586 581.177 0
+64.9159 580.441 0
+61.973 578.804 0
+63.6735 582.384 0
+62.8299 585.033 0
+72.0648 583.691 0
+72.3258 589.396 0
+74.0887 590.34 0
+65.541 591.738 0
+56.0724 589.552 0
+53.6605 591.191 0
+56.6184 594.111 0
+54.9651 594.177 0
+53.7312 596.51 0
+52.2534 595.133 0
+51.8849 596.668 0
+52.969 597.717 0
+57.4188 595.808 0
+58.7255 599.071 0
+57.7752 600.791 0
+59.1287 600.175 0
+59.3691 596.159 0
+63.0013 598.784 0
+61.7716 601.537 0
+62.7415 601.337 0
+64.663 607.32 0
+59.918 608.665 0
+66.9186 608.988 0
+67.9706 607.601 0
+69.2443 608.461 0
+71.7699 600.108 0
+73.7012 598.933 0
+73.6336 609.883 0
+71.9023 611.378 0
+73.2777 612.703 0
+74.0387 611.308 0
+75.5184 613.275 0
+76.4718 611.702 0
+74.1193 609.878 0
+75.3812 609.775 0
+74.0093 608.771 0
+74.9553 598.043 0
+80.204 597.751 0
+81.6928 600.506 0
+84.9867 599.362 0
+87.608 608.345 0
+86.4682 610.85 0
+87.3809 614.531 0
+85.838 615.566 0
+87.9902 617.107 0
+86.0565 617.869 0
+86.6559 619.481 0
+87.3257 618.554 0
+89.1832 619.82 0
+88.4424 613.877 0
+91.1859 616.287 0
+92.1527 615.867 0
+90.8826 615.093 0
+92.9157 614.474 0
+90.8742 614.262 0
+91.5433 613.203 0
+89.1956 611.564 0
+92.9789 611.061 0
+90.6338 609.699 0
+91.9486 605.164 0
+88.8874 600.441 0
+93.7059 596.049 0
+102.398 599.934 0
+103.21 603.805 0
+104.748 601.852 0
+105.922 602.673 0
+104.392 605.59 0
+105.478 607.486 0
+108.197 607.274 0
+107.039 608.16 0
+108.02 609.359 0
+103.849 609.994 0
+103.542 608.323 0
+100.734 609.313 0
+99.6843 611.362 0
+101.347 612.643 0
+99.802 613.577 0
+103.495 613.865 0
+104.194 616.03 0
+100.992 616.192 0
+102.284 619.472 0
+100.534 619.255 0
+99.293 621.428 0
+102.825 625.695 0
+105.721 624.051 0
+105.06 626.096 0
+107.119 628.56 0
+102.98 632.021 0
+104.651 634.599 0
+100.798 637.205 0
+102.749 638.617 0
+104.875 637.877 0
+104.023 640.135 0
+108.605 643.419 0
+106.387 644.535 0
+105.923 646.811 0
+104.174 646.184 0
+104.583 648.585 0
+101.495 649.622 0
+96.916 646.629 0
+88.7692 645.414 0
+83.673 639.871 0
+84.0421 638.161 0
+90.1601 639.393 0
+93.439 637.83 0
+89.2972 630.902 0
+86.5755 630.287 0
+85.53 632.282 0
+87.2339 637.573 0
+83.055 636.509 0
+81.8165 638.473 0
+75.2644 633.371 0
+66.6033 630.793 0
+64.2165 626.067 0
+59.0247 622.254 0
+58.8557 624.196 0
+61.4932 625.548 0
+63.1107 630.703 0
+60.863 629.38 0
+60.4269 633.176 0
+57.8718 630.582 0
+57.0304 625.605 0
+54.4951 624.675 0
+53.1274 631.188 0
+56.3543 633.185 0
+55.904 635.784 0
+61.3975 640.822 0
+62.4875 635.089 0
+66.8106 639.745 0
+69.1215 638.52 0
+74.1678 639.103 0
+74.0119 642.341 0
+74.7514 639.285 0
+79.8053 640.612 0
+80.785 641.577 0
+79.7519 644.492 0
+83.0457 644.544 0
+87.2754 650.694 0
+93.3139 654.367 0
+91.8798 656.088 0
+93.7013 654.407 0
+95.1642 655.556 0
+97.071 662.597 0
+100.634 661.089 0
+102.801 665.313 0
+121.821 675.128 0
+122.413 676.741 0
+120.112 678.842 0
+114.683 676.104 0
+111.403 676.597 0
+110.329 675.132 0
+109.473 676.702 0
+103.486 676.755 0
+100.238 680.487 0
+92.8157 681.569 0
+89.2851 685.484 0
+85.913 685.986 0
+84.35 684.241 0
+84.1742 685.817 0
+81.5411 683.352 0
+82.4334 685.47 0
+76.1066 689.1 0
+>
+103.417 134.885 0
+104.735 135.706 0
+102.431 137.983 0
+97.7879 137.797 0
+95.724 144.636 0
+96.5711 149.657 0
+86.3816 148.912 0
+84.6914 151.596 0
+81.3735 152.556 0
+78.2246 150.005 0
+79.0556 152.622 0
+75.034 153.723 0
+72.7424 156.459 0
+74.2832 159.457 0
+70.7441 158.196 0
+66.6889 165.625 0
+61.9864 168.543 0
+55.1315 167.864 0
+48.9354 163.282 0
+44.422 156.5 0
+48.5137 152.974 0
+45.5105 154.782 0
+37.3841 149.795 0
+28.404 149.455 0
+21.0872 145.398 0
+13.087 143.293 0
+6.86721 138.895 0
+5.10823 135.973 0
+>
+21.7921 483.03 0
+21.9334 479.436 0
+24.4473 476.705 0
+22.8467 474.889 0
+23.7926 472.436 0
+30.7043 474.362 0
+29.5348 475.066 0
+30.4324 475.939 0
+33.159 474.138 0
+33.3789 475.753 0
+31.327 476.614 0
+32.6226 477.836 0
+37.4124 475.972 0
+36.0588 477.565 0
+37.6674 480.125 0
+34.2407 481.005 0
+33.516 485.26 0
+37.1066 489.11 0
+33.6075 491.587 0
+29.1782 490.82 0
+29.0238 487.032 0
+24.3539 483.5 0
+21.8009 483.595 0
+21.7921 483.03 0
+>
+113.275 657.786 0
+115.509 658.831 0
+119.08 657.883 0
+119.45 655.753 0
+122.149 654.403 0
+121.744 651.945 0
+124.078 653.601 0
+123.386 651.612 0
+124.642 651.281 0
+125.624 653.214 0
+126.183 650.251 0
+128.827 654.709 0
+125.279 659.122 0
+123.442 659.191 0
+120.786 665.993 0
+115.842 664.181 0
+113.278 658.074 0
+113.275 657.786 0
+>
+95.7158 592.649 0
+99.4912 590.586 0
+98.7709 586.393 0
+102.082 586.551 0
+101.482 584.75 0
+102.935 583.95 0
+104.694 584.677 0
+104.619 587.215 0
+106.477 588.218 0
+104.538 589.055 0
+106.786 590.244 0
+105.748 593.943 0
+106.825 594.676 0
+103.356 598.352 0
+101.704 598.466 0
+95.7195 593.026 0
+95.7158 592.649 0
+>
+140.499 681.696 0
+146.349 674.748 0
+144.318 674.294 0
+145.269 671.507 0
+148.546 670.16 0
+148.748 671.866 0
+146.726 672.984 0
+150.8 676.465 0
+150.618 678.826 0
+147.728 679.905 0
+150.818 680.255 0
+149.672 682.576 0
+145.326 682.001 0
+142.249 684.046 0
+140.5 681.884 0
+140.499 681.696 0
+>
+17.0252 448.479 0
+21.055 447.807 0
+22.7537 449.355 0
+25.6841 447.648 0
+25.3403 451.023 0
+26.7075 450.215 0
+27.6423 453.482 0
+24.1827 452.658 0
+23.5612 450.639 0
+20.7232 451.879 0
+17.2259 448.708 0
+17.0252 448.479 0
+>
+130.288 670.402 0
+136.049 664.691 0
+138.65 663.201 0
+140.397 664.332 0
+137.521 668.327 0
+139.844 668.912 0
+139.368 670.111 0
+134.067 672.183 0
+130.289 670.59 0
+130.288 670.402 0
+>
+109.36 595.396 0
+114.723 597.103 0
+115.315 598.162 0
+112.303 598.508 0
+113.489 600.859 0
+111.548 601.284 0
+111.913 598.334 0
+109.768 597.654 0
+109.362 595.673 0
+109.36 595.396 0
+>
+10.2708 451.257 0
+11.0431 450.269 0
+14.4288 452.532 0
+14.9965 451.049 0
+18.3991 454.464 0
+14.7345 453.17 0
+12.0068 455.064 0
+10.2769 451.634 0
+10.2708 451.257 0
+>
+12.3598 409.018 0
+14.4045 407.002 0
+14.1368 408.857 0
+18.3592 406.985 0
+13.8807 411.443 0
+14.845 409.899 0
+13.2747 410.621 0
+12.4607 409.149 0
+12.3598 409.018 0
+>
+94.852 522.382 0
+96.5178 522.566 0
+95.0297 520.452 0
+96.6866 519.65 0
+99.3545 522.351 0
+97.5957 522.689 0
+97.5131 524.351 0
+94.8564 522.847 0
+94.852 522.382 0
+>
+12.7212 462.767 0
+17.461 463.756 0
+17.9198 461.621 0
+23.4676 463.985 0
+20.9502 466.661 0
+16.1157 465.817 0
+16.0347 466.915 0
+12.7285 463.221 0
+12.7212 462.767 0
+>
+129.468 663.581 0
+133.309 659.444 0
+138.82 659.355 0
+138.249 660.799 0
+132.841 661.941 0
+132.475 664.99 0
+129.47 663.758 0
+129.468 663.581 0
+>
+102.346 678.75 0
+104.069 677.127 0
+108.422 678.019 0
+109.015 679.521 0
+105.773 684.027 0
+103.347 682.63 0
+102.354 679.592 0
+102.346 678.75 0
+>
+-92.6453 335.866 0
+-84.8429 337.547 0
+-85.6199 334.06 0
+-88.5882 330.558 0
+-91.1875 330.12 0
+-89.3159 329.244 0
+-89.556 327.486 0
+-92.851 327.142 0
+>
+87.0526 592.281 0
+94.505 588.184 0
+97.6451 590.88 0
+95.4231 592.563 0
+95.6342 594.279 0
+87.7617 595 0
+87.0555 592.558 0
+87.0526 592.281 0
+>
+18.5888 453.996 0
+23.04 455.258 0
+22.8747 457.344 0
+24.3623 458.053 0
+21.0052 457.428 0
+18.5902 454.085 0
+18.5888 453.996 0
+>
+128.549 656.373 0
+135.59 653.202 0
+135.697 654.808 0
+131.35 655.756 0
+130.394 657.436 0
+128.55 656.562 0
+128.549 656.373 0
+>
+119.995 688.673 0
+120.951 687.602 0
+125.198 687.936 0
+136.544 682.141 0
+139.925 682.63 0
+139.172 685.859 0
+140.828 688.531 0
+>
+92.7547 548.453 0
+95.1932 548.108 0
+94.5218 549.4 0
+99.0354 551.718 0
+93.2639 550.609 0
+92.7552 548.508 0
+92.7547 548.453 0
+>
+84.4112 544.47 0
+87.3267 542.922 0
+88.9172 545.621 0
+86.0696 544.22 0
+84.6214 545.897 0
+84.5108 544.657 0
+84.4112 544.47 0
+>
+109.111 668.426 0
+106.1 666.713 0
+105.782 663.524 0
+108.969 663.13 0
+112.391 667.667 0
+111.631 669.291 0
+109.111 668.426 0
+>
+70.6097 508.329 0
+73.4651 509.494 0
+72.3967 510.348 0
+74.6657 511.708 0
+73.6989 512.871 0
+70.6118 508.518 0
+70.6097 508.329 0
+>
+-81.7542 311.327 0
+-80.1896 309.95 0
+-76.955 311.907 0
+-76.6891 314.906 0
+-78.1723 315.449 0
+-81.746 311.693 0
+-81.7542 311.327 0
+>
+-90.9091 303.585 0
+-87.1052 304.107 0
+-86.746 306.727 0
+-89.942 306.568 0
+-90.7053 303.769 0
+-90.9091 303.585 0
+>
+145.265 688.506 0
+145.264 688.417 0
+144.675 686.382 0
+147.179 685.592 0
+146.807 688.309 0
+147.483 688.494 0
+>
+87.7259 600.952 0
+91.6552 604.979 0
+90.2157 606.788 0
+88.2547 605.102 0
+87.7316 601.506 0
+87.7259 600.952 0
+>
+87.2024 597.355 0
+92.6355 596.004 0
+89.4632 599.693 0
+87.5176 599.613 0
+87.2062 597.721 0
+87.2024 597.355 0
+>
+-6.32359 465.671 0
+-1.65443 462.496 0
+1.52835 464.426 0
+-0.11661 466.073 0
+-6.22285 465.802 0
+-6.32359 465.671 0
+>
+125.614 624.624 0
+125.8 623.481 0
+127.26 624.114 0
+129.994 626.821 0
+125.616 624.812 0
+125.614 624.624 0
+>
+87.3875 587.014 0
+91.4485 584.247 0
+92.4599 588.071 0
+89.9447 589.614 0
+87.3904 587.302 0
+87.3875 587.014 0
+>
+136.201 673.499 0
+140.06 672.789 0
+142.392 675.224 0
+137.761 675.939 0
+136.202 673.688 0
+136.201 673.499 0
+>
+-12.2725 468.682 0
+-16.7483 471.402 0
+-13.6816 466.956 0
+-12.2109 466.652 0
+-11.9774 468.676 0
+-12.2725 468.682 0
+>
+68.0556 524.615 0
+70.2891 523.071 0
+71.7787 524.938 0
+70.3442 527.858 0
+68.0561 524.66 0
+68.0556 524.615 0
+>
+-60.7258 353.381 0
+-57.5111 350.308 0
+-53.1144 351.458 0
+-57.3988 355.661 0
+-60.7241 353.458 0
+-60.7258 353.381 0
+>
+27.5626 468.046 0
+25.4741 466.537 0
+26.7206 464.357 0
+31.877 467.085 0
+27.7593 468.043 0
+27.5626 468.046 0
+>
+-47.2764 290.176 0
+-46.2917 289.469 0
+-45.5668 290.797 0
+-46.8488 291.609 0
+-47.2709 290.453 0
+-47.2764 290.176 0
+>
+111.558 683.477 0
+112.796 681.472 0
+114.457 683.919 0
+113.019 685.072 0
+111.561 683.754 0
+111.558 683.477 0
+>
+65.9036 636.941 0
+67.3432 635.771 0
+68.6151 636.731 0
+67.4673 637.986 0
+65.9058 637.119 0
+65.9036 636.941 0
+>
+121.599 683.951 0
+123.424 682.873 0
+125.072 683.925 0
+123.924 685.174 0
+121.6 684.128 0
+121.599 683.951 0
+>
+75.6084 499.408 0
+76.6762 498.388 0
+76.5956 499.996 0
+75.6104 499.597 0
+75.6084 499.408 0
+>
+103.568 600.334 0
+105.413 600.04 0
+104.362 602.133 0
+103.572 600.799 0
+103.568 600.334 0
+>
+87.6367 611.115 0
+88.3066 610.133 0
+88.9032 611.467 0
+87.6387 611.303 0
+87.6367 611.115 0
+>
+26.7514 426.442 0
+27.9269 425.827 0
+29.8306 427.772 0
+26.8514 426.53 0
+26.7514 426.442 0
+>
+-64.4406 351.608 0
+-61.3778 350.755 0
+-60.4534 352.166 0
+-64.4349 351.874 0
+-64.4406 351.608 0
+>
+4.81566 431.207 0
+5.37809 429.402 0
+6.89062 431.361 0
+4.81877 431.395 0
+4.81566 431.207 0
+>
+23.818 493.439 0
+25.2642 491.71 0
+26.5842 494.605 0
+23.8195 493.539 0
+23.818 493.439 0
+>
+-46.1075 288.679 0
+-42.7991 289.357 0
+-44.5679 290.821 0
+-45.9044 288.852 0
+-46.1075 288.679 0
+>
+122.191 685.697 0
+127.009 684.93 0
+125.002 687.571 0
+122.192 685.886 0
+122.191 685.697 0
+>
+-68.0531 350.023 0
+-65.6248 352 0
+-67.8112 352.003 0
+-68.0492 350.201 0
+-68.0531 350.023 0
+>
+64.9013 595.115 0
+69.3682 594.418 0
+69.193 596.038 0
+64.9035 595.292 0
+64.9013 595.115 0
+>
+15.4777 444.058 0
+17.2482 443.809 0
+17.663 445.133 0
+15.4792 444.158 0
+15.4777 444.058 0
+>
+57.7629 476.257 0
+60.4302 477.377 0
+60.8462 479.267 0
+57.7721 477 0
+57.7629 476.257 0
+>
+152.082 682.099 0
+153.62 680.751 0
+152.86 683.248 0
+152.083 682.287 0
+152.082 682.099 0
+>
+69.5904 521.916 0
+70.7499 520.573 0
+72.3282 521.607 0
+69.5926 522.104 0
+69.5904 521.916 0
+>
+65.2185 605.085 0
+65.7831 603.56 0
+67.8326 604.222 0
+65.2198 605.185 0
+65.2185 605.085 0
+>
+71.5293 520.231 0
+74.0494 517.942 0
+73.4935 520.763 0
+71.6277 520.274 0
+71.5293 520.231 0
+>
+143.332 670.698 0
+145.261 670.033 0
+145.172 671.463 0
+143.333 670.786 0
+143.332 670.698 0
+>
+25.7656 505.336 0
+29.1858 504.531 0
+27.7563 507.29 0
+25.7696 505.602 0
+25.7656 505.336 0
+>
+115.847 688.706 0
+115.75 688.662 0
+116.114 685.889 0
+117.765 687.316 0
+115.847 688.706 0
+>
+75.0812 566.28 0
+77.998 565.46 0
+79.192 567.619 0
+75.0822 566.368 0
+75.0812 566.28 0
+>
+109.819 660.862 0
+110.087 658.234 0
+112.826 661.856 0
+109.82 660.962 0
+109.819 660.862 0
+>
+-40.8126 375.601 0
+-39.131 375.379 0
+-39.2646 378.664 0
+-40.8089 375.789 0
+-40.8126 375.601 0
+>
+105.262 616.021 0
+106.421 615.324 0
+106.824 617.027 0
+105.264 616.209 0
+105.262 616.021 0
+>
+20.9318 446.191 0
+22.6851 444.823 0
+23.8197 448.175 0
+20.9333 446.29 0
+20.9318 446.191 0
+>
+75.8129 509.102 0
+77.4859 509.738 0
+76.8135 510.986 0
+75.814 509.202 0
+75.8129 509.102 0
+>
+-33.765 396.438 0
+-31.6904 396.21 0
+-32.4599 397.378 0
+-33.7616 396.616 0
+-33.765 396.438 0
+>
+99.1841 546.63 0
+100.05 545.193 0
+102.022 547.17 0
+99.1868 546.918 0
+99.1841 546.63 0
+>
+88.2767 607.229 0
+88.8506 606.337 0
+90.3282 608.306 0
+88.2785 607.407 0
+88.2767 607.229 0
+>
+94.4879 514.917 0
+99.6048 517.54 0
+96.4702 517.436 0
+94.4887 515.006 0
+94.4879 514.917 0
+>
+93.4693 688.91 0
+93.4665 688.633 0
+94.4056 686.086 0
+96.8122 685.508 0
+101.668 688.83 0
+>
+111.217 688.744 0
+111.502 688.221 0
+113.145 688.595 0
+113.82 688.589 0
+114.014 688.721 0
+>
+256.784 218.949 0
+260.594 219.141 0
+258.483 220.473 0
+256.783 219.226 0
+256.784 218.949 0
+>
+14.7751 468.143 0
+12.7849 466.734 0
+16.8528 468.886 0
+14.6789 468.278 0
+14.7751 468.143 0
+>
+91.6298 553.262 0
+95.7579 556.181 0
+94.6014 557.721 0
+91.6316 553.439 0
+91.6298 553.262 0
+>
+109.489 678.608 0
+111.032 678.395 0
+110.079 679.844 0
+109.492 678.874 0
+109.489 678.608 0
+>
+103.552 598.583 0
+106.256 596.343 0
+105.799 599.715 0
+103.556 598.948 0
+103.552 598.583 0
+>
+-80.2445 307.501 0
+-78.3399 307.924 0
+-79.0182 308.815 0
+-80.0421 307.629 0
+-80.2445 307.501 0
+>
+126.129 628.787 0
+127.386 628.357 0
+127.394 629.521 0
+126.129 628.876 0
+126.129 628.787 0
+>
+136.54 681.443 0
+137.691 680.283 0
+138.666 681.895 0
+136.542 681.731 0
+136.54 681.443 0
+>
+133.411 675.179 0
+133.884 673.647 0
+135.142 674.071 0
+133.508 675.323 0
+133.411 675.179 0
+>
+22.9294 486.714 0
+24.5006 486.69 0
+23.7353 488.032 0
+23.0303 486.89 0
+22.9294 486.714 0
+>
+119.292 685.165 0
+120.637 684.468 0
+121.039 686.448 0
+119.293 685.343 0
+119.292 685.165 0
+>
+77.1048 590.261 0
+78.6557 589.69 0
+77.8941 591.216 0
+77.107 590.449 0
+77.1048 590.261 0
+>
+-81.2316 325.643 0
+-79.2552 324.944 0
+-81.2296 325.731 0
+-81.2316 325.643 0
+>
+-92.8179 328.55 0
+-90.9279 328.45 0
+-92.8071 329.004 0
+-92.8074 328.993 0
+>
+-23.5838 357.99 0
+-23.3835 358.086 0
+-22.0687 359.403 0
+-23.5838 357.99 0
+>
+-23.4971 473.47 0
+-21.6269 473.534 0
+-23.4899 473.846 0
+-23.4971 473.47 0
+>
+-25.7068 414.299 0
+-24.3113 414.916 0
+-25.6966 414.842 0
+-25.7068 414.299 0
+>
+-78.6954 309.872 0
+-77.0903 310.302 0
+-78.4919 310.056 0
+-78.6954 309.872 0
+>
+131.045 653.586 0
+131.91 652.716 0
+131.046 653.775 0
+131.045 653.586 0
+>
+30.6839 506.359 0
+33.1469 507.154 0
+30.6867 506.548 0
+30.6839 506.359 0
+>
+65.3922 498.14 0
+66.8602 497.845 0
+65.3942 498.317 0
+65.3922 498.14 0
+>
+122.473 645.89 0
+124.031 647.086 0
+122.766 646.22 0
+122.473 645.89 0
+>
+74.7177 585.766 0
+76.9475 584.91 0
+74.7188 585.855 0
+74.7177 585.766 0
+>
+128.98 648.713 0
+130.624 648.514 0
+128.981 648.891 0
+128.98 648.713 0
+>
+106.416 603.633 0
+108.161 603.064 0
+106.417 603.733 0
+106.416 603.633 0
+>
+61.1547 591.194 0
+63.4936 591.441 0
+61.1664 592.113 0
+61.1547 591.194 0
+>
+88.3128 534.08 0
+90.2776 534.991 0
+88.4124 534.268 0
+88.3128 534.08 0
+>
+-9.73697 428.684 0
+-7.93452 430.138 0
+-9.7352 428.784 0
+-9.73697 428.684 0
+>
+48.0982 473.799 0
+49.4827 474.423 0
+48.0994 473.887 0
+48.0982 473.799 0
+>
+-45.5693 375.785 0
+-43.6106 374.548 0
+-45.5599 376.25 0
+-45.5693 375.785 0
+>
+130.248 650.178 0
+131.309 649.628 0
+130.346 650.311 0
+130.248 650.178 0
+>
+28.0167 425.216 0
+29.4133 426.215 0
+28.0193 425.393 0
+28.0167 425.216 0
+>
+108.721 634.419 0
+106.098 633.733 0
+108.817 634.319 0
+108.721 634.419 0
+>
+-9.14882 434.039 0
+-7.38796 433.166 0
+-9.14392 434.316 0
+-9.14882 434.039 0
+>
+73.3231 514.305 0
+75.3799 514.271 0
+73.3251 514.482 0
+73.3231 514.305 0
+>
+26.2446 511.048 0
+27.0124 509.972 0
+26.2459 511.136 0
+26.2446 511.048 0
+>
+19.1525 458.598 0
+20.6475 459.783 0
+19.1541 458.698 0
+19.1525 458.598 0
+>
+97.0149 596.249 0
+99.064 596.962 0
+97.0166 596.427 0
+97.0149 596.249 0
+>
+-37.2413 385.786 0
+-35.5648 385.376 0
+-37.2396 385.874 0
+-37.2413 385.786 0
+>
+24.195 427.123 0
+25.5781 427.202 0
+24.2005 427.489 0
+24.195 427.123 0
+>
+74.1882 512.821 0
+75.178 513.73 0
+74.1933 513.275 0
+74.1882 512.821 0
+>
+-55.3699 324.064 0
+-54.5887 323.305 0
+-55.2694 324.106 0
+-55.3699 324.064 0
+>
+89.7566 551.43 0
+91.4273 552.521 0
+89.7576 551.529 0
+89.7566 551.43 0
+>
+46.4321 481.567 0
+48.3108 482.473 0
+46.5323 481.71 0
+46.4321 481.567 0
+>
+128.925 654.808 0
+130.761 654.43 0
+128.926 654.997 0
+128.925 654.808 0
+>
+106.054 639.751 0
+108.181 639.178 0
+106.056 639.939 0
+106.054 639.751 0
+>
+-94.0406 276.232 0
+-94.0406 276.232 0
+-93.0437 276.098 0
+-94.0404 276.243 0
+>
+116.475 682.794 0
+118.307 682.591 0
+116.483 683.802 0
+116.475 682.794 0
+>
+18.304 409.845 0
+19.778 409.269 0
+18.3111 410.311 0
+18.304 409.845 0
+>
+139.566 670.985 0
+140.912 669.825 0
+139.567 671.085 0
+139.566 670.985 0
+>
+126.411 668.678 0
+128.142 667.458 0
+126.413 668.955 0
+126.411 668.678 0
+>
+-3.08867 436.428 0
+-1.60158 436.857 0
+-2.98852 436.514 0
+-3.08867 436.428 0
+>
+14.9752 405.552 0
+16.4483 404.887 0
+15.0757 405.65 0
+14.9752 405.552 0
+>
+110.561 645.718 0
+112.029 647.59 0
+110.562 645.807 0
+110.561 645.718 0
+>
+29.4011 425.373 0
+30.4963 426.022 0
+29.4066 425.75 0
+29.4011 425.373 0
+>
+29.3365 448.093 0
+30.8263 448.914 0
+29.3433 448.559 0
+29.3365 448.093 0
+>
+129.515 684.536 0
+133.556 682.758 0
+129.516 684.625 0
+129.515 684.536 0
+>
+130.152 562.266 0
+131.619 563.01 0
+130.348 562.453 0
+130.152 562.266 0
+>
+272.939 236.829 0
+274.343 236.56 0
+272.938 237.095 0
+272.939 236.829 0
+>
+78.252 588.397 0
+79.6045 587.463 0
+78.2572 588.863 0
+78.252 588.397 0
+>
+-59.0225 325.614 0
+-56.5244 326.028 0
+-59.007 326.357 0
+-59.0225 325.614 0
+>
+-58.648 319.686 0
+-56.7728 318.827 0
+-58.4458 319.826 0
+-58.648 319.686 0
+>
+47.9417 476.837 0
+49.1367 478.029 0
+47.9501 477.48 0
+47.9417 476.837 0
+>
+-71.4215 346.027 0
+-69.9124 346.826 0
+-71.4195 346.116 0
+-71.4215 346.027 0
+>
+76.2021 639.035 0
+79.309 639.554 0
+76.2033 639.135 0
+76.2021 639.035 0
+>
+130.411 660.062 0
+131.953 659.221 0
+130.413 660.339 0
+130.411 660.062 0
+>
+71.1166 492.533 0
+72.5018 493.537 0
+71.125 493.275 0
+71.1166 492.533 0
+>
+23.684 497.509 0
+25.049 496.923 0
+23.6939 498.152 0
+23.684 497.509 0
+>
+20.9656 441.945 0
+22.4428 441.834 0
+20.9685 442.134 0
+20.9656 441.945 0
+>
+-84.4002 339.489 0
+-82.7943 340.095 0
+-84.3984 339.566 0
+-84.4002 339.489 0
+>
+-52.0477 369.453 0
+-49.942 370.519 0
+-52.042 369.73 0
+-52.0477 369.453 0
+>
+108.463 604.313 0
+108.745 603.114 0
+108.658 604.312 0
+108.463 604.313 0
+>
+22.7763 470.28 0
+24.653 470.805 0
+22.7768 470.313 0
+22.7763 470.28 0
+>
+100.976 582.638 0
+103.32 583.437 0
+100.978 582.915 0
+100.976 582.638 0
+>
+70.5375 519.134 0
+72.001 518.663 0
+70.5397 519.323 0
+70.5375 519.134 0
+>
+72.3571 506.836 0
+74.3338 508.298 0
+72.3591 507.013 0
+72.3571 506.836 0
+>
+131.535 565.027 0
+132.802 564.941 0
+131.536 565.138 0
+131.535 565.027 0
+>
+79.986 568.896 0
+81.3569 569.435 0
+80.1826 569.038 0
+79.986 568.896 0
+>
+108.627 623.516 0
+110.085 623.736 0
+108.531 623.605 0
+108.627 623.516 0
+>
+94.2907 596.176 0
+96.2403 596.623 0
+94.2917 596.276 0
+94.2907 596.176 0
+>
+71.6693 515.332 0
+75.1933 515.115 0
+71.6716 515.531 0
+71.6693 515.332 0
+>
+106.266 630.884 0
+107.521 630.23 0
+106.267 630.983 0
+106.266 630.884 0
+>
+75.0749 513.266 0
+76.9321 512.879 0
+75.1733 513.309 0
+75.0749 513.266 0
+>
+80.1635 152.523 0
+81.6797 152.974 0
+80.1661 152.8 0
+80.1635 152.523 0
+>
+125.524 666.29 0
+128.131 665.895 0
+125.525 666.368 0
+125.524 666.29 0
+>
+-79.1817 337.052 0
+-76.6929 337.096 0
+-78.8761 337.367 0
+-79.1817 337.052 0
+>
+132.807 565.772 0
+133.779 565.201 0
+132.808 565.861 0
+132.807 565.772 0
+>
+21.077 442.786 0
+22.9563 443.201 0
+21.1767 442.862 0
+21.077 442.786 0
+>
+48.7705 472.582 0
+49.3464 471.511 0
+48.8707 472.725 0
+48.7705 472.582 0
+>
+88.3823 550.712 0
+89.66 551.53 0
+88.385 550.978 0
+88.3823 550.712 0
+>
+-0.36632 434.075 0
+0.72638 434.511 0
+-0.26618 434.162 0
+-0.36632 434.075 0
+>
+24.7335 495.542 0
+25.5335 496.517 0
+24.735 495.642 0
+24.7335 495.542 0
+>
+-1.72838 435.207 0
+-0.45406 434.72 0
+-1.42625 435.568 0
+-1.72838 435.207 0
+>
+94.0366 518.977 0
+95.1172 519.343 0
+94.0384 519.165 0
+94.0366 518.977 0
+>
+99.3195 518.474 0
+100.291 517.634 0
+99.3237 518.939 0
+99.3195 518.474 0
+>
+93.897 535.145 0
+95.1733 535.687 0
+93.9961 535.277 0
+93.897 535.145 0
+>
+88.7972 533.621 0
+89.9761 534.163 0
+88.7998 533.887 0
+88.7972 533.621 0
+>
+110.145 676.286 0
+110.526 675.607 0
+110.15 676.84 0
+110.145 676.286 0
+>
+77.0122 555.73 0
+78.5758 555.891 0
+77.0143 555.919 0
+77.0122 555.73 0
+>
+31.1416 497.486 0
+32.4129 497.19 0
+31.2403 497.529 0
+31.1416 497.486 0
+>
+-80.4476 302.881 0
+-79.037 303.493 0
+-80.4434 303.069 0
+-80.4476 302.881 0
+>
+113.035 686.967 0
+114.191 686.78 0
+113.037 687.244 0
+113.035 686.967 0
+>
+130.365 667.442 0
+131.714 666.99 0
+130.656 667.718 0
+130.365 667.442 0
+>
+92.4275 514.56 0
+93.61 515.302 0
+92.4285 514.66 0
+92.4275 514.56 0
+>
+85.0373 576.411 0
+86.1109 576.588 0
+85.0413 576.799 0
+85.0373 576.411 0
+>
+21.8085 496.795 0
+22.7045 497.624 0
+21.81 496.895 0
+21.8085 496.795 0
+>
+-21.9298 356.119 0
+-21.8281 356.251 0
+-20.6133 357.526 0
+-21.9298 356.119 0
+>
+13.7104 406.88 0
+14.6888 406.21 0
+13.7118 406.968 0
+13.7104 406.88 0
+>
+111.976 204.595 0
+113.285 205.14 0
+111.979 205.06 0
+111.976 204.595 0
+>
+110.371 657.444 0
+111.343 658.09 0
+110.372 657.633 0
+110.371 657.444 0
+>
+126.944 662.114 0
+128.205 662.67 0
+126.946 662.302 0
+126.944 662.114 0
+>
+128.757 658.5 0
+129.913 657.938 0
+128.758 658.688 0
+128.757 658.5 0
+>
+130.645 651.561 0
+132.189 650.908 0
+130.645 651.65 0
+130.645 651.561 0
+>
+151.704 683.674 0
+152.957 683.48 0
+151.705 684.029 0
+151.704 683.674 0
+>
+-72.3362 285.793 0
+-71.5183 286.662 0
+-72.3341 285.892 0
+-72.3362 285.793 0
+>
+22.9031 452.722 0
+26.0765 454.159 0
+22.9047 452.822 0
+22.9031 452.722 0
+>
+-30.211 472.214 0
+-28.6464 471.729 0
+-30.1118 472.256 0
+-30.211 472.214 0
+>
+33.0455 473.086 0
+34.0416 473.981 0
+33.0521 473.541 0
+33.0455 473.086 0
+>
+124.371 667.219 0
+125.92 667.562 0
+124.372 667.307 0
+124.371 667.219 0
+>
+35.9237 474.974 0
+37.4032 475.319 0
+35.9264 475.162 0
+35.9237 474.974 0
+>
+98.4648 510.625 0
+99.5492 511.358 0
+98.4666 510.825 0
+98.4648 510.625 0
+>
+121.219 684.785 0
+122.862 685.138 0
+121.225 685.527 0
+121.219 684.785 0
+>
+70.9565 637.988 0
+72.0258 638.253 0
+70.96 638.276 0
+70.9565 637.988 0
+>
+-10.7157 434.71 0
+-9.3265 435.151 0
+-10.6155 434.797 0
+-10.7157 434.71 0
+>
+19.9827 409.731 0
+20.968 409.517 0
+19.9856 409.919 0
+19.9827 409.731 0
+>
+-82.2114 330.744 0
+-81.0111 330.983 0
+-82.2071 330.932 0
+-82.2114 330.744 0
+>
+104.84 676.976 0
+106.964 676.868 0
+104.938 677.119 0
+104.84 676.976 0
+>
+42.0657 478.401 0
+45.2361 480.298 0
+42.2642 478.543 0
+42.0657 478.401 0
+>
+83.4367 644.872 0
+84.7005 645.313 0
+83.4386 645.05 0
+83.4367 644.872 0
+>
+124.116 645.423 0
+125.375 645.425 0
+124.116 645.512 0
+124.116 645.423 0
+>
+125.116 622.7 0
+126.28 622.78 0
+125.116 622.788 0
+125.116 622.7 0
+>
+72.6993 528.44 0
+73.7714 528.063 0
+72.7976 528.484 0
+72.6993 528.44 0
+>
+97.1979 511.379 0
+98.4757 511.833 0
+97.396 511.61 0
+97.1979 511.379 0
+>
+68.1172 529.867 0
+69.2009 530.509 0
+68.1185 529.978 0
+68.1172 529.867 0
+>
+-61.6237 320.314 0
+-60.4211 320.654 0
+-61.4218 320.442 0
+-61.6237 320.314 0
+>
+1.95446 431.254 0
+3.03827 431.147 0
+1.95762 431.443 0
+1.95446 431.254 0
+>
+265.52 216.582 0
+266.823 216.765 0
+265.519 216.77 0
+265.52 216.582 0
+>
+121.718 686.997 0
+122.782 687.355 0
+121.719 687.086 0
+121.718 686.997 0
+>
+149.247 674.999 0
+150.21 674.44 0
+149.248 675.088 0
+149.247 674.999 0
+>
+-55.3375 354.465 0
+-53.554 354.228 0
+-55.2363 354.551 0
+-55.3375 354.465 0
+>
+47.8642 478.412 0
+48.663 479.377 0
+47.8655 478.512 0
+47.8642 478.412 0
+>
+92.5795 560.544 0
+93.7566 561.197 0
+92.5805 560.644 0
+92.5795 560.544 0
+>
+13.3496 427.932 0
+14.3437 428.382 0
+13.351 428.021 0
+13.3496 427.932 0
+>
+125.771 687.156 0
+126.728 686.085 0
+125.772 687.244 0
+125.771 687.156 0
+>
+-81.3981 340.24 0
+-79.5956 340.754 0
+-81.3915 340.529 0
+-81.3981 340.24 0
+>
+109.575 677.299 0
+110.546 677.945 0
+109.579 677.765 0
+109.575 677.299 0
+>
+105.426 623.588 0
+106.197 622.939 0
+105.429 623.865 0
+105.426 623.588 0
+>
+117.179 686.379 0
+118.339 686.647 0
+117.181 686.656 0
+117.179 686.379 0
+>
+-83.4393 316.167 0
+-82.244 316.129 0
+-83.3367 316.298 0
+-83.4393 316.167 0
+>
+264.812 217.775 0
+265.717 217.325 0
+264.812 217.963 0
+264.812 217.775 0
+>
+72.0403 513.488 0
+73.0251 513.942 0
+72.0423 513.665 0
+72.0403 513.488 0
+>
+-29.3224 472.374 0
+-28.337 472.455 0
+-29.3185 472.574 0
+-29.3224 472.374 0
+>
+-93.2655 309.495 0
+-93.2653 309.507 0
+-93.265 309.518 0
+>
+-94.1148 273.028 0
+-92.5515 271.418 0
+-94.0925 273.993 0
+>
+703.932 311.48 0
+709.675 312.951 0
+707.541 316.347 0
+713.513 314.538 0
+714.937 316.451 0
+717.825 316.756 0
+719.057 318.44 0
+716.096 322.469 0
+719.023 321.753 0
+718.378 325.352 0
+727.058 325.75 0
+731.144 330.868 0
+732.647 335.569 0
+735.43 338.277 0
+735.631 343.024 0
+733.753 349.708 0
+731.763 349.58 0
+728.923 353.088 0
+727.267 352.118 0
+727.884 349.274 0
+725.993 344.336 0
+721.326 338.861 0
+718.45 338.377 0
+719.351 335.867 0
+713.555 330.996 0
+716.258 328.38 0
+714.71 329.608 0
+711.725 326.798 0
+704.405 324.929 0
+702.025 327.015 0
+704.361 331.131 0
+700.624 332.196 0
+700.966 331.109 0
+698.986 333.244 0
+693.841 332.033 0
+690.995 333.347 0
+690.908 330.386 0
+693.109 327.692 0
+691.684 325.781 0
+693.525 322.05 0
+695.558 321.161 0
+696.513 322.309 0
+702.443 318.882 0
+700.699 314.879 0
+697.397 314.94 0
+696.017 311.819 0
+692.985 310.046 0
+691.741 311.199 0
+688.677 310.249 0
+688.973 307.715 0
+685.087 304.646 0
+684.567 302.503 0
+681.828 303.513 0
+678.627 300.794 0
+675.856 302.681 0
+681.196 288.153 0
+677.956 283.633 0
+675.843 283.878 0
+673.832 278.538 0
+671.957 277.725 0
+674.859 275.097 0
+671.065 277.46 0
+669.131 275.491 0
+672.931 270.171 0
+672.003 262.493 0
+674.134 261.836 0
+678.581 263.753 0
+680.577 266.793 0
+688.788 272.608 0
+687.886 275.298 0
+683.351 273.185 0
+681.318 276.677 0
+687.118 285.138 0
+686.338 287.232 0
+689.779 288.984 0
+688.514 290.648 0
+691.258 292.274 0
+694.916 288.255 0
+697.633 287.936 0
+692.389 294.139 0
+692.794 296.656 0
+687.794 301.835 0
+691.181 304.876 0
+699.652 303.154 0
+698.462 305.476 0
+704.55 308.447 0
+703.648 311.058 0
+703.932 311.48 0
+>
+807.965 510.318 0
+809.834 508.497 0
+811.577 509.132 0
+812.473 507.05 0
+818.507 506.803 0
+819.381 505.176 0
+820.545 505.571 0
+819.902 508.458 0
+822.271 508.447 0
+821.086 506.569 0
+823.893 507.64 0
+821.068 503.091 0
+822.949 504.905 0
+824.519 499.414 0
+828.281 497.37 0
+831.814 497.834 0
+831.293 496.469 0
+832.935 495.307 0
+831.689 500.202 0
+828.641 501.803 0
+834.844 500.324 0
+835.199 504.813 0
+836.524 504.036 0
+842.169 507.459 0
+835.332 511.598 0
+838.527 510.921 0
+840.177 513.295 0
+839.317 516.448 0
+842.501 515.973 0
+847.419 518.101 0
+846.897 520.437 0
+849.902 521.425 0
+854.223 528.956 0
+859.351 528.972 0
+863.12 532.116 0
+864.568 536.191 0
+861.729 539.367 0
+861.086 543.804 0
+856.744 540.394 0
+859.789 535.276 0
+859.382 533.726 0
+857.141 536.802 0
+858.537 532.976 0
+856.772 532.789 0
+856.479 530.954 0
+854.899 531.001 0
+855.703 534.302 0
+854.593 534.754 0
+851.867 530.566 0
+854.626 537.733 0
+848.516 534.14 0
+846.569 535.506 0
+844.082 530.498 0
+845.466 528.61 0
+843.027 526.315 0
+842.247 529.796 0
+840.376 527.944 0
+838.988 529.91 0
+838.21 526.055 0
+832.872 526.316 0
+834.472 524.038 0
+833.733 523.106 0
+832.356 524.895 0
+830.202 522.74 0
+827.37 524.084 0
+824.349 519.656 0
+815.246 516.441 0
+819.361 513.166 0
+821.06 514.647 0
+824.694 513.076 0
+822.004 513.582 0
+819.58 510.848 0
+817.403 512.875 0
+815.653 512.372 0
+815.55 510.551 0
+812.596 512.349 0
+811.014 510.507 0
+807.956 510.485 0
+807.965 510.318 0
+>
+812.384 503.011 0
+814.687 498.527 0
+817.083 498.037 0
+817.159 490.764 0
+820.207 494.922 0
+823.738 489.71 0
+824.469 492.769 0
+826.794 493.67 0
+827.287 489.895 0
+829.382 491.442 0
+830.611 494.393 0
+829.324 496.321 0
+827.351 494.356 0
+825.466 496.398 0
+824.356 494.947 0
+823.866 496.772 0
+822.46 495.306 0
+822.289 496.701 0
+821.245 495.856 0
+822.688 498.527 0
+819.939 496.29 0
+819.367 497.798 0
+821.3 498.623 0
+819.73 498.419 0
+820.165 499.567 0
+822.741 499.41 0
+821.849 501.37 0
+821.004 500.524 0
+820.434 501.988 0
+819.288 499.321 0
+816.052 500.792 0
+816.685 501.928 0
+815.272 502.513 0
+818.989 503.206 0
+818.739 504.218 0
+812.375 503.189 0
+812.384 503.011 0
+>
+797.265 459.341 0
+793.886 461.604 0
+794.212 465.061 0
+792.682 466 0
+794.513 467.014 0
+794.008 469.228 0
+786.8 468.911 0
+785.279 461.465 0
+788.186 454.556 0
+785.726 450.084 0
+789.644 446.92 0
+790.998 443.51 0
+796.507 444.423 0
+799.992 450.207 0
+801.291 456.041 0
+797.468 459.24 0
+797.265 459.341 0
+>
+816.192 486.492 0
+817.177 484.636 0
+819.229 485.109 0
+821.603 483.181 0
+822.717 484.598 0
+822.506 486.771 0
+819.181 486.043 0
+817.269 488.631 0
+816.182 486.681 0
+816.192 486.492 0
+>
+701.791 373.368 0
+703.756 376.515 0
+701.286 376.061 0
+696.926 370.54 0
+695.334 367.976 0
+696.022 365.691 0
+696.54 367.701 0
+701.198 370.765 0
+701.695 373.275 0
+701.791 373.368 0
+>
+751.985 409.363 0
+754.134 405.72 0
+758.139 405.064 0
+770.906 417.098 0
+768.302 417.58 0
+759.294 412.528 0
+753.206 413.179 0
+751.861 409.925 0
+751.985 409.363 0
+>
+575.644 290.616 0
+580.702 288.576 0
+583.019 284.582 0
+586.954 283.454 0
+585.451 286.929 0
+587.066 289.829 0
+582.84 294.1 0
+575.639 290.783 0
+575.644 290.616 0
+>
+866.488 692.42 0
+869.779 687.829 0
+874.718 688.249 0
+872.046 693.825 0
+868.075 695.16 0
+866.477 692.609 0
+866.488 692.42 0
+>
+892.494 527.457 0
+885.1 522.151 0
+884.578 519.197 0
+888.85 517.067 0
+892.53 521.744 0
+892.618 521.928 0
+892.804 522.14 0
+>
+693.877 359.404 0
+694.79 356.415 0
+697.999 355.907 0
+698.042 359.889 0
+696.113 360.825 0
+693.973 359.496 0
+693.877 359.404 0
+>
+678.301 333.8 0
+679.949 332.417 0
+686.687 333.738 0
+683.999 336.192 0
+678.824 335.809 0
+678.28 334.355 0
+678.301 333.8 0
+>
+633.484 277.684 0
+636.124 276.628 0
+636.847 278.962 0
+638.774 278.238 0
+636.401 280.335 0
+633.581 277.787 0
+633.484 277.684 0
+>
+639.363 272.615 0
+640.5 268.622 0
+642.836 273.654 0
+642.009 277.38 0
+640.704 277.47 0
+639.354 272.893 0
+639.363 272.615 0
+>
+844.907 646.346 0
+846.084 644.517 0
+848.479 645.334 0
+847.452 647.93 0
+845.674 648.297 0
+844.897 646.524 0
+844.907 646.346 0
+>
+812.25 515.262 0
+813.706 513.799 0
+816.551 514.09 0
+814.682 515.899 0
+812.235 515.551 0
+812.25 515.262 0
+>
+872.909 708.521 0
+872.818 708.415 0
+872.575 704.405 0
+876.53 703.294 0
+876.722 704.935 0
+874.07 708.592 0
+>
+631.89 274.4 0
+632.856 272.444 0
+634.911 273.933 0
+633.541 275.976 0
+631.884 274.577 0
+631.89 274.4 0
+>
+624.723 315.898 0
+628.216 315.958 0
+629.068 317.341 0
+626.818 318.977 0
+624.71 316.275 0
+624.723 315.898 0
+>
+853.427 667.84 0
+856.261 662.672 0
+858.947 666.767 0
+859.033 670.298 0
+853.41 668.129 0
+853.427 667.84 0
+>
+741.158 372.55 0
+744.052 370.127 0
+747.627 370.415 0
+745.327 375.189 0
+741.038 373.012 0
+741.158 372.55 0
+>
+703.599 327.632 0
+706.933 326.696 0
+707.172 328.24 0
+704.991 330.333 0
+703.436 329.238 0
+703.599 327.632 0
+>
+618.388 292.472 0
+619.349 290.604 0
+621.001 292.09 0
+619.729 294.314 0
+618.487 292.52 0
+618.388 292.472 0
+>
+836.241 695.944 0
+837.215 694.192 0
+839.323 694.726 0
+838.256 696.393 0
+836.329 696.094 0
+836.241 695.944 0
+>
+704.389 332.956 0
+706.122 332.046 0
+706.358 333.667 0
+704.371 333.4 0
+704.389 332.956 0
+>
+791.597 571.086 0
+789 570.064 0
+791.5 569.132 0
+791.701 570.98 0
+791.597 571.086 0
+>
+807.977 610.508 0
+811.357 607.655 0
+811.272 611.095 0
+807.973 610.597 0
+807.977 610.508 0
+>
+701.788 294.499 0
+704.467 295.158 0
+703.679 297.396 0
+701.749 295.509 0
+701.788 294.499 0
+>
+837.748 671.136 0
+838.995 669.768 0
+839.249 672.147 0
+837.738 671.314 0
+837.748 671.136 0
+>
+810.365 484.424 0
+812.342 484.435 0
+812.752 489.982 0
+810.346 484.79 0
+810.365 484.424 0
+>
+700.045 290.352 0
+701.204 288.862 0
+701.943 290.503 0
+700.042 290.441 0
+700.045 290.352 0
+>
+704.766 297.76 0
+704.804 299.374 0
+703.542 298.358 0
+704.771 297.649 0
+704.766 297.76 0
+>
+628.68 271.429 0
+629.825 270.123 0
+630.07 271.841 0
+628.672 271.696 0
+628.68 271.429 0
+>
+689.176 326.052 0
+690.05 324.096 0
+691.15 326.683 0
+689.169 326.241 0
+689.176 326.052 0
+>
+698.459 282.043 0
+699.491 281.282 0
+700.215 283.311 0
+698.556 282.136 0
+698.459 282.043 0
+>
+634.314 270.782 0
+634.943 269.925 0
+635.19 271.544 0
+634.305 271.048 0
+634.314 270.782 0
+>
+699.31 293.836 0
+699.769 292.331 0
+701.46 292.619 0
+699.303 294.025 0
+699.31 293.836 0
+>
+589.321 287.965 0
+594.942 290.62 0
+589.316 288.153 0
+589.321 287.965 0
+>
+811.382 495.539 0
+813.016 494.497 0
+811.269 495.812 0
+811.382 495.539 0
+>
+694.049 271.405 0
+696.877 273.557 0
+694.042 271.594 0
+694.049 271.405 0
+>
+720.736 462.34 0
+722.582 460.795 0
+720.712 462.895 0
+720.736 462.34 0
+>
+636.253 275.744 0
+636.804 274.24 0
+636.247 275.932 0
+636.253 275.744 0
+>
+641.742 279.359 0
+642.513 277.297 0
+641.739 279.448 0
+641.742 279.359 0
+>
+694.366 354.509 0
+696.091 353.742 0
+694.362 354.609 0
+694.366 354.509 0
+>
+633.655 272.514 0
+635.375 272.016 0
+633.652 272.603 0
+633.655 272.514 0
+>
+696.421 363.116 0
+698.521 362.921 0
+696.418 363.205 0
+696.421 363.116 0
+>
+639.64 267.349 0
+639.737 267.441 0
+639.993 268.794 0
+639.64 267.349 0
+>
+586.618 288.073 0
+588.303 288.578 0
+586.612 288.25 0
+586.618 288.073 0
+>
+696.748 290.126 0
+698.183 289.258 0
+696.744 290.226 0
+696.748 290.126 0
+>
+692.972 364.738 0
+695.137 365.389 0
+692.968 364.838 0
+692.972 364.738 0
+>
+629.342 275.704 0
+630.404 276.938 0
+629.33 276.07 0
+629.342 275.704 0
+>
+649.198 275.159 0
+650.706 277.943 0
+649.195 275.259 0
+649.198 275.159 0
+>
+820.538 618.881 0
+821.878 619.422 0
+820.528 619.07 0
+820.538 618.881 0
+>
+659.364 282.455 0
+660.971 282.334 0
+659.358 282.643 0
+659.364 282.455 0
+>
+684.692 325.793 0
+686.095 325.668 0
+684.678 326.159 0
+684.692 325.793 0
+>
+822.777 485.348 0
+823.783 485.021 0
+822.872 485.431 0
+822.777 485.348 0
+>
+791.415 574.686 0
+792.054 573.694 0
+791.513 574.691 0
+791.415 574.686 0
+>
+-1160.78 -333.684 0
+-1159.9 -334.663 0
+-1158.76 -332.483 0
+-1155.73 -332.145 0
+-1147.94 -336.648 0
+-1147.72 -339.22 0
+-1141.98 -339.775 0
+-1139.73 -335.685 0
+-1136.49 -336.7 0
+-1137.14 -335.525 0
+-1131.73 -337.459 0
+-1130.78 -340.37 0
+-1129.83 -337.789 0
+-1125.34 -337.867 0
+-1121.95 -334.251 0
+-1117.46 -334.316 0
+-1113.31 -331.758 0
+-1108.34 -324.195 0
+-1104.05 -321.318 0
+-1102.14 -315.889 0
+-1107.9 -303.492 0
+-1110.38 -305.09 0
+-1116.39 -300.037 0
+-1114.84 -298.083 0
+-1116.36 -295.638 0
+-1118.82 -294.321 0
+-1122.23 -296.887 0
+-1121.81 -291.679 0
+-1124.96 -292.37 0
+-1124.92 -290.479 0
+-1121.28 -289.066 0
+-1121.39 -284.985 0
+-1123.03 -285.569 0
+-1123.34 -284.081 0
+-1121.28 -283.678 0
+-1121.36 -280.642 0
+-1119.95 -285.769 0
+-1117.48 -288.177 0
+-1115.45 -286.886 0
+-1114.43 -279.311 0
+-1116.16 -275.578 0
+-1121.29 -271.81 0
+-1127.52 -272.264 0
+-1131.29 -270.065 0
+-1137.59 -271.484 0
+-1136.78 -268.009 0
+-1136.82 -271.138 0
+-1134.68 -269.836 0
+-1136.96 -263.68 0
+-1136.1 -257.131 0
+-1137.88 -254.069 0
+-1135.94 -256.441 0
+-1134.09 -255.979 0
+-1134.66 -253.753 0
+-1132.89 -252.967 0
+-1131.04 -245.967 0
+-1131.68 -248.616 0
+-1129.43 -252.43 0
+-1127.69 -247.987 0
+-1122.11 -244.9 0
+-1122.21 -243.564 0
+-1114.37 -244.006 0
+-1114.43 -242.062 0
+-1110.7 -239.436 0
+-1108.55 -235.164 0
+-1107.23 -229.316 0
+-1112.74 -223.867 0
+-1111.21 -222.007 0
+-1112.68 -219.233 0
+-1110.72 -221.241 0
+-1110.04 -218.087 0
+-1107.76 -218.794 0
+-1109.99 -209.674 0
+-1108.23 -212.846 0
+-1105.72 -214.65 0
+-1104.9 -213.73 0
+-1106.45 -222.393 0
+-1102.75 -219.994 0
+-1102.11 -221.225 0
+-1104.15 -222.773 0
+-1100.32 -224.023 0
+-1101.28 -225.408 0
+-1105.36 -223.287 0
+-1106.83 -225.764 0
+-1104.41 -229.93 0
+-1107.4 -234.043 0
+-1105.14 -235.031 0
+-1100.3 -231.813 0
+-1096.21 -233.752 0
+-1088.07 -231.658 0
+-1085.27 -232.549 0
+-1084.78 -218.423 0
+-1083.26 -220.663 0
+-1083.01 -229.51 0
+-1074.57 -218.137 0
+-1066.18 -214.043 0
+-1066.07 -212.546 0
+-1062.73 -216.013 0
+-1056.73 -216.586 0
+-1052.47 -213.512 0
+-1045.44 -213.131 0
+-1036.56 -209.192 0
+-1038.58 -206.671 0
+-1041.76 -206.718 0
+-1044.4 -210.7 0
+-1042.69 -206.397 0
+-1044.51 -203.902 0
+-1040.67 -200.761 0
+-1040.52 -202.945 0
+-1034.48 -204.307 0
+-1036.8 -205.542 0
+-1036.4 -207.134 0
+-1031.41 -206.988 0
+-1035.62 -207.987 0
+-1034.27 -209.742 0
+-1020.19 -208.323 0
+-1021.41 -206.297 0
+-1026.73 -206.737 0
+-1023.79 -205.594 0
+-1027.79 -203.93 0
+-1023 -204.954 0
+-1021.95 -203.722 0
+-1022.37 -205.047 0
+-1020.82 -205.595 0
+-1019.73 -203.79 0
+-1020.15 -206.494 0
+-1017.09 -205.213 0
+-1018.88 -206.445 0
+-1018.12 -207.588 0
+-1013.54 -207.179 0
+-1011.83 -209.807 0
+-1013.92 -209.467 0
+-1012.86 -210.769 0
+-1015.68 -211.685 0
+-1015.45 -214.291 0
+-1018.68 -212.113 0
+-1018.26 -216.34 0
+-1000.71 -205.38 0
+-1004.54 -204.289 0
+-1009 -205.918 0
+-1007.03 -205.084 0
+-1007.93 -204.304 0
+-1004.13 -202.998 0
+-999.985 -205.57 0
+-996.848 -204.631 0
+-1000.82 -199.812 0
+-999.38 -200.339 0
+-1000.43 -198.814 0
+-996.906 -196.955 0
+-995.965 -204.132 0
+-992.392 -202.988 0
+-995.398 -205.022 0
+-993.243 -205.884 0
+-996.505 -205.696 0
+-994.869 -207.841 0
+-989.662 -206.061 0
+-987.392 -206.795 0
+-988.625 -204.907 0
+-990.366 -205.579 0
+-988.913 -204.513 0
+-987.031 -206.211 0
+-987.495 -208.187 0
+-981.703 -205.613 0
+-977.766 -206.661 0
+-982.616 -203.671 0
+-982.281 -200.579 0
+-976.812 -208.052 0
+-973.47 -205.702 0
+-973.558 -202.591 0
+-970.884 -199.266 0
+-965.995 -197.368 0
+-960.632 -197.625 0
+-963.666 -194.39 0
+-962.01 -194.838 0
+-960.36 -192.465 0
+-961.74 -191.145 0
+-960.313 -190.392 0
+-959.955 -186.943 0
+-964.646 -184.769 0
+-965.482 -187.529 0
+-965.66 -184.22 0
+-969.214 -182.366 0
+-970.075 -179.762 0
+-971.673 -179.971 0
+-970.58 -176.62 0
+-970.159 -179.474 0
+-967.678 -178.721 0
+-966.697 -181.13 0
+-963.623 -179.484 0
+-961.015 -181.279 0
+-960.591 -178.387 0
+-959.897 -180.413 0
+-958.327 -179.129 0
+-959.075 -180.71 0
+-957.63 -182.565 0
+-954.653 -182.208 0
+-953.454 -180.231 0
+-955.575 -189.057 0
+-952.041 -192.654 0
+-948.387 -191.701 0
+-944.121 -186.653 0
+-935.82 -182.595 0
+-935.032 -180.43 0
+-937.054 -182.179 0
+-938.869 -181.055 0
+-935.104 -178.508 0
+-935.511 -176.843 0
+-938.319 -177.813 0
+-935.487 -176.518 0
+-936.527 -174.876 0
+-934.303 -177.618 0
+-934.685 -179.993 0
+-929.944 -179.961 0
+-928.984 -181.259 0
+-920.928 -179.017 0
+-916.093 -180.577 0
+-915.966 -178.794 0
+-915.556 -180.424 0
+-915.846 -175.614 0
+-914.517 -179.134 0
+-916.371 -181.538 0
+-916.857 -186.913 0
+-912.608 -187.866 0
+-912.628 -191.144 0
+-905.104 -191.953 0
+-903.095 -190.313 0
+-901.288 -191.565 0
+-899.678 -189.605 0
+-895.005 -188.995 0
+-893.435 -184.554 0
+-896.724 -159.413 0
+-892.347 -167.412 0
+-887.454 -165.028 0
+-883.354 -166.494 0
+-891.716 -168.908 0
+-892.036 -171.983 0
+-890.414 -174.348 0
+-892.726 -177.374 0
+-879.95 -185.72 0
+-878.939 -187.849 0
+-871.598 -186.571 0
+-871.994 -184.665 0
+-869.515 -185.306 0
+-868.069 -177.943 0
+-864.413 -178.248 0
+-860.806 -173.047 0
+-857.611 -173.926 0
+-857.01 -169.692 0
+-852.849 -167.127 0
+-848.99 -167.465 0
+-849.561 -165.043 0
+-847.043 -163.469 0
+-847.314 -165.947 0
+-843.897 -171.326 0
+-844.951 -174.539 0
+-840.66 -179.457 0
+-833.076 -175.843 0
+-833.103 -173.076 0
+-827.625 -169.503 0
+-829.786 -164.111 0
+-828.539 -159.518 0
+-829.766 -157.47 0
+-829.395 -151.874 0
+-819.99 -141.067 0
+-821.94 -115.37 0
+-827.338 -113.277 0
+-829.027 -107.351 0
+-834.639 -105.385 0
+-825.993 -107.275 0
+-824.908 -112.878 0
+-820.157 -115.265 0
+-818.825 -112.533 0
+-819.221 -118.463 0
+-816.448 -117.613 0
+-819.327 -120.051 0
+-819.689 -138.098 0
+-818.081 -140.687 0
+-813.255 -138.893 0
+-817.189 -141.443 0
+-815.663 -148.476 0
+-817.952 -156.236 0
+-809.067 -159.714 0
+-808.028 -156.602 0
+-808.775 -160.058 0
+-806.858 -161.171 0
+-802.331 -159.172 0
+-802.865 -152.859 0
+-797.575 -148.708 0
+-796.686 -144.655 0
+-797.699 -142.524 0
+-794.297 -144.899 0
+-795.118 -139.793 0
+-792.934 -138.35 0
+-798.182 -124.197 0
+-794.881 -128.062 0
+-794.495 -126.93 0
+-791.104 -132.663 0
+-791.73 -135.89 0
+-786.323 -142.839 0
+-785.71 -141.43 0
+-784.234 -146.16 0
+-781.541 -148.195 0
+-775.199 -147.103 0
+-773.8 -144.801 0
+-775.1 -140.567 0
+-772.718 -144.218 0
+-774.149 -147.024 0
+-772 -146.093 0
+-771.329 -142.073 0
+-767.529 -139.787 0
+-769.286 -134.514 0
+-767.583 -132.344 0
+-765.275 -132.164 0
+-766.733 -128.796 0
+-762.792 -125.868 0
+-767.08 -126.013 0
+-771.963 -122.382 0
+-767.242 -112.111 0
+-766.914 -105.309 0
+-769.473 -102.946 0
+-775.387 -102.522 0
+-766.786 -101.67 0
+-769.403 -96.969 0
+-765.208 -99.807 0
+-773.002 -89.7678 0
+-765.73 -96.5532 0
+-763.343 -96.6942 0
+-762.649 -93.9781 0
+-766.327 -86.3703 0
+-768.559 -83.8364 0
+-772.211 -83.9711 0
+-769.038 -83.1995 0
+-773.732 -81.7288 0
+-770.265 -81.246 0
+-766.4 -84.2559 0
+-762.15 -84.5284 0
+-760.893 -82.7798 0
+-764.563 -78.3478 0
+-764.25 -76.7183 0
+-769.875 -73.6055 0
+-772.177 -67.4174 0
+-776.923 -65.2329 0
+-783.676 -65.1147 0
+-781.02 -64.2679 0
+-781.844 -62.5743 0
+-774.091 -64.868 0
+-771.142 -67.4848 0
+-772.06 -60.825 0
+-769.923 -55.1614 0
+-770.75 -50.3369 0
+-774.89 -46.9442 0
+-777.779 -46.6414 0
+-781.367 -50.6256 0
+-779.249 -46.881 0
+-782.694 -45.5747 0
+-780.226 -44.3799 0
+-783.895 -41.7556 0
+-773.215 -45.1686 0
+-769.506 -50.3734 0
+-765.81 -46.2714 0
+-769.022 -50.9214 0
+-766.426 -58.9135 0
+-762.924 -56.1892 0
+-766.379 -59.7919 0
+-765.069 -63.6253 0
+-763.18 -61.7388 0
+-762.514 -64.2955 0
+-762.236 -61.609 0
+-761.777 -64.1635 0
+-759.092 -57.9744 0
+-758.946 -60.5533 0
+-757.882 -60.1618 0
+-759.013 -61.5814 0
+-757.212 -61.0465 0
+-763.654 -67.465 0
+-762.255 -68.3408 0
+-759.691 -65.6557 0
+-762.161 -68.4927 0
+-760.9 -76.3836 0
+-759.315 -74.3758 0
+-760.889 -77.8318 0
+-756.561 -80.1168 0
+-755.27 -77.8094 0
+-756.011 -84.5385 0
+-751.715 -84.0707 0
+-750.25 -82.3012 0
+-745.539 -85.1221 0
+-743.739 -84.6184 0
+-745.894 -85.7952 0
+-744.857 -92.4887 0
+-737.51 -106.593 0
+-734.135 -107.597 0
+-732.511 -109.984 0
+-736.626 -114.216 0
+-735.243 -117.149 0
+-729.712 -115.301 0
+-729.604 -110.117 0
+-720.132 -111.904 0
+-717.552 -114.01 0
+-719.46 -114.556 0
+-719.956 -117.597 0
+-722.018 -117.248 0
+-721.493 -115.453 0
+-723.275 -115.648 0
+-729.947 -122.573 0
+-733.565 -123.799 0
+-731.959 -128.235 0
+-729.618 -129.173 0
+-726.818 -125.98 0
+-724.84 -129.462 0
+-721.768 -130.387 0
+-712.315 -129.171 0
+-711.64 -131.833 0
+-707.324 -134.643 0
+-706.706 -138.287 0
+-704.157 -137.496 0
+-703.622 -135.477 0
+-701.758 -137.458 0
+-703.592 -134.975 0
+-702.32 -134.613 0
+-699.073 -139.676 0
+-697.243 -135.101 0
+-695.553 -141.874 0
+-693.417 -142.782 0
+-692.431 -141.966 0
+-694.27 -139.519 0
+-691.712 -138.547 0
+-697.574 -131.867 0
+-696.228 -130.221 0
+-695.11 -132.482 0
+-695.756 -129.274 0
+-694.098 -127.635 0
+-692.612 -128.943 0
+-690.258 -127.859 0
+-690.552 -129.332 0
+-683.286 -131.533 0
+-683.029 -128.894 0
+-685.138 -127.552 0
+-683.243 -125.377 0
+-681.317 -126.283 0
+-681.691 -123.743 0
+-684.899 -123.412 0
+-685.681 -120.757 0
+-686.549 -124.951 0
+-687.268 -122.983 0
+-688.589 -124.228 0
+-687 -120.166 0
+-687.631 -118.494 0
+-689.099 -120.469 0
+-689.699 -118.273 0
+-694.495 -121.968 0
+-693.365 -123.994 0
+-694.923 -125.717 0
+-695.497 -123.074 0
+-698.594 -122.612 0
+-701.967 -128.619 0
+-703.746 -128.749 0
+-701.082 -124.19 0
+-705.741 -120.229 0
+-703.617 -119.515 0
+-700.712 -121.457 0
+-701.184 -118.864 0
+-698.702 -119.156 0
+-697.686 -116.035 0
+-695.705 -117.742 0
+-693.074 -117.247 0
+-697.37 -121.284 0
+-687.978 -115.529 0
+-694.498 -114.923 0
+-692.934 -113.1 0
+-695.516 -112.769 0
+-695.468 -110.196 0
+-700.086 -112.622 0
+-700.841 -111.323 0
+-694.829 -106.403 0
+-681.052 -103.75 0
+-678.222 -105.135 0
+-676.988 -108.946 0
+-672.891 -111.835 0
+-673.18 -120.493 0
+-671.428 -122.608 0
+-669.562 -122.714 0
+-666.56 -119.326 0
+-665.048 -120.173 0
+-659.837 -118.129 0
+-658.289 -116.493 0
+-659.952 -112.808 0
+-664.06 -111.926 0
+-665.694 -109.594 0
+-667.88 -109.659 0
+-668.847 -112.022 0
+-671.443 -110.149 0
+-669.165 -106.687 0
+-667.12 -107.263 0
+-662.393 -104.556 0
+-660.305 -100.714 0
+-662.319 -99.6139 0
+-670.693 -100.723 0
+-668.801 -96.7353 0
+-665.432 -95.944 0
+-667.602 -93.9502 0
+-665.689 -93.176 0
+-662.267 -95.0622 0
+-663.556 -94.0035 0
+-662.46 -92.992 0
+-665.699 -91.5414 0
+-662.924 -92.0365 0
+-650.09 -87.1727 0
+-649.162 -85.4352 0
+-645.941 -85.3374 0
+-644.827 -87.6599 0
+-641.879 -86.8858 0
+-639.803 -81.3088 0
+-635.647 -86.7194 0
+-642.666 -89.8171 0
+-644.795 -92.6395 0
+-643.928 -97.5317 0
+-646.408 -101.04 0
+-644.643 -102.906 0
+-645.291 -108.921 0
+-634.324 -107.806 0
+-630.871 -109.204 0
+-629.942 -111.212 0
+-631.058 -114.516 0
+-627.537 -112.796 0
+-628.993 -110.939 0
+-628.509 -107.79 0
+-621.338 -99.9859 0
+-626.326 -94.4474 0
+-630.447 -93.9523 0
+-629.624 -92.1862 0
+-631.728 -90.8399 0
+-631.219 -89.1459 0
+-623.06 -93.5194 0
+-623.033 -96.8302 0
+-620.246 -98.9833 0
+-617.903 -97.8584 0
+>
+-864.185 -196.669 0
+-861.167 -198.706 0
+-859.17 -197.152 0
+-856.252 -197.538 0
+-856.48 -200.953 0
+-859.518 -200.784 0
+-862.051 -205.643 0
+-858.111 -204.916 0
+-859.71 -206.823 0
+-859.473 -208.009 0
+-857.431 -207.357 0
+-858.911 -209.036 0
+-857.811 -209.908 0
+-854.367 -208.73 0
+-853.144 -207.731 0
+-855.12 -204.226 0
+-852.329 -200.194 0
+-853.546 -196.368 0
+-850.377 -191.372 0
+-845.789 -190.316 0
+-845.419 -187.9 0
+-849.771 -187.004 0
+-854.849 -189.106 0
+-855.906 -187.629 0
+-856.978 -192.664 0
+-861.918 -192.659 0
+-863.863 -195.015 0
+-862.676 -196.129 0
+-864.182 -196.636 0
+-864.185 -196.669 0
+>
+-724.423 -139.855 0
+-722.057 -140.411 0
+-721.429 -136.896 0
+-722.521 -135.979 0
+-720.202 -135.569 0
+-720.411 -133.831 0
+-718.162 -134.582 0
+-718.505 -131.603 0
+-726.651 -137.019 0
+-731.539 -138.495 0
+-735.086 -136.778 0
+-736.29 -139.418 0
+-740.121 -140.631 0
+-739.109 -141.152 0
+-741.562 -143.727 0
+-741.16 -147.396 0
+-736.086 -144.655 0
+-732.543 -146.472 0
+-732.747 -144.666 0
+-727.655 -143.303 0
+-726.876 -145.961 0
+-724.808 -146.276 0
+-722.503 -144.385 0
+-725.354 -143.206 0
+-723.19 -141.923 0
+-724.63 -139.842 0
+-724.423 -139.855 0
+>
+-1129.29 -254.621 0
+-1130.41 -255.234 0
+-1125.63 -255.53 0
+-1127.68 -257.067 0
+-1126.35 -259.115 0
+-1116.7 -255.729 0
+-1104.73 -256.506 0
+-1101.36 -259.744 0
+-1101.22 -264.676 0
+-1099.56 -265.227 0
+-1095.17 -250.135 0
+-1099.88 -247.822 0
+-1101.11 -249.799 0
+-1106.64 -249.833 0
+-1111.56 -244.8 0
+-1121.59 -246.361 0
+-1121.93 -247.888 0
+-1119.64 -248.538 0
+-1123.21 -247.931 0
+-1124.26 -250.444 0
+-1122.89 -250.646 0
+-1129.06 -254.402 0
+-1129.29 -254.621 0
+>
+-884.053 -205.746 0
+-880.179 -206.055 0
+-881.837 -204.119 0
+-878.884 -202.485 0
+-873.865 -204.524 0
+-871.876 -201.552 0
+-869.474 -201.816 0
+-871.735 -199.458 0
+-871.491 -197.404 0
+-868.465 -196.201 0
+-868.46 -193.017 0
+-874.617 -193.872 0
+-876.383 -195.103 0
+-875.978 -196.875 0
+-879.595 -197.473 0
+-877.611 -199.24 0
+-881.7 -200.56 0
+-883.942 -205.664 0
+-884.053 -205.746 0
+>
+-1106.03 -369.624 0
+-1105.83 -368.415 0
+-1107.31 -368.122 0
+-1105.29 -366.892 0
+-1110.5 -366.316 0
+-1122.93 -357.994 0
+-1121.03 -359.706 0
+-1123.4 -361.315 0
+-1122.6 -363.486 0
+-1125.96 -361.118 0
+-1126.4 -358.487 0
+-1128.11 -358.434 0
+-1129.72 -359.875 0
+-1129.34 -363.308 0
+-1132.64 -364.335 0
+-1141.27 -359.41 0
+-1145.75 -359.14 0
+-1150.38 -366.213 0
+>
+-937.728 -195.944 0
+-939.423 -194.593 0
+-941.418 -195.949 0
+-942.458 -194.284 0
+-944.586 -196.014 0
+-946.488 -193.147 0
+-950.979 -195.45 0
+-954.116 -193.632 0
+-955.125 -194.45 0
+-953.718 -198.309 0
+-959.072 -203.742 0
+-954.704 -203.179 0
+-953.526 -204.393 0
+-947.296 -199.947 0
+-938.179 -199.294 0
+-936.37 -197.586 0
+-937.413 -195.966 0
+-937.728 -195.944 0
+>
+-712.232 -140.055 0
+-706.711 -145.467 0
+-705.782 -143.853 0
+-704.168 -144.787 0
+-702.678 -149.624 0
+-701.521 -149.456 0
+-701.198 -143.92 0
+-699.575 -148.27 0
+-697.496 -148.391 0
+-698.712 -144.21 0
+-697.658 -142.222 0
+-699.397 -141.65 0
+-699.794 -139.521 0
+-702.955 -138.328 0
+-712.199 -139.497 0
+-712.232 -140.055 0
+>
+-1107.31 -235.649 0
+-1103.62 -240.051 0
+-1100.64 -241.333 0
+-1100.58 -239.263 0
+-1096.71 -246.759 0
+-1093.1 -246.842 0
+-1086.36 -234.197 0
+-1092.03 -237.395 0
+-1091.06 -234.537 0
+-1098.3 -235.942 0
+-1099.61 -232.447 0
+-1105.26 -235.259 0
+-1107.31 -235.649 0
+>
+-790.744 -166.269 0
+-788.287 -165.493 0
+-789.867 -163.989 0
+-789.329 -160.476 0
+-786.911 -158.653 0
+-790.459 -158.484 0
+-790.75 -156.489 0
+-796.099 -158.303 0
+-799.857 -164.665 0
+-794.24 -165.26 0
+-793.107 -167.196 0
+-790.75 -166.358 0
+-790.744 -166.269 0
+>
+-713.854 -146.312 0
+-712.196 -146.5 0
+-712.851 -150.528 0
+-710.585 -151.031 0
+-710.601 -149.529 0
+-709.316 -150.736 0
+-710.243 -148.766 0
+-707.98 -147.543 0
+-711.247 -148.09 0
+-710.407 -146.235 0
+-712.137 -143.747 0
+-713.832 -145.943 0
+-713.854 -146.312 0
+>
+-781.287 -155.743 0
+-779.421 -156.007 0
+-780.014 -157.125 0
+-778.028 -158.811 0
+-772.322 -157.889 0
+-774.492 -155.801 0
+-773.056 -154.578 0
+-773.891 -152.887 0
+-779.372 -153.574 0
+-781.263 -155.363 0
+-781.287 -155.743 0
+>
+-1074.51 -371.978 0
+-1079.39 -369.874 0
+-1085.91 -362.549 0
+-1088.88 -352.267 0
+-1093.38 -358.068 0
+-1098.45 -357.119 0
+-1101.71 -359.184 0
+-1101.89 -367.206 0
+-1097.93 -367.221 0
+-1099.22 -368.812 0
+-1099 -370.154 0
+>
+-1113.86 -295.041 0
+-1111 -296.684 0
+-1109.79 -303.016 0
+-1107.41 -302.691 0
+-1106.47 -298.842 0
+-1107.67 -295.052 0
+-1109.71 -295.232 0
+-1110.81 -292.968 0
+-1113.81 -294.489 0
+-1113.86 -295.041 0
+>
+-811.077 -164.863 0
+-811.162 -169.407 0
+-808.919 -165.52 0
+-804.255 -164.664 0
+-805.381 -162.625 0
+-803.794 -160.762 0
+-807.081 -161.392 0
+-809.318 -160.349 0
+-810.967 -164.78 0
+-811.077 -164.863 0
+>
+-802.566 -154.698 0
+-801.01 -158.179 0
+-798.47 -159.375 0
+-792.03 -148.694 0
+-795.116 -147.889 0
+-795.609 -150.665 0
+-796.691 -147.979 0
+-802.625 -153.998 0
+-802.566 -154.698 0
+>
+-794.804 -141.408 0
+-791.405 -147.095 0
+-790.33 -145.019 0
+-788.727 -146.098 0
+-788.069 -143.985 0
+-790.111 -139.969 0
+-792.612 -138.225 0
+-794.762 -140.759 0
+-794.804 -141.408 0
+>
+-689.428 -131.502 0
+-688.282 -133.293 0
+-687.203 -132.65 0
+-687.008 -134.677 0
+-684.681 -132.247 0
+-686.766 -130.492 0
+-689.407 -131.134 0
+-689.428 -131.502 0
+>
+-808.702 -175.138 0
+-804.123 -178.936 0
+-800.494 -174.631 0
+-803.088 -170.95 0
+-805.265 -172.214 0
+-805.917 -170.959 0
+-808.689 -174.948 0
+-808.702 -175.138 0
+>
+-1096.39 -268.265 0
+-1095.49 -271.691 0
+-1090.48 -272.934 0
+-1086.57 -265.251 0
+-1092.07 -263.358 0
+-1091.64 -264.672 0
+-1096.39 -268.175 0
+-1096.39 -268.265 0
+>
+-1102.28 -332.982 0
+-1097.75 -329.635 0
+-1097.23 -327.091 0
+-1098.72 -327.022 0
+-1098.49 -329.589 0
+-1102.26 -332.791 0
+-1102.28 -332.982 0
+>
+-758.372 -165.677 0
+-757.633 -167.27 0
+-754.863 -166.453 0
+-756.293 -165.894 0
+-755.701 -164.764 0
+-758.355 -165.409 0
+-758.372 -165.677 0
+>
+-826.727 -107.315 0
+-828.718 -107.417 0
+-827.187 -112.59 0
+-825.764 -113.191 0
+-825.892 -108.878 0
+-826.629 -107.423 0
+-826.727 -107.315 0
+>
+-692.972 -111.978 0
+-691.027 -112.506 0
+-691.963 -110.727 0
+-689.66 -110.481 0
+-692.528 -109.719 0
+-692.858 -111.794 0
+-692.972 -111.978 0
+>
+-818.246 -180.049 0
+-817.514 -183.321 0
+-810.997 -179.854 0
+-813.653 -180.39 0
+-815.326 -178.687 0
+-818.228 -179.769 0
+-818.246 -180.049 0
+>
+-764.058 -122.782 0
+-762.897 -124.224 0
+-760.979 -123.581 0
+-758.734 -119.392 0
+-761.408 -118.797 0
+-764.047 -122.603 0
+-764.058 -122.782 0
+>
+-699.024 -153.152 0
+-698.468 -154.349 0
+-696.441 -153.582 0
+-697.25 -151.351 0
+-699.003 -152.784 0
+-699.024 -153.152 0
+>
+-757.224 -174.25 0
+-756.667 -177.133 0
+-753.412 -175.223 0
+-755.907 -173.253 0
+-757.212 -174.06 0
+-757.224 -174.25 0
+>
+-771.536 -62.3632 0
+-771.21 -63.7426 0
+-768.87 -59.7309 0
+-769.64 -57.2002 0
+-771.409 -60.4072 0
+-771.536 -62.3632 0
+>
+-831.241 -178.257 0
+-830.052 -180.92 0
+-827.007 -179.276 0
+-827.276 -176.977 0
+-831.235 -178.156 0
+-831.241 -178.257 0
+>
+-723.962 -183.062 0
+-719.558 -181.08 0
+-721.047 -181.508 0
+-721.053 -179.827 0
+-723.924 -182.426 0
+-723.962 -183.062 0
+>
+-715.626 -130.52 0
+-714.579 -133.944 0
+-712.914 -133.987 0
+-713.002 -130.206 0
+-715.62 -130.419 0
+-715.626 -130.52 0
+>
+-772.731 -154.407 0
+-770.455 -154.785 0
+-768.34 -152.73 0
+-770.494 -152.079 0
+-772.726 -154.318 0
+-772.731 -154.407 0
+>
+-708.109 -171.161 0
+-703.987 -172.14 0
+-703.148 -170.273 0
+-707.386 -169.512 0
+-708.106 -171.106 0
+-708.109 -171.161 0
+>
+-1133.22 -259.738 0
+-1127.92 -258.795 0
+-1127.7 -256.055 0
+-1132.19 -256.179 0
+-1133.22 -259.637 0
+-1133.22 -259.738 0
+>
+-692.412 -130.869 0
+-692.121 -133.025 0
+-690.287 -133.737 0
+-690.686 -129.839 0
+-692.395 -130.579 0
+-692.412 -130.869 0
+>
+-892.501 -196.915 0
+-891.664 -198.515 0
+-890.061 -198.164 0
+-889.267 -194.278 0
+-892.495 -196.826 0
+-892.501 -196.915 0
+>
+-848.425 -206.356 0
+-846.531 -207.931 0
+-843.72 -206.756 0
+-846.156 -205.426 0
+-848.419 -206.255 0
+-848.425 -206.356 0
+>
+-708.837 -171.108 0
+-710.893 -170.529 0
+-714.358 -172.612 0
+-711.362 -173.201 0
+-708.941 -171.102 0
+-708.837 -171.108 0
+>
+-760.693 -174.508 0
+-757.99 -174.809 0
+-757.769 -172.904 0
+-759.185 -172.111 0
+-760.675 -174.218 0
+-760.693 -174.508 0
+>
+-1132.47 -251.809 0
+-1132.74 -253.773 0
+-1130.64 -252.866 0
+-1131.16 -250.122 0
+-1132.19 -250.946 0
+-1132.47 -251.809 0
+>
+-764.91 -64.3875 0
+-764.437 -66.7074 0
+-762.45 -64.9168 0
+-763.459 -62.8429 0
+-764.892 -64.1081 0
+-764.91 -64.3875 0
+>
+-960.104 -190.407 0
+-959.554 -191.542 0
+-957.91 -189.259 0
+-958.972 -187.917 0
+-959.993 -190.337 0
+-960.104 -190.407 0
+>
+-625.532 -95.1059 0
+-623.534 -96.5121 0
+-623.287 -93.8759 0
+-625.014 -93.2223 0
+-625.506 -94.6377 0
+-625.532 -95.1059 0
+>
+-745.123 -154.162 0
+-743.951 -155.501 0
+-742.81 -153.922 0
+-743.67 -152.603 0
+-745.111 -153.973 0
+-745.123 -154.162 0
+>
+-793.668 -133.531 0
+-792.31 -135.157 0
+-791.226 -132.936 0
+-793.392 -130.876 0
+-793.638 -133.061 0
+-793.668 -133.531 0
+>
+-780.495 -45.3052 0
+-779.233 -46.6463 0
+-777.197 -45.7031 0
+-778.051 -44.479 0
+-780.476 -45.0257 0
+-780.495 -45.3052 0
+>
+-1084.82 -222.907 0
+-1084.03 -224.897 0
+-1084.04 -219.796 0
+-1084.77 -222.243 0
+-1084.82 -222.907 0
+>
+-781.167 -152.192 0
+-773.527 -150.43 0
+-774.281 -149.114 0
+-781.149 -151.913 0
+-781.167 -152.192 0
+>
+-753.8 -169.591 0
+-751.379 -172.778 0
+-750.108 -169.076 0
+-753.789 -169.412 0
+-753.8 -169.591 0
+>
+-1117.94 -293.971 0
+-1117.38 -295.013 0
+-1116.47 -294.359 0
+-1117.71 -293.751 0
+-1117.94 -293.971 0
+>
+-693.968 -130.768 0
+-692.916 -132.374 0
+-692.882 -129.991 0
+-693.957 -130.578 0
+-693.968 -130.768 0
+>
+-819.127 -175.857 0
+-815.513 -173.473 0
+-815.91 -171.526 0
+-819.11 -175.588 0
+-819.127 -175.857 0
+>
+-1160.03 -324.282 0
+-1158.83 -322.72 0
+-1155.35 -323.43 0
+-1158.67 -323.392 0
+-1160.05 -324.609 0
+>
+-703.276 -168.866 0
+-695.361 -167.419 0
+-692.476 -164.449 0
+-703.265 -168.687 0
+-703.276 -168.866 0
+>
+-867.095 -194.606 0
+-865.624 -194.615 0
+-865.945 -193.142 0
+-867.077 -194.337 0
+-867.095 -194.606 0
+>
+-695.382 -144.314 0
+-693.749 -144.924 0
+-693.633 -142.915 0
+-695.371 -144.125 0
+-695.382 -144.314 0
+>
+-771.066 -64.7285 0
+-767.121 -69.6201 0
+-769.147 -60.7904 0
+-771.006 -63.8008 0
+-771.066 -64.7285 0
+>
+-746.647 -150.044 0
+-744.923 -150.889 0
+-745.749 -149.022 0
+-746.642 -149.954 0
+-746.647 -150.044 0
+>
+-722.942 -158.749 0
+-719.897 -160.24 0
+-720.907 -157.895 0
+-722.925 -158.47 0
+-722.942 -158.749 0
+>
+-656.704 -108.661 0
+-654.755 -110.953 0
+-654.655 -109.179 0
+-656.698 -108.561 0
+-656.704 -108.661 0
+>
+-770.186 -71.9916 0
+-766.225 -73.46 0
+-769.252 -70.4135 0
+-770.162 -71.6116 0
+-770.186 -71.9916 0
+>
+-768.53 -102.872 0
+-765.529 -104.836 0
+-766.635 -102.566 0
+-768.524 -102.771 0
+-768.53 -102.872 0
+>
+-692.198 -114.733 0
+-689.452 -114.043 0
+-690.645 -113.1 0
+-692.187 -114.544 0
+-692.198 -114.733 0
+>
+-746.286 -122.12 0
+-742.557 -124.223 0
+-743.554 -121.784 0
+-746.28 -122.03 0
+-746.286 -122.12 0
+>
+-1113.14 -288.589 0
+-1111.29 -290.945 0
+-1110.96 -289.362 0
+-1113.13 -288.487 0
+-1113.14 -288.589 0
+>
+-731.973 -135.33 0
+-731.263 -137.391 0
+-729.794 -133.792 0
+-731.934 -134.682 0
+-731.973 -135.33 0
+>
+-764.807 -70.8357 0
+-762.363 -73.2488 0
+-763.029 -70.681 0
+-764.863 -70.0914 0
+-764.807 -70.8357 0
+>
+-718.284 -131.392 0
+-717.276 -131.967 0
+-716.988 -130.629 0
+-718.278 -131.291 0
+-718.284 -131.392 0
+>
+-1128.32 -250.501 0
+-1126.64 -250.819 0
+-1126.76 -248.392 0
+-1128.3 -250.309 0
+-1128.32 -250.501 0
+>
+-849.378 -165.437 0
+-848.399 -166.482 0
+-847.638 -164.52 0
+-849.352 -165.046 0
+-849.378 -165.437 0
+>
+-958.525 -184.7 0
+-956.806 -184.262 0
+-958.279 -182.789 0
+-958.505 -184.42 0
+-958.525 -184.7 0
+>
+-735.041 -165.424 0
+-733.144 -165.156 0
+-734.647 -164.08 0
+-735.035 -165.323 0
+-735.041 -165.424 0
+>
+-1116.43 -293.807 0
+-1115.68 -295.136 0
+-1115.32 -293.225 0
+-1116.39 -293.333 0
+-1116.43 -293.807 0
+>
+-721.816 -141.625 0
+-719.723 -143.251 0
+-719.822 -141.419 0
+-721.806 -141.457 0
+-721.816 -141.625 0
+>
+-761.481 -163.522 0
+-760.951 -165.103 0
+-760.686 -162.494 0
+-761.47 -163.343 0
+-761.481 -163.522 0
+>
+-690.724 -112.67 0
+-689.317 -113.502 0
+-689.325 -111.867 0
+-690.718 -112.569 0
+-690.724 -112.67 0
+>
+-1110.13 -224.454 0
+-1107.31 -222.516 0
+-1107.86 -221.383 0
+-1110.1 -224.082 0
+-1110.13 -224.454 0
+>
+-722.928 -148.002 0
+-720.597 -147.413 0
+-720.986 -145.193 0
+-722.901 -147.544 0
+-722.928 -148.002 0
+>
+-1126.45 -248.564 0
+-1125.6 -251.13 0
+-1123.89 -247.172 0
+-1126.44 -248.373 0
+-1126.45 -248.564 0
+>
+-1112.03 -243.968 0
+-1107.6 -245.833 0
+-1109.07 -242.925 0
+-1112.02 -243.867 0
+-1112.03 -243.968 0
+>
+-659.194 -121.478 0
+-658.052 -123.366 0
+-655.472 -121.866 0
+-659.189 -121.388 0
+-659.194 -121.478 0
+>
+-1126.31 -358.676 0
+-1123.78 -361.99 0
+-1122.87 -358.566 0
+-1125.96 -358.306 0
+-1126.31 -358.676 0
+>
+-727.106 -186.71 0
+-726.537 -187.718 0
+-724.437 -184.021 0
+-727.1 -186.609 0
+-727.106 -186.71 0
+>
+-1103.15 -264.795 0
+-1100.83 -267.768 0
+-1097.74 -267.774 0
+-1103.14 -264.615 0
+-1103.15 -264.795 0
+>
+-1108.81 -238.364 0
+-1106.57 -239.622 0
+-1105.7 -238.047 0
+-1108.78 -237.981 0
+-1108.81 -238.364 0
+>
+-795.164 -130.806 0
+-793.959 -133.186 0
+-794.428 -129.125 0
+-795.128 -130.258 0
+-795.164 -130.806 0
+>
+-686.373 -118.332 0
+-685.55 -120.284 0
+-685.008 -118.132 0
+-686.261 -118.204 0
+-686.373 -118.332 0
+>
+-1119.92 -290.683 0
+-1117.51 -292.677 0
+-1119.91 -290.593 0
+-1119.92 -290.683 0
+>
+-1104.33 -369.753 0
+-1103.78 -368.095 0
+-1105.05 -367.942 0
+-1104.97 -369.705 0
+>
+-1106.56 -218.415 0
+-1106 -216.816 0
+-1106.51 -217.841 0
+-1106.56 -218.415 0
+>
+-996.337 -210.51 0
+-995.299 -210.768 0
+-996.33 -210.409 0
+-996.337 -210.51 0
+>
+-1005.91 -204.231 0
+-1004.83 -203.928 0
+-1005.79 -204.092 0
+-1005.91 -204.231 0
+>
+-1090.48 -275.722 0
+-1089.45 -276.176 0
+-1090.47 -275.62 0
+-1090.48 -275.722 0
+>
+-797.541 -159.57 0
+-796.537 -158.612 0
+-797.499 -158.921 0
+-797.541 -159.57 0
+>
+-685.48 -135.269 0
+-684.567 -135.702 0
+-685.573 -135.084 0
+-685.48 -135.269 0
+>
+-768.928 -97.6952 0
+-766.204 -100.72 0
+-768.816 -97.5678 0
+-768.928 -97.6952 0
+>
+-727.269 -164.767 0
+-726.713 -165.955 0
+-727.241 -164.298 0
+-727.269 -164.767 0
+>
+-686.524 -135.309 0
+-685.735 -134.28 0
+-686.513 -135.12 0
+-686.524 -135.309 0
+>
+-757.318 -157.06 0
+-756.311 -157.671 0
+-757.307 -156.87 0
+-757.318 -157.06 0
+>
+-765.725 -176.341 0
+-764.544 -175.853 0
+-765.708 -176.062 0
+-765.725 -176.341 0
+>
+-724.496 -165.571 0
+-723.324 -165.181 0
+-724.383 -165.432 0
+-724.496 -165.571 0
+>
+-767.18 -112.777 0
+-766.1 -112.184 0
+-767.15 -112.308 0
+-767.18 -112.777 0
+>
+-699.611 -150.688 0
+-698.183 -151.241 0
+-699.601 -150.509 0
+-699.611 -150.688 0
+>
+-1159.26 -314.802 0
+-1157.53 -314.544 0
+-1157.98 -318.768 0
+-1159.69 -320.095 0
+>
+-855.491 -209.825 0
+-852.779 -208.588 0
+-855.473 -209.545 0
+-855.491 -209.825 0
+>
+-920.485 -208.486 0
+-917.928 -208.102 0
+-920.412 -207.454 0
+-920.485 -208.486 0
+>
+-760.394 -62.0534 0
+-760.286 -61.9818 0
+-759.201 -59.6617 0
+-760.394 -62.0534 0
+>
+-788.574 -142.089 0
+-787.016 -143.873 0
+-788.568 -141.988 0
+-788.574 -142.089 0
+>
+-688.167 -136.703 0
+-686.758 -135.755 0
+-688.157 -136.525 0
+-688.167 -136.703 0
+>
+-737.961 -156.649 0
+-736.251 -156.001 0
+-737.944 -156.37 0
+-737.961 -156.649 0
+>
+-735.789 -151.825 0
+-733.855 -150.911 0
+-735.767 -151.445 0
+-735.789 -151.825 0
+>
+-720.544 -137.79 0
+-719.352 -138.791 0
+-720.541 -137.745 0
+-720.544 -137.79 0
+>
+-735.025 -149.54 0
+-733.448 -149.355 0
+-735.019 -149.439 0
+-735.025 -149.54 0
+>
+-745.118 -169.57 0
+-743.341 -169.576 0
+-745.078 -168.911 0
+-745.118 -169.57 0
+>
+-870.572 -205.624 0
+-868.433 -205.115 0
+-870.566 -205.534 0
+-870.572 -205.624 0
+>
+-636.334 -117.895 0
+-634.661 -117.707 0
+-636.314 -117.538 0
+-636.334 -117.895 0
+>
+-770.511 -68.9737 0
+-770.142 -71.2986 0
+-770.493 -68.6943 0
+-770.511 -68.9737 0
+>
+-775.769 -65.0839 0
+-772.832 -66.2971 0
+-775.756 -64.8826 0
+-775.769 -65.0839 0
+>
+-780.709 -64.2883 0
+-776.689 -64.8328 0
+-780.684 -63.9082 0
+-780.709 -64.2883 0
+>
+-710.474 -135.028 0
+-708.599 -135.038 0
+-710.463 -134.838 0
+-710.474 -135.028 0
+>
+-1120.76 -293.259 0
+-1119.22 -293.96 0
+-1120.72 -292.707 0
+-1120.76 -293.259 0
+>
+-691.153 -134.291 0
+-689.551 -135.414 0
+-691.136 -134.012 0
+-691.153 -134.291 0
+>
+-714.067 -174.78 0
+-711.721 -173.976 0
+-713.957 -174.685 0
+-714.067 -174.78 0
+>
+-1114.21 -299.46 0
+-1113.08 -301.487 0
+-1114.2 -299.358 0
+-1114.21 -299.46 0
+>
+-1114.34 -290.286 0
+-1112.84 -291.629 0
+-1114.31 -289.903 0
+-1114.34 -290.286 0
+>
+-773.675 -45.8455 0
+-772.112 -47.3403 0
+-773.663 -45.6555 0
+-773.675 -45.8455 0
+>
+-878.271 -205.869 0
+-875.83 -205.562 0
+-878.259 -205.679 0
+-878.271 -205.869 0
+>
+-1026.9 -220.057 0
+-1025.53 -218.658 0
+-1026.84 -219.225 0
+-1026.9 -220.057 0
+>
+-725.412 -166.918 0
+-724.31 -165.952 0
+-725.401 -166.739 0
+-725.412 -166.918 0
+>
+-773.156 -149.51 0
+-769.483 -149.281 0
+-773.145 -149.343 0
+-773.156 -149.51 0
+>
+-1096.25 -310.212 0
+-1094.66 -306.131 0
+-1096.17 -309.175 0
+-1096.25 -310.212 0
+>
+-661.279 -94.1227 0
+-659.695 -93.6648 0
+-661.274 -94.0446 0
+-661.279 -94.1227 0
+>
+-765.291 -75.1138 0
+-763.681 -75.9581 0
+-765.279 -74.9238 0
+-765.291 -75.1138 0
+>
+-739.737 -156.643 0
+-738.383 -156.713 0
+-739.72 -156.363 0
+-739.737 -156.643 0
+>
+-781.776 -42.6938 0
+-778.754 -44.1069 0
+-781.763 -42.5038 0
+-781.776 -42.6938 0
+>
+-926.557 -197.44 0
+-925.174 -197.256 0
+-926.445 -197.358 0
+-926.557 -197.44 0
+>
+-1104.39 -367.674 0
+-1102.82 -366.75 0
+-1104.36 -367.393 0
+-1104.39 -367.674 0
+>
+-709.422 -143.683 0
+-707.82 -144.808 0
+-709.2 -143.461 0
+-709.422 -143.683 0
+>
+-888.11 -166.907 0
+-885.216 -166.073 0
+-888.09 -166.627 0
+-888.11 -166.907 0
+>
+-736.687 -127.106 0
+-735.921 -128.229 0
+-736.68 -127.005 0
+-736.687 -127.106 0
+>
+-686.615 -136.883 0
+-685.95 -137.996 0
+-686.588 -136.425 0
+-686.615 -136.883 0
+>
+-659.511 -99.5501 0
+-658.107 -98.6005 0
+-659.485 -99.0817 0
+-659.511 -99.5501 0
+>
+-770.217 -72.461 0
+-766.687 -74.1821 0
+-770.21 -72.3604 0
+-770.217 -72.461 0
+>
+-957.103 -186.87 0
+-955.46 -187.475 0
+-957.096 -186.78 0
+-957.103 -186.87 0
+>
+-784.636 -159.078 0
+-782.458 -157.723 0
+-784.527 -159.007 0
+-784.636 -159.078 0
+>
+-769.012 -69.9128 0
+-766.588 -72.6398 0
+-768.999 -69.7228 0
+-769.012 -69.9128 0
+>
+-1004 -204.183 0
+-1002.76 -204.559 0
+-1004 -204.093 0
+-1004 -204.183 0
+>
+-936.645 -180.889 0
+-936.534 -180.807 0
+-938.444 -180.996 0
+-936.645 -180.889 0
+>
+-657.138 -125.61 0
+-655.173 -123.941 0
+-657.122 -125.32 0
+-657.138 -125.61 0
+>
+-699.967 -121.176 0
+-698.667 -120.323 0
+-699.955 -120.986 0
+-699.967 -121.176 0
+>
+-1099.81 -265.638 0
+-1097.95 -266.34 0
+-1099.7 -265.601 0
+-1099.81 -265.638 0
+>
+-727.029 -148.519 0
+-725.569 -148.528 0
+-727.002 -148.061 0
+-727.029 -148.519 0
+>
+-763.604 -68.3098 0
+-762.422 -70.9446 0
+-763.689 -68.0126 0
+-763.604 -68.3098 0
+>
+-729.049 -163.07 0
+-727.948 -163.886 0
+-729.038 -162.891 0
+-729.049 -163.07 0
+>
+-924.338 -201.824 0
+-923.828 -200.586 0
+-924.324 -201.633 0
+-924.338 -201.824 0
+>
+-1115.11 -275.843 0
+-1114.74 -277.914 0
+-1115.08 -275.482 0
+-1115.11 -275.843 0
+>
+-793.702 -135.673 0
+-790.977 -138.802 0
+-793.678 -135.304 0
+-793.702 -135.673 0
+>
+-1108.83 -293.554 0
+-1107.64 -294.635 0
+-1108.82 -293.363 0
+-1108.83 -293.554 0
+>
+-1124.43 -264.421 0
+-1123.15 -264.332 0
+-1124.32 -264.34 0
+-1124.43 -264.421 0
+>
+-821.606 -116.617 0
+-820.463 -119.841 0
+-821.58 -116.237 0
+-821.606 -116.617 0
+>
+-775.603 -45.1572 0
+-774.211 -46.0909 0
+-775.596 -45.0566 0
+-775.603 -45.1572 0
+>
+-785.637 -158.364 0
+-784.409 -157.139 0
+-785.608 -157.894 0
+-785.637 -158.364 0
+>
+-756.222 -152.831 0
+-754.822 -152.166 0
+-756.197 -152.44 0
+-756.222 -152.831 0
+>
+-739.872 -111.112 0
+-738.705 -112.451 0
+-739.867 -111.033 0
+-739.872 -111.112 0
+>
+-686.052 -116.391 0
+-684.982 -115.894 0
+-686.041 -116.213 0
+-686.052 -116.391 0
+>
+-690.396 -130.225 0
+-689.622 -131.256 0
+-690.39 -130.136 0
+-690.396 -130.225 0
+>
+-696.855 -140.959 0
+-695.994 -140.494 0
+-696.833 -140.59 0
+-696.855 -140.959 0
+>
+-1099.14 -233.188 0
+-1097.8 -233.76 0
+-1099.12 -232.997 0
+-1099.14 -233.188 0
+>
+-1040.74 -205.802 0
+-1039.46 -205.619 0
+-1040.67 -204.947 0
+-1040.74 -205.802 0
+>
+-1122.96 -247.52 0
+-1122.24 -246.489 0
+-1122.95 -247.43 0
+-1122.96 -247.52 0
+>
+-768.633 -49.7346 0
+-767.869 -49.1673 0
+-768.627 -49.634 0
+-768.633 -49.7346 0
+>
+-661.053 -95.6351 0
+-659.583 -95.3385 0
+-661.048 -95.5347 0
+-661.053 -95.6351 0
+>
+-1090.52 -262.585 0
+-1090.06 -263.617 0
+-1090.51 -262.54 0
+-1090.52 -262.585 0
+>
+-869.097 -204.035 0
+-867.959 -204.314 0
+-869.091 -203.945 0
+-869.097 -204.035 0
+>
+-770.784 -92.5258 0
+-769.582 -93.2652 0
+-770.773 -92.347 0
+-770.784 -92.5258 0
+>
+-693.611 -135.369 0
+-692.703 -135.881 0
+-693.574 -134.721 0
+-693.611 -135.369 0
+>
+-776.837 -44.9746 0
+-775.427 -45.6403 0
+-776.725 -44.8473 0
+-776.837 -44.9746 0
+>
+-719.606 -141.297 0
+-718.54 -140.902 0
+-719.59 -141.018 0
+-719.606 -141.297 0
+>
+-765.854 -96.8706 0
+-764.425 -97.3322 0
+-765.848 -96.7701 0
+-765.854 -96.8706 0
+>
+-736.209 -165.723 0
+-735.008 -164.865 0
+-736.181 -165.254 0
+-736.209 -165.723 0
+>
+-1126.51 -247.902 0
+-1125.27 -247.049 0
+-1126.5 -247.8 0
+-1126.51 -247.902 0
+>
+-814.558 -170.075 0
+-813.787 -171.113 0
+-814.553 -169.985 0
+-814.558 -170.075 0
+>
+-1130.38 -268.106 0
+-1129.26 -267.448 0
+-1130.37 -267.915 0
+-1130.38 -268.106 0
+>
+-663.537 -95.493 0
+-662.099 -95.7544 0
+-663.532 -95.3926 0
+-663.537 -95.493 0
+>
+-678.379 -111.429 0
+-676.768 -112.35 0
+-678.368 -111.239 0
+-678.379 -111.429 0
+>
+-1063.34 -372.799 0
+-1063.83 -370.692 0
+-1069.62 -372.339 0
+>
+-1105.18 -369.688 0
+-1105.1 -368.652 0
+-1105.71 -369.648 0
+>
+-1101.35 -369.978 0
+-1102.37 -369.379 0
+-1102.73 -369.873 0
+>
+-986.219 13.8006 0
+-996.919 14.3077 0
+-1000.5 10.1369 0
+-1006.96 9.00993 0
+-1016.29 13.4663 0
+-1020.89 13.4677 0
+-1041.83 5.56318 0
+-1043.44 7.50159 0
+-1043.67 12.1985 0
+-1050.13 17.2289 0
+-1057.92 15.3876 0
+-1068.97 18.2096 0
+-1074.42 15.7509 0
+-1075.83 19.8783 0
+-1079.98 22.6714 0
+-1083.83 22.8881 0
+-1089.56 29.0368 0
+-1092.33 30.8615 0
+-1098.61 30.7906 0
+-1099.92 34.881 0
+-1105.86 36.2704 0
+-1108.38 31.5828 0
+-1111.52 30.4823 0
+-1112.32 25.1271 0
+-1115.74 23.2346 0
+-1118.15 18.5592 0
+-1121.61 17.4763 0
+-1117.12 24.1104 0
+-1113.51 25.8372 0
+-1112.78 30.4042 0
+-1109 32.865 0
+-1108.21 36.9039 0
+-1105.17 38.1714 0
+-1098.55 36.0858 0
+-1097.02 32.2022 0
+-1089.77 31.4152 0
+-1082.5 24.9138 0
+-1075.41 21.0661 0
+-1074.27 17.405 0
+-1068.42 19.7595 0
+-1066.43 18.5429 0
+-1062.24 19.8881 0
+-1057.23 17.3783 0
+-1049.18 19.7301 0
+-1041.79 13.3292 0
+-1040.74 7.2374 0
+-1033.01 9.65941 0
+-1028.81 13.6164 0
+-1020.1 15.393 0
+-1015.31 15.2394 0
+-1007.06 11.597 0
+-999.561 16.4147 0
+-985.911 15.0075 0
+-976.802 10.3659 0
+-974.744 1.00217 0
+-969.374 -10.0709 0
+-972.536 -15.6807 0
+-961.147 -23.4526 0
+-942.636 -28.3552 0
+-938.686 -27.2166 0
+-933.873 -29.754 0
+-929.372 -29.5582 0
+-926.994 -32.5712 0
+-921.398 -34.4297 0
+-914.123 -33.4132 0
+-907.819 -35.556 0
+-891.994 -27.4061 0
+-884.53 -32.1145 0
+-883.289 -39.3464 0
+-879.966 -40.9297 0
+-872.596 -39.8671 0
+-864.12 -29.2345 0
+-860.477 -27.7755 0
+-842.967 -31.6827 0
+-838.626 -51.3236 0
+-832.631 -62.4579 0
+-831.977 -68.069 0
+-826.031 -72.5365 0
+-818.687 -73.3412 0
+-815.613 -77.1799 0
+-816.425 -83.0251 0
+-814.739 -90.4996 0
+-809.251 -97.328 0
+-808.056 -101.317 0
+-809.129 -101.774 0
+-809.874 -98.8482 0
+-813.929 -97.0828 0
+-816.51 -93.5608 0
+-819.288 -76.054 0
+-827.698 -75.5701 0
+-834.066 -68.1383 0
+-840.602 -51.2864 0
+-844.533 -33.2254 0
+-862.135 -30.5599 0
+-869.333 -36.5347 0
+-871.717 -40.6851 0
+-878.836 -42.5774 0
+-885.205 -39.893 0
+-886.614 -33.538 0
+-892.808 -28.54 0
+-908.592 -37.527 0
+-914.35 -35.0309 0
+-922.714 -36.6527 0
+-932.013 -31.341 0
+-961.944 -25.6142 0
+-974.375 -16.4826 0
+-972.121 -9.18453 0
+-976.721 1.07135 0
+-986.219 13.8006 0
+>
+-656.094 58.7493 0
+-654.552 50.2609 0
+-652.613 50.0209 0
+-650.793 52.9221 0
+-649.705 50.4952 0
+-655.374 45.1504 0
+-657.825 36.9254 0
+-661.668 38.0642 0
+-657.746 34.8163 0
+-656.953 30.8845 0
+-654.487 30.7927 0
+-651.221 33.7648 0
+-649.916 38.3873 0
+-648.098 39.5435 0
+-645.742 37.6351 0
+-639.957 38.0422 0
+-638.901 36.7603 0
+-644.448 35.1748 0
+-645.035 32.2219 0
+-647.492 34.1693 0
+-648.844 27.0093 0
+-653.906 25.0051 0
+-648.587 19.1829 0
+-658 22.0151 0
+-660.694 20.0386 0
+-663.191 21.3641 0
+-669.186 19.3639 0
+-668.666 22.848 0
+-669.779 23.1842 0
+-672.333 20.1706 0
+-674.953 22.8497 0
+-673.101 24.4836 0
+-673.809 26.3857 0
+-662.857 25.1949 0
+-658.59 27.6248 0
+-663.082 36.8064 0
+-664.997 32.3884 0
+-668.114 30.2488 0
+-676.623 32.6051 0
+-666.201 34.611 0
+-665.835 35.5517 0
+-668.704 35.7822 0
+-667.041 41.1 0
+-664.981 39.4407 0
+-662.824 41.0562 0
+-661.156 39.7124 0
+-659.864 40.6641 0
+-656.391 47.0475 0
+-657.649 53.4593 0
+-656.799 57.2921 0
+-658.306 59.5665 0
+-656.275 59.1632 0
+-656.094 58.7493 0
+>
+-1118.21 -149.06 0
+-1117.09 -148.338 0
+-1109.91 -154.899 0
+-1112 -157.14 0
+-1112.78 -162.567 0
+-1114.04 -162.484 0
+-1113.51 -164.991 0
+-1110.2 -160.955 0
+-1109.26 -162.35 0
+-1109.27 -165.038 0
+-1112.43 -166.034 0
+-1110.94 -167.258 0
+-1112.13 -171.29 0
+-1110.71 -169.581 0
+-1106.37 -169.59 0
+-1108.64 -172.748 0
+-1112.05 -172.873 0
+-1112.31 -174.803 0
+-1113.46 -173.345 0
+-1115.72 -173.702 0
+-1117.54 -170.168 0
+-1116.23 -168.36 0
+-1117.88 -162.775 0
+-1115.96 -162.584 0
+-1119.45 -158.784 0
+-1116.66 -160.88 0
+-1113.27 -155.865 0
+-1114.6 -152.735 0
+-1120.22 -149.071 0
+-1118.2 -149.026 0
+-1118.21 -149.06 0
+>
+-801.104 -30.4986 0
+-800.314 -37.2035 0
+-801.839 -39.785 0
+-804.952 -36.6633 0
+-803.397 -27.5671 0
+-801.211 -30.5475 0
+-801.104 -30.4986 0
+>
+-806.149 -107.185 0
+-802.868 -112.827 0
+-802.774 -116.169 0
+-808.848 -110.118 0
+-809.163 -106.985 0
+-807.653 -106.265 0
+-806.149 -107.185 0
+>
+-945.179 -166.464 0
+-941.206 -178.416 0
+-944.828 -176.078 0
+-945.186 -166.554 0
+-945.179 -166.464 0
+>
+-1085.64 -221.131 0
+-1085.62 -220.951 0
+-1084.87 -219.526 0
+-1084.98 -222.181 0
+-1085.64 -221.131 0
+>
+-797.621 -157.566 0
+-799.754 -158.17 0
+-801.762 -153.604 0
+-796.635 -150.363 0
+-797.621 -157.566 0
+>
+-752.786 -42.3142 0
+-750.571 -40.146 0
+-747.887 -40.3524 0
+-752.786 -42.3142 0
+>
+-814.452 -92.4293 0
+-815.463 -91.9568 0
+-814.421 -95.0833 0
+-810.975 -96.595 0
+-813.84 -92.6501 0
+-814.452 -92.4293 0
+>
+-836.617 -58.3466 0
+-833.864 -63.7106 0
+-836.111 -58.5617 0
+-836.617 -58.3466 0
+>
+-1001.31 11.7191 0
+-998.724 15.1807 0
+-1003.81 11.7681 0
+-1001.31 11.7191 0
+>
+-617.903 -97.8584 0
+-614.601 -96.2599 0
+-616.062 -94.5041 0
+-613.036 -92.2422 0
+-612.722 -86.4467 0
+-611.878 -88.0796 0
+-602.025 -85.9831 0
+-598.937 -90.2489 0
+-597.931 -88.8609 0
+-600.213 -86.9739 0
+-598.331 -84.6941 0
+-594.657 -83.7832 0
+-590.492 -85.2996 0
+-587.493 -81.4581 0
+-584.763 -80.7191 0
+-584.256 -76.97 0
+-584.35 -80.7296 0
+-587.624 -81.9651 0
+-587.736 -84.0929 0
+-589.771 -85.3823 0
+-588.993 -86.3505 0
+-592.65 -86.9508 0
+-593.742 -89.9768 0
+-585.409 -89.0967 0
+-580.212 -92.7297 0
+-577.058 -89.8217 0
+-574.289 -90.3334 0
+-572.789 -93.3923 0
+-577.102 -94.6666 0
+-581.67 -92.8774 0
+-582.956 -95.6923 0
+-581.943 -98.1241 0
+-578.775 -100.991 0
+-569.492 -99.7923 0
+-558.904 -105.542 0
+-558.076 -103.485 0
+-559.894 -100.514 0
+-555.153 -94.7908 0
+-557.377 -95.7618 0
+-560.005 -94.5017 0
+-558.364 -96.8731 0
+-559.934 -99.25 0
+-564.167 -94.8937 0
+-557.591 -85.6479 0
+-553.407 -82.6999 0
+-556.143 -81.5794 0
+-555.182 -80.9805 0
+-551.52 -82.1921 0
+-550.138 -81.4578 0
+-545.184 -81.6609 0
+-544.812 -84.5812 0
+-539.465 -85.2146 0
+-535.69 -88.3687 0
+-532.393 -88.6195 0
+-532.458 -94.2062 0
+-533.562 -89.2652 0
+-535.28 -88.4335 0
+-535.391 -94.9333 0
+-533.33 -97.2209 0
+-525.897 -91.1667 0
+-523.775 -92.1951 0
+-519.451 -90.4621 0
+-518.113 -88.4292 0
+-519.685 -86.7252 0
+-516.951 -87.9271 0
+-519.229 -90.1492 0
+-518.567 -91.4303 0
+-514.671 -87.813 0
+-506.449 -86.6195 0
+-506.567 -84.7516 0
+-507.931 -85.1889 0
+-503.92 -81.2077 0
+-509.119 -77.5602 0
+-505.337 -78.3976 0
+-504.717 -80.568 0
+-501.453 -81.4576 0
+-501.37 -79.6997 0
+-499.08 -81.5243 0
+-500.304 -81.1882 0
+-500.518 -83.5532 0
+-501.26 -81.7455 0
+-502.185 -83.843 0
+-504.019 -83.2995 0
+-503.819 -85.6283 0
+-504.255 -83.9351 0
+-506.067 -85.0986 0
+-504.225 -89.8801 0
+-496.691 -85.6832 0
+-490.613 -79.3654 0
+-482.365 -75.1081 0
+-487.416 -74.9649 0
+-482.944 -74.2344 0
+-482.865 -72.5215 0
+-481.961 -75.305 0
+-474.309 -79.5542 0
+-466.269 -77.4976 0
+-462.199 -78.7933 0
+-459.55 -72.5602 0
+-454.3 -70.4639 0
+-456.474 -66.0007 0
+-455.381 -62.2501 0
+-457.508 -59.0918 0
+-449.72 -48.3968 0
+-452.217 -46.6598 0
+-456.85 -51.2664 0
+-459.897 -50.3057 0
+-459.987 -45.4325 0
+-461.839 -43.1206 0
+-457.063 -46.8115 0
+-453.564 -44.5499 0
+-449.118 -46.4183 0
+-448.326 -49.4721 0
+-449.777 -52.0148 0
+-447.529 -52.4257 0
+-446.389 -54.6145 0
+-440.927 -47.424 0
+-435.589 -45.3839 0
+-437.82 -42.2688 0
+-440.314 -42.8173 0
+-445.73 -37.2775 0
+-450.112 -38.6653 0
+-451.596 -35.0232 0
+-455.612 -32.8047 0
+-456.07 -24.7064 0
+-463.659 -21.9999 0
+-456.429 -23.5315 0
+-448.543 -31.1263 0
+-445.878 -31.3336 0
+-445.476 -33.8578 0
+-437.848 -33.4577 0
+-436.756 -32.0129 0
+-433.499 -35.1282 0
+-432.354 -32.4382 0
+-432.1 -33.7076 0
+-428.174 -30.8593 0
+-428.408 -26.7623 0
+-438.067 -19.7039 0
+-435.837 -25.0921 0
+-438.672 -21.7713 0
+-437.976 -17.625 0
+-436.567 -20.6273 0
+-428.859 -25.3063 0
+-427.397 -29.5453 0
+-424.875 -25.8565 0
+-422.177 -27.6312 0
+-422.908 -25.5066 0
+-421.364 -23.034 0
+-425.793 -23.3116 0
+-429.103 -21.4426 0
+-425.268 -23.0447 0
+-420.798 -21.8 0
+-422.628 -18.9824 0
+-427.207 -17.9945 0
+-422.317 -18.9067 0
+-426.527 -14.1375 0
+-422.364 -17.6019 0
+-419.893 -12.6638 0
+-425.366 -13.3971 0
+-426.443 -12.1924 0
+-424.323 -13.019 0
+-418.824 -11.6741 0
+-421.301 -9.58592 0
+-424.865 -11.3252 0
+-422.423 -9.43738 0
+-419.147 -9.6227 0
+-420.462 -6.78261 0
+-415.172 -0.65169 0
+-415.566 -2.67234 0
+-413.269 -1.71267 0
+-415.538 -4.39932 0
+-413.255 -6.21114 0
+-411.511 -6.19614 0
+-410.56 -3.11924 0
+-407.959 -2.26072 0
+-408.855 -4.03747 0
+-404.839 -6.09899 0
+-406.747 -0.26354 0
+-404.517 -0.88061 0
+-405.651 -1.01106 0
+-404.722 -3.32097 0
+-403.708 -1.13723 0
+-401.196 -2.36663 0
+-398.484 -11.1391 0
+-400.424 -13.3849 0
+-399.644 -14.3856 0
+-397.492 -11.9703 0
+-395.357 -12.4368 0
+-390.111 -7.07648 0
+-384.65 -6.43095 0
+-385.03 -3.16622 0
+-387.266 -2.70792 0
+-385.944 -0.43606 0
+-387.325 0.87779 0
+-384.524 -0.81654 0
+-383.542 0.66803 0
+-385.05 1.38589 0
+-383.827 1.20264 0
+-381.866 -0.97998 0
+-381.361 -3.68207 0
+-384.313 -5.69908 0
+-384.113 -8.35555 0
+-382.258 -8.1412 0
+-378.854 -5.08487 0
+-380.471 -1.9599 0
+-378.756 -0.08185 0
+-379.74 5.98863 0
+-375.366 7.77064 0
+-378.303 11.1268 0
+-377.094 10.6551 0
+-375.978 12.9245 0
+-375.826 9.06865 0
+-373.733 7.63838 0
+-366.404 11.7075 0
+-362.154 7.83558 0
+-361.93 10.9303 0
+-358.508 12.0532 0
+-358.822 14.5125 0
+-356.016 15.6154 0
+-357.498 16.9635 0
+-354.941 19.5554 0
+-357.206 24.4156 0
+-362.501 25.0024 0
+-363.623 27.6388 0
+-366.844 26.3764 0
+-371 27.2882 0
+-369.679 29.6383 0
+-365.344 28.0743 0
+-363.248 29.3815 0
+-359.186 26.0729 0
+-347.512 23.8944 0
+-344.084 14.5994 0
+-344.282 12.1048 0
+-347.376 8.78657 0
+-346.111 7.08122 0
+-347.859 4.1787 0
+-346.888 2.79599 0
+-341.153 10.9629 0
+-342.742 14.9152 0
+-341.362 21.635 0
+-339.29 25.0257 0
+-333.947 28.482 0
+-335.978 31.5275 0
+-334.804 35.5528 0
+-332.821 36.6788 0
+-334.842 39.9575 0
+-329.133 36.9739 0
+-326.605 39.0585 0
+-327.747 41.2692 0
+-326.183 39.4097 0
+-328.263 35.6849 0
+-324.635 37.1285 0
+-324.017 34.5152 0
+-328.434 28.3645 0
+-332.672 27.0554 0
+-330.472 23.0259 0
+-327.375 23.8446 0
+-327.124 27.8599 0
+-326.149 29.3468 0
+-324.43 28.8718 0
+-323.243 33.3526 0
+-321.724 32.9853 0
+-319.879 35.9633 0
+-316.461 37.2831 0
+-316.578 36.865 0
+-312.998 37.068 0
+-313.482 43.3771 0
+-307.491 51.0404 0
+-309.168 52.6239 0
+-310.638 51.4657 0
+-311.766 54.0745 0
+-309.493 54.9032 0
+-308.79 57.423 0
+-306.428 57.8932 0
+-306.917 55.6545 0
+-304.483 55.2888 0
+-306.101 50.0121 0
+-301.097 55.9009 0
+-303.13 56.0626 0
+-302.234 58.3089 0
+-300.712 55.2869 0
+-295.116 60.7445 0
+-292.418 59.249 0
+-291.407 61.9027 0
+-288.56 61.7584 0
+-288.799 66.5782 0
+-290.794 67.7596 0
+-292.163 72.2197 0
+-293.548 70.5018 0
+-296.746 72.1825 0
+-300.938 68.8541 0
+-299.61 71.8294 0
+-296.61 73.1446 0
+-295.525 77.8846 0
+-311.331 77.0685 0
+-312.867 71.2891 0
+-312.02 77.6941 0
+-318.913 81.2297 0
+-323.898 86.665 0
+-323.676 89.8476 0
+-321.36 86.5246 0
+-312.984 87.4121 0
+-297.916 82.1379 0
+-300.436 85.6075 0
+-298.552 87.0732 0
+-297.989 85.7526 0
+-294.716 89.1025 0
+-296.744 92.0982 0
+-302.414 92.7593 0
+-304.175 94.6353 0
+-301.324 94.7647 0
+-300.543 96.6814 0
+-299.713 94.3395 0
+-297.896 93.9958 0
+-298.346 95.5903 0
+-296.255 94.3923 0
+-295.263 96.5349 0
+-296.427 98.0661 0
+-295.092 98.4737 0
+-296.106 101.344 0
+-292.233 98.8379 0
+-292.56 95.3822 0
+-290.733 95.3059 0
+-285.651 103.971 0
+-287.221 105.505 0
+-284.075 105.449 0
+-284.286 108.09 0
+-281.442 108.134 0
+-282.14 105.603 0
+-279.424 104.863 0
+-282.892 101.562 0
+-279.111 102.219 0
+-279.861 101.09 0
+-277.919 101.433 0
+-277.789 99.3396 0
+-282.063 99.1221 0
+-281.688 95.3199 0
+-277.032 91.869 0
+-274.684 95.1211 0
+-272.13 95.5332 0
+-273.732 99.1547 0
+-269.15 96.4979 0
+-264.147 97.2613 0
+-264.19 95.9741 0
+-258.723 98.4678 0
+-257.209 101.239 0
+-258.573 106.005 0
+-256.147 111.8 0
+-253.811 108.801 0
+-256.398 101.212 0
+-250.732 100.602 0
+-241.179 94.606 0
+-243.511 91.5714 0
+-244.805 92.4017 0
+-243.42 91.2465 0
+-243.74 87.6141 0
+-242.156 89.4956 0
+-238.177 90.0237 0
+-236.978 92.573 0
+-235.059 92.2346 0
+-231.915 98.5648 0
+-232.458 100.658 0
+-234.119 99.5115 0
+-235.281 101.27 0
+-234.821 106.163 0
+-232.865 107.067 0
+-230.514 104.406 0
+-228.243 105.623 0
+-226.146 107.822 0
+-226.164 110.499 0
+-223.396 111.434 0
+-221.331 115.911 0
+-226.087 116.203 0
+-227.625 118.883 0
+-226.768 120.344 0
+-228.074 120.696 0
+-232.242 117.13 0
+-234.232 118.293 0
+-236.111 116.598 0
+-236.107 119.896 0
+-237.692 121.047 0
+-236.477 121.008 0
+-235.905 126.175 0
+-240.812 127.955 0
+-242.717 131.671 0
+-239.791 128.2 0
+-235.764 127.426 0
+-234.618 125.246 0
+-231.715 127.329 0
+-230.95 129.071 0
+-234.522 131.417 0
+-233.472 132.583 0
+-234.647 133.82 0
+-231.443 135.849 0
+-234.22 140.791 0
+-228.158 134.079 0
+-230.125 132.742 0
+-230.214 129.925 0
+-227.419 131.835 0
+-227.651 130.909 0
+-226.242 130.632 0
+-225.782 132.383 0
+-224.506 131.088 0
+-225.389 128.762 0
+-229.337 128.831 0
+-227.745 127.948 0
+-229.265 124.709 0
+-222.469 124.962 0
+-217.442 127.027 0
+-219.986 126.639 0
+-219.25 127.505 0
+-220.852 128.098 0
+-217.949 130.285 0
+-216.03 130.126 0
+-215.3 127.516 0
+-211.191 129.434 0
+-206.21 126.686 0
+-200.014 127.334 0
+-201.266 129.502 0
+-203.839 128.102 0
+-207.582 131.589 0
+-207.694 134.601 0
+-208.827 133.936 0
+-205.914 136.568 0
+-201.05 136.8 0
+-200.225 133.912 0
+-196.228 135.603 0
+-198.049 135.612 0
+-200.37 139.233 0
+-199.624 140.509 0
+>
+-375.743 -11.8851 0
+-370.801 -11.3915 0
+-370.567 -13.2475 0
+-363.006 -11.3193 0
+-365.06 -8.79183 0
+-364.045 -3.81472 0
+-362.666 -2.62285 0
+-360.473 -4.18786 0
+-357.584 -3.65499 0
+-359.03 -1.32978 0
+-357.513 3.43857 0
+-354.473 2.62002 0
+-352.329 5.09537 0
+-357.331 8.11421 0
+-362.862 5.44952 0
+-363.863 8.63696 0
+-367.875 10.7535 0
+-367.721 6.8871 0
+-372.694 0.32063 0
+-370.712 -1.37138 0
+-369.203 0.51565 0
+-364.243 -1.02598 0
+-371.592 -8.06717 0
+-371.137 -9.52033 0
+-372.617 -8.05989 0
+-375.724 -11.4186 0
+-375.743 -11.8851 0
+>
+-148.381 -22.8743 0
+-145.354 -24.5554 0
+-145.191 -26.3117 0
+-141.614 -26.3969 0
+-141.558 -24.036 0
+-137.904 -20.8507 0
+-132.598 -21.296 0
+-136.546 -15.2489 0
+-139.693 -18.6903 0
+-139.612 -15.2653 0
+-141.878 -15.9989 0
+-142.573 -19.4426 0
+-143.837 -16.7395 0
+-146.214 -17.8359 0
+-146.584 -20.4555 0
+-144.02 -20.1067 0
+-146 -21.6785 0
+-141.807 -21.6345 0
+-142.683 -24.0647 0
+-144.205 -23.5737 0
+-144.851 -24.9335 0
+-145.227 -23.5381 0
+-146.556 -23.5284 0
+-147.415 -20.99 0
+-148.365 -22.2203 0
+-148.381 -22.8743 0
+>
+-273.753 77.8129 0
+-269.288 74.4727 0
+-263.732 79.3736 0
+-260.478 79.365 0
+-257.519 76.579 0
+-253.338 80.007 0
+-253.907 84.3684 0
+-258.097 89.8272 0
+-260.121 90.0834 0
+-261.937 87.4226 0
+-260.204 87.5869 0
+-260.646 86.5353 0
+-261.753 86.8611 0
+-263.82 82.798 0
+-269.7 86.3292 0
+-271.879 85.0258 0
+-271.533 83.2476 0
+-269.74 79.165 0
+-273.746 78.0015 0
+-273.753 77.8129 0
+>
+-295.111 83.7488 0
+-293.278 80.9496 0
+-288.453 79.3007 0
+-281.615 85.7727 0
+-281.847 90.7809 0
+-284.524 89.8079 0
+-284.947 92.234 0
+-287.508 91.6687 0
+-290.786 93.8187 0
+-290.352 91.7362 0
+-292.589 91.7159 0
+-291.823 90.3883 0
+-294.494 86.783 0
+-293.527 85.4037 0
+-290.509 87.33 0
+-290.254 85.8985 0
+-295.108 83.8376 0
+-295.111 83.7488 0
+>
+-408.109 -27.8248 0
+-404.086 -29.8846 0
+-399.945 -29.1208 0
+-396.238 -31.4099 0
+-394.447 -30.3145 0
+-394.775 -25.7604 0
+-393.124 -25.5608 0
+-395.724 -23.8741 0
+-395.9 -20.6615 0
+-398.911 -23.9767 0
+-401.071 -21.5613 0
+-402.931 -21.8626 0
+-406.507 -26.3444 0
+-410.256 -22.6698 0
+-414.503 -25.9643 0
+-408.619 -27.7367 0
+-408.109 -27.8248 0
+>
+-445.506 -36.8752 0
+-440.392 -42.2458 0
+-437.809 -42.002 0
+-436.157 -44.2344 0
+-434.338 -45.0148 0
+-435.313 -46.142 0
+-434.257 -47.8916 0
+-430.209 -49.5134 0
+-428.87 -47.0653 0
+-432.429 -46.0772 0
+-432.32 -41.1596 0
+-434.499 -36.8445 0
+-439.048 -37.3926 0
+-442.117 -34.6518 0
+-445.498 -36.6973 0
+-445.506 -36.8752 0
+>
+-147.132 -9.30682 0
+-145.627 -10.408 0
+-143.968 -9.42758 0
+-143.256 -13.7922 0
+-140.977 -12.5047 0
+-142.189 -11.9213 0
+-140.731 -10.7583 0
+-141.989 -7.81143 0
+-147.126 -9.02971 0
+-147.132 -9.30682 0
+>
+-155.78 -20.1977 0
+-150.659 -19.8576 0
+-150.492 -13.0183 0
+-147.9 -11.4621 0
+-151.048 -10.6865 0
+-153.137 -16.658 0
+-152.156 -18.3348 0
+-155.773 -19.9095 0
+-155.78 -20.1977 0
+>
+-321.491 85.7402 0
+-317.095 83.5742 0
+-314.628 84.2271 0
+-313.264 82.6091 0
+-310.796 83.296 0
+-314.129 86.721 0
+-321.477 86.1066 0
+-321.491 85.7402 0
+>
+-407.519 -13.7231 0
+-405.947 -12.9653 0
+-406.893 -11.0332 0
+-414.636 -14.547 0
+-412.978 -16.6102 0
+-408.914 -17.6276 0
+-408.043 -13.9906 0
+-407.519 -13.7231 0
+>
+-322.013 85.3819 0
+-317.784 81.4765 0
+-313.811 81.5622 0
+-314.547 83.6683 0
+-317.21 83.2116 0
+-322.01 85.4818 0
+-322.013 85.3819 0
+>
+-154.292 -42.9613 0
+-151.738 -43.2119 0
+-152.346 -38.7052 0
+-153.879 -38.6235 0
+-154.288 -42.7839 0
+-154.292 -42.9613 0
+>
+-280.567 77.8696 0
+-277.219 77.6095 0
+-274.553 81.1844 0
+-278.393 81.9053 0
+-280.564 77.9694 0
+-280.567 77.8696 0
+>
+-142.13 -0.93181 0
+-141.548 -2.18793 0
+-139.451 0.1132 0
+-140.754 1.12027 0
+-142.121 -0.55494 0
+-142.13 -0.93181 0
+>
+-162.463 -58.5663 0
+-160.483 -61.4326 0
+-158.654 -57.9281 0
+-162.461 -58.4776 0
+-162.463 -58.5663 0
+>
+-401.974 -11.1833 0
+-399.971 -12.3796 0
+-400.42 -10.8361 0
+-401.963 -10.9166 0
+-401.974 -11.1833 0
+>
+-351.744 4.32769 0
+-350.228 3.81344 0
+-351.08 5.63672 0
+-351.741 4.41653 0
+-351.744 4.32769 0
+>
+-406.138 -10.1743 0
+-405.079 -11.8328 0
+-403.81 -10.9286 0
+-406.13 -9.98544 0
+-406.138 -10.1743 0
+>
+-296.397 81.95 0
+-294.473 81.6812 0
+-295.435 83.2492 0
+-296.387 82.2164 0
+-296.397 81.95 0
+>
+-136.429 -54.1983 0
+-135.745 -55.6556 0
+-135.087 -53.7745 0
+-136.426 -54.0985 0
+-136.429 -54.1983 0
+>
+-371.712 6.96791 0
+-370.034 5.36581 0
+-370.757 7.79762 0
+-371.606 7.05269 0
+-371.712 6.96791 0
+>
+-416.082 -12.359 0
+-414.622 -14.2248 0
+-410.126 -7.41258 0
+-416.07 -12.0812 0
+-416.082 -12.359 0
+>
+-271.267 94.026 0
+-267.478 91.9084 0
+-266.186 94.0309 0
+-271.159 94.2112 0
+-271.267 94.026 0
+>
+-217.05 126.604 0
+-216.183 125.145 0
+-215.043 125.987 0
+-217.044 126.782 0
+-217.05 126.604 0
+>
+-369.51 28.7526 0
+-368.966 27.0174 0
+-366.404 27.1376 0
+-369.48 29.4968 0
+-369.51 28.7526 0
+>
+-142.453 -14.4103 0
+-141.244 -15.1268 0
+-140.701 -13.8088 0
+-142.449 -14.233 0
+-142.453 -14.4103 0
+>
+-312.14 85.48 0
+-310.352 84.3023 0
+-312.036 85.5317 0
+-312.14 85.48 0
+>
+-151.173 137.117 0
+-149.97 136.72 0
+-151.17 137.217 0
+-151.173 137.117 0
+>
+-312.617 86.3425 0
+-311.523 85.6461 0
+-312.614 86.4202 0
+-312.617 86.3425 0
+>
+-438.156 -19.377 0
+-437.897 -18.1632 0
+-438.135 -18.9101 0
+-438.156 -19.377 0
+>
+-383.37 -2.67721 0
+-382.226 -2.26732 0
+-383.362 -2.48835 0
+-383.37 -2.67721 0
+>
+-150.931 -10.0461 0
+-149.712 -10.3532 0
+-150.926 -9.85764 0
+-150.931 -10.0461 0
+>
+-152.006 -54.2966 0
+-150.96 -53.4012 0
+-151.997 -53.9197 0
+-152.006 -54.2966 0
+>
+-136.308 -9.47659 0
+-135.181 -9.31452 0
+-136.306 -9.38792 0
+-136.308 -9.47659 0
+>
+-329.839 12.5735 0
+-328.79 13.2795 0
+-329.828 12.8622 0
+-329.839 12.5735 0
+>
+-142.287 -54.9824 0
+-140.758 -55.2955 0
+-142.283 -54.8051 0
+-142.287 -54.9824 0
+>
+-286.588 74.457 0
+-285.571 74.4325 0
+-286.578 74.7455 0
+-286.588 74.457 0
+>
+-263.575 93.1207 0
+-261.321 93.6893 0
+-263.569 93.2982 0
+-263.575 93.1207 0
+>
+-288.164 70.1674 0
+-287.22 68.0453 0
+-288.16 70.2562 0
+-288.164 70.1674 0
+>
+-286.031 75.8376 0
+-284.529 75.1406 0
+-286.021 76.115 0
+-286.031 75.8376 0
+>
+-323.562 87.4861 0
+-321.696 85.6924 0
+-323.549 87.8414 0
+-323.562 87.4861 0
+>
+-335.184 9.1592 0
+-333.075 8.06868 0
+-335.176 9.35906 0
+-335.184 9.1592 0
+>
+-451.146 -327.323 0
+-449.187 -328.123 0
+-451.131 -326.945 0
+-451.146 -327.323 0
+>
+-153.46 138.575 0
+-151.974 137.416 0
+-153.458 138.664 0
+-153.46 138.575 0
+>
+-316.583 80.9203 0
+-312.86 79.7594 0
+-316.577 81.098 0
+-316.583 80.9203 0
+>
+-383.642 -4.3353 0
+-381.978 -3.74614 0
+-383.638 -4.23532 0
+-383.642 -4.3353 0
+>
+-311.201 86.1011 0
+-309.403 85.19 0
+-311.198 86.1899 0
+-311.201 86.1011 0
+>
+-171.771 -37.6323 0
+-170.02 -37.2112 0
+-171.764 -37.3552 0
+-171.771 -37.6323 0
+>
+-376.425 -8.41999 0
+-374.034 -7.59192 0
+-376.414 -8.15339 0
+-376.425 -8.41999 0
+>
+-294.029 88.4333 0
+-293.168 89.7473 0
+-294.025 88.5332 0
+-294.029 88.4333 0
+>
+-370.233 8.09938 0
+-369.137 7.32154 0
+-370.221 8.38817 0
+-370.233 8.09938 0
+>
+-398.731 -22.081 0
+-397.872 -21.1814 0
+-398.726 -21.981 0
+-398.731 -22.081 0
+>
+-310.521 85.2312 0
+-309.122 84.5349 0
+-310.514 85.4199 0
+-310.521 85.2312 0
+>
+-337.728 9.53262 0
+-336.526 8.84256 0
+-337.721 9.72139 0
+-337.728 9.53262 0
+>
+-379.036 -9.61721 0
+-377.79 -9.211 0
+-379.01 -8.97291 0
+-379.036 -9.61721 0
+>
+-607.025 -90.3307 0
+-606.003 -88.6645 0
+-607.005 -89.9629 0
+-607.025 -90.3307 0
+>
+-261.057 92.4696 0
+-259.617 92.988 0
+-261.055 92.5251 0
+-261.057 92.4696 0
+>
+-599.059 -94.4885 0
+-597.927 -94.638 0
+-599.044 -94.1988 0
+-599.059 -94.4885 0
+>
+-308.228 78.3885 0
+-304.04 78.8026 0
+-308.122 78.5291 0
+-308.228 78.3885 0
+>
+-339.092 11.352 0
+-338.311 10.3441 0
+-339.067 12.0071 0
+-339.092 11.352 0
+>
+-313.384 82.1022 0
+-311.664 81.8385 0
+-313.382 82.1466 0
+-313.384 82.1022 0
+>
+-283.92 104.088 0
+-282.568 104.974 0
+-283.916 104.188 0
+-283.92 104.088 0
+>
+-301.716 81.1524 0
+-300.61 80.8012 0
+-301.614 81.1599 0
+-301.716 81.1524 0
+>
+-151.893 -28.5121 0
+-148.19 -27.6814 0
+-151.891 -28.4235 0
+-151.893 -28.5121 0
+>
+-579.453 -92.0654 0
+-578.449 -92.6871 0
+-579.343 -91.9371 0
+-579.453 -92.0654 0
+>
+-151.102 -42.3067 0
+-148.535 -41.9915 0
+-151.093 -41.9298 0
+-151.102 -42.3067 0
+>
+-146.567 -2.85436 0
+-146.187 -4.01707 0
+-146.464 -2.8125 0
+-146.567 -2.85436 0
+>
+-484.306 -74.6846 0
+-483.173 -74.7366 0
+-484.304 -74.6401 0
+-484.306 -74.6846 0
+>
+-223.364 122.27 0
+-221.649 122.028 0
+-223.361 122.347 0
+-223.364 122.27 0
+>
+-238.174 128.103 0
+-238.068 128.233 0
+-237.066 127.878 0
+-238.174 128.103 0
+>
+-486.166 -74.7216 0
+-486.263 -74.5945 0
+-485.014 -74.3733 0
+-486.166 -74.7216 0
+>
+5.10823 135.973 0
+-0.27564 127.101 0
+0.92285 126.163 0
+-1.83691 124.077 0
+-2.69557 120.766 0
+-1.19075 120.001 0
+-4.32748 119.816 0
+-6.39088 117.122 0
+-6.62138 115.286 0
+-4.61055 114.513 0
+-7.33763 108.184 0
+-10.9115 106.112 0
+-11.3566 103.537 0
+-14.4379 100.727 0
+-11.7253 99.388 0
+-19.424 99.1782 0
+-22.1216 95.222 0
+-19.6209 93.2754 0
+-25.9068 92.9685 0
+-30.6865 79.9285 0
+-38.6357 71.8532 0
+-37.7467 70.4526 0
+-39.6857 69.8324 0
+-38.9996 68.4353 0
+-41.3429 67.9332 0
+-40.1349 67.3579 0
+-42.5161 64.7179 0
+-44.0417 58.827 0
+-45.5731 58.3887 0
+-50.3094 49.2419 0
+-47.4168 46.1535 0
+-50.8425 47.8663 0
+-55.2326 41.2966 0
+-55.8307 36.4201 0
+-58.7212 34.1681 0
+-59.2787 31.5407 0
+-62.1405 30.9069 0
+-64.5864 25.3558 0
+-66.8336 24.9883 0
+-67.483 22.9723 0
+-65.8576 22.7531 0
+-73.1028 11.531 0
+-72.9401 9.39971 0
+-62.7835 7.36737 0
+-68.9366 5.48807 0
+-76.2508 6.92576 0
+-80.6388 1.61394 0
+-80.6699 0.04057 0
+-79.6394 0.56336 0
+-80.7537 -4.2031 0
+-84.6057 -8.0062 0
+-87.2777 -13.9606 0
+-87.6693 -18.1982 0
+-86.9073 -15.8635 0
+-85.3969 -16.9468 0
+-86.6311 -22.4756 0
+-84.9074 -23.1528 0
+-84.9626 -25.9339 0
+-87.7303 -26.3332 0
+-87.8897 -29.1899 0
+-85.7428 -29.1883 0
+-86.1811 -30.6649 0
+-85.2437 -29.7968 0
+-86.5399 -33.2848 0
+-85.0933 -32.5265 0
+-82.8744 -34.0888 0
+-84.6496 -35.9493 0
+-85.6373 -34.1784 0
+-86.8907 -35.4948 0
+-84.9664 -36.4529 0
+-86.407 -36.8899 0
+-84.7252 -39.7829 0
+-86.6885 -45.9292 0
+-84.6695 -47.3545 0
+-85.3135 -48.8715 0
+-88.2709 -48.3031 0
+-87.2878 -50.3511 0
+-91.355 -54.061 0
+-89.8582 -56.0307 0
+-92.6558 -57.6374 0
+-89.6024 -58.6184 0
+-92.3691 -58.6629 0
+-92.3185 -61.2467 0
+-93.9833 -62.5101 0
+-92.6868 -64.2876 0
+-94.5381 -64.6162 0
+-94.5977 -67.5746 0
+-91.3145 -67.4186 0
+-91.1581 -69.8603 0
+-89.1379 -71.3856 0
+-97.9159 -74.491 0
+-96.8047 -70.2569 0
+-98.7792 -71.5581 0
+-98.6531 -75.4404 0
+-97.308 -74.858 0
+-96.5347 -77.1904 0
+-92.7994 -75.0484 0
+-96.3642 -78.912 0
+-90.0803 -82.7726 0
+-91.8808 -80.4315 0
+-90.2234 -79.6219 0
+-87.0898 -82 0
+-85.2997 -79.6296 0
+-83.2496 -79.7025 0
+-82.8125 -83.6456 0
+-86.802 -83.0253 0
+-88.4745 -84.5998 0
+-85.582 -88.9012 0
+-83.1388 -100.685 0
+-82.5646 -97.5044 0
+-80.7631 -99.988 0
+-80.2742 -101.294 0
+-82.2102 -100.47 0
+-82.7545 -102.078 0
+-76.9946 -118.256 0
+-75.4475 -118.008 0
+-78.0191 -123.59 0
+-76.5355 -126.809 0
+-73.8587 -126.714 0
+-72.9843 -129.545 0
+-74.7018 -127.807 0
+-69.4527 -133.443 0
+-69.3853 -135.428 0
+-75.7178 -127.101 0
+-76.8568 -127.491 0
+-67.0841 -139.17 0
+-61.4823 -142.681 0
+-60.6043 -139.55 0
+-60.2429 -142.47 0
+-58.2964 -143.057 0
+-57.2166 -146.167 0
+-51.4076 -149.877 0
+-50.4546 -148.32 0
+-50.8956 -150.063 0
+-43.8608 -154.61 0
+-38.4091 -161.765 0
+-37.5694 -167.406 0
+-34.0363 -172.357 0
+-30.916 -184.313 0
+-34.1372 -192.473 0
+-30.8128 -198.073 0
+-31.3998 -202.772 0
+-28.4271 -204.422 0
+-25.5737 -200.122 0
+-19.9301 -202.884 0
+-15.8554 -207.095 0
+-17.8201 -199.824 0
+-17.2658 -197.151 0
+-14.9788 -196.12 0
+-14.8755 -196.121 0
+-12.1376 -192.338 0
+-12.9898 -186.777 0
+-11.9245 -184.399 0
+-13.3345 -181.888 0
+-12.0747 -180.343 0
+-12.1996 -159.75 0
+-2.88403 -133.838 0
+0.13937 -130.844 0
+3.13289 -122.256 0
+17.7481 -112.342 0
+20.0582 -108.217 0
+19.1007 -102.579 0
+25.2045 -98.5887 0
+34.4035 -83.7339 0
+37.2642 -75.4603 0
+42.4224 -72.1952 0
+41.0058 -70.6181 0
+40.7814 -63.1403 0
+43.2621 -60.9416 0
+45.2973 -52.5692 0
+48.1856 -50.2967 0
+52.0296 -34.7333 0
+50.6062 -34.0761 0
+53.075 -32.4408 0
+51.9951 -28.2766 0
+54.6125 -22.0245 0
+57.121 -6.26912 0
+62.5931 10.9299 0
+63.1928 20.0605 0
+67.3167 25.5574 0
+64.6166 30.2905 0
+64.4516 34.1683 0
+69.2817 39.5589 0
+69.243 46.1155 0
+77.2293 53.0512 0
+80.5287 58.7471 0
+83.4903 72.5641 0
+85.7487 75.8227 0
+89.6151 77.5952 0
+87.2172 81.6686 0
+90.7784 83.4883 0
+91.4291 88.7322 0
+89.3212 90.9756 0
+92.0586 91.4181 0
+88.8382 93.7483 0
+87.2902 102.156 0
+84.8759 103.749 0
+86.7986 103.821 0
+85.5284 108.993 0
+86.9287 118.96 0
+93.1697 128.365 0
+103.417 134.885 0
+>
+272.919 57.3454 0
+274.963 54.4322 0
+278.721 53.9971 0
+279.419 56.4035 0
+282.272 54.2041 0
+294.876 51.5097 0
+295.47 53.8721 0
+292.517 55.426 0
+297.603 53.7418 0
+297.469 58.7682 0
+300.009 58.2313 0
+301.09 63.4098 0
+295.597 65.8209 0
+294.366 68.1163 0
+293.155 67.09 0
+290.104 68.4555 0
+288.494 66.4195 0
+288.176 68.6765 0
+284.002 71.6534 0
+283.3 70.2986 0
+280.988 66.6098 0
+282.114 64.6671 0
+281.002 63.9303 0
+283.247 61.5397 0
+282.848 60.397 0
+282.942 61.6819 0
+281.219 61.3515 0
+281.755 56.0948 0
+279.8 61.0671 0
+278.387 59.72 0
+277.157 62.1054 0
+277.786 58.1556 0
+275.239 60.1581 0
+275.353 57.623 0
+272.918 57.6112 0
+272.919 57.3454 0
+>
+314.116 71.2558 0
+315.853 69.5639 0
+319.488 71.5198 0
+321.637 69.1896 0
+321.756 66.9647 0
+321.24 68.1232 0
+318.23 63.9904 0
+323.534 60.5786 0
+326.781 60.6061 0
+328.89 63.105 0
+331.337 61.7534 0
+333.4 69.203 0
+332.737 75.2881 0
+335.755 77.719 0
+338.024 84.2967 0
+340.837 86.8045 0
+341.302 91.0619 0
+338.465 91.2118 0
+335.679 85.9248 0
+336.916 83.6328 0
+335.331 79.7418 0
+332.988 81.1489 0
+330.272 78.9095 0
+329.606 74.0086 0
+321.101 72.6514 0
+321.687 75.3805 0
+318.836 76.963 0
+319.171 73.1451 0
+314.908 73.7979 0
+314.116 71.3444 0
+314.116 71.2558 0
+>
+101.016 -369.442 0
+104.891 -367.031 0
+103.86 -364.944 0
+101.361 -364.198 0
+96.5498 -366.415 0
+97.5764 -369.012 0
+93.2715 -373.223 0
+92.2883 -379.902 0
+95.523 -380.122 0
+98.1469 -377.859 0
+98.9985 -375.197 0
+97.1341 -372.971 0
+101.016 -369.442 0
+101.016 -369.442 0
+>
+78.6051 -338.994 0
+80.9768 -342.189 0
+85.7914 -338.947 0
+86.4429 -335.177 0
+88.5329 -334.085 0
+87.7175 -331.589 0
+89.1959 -328.555 0
+87.9623 -326.377 0
+84.3152 -327.037 0
+81.9741 -334.038 0
+78.6092 -338.441 0
+78.6051 -338.994 0
+>
+49.8555 -187.725 0
+50.8494 -191.599 0
+53.5101 -193.983 0
+59.681 -196.489 0
+60.2177 -194.279 0
+56.6335 -191.201 0
+57.9856 -190.106 0
+57.1883 -187.098 0
+49.9596 -187.637 0
+49.8555 -187.725 0
+>
+205.439 71.8998 0
+207.061 71.3463 0
+210.203 74.3364 0
+201.892 75.5873 0
+199.054 73.1525 0
+205.338 71.9884 0
+205.439 71.8998 0
+>
+84.0218 -382.657 0
+84.512 -387.187 0
+86.7934 -389.55 0
+89.5483 -383.724 0
+85.3001 -379.024 0
+84.0223 -382.579 0
+84.0218 -382.657 0
+>
+306.994 60.6383 0
+304.442 62.8239 0
+302.329 60.3731 0
+306.7 59.252 0
+307.096 60.6391 0
+306.994 60.6383 0
+>
+79.9391 -384.111 0
+81.3943 -385.04 0
+81.527 -381.123 0
+80.1688 -381.257 0
+79.9439 -383.458 0
+79.9391 -384.111 0
+>
+315.022 59.0815 0
+315.944 57.937 0
+317.661 59.0136 0
+316.02 61.2598 0
+315.019 59.5466 0
+315.022 59.0815 0
+>
+-99.5767 -30.7139 0
+-98.5469 -35.3026 0
+-98.9747 -31.2696 0
+-96.1738 -24.3658 0
+-99.5746 -30.6142 0
+-99.5767 -30.7139 0
+>
+46.9157 -122.275 0
+47.9134 -125.176 0
+51.4963 -126.608 0
+51.6494 -121.615 0
+46.9205 -121.81 0
+46.9157 -122.275 0
+>
+374.959 96.4039 0
+378.222 94.5609 0
+380.823 97.0305 0
+377.76 99.1633 0
+374.947 97.4229 0
+374.959 96.4039 0
+>
+282.304 29.4238 0
+286.378 28.3058 0
+288.196 30.3867 0
+284.836 31.331 0
+282.304 29.5235 0
+282.304 29.4238 0
+>
+-68.0571 -159.243 0
+-66.5135 -159.403 0
+-64.0939 -156.62 0
+-66.9784 -156.525 0
+-68.052 -158.955 0
+-68.0571 -159.243 0
+>
+307.059 51.5917 0
+306.36 49.9701 0
+308.103 47.635 0
+310.318 50.2756 0
+307.161 51.5925 0
+307.059 51.5917 0
+>
+375.629 107.866 0
+378.578 106.606 0
+377.137 108.571 0
+375.729 107.956 0
+375.629 107.866 0
+>
+-98.7856 -76.912 0
+-97.1926 -79.2943 0
+-98.1405 -75.4508 0
+-98.7723 -76.2583 0
+-98.7856 -76.912 0
+>
+-72.0602 7.44309 0
+-69.9452 6.07253 0
+-68.3998 6.90764 0
+-72.0583 7.5428 0
+-72.0602 7.44309 0
+>
+97.3286 117.944 0
+100.556 117.099 0
+99.3549 118.626 0
+97.3301 118.132 0
+97.3286 117.944 0
+>
+277.752 64.8434 0
+278.569 63.685 0
+279.679 64.8423 0
+277.853 64.8882 0
+277.752 64.8434 0
+>
+93.0686 -340.846 0
+94.5245 -341.188 0
+94.5364 -339.383 0
+93.0705 -340.569 0
+93.0686 -340.846 0
+>
+-69.6052 7.86158 0
+-68.3857 7.64996 0
+-69.6035 7.95021 0
+-69.6052 7.86158 0
+>
+-91.4802 -50.0901 0
+-89.2639 -46.7648 0
+-91.4746 -49.8131 0
+-91.4802 -50.0901 0
+>
+-87.5157 -41.2019 0
+-87.2699 -39.134 0
+-87.5011 -40.4706 0
+-87.5157 -41.2019 0
+>
+-91.3983 -51.1116 0
+-90.7012 -52.0899 0
+-91.1889 -50.883 0
+-91.3983 -51.1116 0
+>
+-8.74391 108.848 0
+-8.01374 110.266 0
+-8.73807 109.225 0
+-8.74391 108.848 0
+>
+-87.2821 -29.4791 0
+-86.1524 -29.2245 0
+-87.2785 -29.3018 0
+-87.2821 -29.4791 0
+>
+-66.3578 7.05744 0
+-63.2966 7.18851 0
+-66.3559 7.15715 0
+-66.3578 7.05744 0
+>
+-89.8472 -45.2234 0
+-88.2621 -42.7167 0
+-89.8416 -44.9464 0
+-89.8472 -45.2234 0
+>
+-93.112 -54.857 0
+-92.0951 -50.1221 0
+-93.1085 -54.6797 0
+-93.112 -54.857 0
+>
+299.167 47.4293 0
+300.895 47.164 0
+299.167 47.5179 0
+299.167 47.4293 0
+>
+92.4068 -315.482 0
+94.3759 -316.503 0
+92.4087 -315.194 0
+92.4068 -315.482 0
+>
+96.2848 -295.119 0
+97.0061 -295.998 0
+96.2867 -294.842 0
+96.2848 -295.119 0
+>
+-73.294 6.91268 0
+-70.8618 6.13438 0
+-73.2904 7.10103 0
+-73.294 6.91268 0
+>
+279.181 63.0791 0
+281.42 61.718 0
+279.179 63.4556 0
+279.181 63.0791 0
+>
+300.786 48.3591 0
+302.602 50.1432 0
+300.783 48.7356 0
+300.786 48.3591 0
+>
+262.011 44.3764 0
+263.837 45.0259 0
+262.011 44.465 0
+262.011 44.3764 0
+>
+321.896 74.6292 0
+322.51 73.8591 0
+321.893 75.0057 0
+321.896 74.6292 0
+>
+60.7669 -201.935 0
+62.1044 -202.501 0
+60.7677 -201.846 0
+60.7669 -201.935 0
+>
+288.237 75.6862 0
+289.657 75.5175 0
+288.234 76.0627 0
+288.237 75.6862 0
+>
+77.8713 -381.328 0
+79.2252 -381.792 0
+77.8735 -381.041 0
+77.8713 -381.328 0
+>
+42.5249 -72.1963 0
+43.7598 -71.656 0
+42.5258 -72.1077 0
+42.5249 -72.1963 0
+>
+90.8273 -318.316 0
+91.7602 -318.788 0
+90.8286 -318.139 0
+90.8273 -318.316 0
+>
+-73.2743 7.93201 0
+-70.9285 7.97554 0
+-73.269 8.20901 0
+-73.2743 7.93201 0
+>
+-68.0781 7.74387 0
+-66.4545 7.33634 0
+-67.9737 7.87489 0
+-68.0781 7.74387 0
+>
+-88.0005 -34.73 0
+-87.0952 -35.4907 0
+-87.9969 -34.5527 0
+-88.0005 -34.73 0
+>
+-95.3222 -62.8489 0
+-93.3699 -57.49 0
+-95.3166 -62.5719 0
+-95.3222 -62.8489 0
+>
+94.2742 -300.64 0
+95.3156 -300.282 0
+94.2767 -300.264 0
+94.2742 -300.64 0
+>
+-98.0412 -70.5643 0
+-96.0812 -64.9064 0
+-98.0336 -70.1876 0
+-98.0412 -70.5643 0
+>
+-64.7131 7.76912 0
+-64.7096 7.95746 0
+-63.6975 7.56172 0
+-64.7131 7.76912 0
+>
+433.69 108.701 0
+436.375 105.477 0
+438.106 104.841 0
+438.179 106.515 0
+439.436 104.043 0
+445.576 106.076 0
+454.276 106.33 0
+455.817 105.105 0
+452.192 109.706 0
+441.899 113.914 0
+442.058 116.411 0
+439.601 118.208 0
+435.115 126.4 0
+434.933 125.2 0
+433.709 125.866 0
+437.886 117.913 0
+436.065 117.982 0
+436.516 115.209 0
+434.02 113.228 0
+436.829 108.554 0
+435.11 108.481 0
+434.574 110.334 0
+433.686 108.967 0
+433.69 108.701 0
+>
+421.736 116.077 0
+424.198 113.855 0
+430.55 115.11 0
+429.172 119.01 0
+424.693 120.877 0
+423.841 117.218 0
+422.515 117.984 0
+421.731 116.365 0
+421.736 116.077 0
+>
+431.137 128.683 0
+433.784 127.441 0
+432.542 129.238 0
+431.135 128.782 0
+431.137 128.683 0
+>
+432.235 104.888 0
+434.364 104.646 0
+432.82 106.238 0
+432.227 105.353 0
+432.235 104.888 0
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/gps/gps.dat
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/gps/gps.dat	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,46 @@
+# no NAME x1 x2 x3
+1 BANC 134.994333 48.416379 0.000000
+2 CHEN -75.363004 39.067354 0.000000
+3 CHIA -29.824020 -56.501438 0.000000
+4 CHNL -43.226427 -43.411341 0.000000
+5 CHYN -40.934467 -71.265986 0.000000
+6 CK01 -87.020943 -80.364941 0.000000
+7 FCWS 118.950051 28.795845 0.000000
+8 FIVE 142.772233 82.705727 0.000000
+9 FLNM -3.600219 48.012958 0.000000
+10 GAIS -76.148210 -41.185686 0.000000
+11 HENC -195.613454 -27.007160 0.000000
+12 HOKN -63.328077 -87.658706 0.000000
+13 HSIN 116.739766 4.957366 0.000000
+14 HUAL 21.599506 64.580955 0.000000
+15 ILAN 108.786666 79.923464 0.000000
+16 KDNM -201.702439 -23.428318 0.000000
+17 KULN -48.234332 -49.277258 0.000000
+18 LANY -192.928827 56.832896 0.000000
+19 LIUC -157.019581 -65.329403 0.000000
+20 NCTU 112.445058 3.175428 0.000000
+21 PANG -20.296178 -145.182139 0.000000
+22 PINT -1.376764 -34.835671 0.000000
+23 PKGM -20.290041 -69.374990 0.000000
+24 S011 -61.842825 -66.678693 0.000000
+25 S012 -78.275601 -51.709854 0.000000
+26 S016 45.266303 -17.556755 0.000000
+27 S058 -50.871859 47.605630 0.000000
+28 S01R -10.379850 -142.011515 0.000000
+29 S092 -64.455528 -47.353679 0.000000
+30 S101 139.545914 65.805507 0.000000
+31 S102 -192.939995 56.843113 0.000000
+32 S103 -22.323022 -52.076732 0.000000
+33 S104 -105.769567 19.819916 0.000000
+34 S105 -91.176022 12.152498 0.000000
+35 S106 -78.959434 -67.534669 0.000000
+36 S167 20.120297 -4.591368 0.000000
+37 S23R -124.388554 -40.370005 0.000000
+38 SANI 71.329946 -20.615251 0.000000
+39 SUAO 89.687797 90.940066 0.000000
+40 SUN1 12.051397 -7.327515 0.000000
+41 TMAM -128.197152 0.841891 0.000000
+42 TSHO -95.232502 -66.002996 0.000000
+43 WUFN 30.282095 -28.323486 0.000000
+44 YMSM 153.453202 61.936191 0.000000
+45 YUSN -31.649323 -2.788163 0.000000
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/gps/postseismic_neu_today_km.dat
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/examples/chichi/gps/postseismic_neu_today_km.dat	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,43 @@
+134.994333 48.416379 15.700169 0.328734 -3.552827
+-75.363004 39.067354 -33.745566 26.631736 -18.412423
+-29.824020 -56.501438 -0.460565 -10.683320 -8.271300
+-43.226427 -43.411341 -31.024071 30.709481 -10.383437
+-40.934467 -71.265986 6.471729 -3.992523 -21.673437
+-87.020943 -80.364941 4.060227 14.237428 -50.330090
+118.950051 28.795845 8.680111 27.396566 -20.705148
+142.772233 82.705727 -1.662582 26.090326 4.554419
+-3.600219 48.012958 -135.299115 99.780961 -33.609159
+-76.148210 -41.185686 -30.407149 20.406634 -20.970026
+-195.613454 -27.007160 -0.071927 0.029988 0.005317
+-63.328077 -87.658706 -2.889454 3.613996 -36.146811
+116.739766 4.957366 -2.967265 14.881296 -6.512825
+21.599506 64.580955 -115.933306 8.827404 -27.118040
+108.786666 79.923464 -0.006297 0.005263 -0.047285
+-201.702439 -23.428318 -0.067098 0.030347 0.022104
+-48.234332 -49.277258 -25.836179 4.339343 -11.587569
+-192.928827 56.832896 -0.024561 0.037710 -0.007095
+-157.019581 -65.329403 -0.352983 -0.078603 -0.005117
+112.445058 3.175428 8.133930 -1.561940 11.845622
+-20.296178 -145.182139 6.067772 -12.836084 10.426651
+-1.376764 -34.835671 -6.859450 -12.704059 -11.889117
+-20.290041 -69.374990 31.203230 -29.608654 -52.573922
+-61.842825 -66.678693 2.232586 3.409125 -10.685103
+-78.275601 -51.709854 -41.839415 5.744861 -11.346087
+45.266303 -17.556755 -86.132164 -33.122035 -55.030010
+-50.871859 47.605630 -95.876033 62.535082 -33.450538
+-64.455528 -47.353679 -34.774480 7.136064 -39.426624
+139.545914 65.805507 0.203247 30.063567 2.549644
+-22.323022 -52.076732 -6.621888 10.726225 -26.540347
+-105.769567 19.819916 -47.156233 48.973074 -13.376075
+-91.176022 12.152498 -35.673699 55.679514 -12.360045
+-78.959434 -67.534669 -33.175863 6.766588 -13.053337
+20.120297 -4.591368 -192.517177 87.531322 125.674085
+-124.388554 -40.370005 -31.657432 19.590577 -11.890196
+71.329946 -20.615251 27.869039 -7.998678 23.745398
+89.687797 90.940066 27.401653 5.441973 -14.232384
+12.051397 -7.327515 -200.268683 105.706034 104.323703
+-128.197152 0.841891 -30.143319 45.314450 -2.725447
+-95.232502 -66.002996 -35.525291 19.532080 -29.347219
+30.282095 -28.323486 -25.786707 -11.140875 -13.217634
+153.453202 61.936191 -0.162956 20.607379 15.886721
+-31.649323 -2.788163 -122.187445 89.651423 -39.252179
diff -r 5e029e7246d8 -r 14d5d55245bd examples/chichi/readme.txt
--- a/examples/chichi/readme.txt	Mon Feb 06 10:49:06 2012 -0800
+++ b/examples/chichi/readme.txt	Wed Mar 14 13:08:45 2012 -0700
@@ -46,3 +46,10 @@ To localize the 3-d deformation in parav
   aplane-001.vtp (afterslip plane)
   vel-..vtk
 
+Our preferred model can be simulated with
+
+./coupled.sh
+
+a figure of the observed and modeled deformation can be generated with:
+
+grdmap.sh -t 50 -b -110/110/-150/180 -p -0.2/0.2/0.01 -v 0.15 -s 10 -e ./efaults.sh -e ./ecoast.sh -e rpatch.sh -e ./econtour.sh -e ./epgps.sh -e ./eopts.sh -Y -0.6 -u m coupled/200-relax-up.grd
diff -r 5e029e7246d8 -r 14d5d55245bd examples/mojave/landers.sh
--- a/examples/mojave/landers.sh	Mon Feb 06 10:49:06 2012 -0800
+++ b/examples/mojave/landers.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -14,8 +14,8 @@ if [ ! -e $WDIR ]; then
 	mkdir $WDIR
 fi
 
-time ../../relax <<EOF $* --no-vtk-output --no-proj-output \
-	--no-stress-output | tee $WDIR/in.param
+time ../../relax <<EOF --no-vtk-output --no-proj-output \
+	--no-stress-output $* | tee $WDIR/in.param
 # grid size (sx1,sx2,sx3)
 512 512 512
 # dx1  dx2  dx3 beta nyquist
diff -r 5e029e7246d8 -r 14d5d55245bd export.f90
--- a/export.f90	Mon Feb 06 10:49:06 2012 -0800
+++ b/export.f90	Wed Mar 14 13:08:45 2012 -0700
@@ -582,6 +582,132 @@ CONTAINS
     
   END SUBROUTINE exportoptsdat
     
+  !---------------------------------------------------------------------
+  !> subroutine exportPlaneStress
+  !! samples the value of an input tensor field at the location of 
+  !! defined plane (position, strike, dip, length and width).
+  !!
+  !! input variables
+  !! @param sig        - sampled tensor array
+  !! @param nop        - number of observation planes
+  !! @param op         - structure of observation planes (position, orientation)
+  !! @param x0, y0 - origin position of coordinate system
+  !! @param dx1,2,3    - sampling size
+  !! @param sx1,2,3    - size of the scalar field
+  !! @param wdir       - output directory for writing
+  !! @param i          - loop index to suffix file names
+  !!
+  !! creates files 
+  !!
+  !!    wdir/index.s00001.estrain.txt with TXT_EXPORTEIGENSTRAIN option
+  !!
+  !!    wdir/index.s00001.estrain.grd with GRD_EXPORTEIGENSTRAIN option
+  !! 
+  !! \author sylvain barbot (01/01/07) - original form
+  !                         (02/25/10) - output in TXT and GRD formats
+  !---------------------------------------------------------------------
+  SUBROUTINE exportplanestress(sig,nop,op,x0,y0,dx1,dx2,dx3,sx1,sx2,sx3,wdir,i)
+    INTEGER, INTENT(IN) :: nop,sx1,sx2,sx3,i
+    TYPE(PLANE_STRUCT), INTENT(IN), DIMENSION(nop) :: op
+    TYPE(TENSOR), INTENT(IN), DIMENSION(sx1,sx2,sx3) :: sig
+    REAL*8, INTENT(IN) :: x0,y0,dx1,dx2,dx3
+    CHARACTER(80), INTENT(IN) :: wdir
+
+    INTEGER :: k,ns1,ns2
+    TYPE(SLIPPATCH_STRUCT), DIMENSION(:,:), ALLOCATABLE :: slippatch
+    CHARACTER(3) :: sdigit
+    CHARACTER(3) :: digit
+#ifdef TXT_EXPORTEIGENSTRAIN
+    INTEGER :: iostatus,i1,i2
+    CHARACTER(80) :: outfiletxt
+#endif
+!#_indef GRD_EXPORTEIGENSTRAIN
+    CHARACTER(80) :: fn11,fn12,fn13,fn22,fn23,fn33
+    INTEGER :: j,iostat,j1,j2
+    REAL*4, ALLOCATABLE, DIMENSION(:,:) :: temp11,temp12,temp13, &
+                                           temp22,temp23,temp33
+    REAL*8 :: rland=9998.,rdum=9999.
+    REAL*8 :: xmin,ymin
+    CHARACTER(80) :: title="monitor tensor field "
+!#_endif
+
+    IF (nop .le. 0) RETURN
+
+    WRITE (digit,'(I3.3)') i
+
+    DO k=1,nop
+       CALL monitorstressfield(op(k)%x,op(k)%y,op(k)%z, &
+            op(k)%width,op(k)%length,op(k)%strike,op(k)%dip, &
+            0._8,sx1,sx2,sx3,dx1,dx2,dx3,sig,slippatch)
+
+       IF (.NOT. ALLOCATED(slippatch)) THEN
+          WRITE_DEBUG_INFO
+          WRITE (0,'("could not monitor slip")')
+          STOP 2
+       END IF
+
+       ns1=SIZE(slippatch,1)
+       ns2=SIZE(slippatch,2)
+          
+       slippatch(:,:)%x1=slippatch(:,:)%x1+x0
+       slippatch(:,:)%x2=slippatch(:,:)%x2+y0
+
+       WRITE (sdigit,'(I3.3)') k
+
+!#_ifdef GRD_EXPORTEIGENSTRAIN
+       fn11=trim(wdir)//"/"//digit//".op"//sdigit//"-s11.grd"
+       fn12=trim(wdir)//"/"//digit//".op"//sdigit//"-s12.grd"
+       fn13=trim(wdir)//"/"//digit//".op"//sdigit//"-s13.grd"
+       fn22=trim(wdir)//"/"//digit//".op"//sdigit//"-s22.grd"
+       fn23=trim(wdir)//"/"//digit//".op"//sdigit//"-s23.grd"
+       fn33=trim(wdir)//"/"//digit//".op"//sdigit//"-s33.grd"
+
+       ! convert to c standard
+       j=INDEX(fn11," ")
+       fn11(j:j)=char(0)
+       fn12(j:j)=char(0)
+       fn13(j:j)=char(0)
+       fn22(j:j)=char(0)
+       fn23(j:j)=char(0)
+       fn33(j:j)=char(0)
+
+       ALLOCATE(temp11(ns1,ns2),temp12(ns1,ns2),temp13(ns1,ns2), &
+                temp22(ns1,ns2),temp23(ns1,ns2),temp33(ns1,ns2),STAT=iostat)
+       IF (iostatus>0) STOP "could not allocate temporary array for GRD slip export."
+
+       DO j2=1,ns2
+          DO j1=1,ns1
+             temp11(ns1+1-j1,j2)=slippatch(j1,j2)%sig%s11
+             temp12(ns1+1-j1,j2)=slippatch(j1,j2)%sig%s12
+             temp13(ns1+1-j1,j2)=slippatch(j1,j2)%sig%s13
+             temp22(ns1+1-j1,j2)=slippatch(j1,j2)%sig%s22
+             temp23(ns1+1-j1,j2)=slippatch(j1,j2)%sig%s23
+             temp33(ns1+1-j1,j2)=slippatch(j1,j2)%sig%s33
+          END DO
+       END DO
+
+       ! xmin is the lowest coordinates (positive eastward in GMT)
+       xmin= MINVAL(slippatch(:,:)%lx)
+       ! ymin is the lowest coordinates (positive northward in GMT)
+       ymin=-MAXVAL(slippatch(:,:)%lz)
+
+       ! call the c function "writegrd_"
+       CALL writegrd(temp11,ns1,ns2,ymin,xmin,dx3,dx2,rland,rdum,title,fn11)
+       CALL writegrd(temp12,ns1,ns2,ymin,xmin,dx3,dx2,rland,rdum,title,fn12)
+       CALL writegrd(temp13,ns1,ns2,ymin,xmin,dx3,dx2,rland,rdum,title,fn13)
+       CALL writegrd(temp22,ns1,ns2,ymin,xmin,dx3,dx2,rland,rdum,title,fn22)
+       CALL writegrd(temp23,ns1,ns2,ymin,xmin,dx3,dx2,rland,rdum,title,fn23)
+       CALL writegrd(temp33,ns1,ns2,ymin,xmin,dx3,dx2,rland,rdum,title,fn33)
+
+       DEALLOCATE(temp11,temp12,temp13,temp22,temp23,temp33)
+
+!#_endif
+
+       DEALLOCATE(slippatch)
+    END DO
+
+END SUBROUTINE exportplanestress
+
   !---------------------------------------------------------------------
   !> subroutine exportEigenstrain
   !! samples the value of an input scalar field at the location of 
diff -r 5e029e7246d8 -r 14d5d55245bd friction3d.f90
--- a/friction3d.f90	Mon Feb 06 10:49:06 2012 -0800
+++ b/friction3d.f90	Wed Mar 14 13:08:45 2012 -0700
@@ -462,7 +462,7 @@ CONTAINS
           CALL local2ref(xr,yr,zr,x1,x2,x3)
 
           ! initialize zero slip velocity
-          patch(j2,j3)=SLIPPATCH_STRUCT(x1,x2,x3,yr,zr,0._8,0._8,0._8)
+          patch(j2,j3)=SLIPPATCH_STRUCT(x1,x2,x3,yr,zr,0._8,0._8,0._8,s)
 
           ! discard out-of-bound locations
           IF (  (x1 .GT. DBLE(sx1/2-1)*dx1) .OR. (x1 .LT. -DBLE(sx1/2)*dx1) &
diff -r 5e029e7246d8 -r 14d5d55245bd input.f90
--- a/input.f90	Mon Feb 06 10:49:06 2012 -0800
+++ b/input.f90	Wed Mar 14 13:08:45 2012 -0700
@@ -898,7 +898,8 @@ CONTAINS
        ALLOCATE(in%inter%ts(in%inter%nt),in%inter%tsc(in%inter%nt),STAT=iostatus)
        IF (iostatus>0) STOP "could not allocate the tensile source list"
        PRINT 2000
-       PRINT '(a)',"no. opening xs ys zs  length width  strike dip"
+       PRINT '(a)',"no.  opening       xs       ys       ", &
+                   "zs  length   width strike   dip"
        PRINT 2000
        DO k=1,in%inter%nt
           CALL getdata(iunit,dataline)
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-cgrid-1.png
Binary file latex/graphics/paraview-cgrid-1.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-cgrid-2.png
Binary file latex/graphics/paraview-cgrid-2.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-coulomb.png
Binary file latex/graphics/paraview-coulomb.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-disp-1.png
Binary file latex/graphics/paraview-disp-1.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-disp-2.png
Binary file latex/graphics/paraview-disp-2.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-disp-relax.png
Binary file latex/graphics/paraview-disp-relax.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-extract.png
Binary file latex/graphics/paraview-extract.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/graphics/paraview-rfaults.png
Binary file latex/graphics/paraview-rfaults.png has changed
diff -r 5e029e7246d8 -r 14d5d55245bd latex/relax.tex
--- a/latex/relax.tex	Mon Feb 06 10:49:06 2012 -0800
+++ b/latex/relax.tex	Wed Mar 14 13:08:45 2012 -0700
@@ -75,7 +75,7 @@ The open-source program RELAX evaluates 
 
 The possible applications for the earthquake-cycle modeling include i) co-seismic displacement and Coulomb stress calculation, ii) quasi-static stress transfer between earthquakes due to a postseismic transient, iii) modeling of postseismic transients including nonlinear rheologies and multiple mechanisms, iv) cycle of multiple earthquakes and spin-up models, v) loading cycle of lakes or the monsoon.
 
-\section{Acknowledgment}
+\section{Acknowledgments}
 We are greatly thankful for the help of Yuri Fialko and Walter Landry, who contributed to the coming about of the software. We appreciate the efforts of Lucile Bruhat, Yaru Hsu, Mikhail Kogan, Zhen Liu and Baptiste Rousset for testing an earlier version of the code. The support of CIG is greatly appreciated.
 
 
@@ -228,9 +228,9 @@ In RELAX, the fault thickness is chosen 
 \subsection{Introduction}
 The RELAX code is written in Fortran90 with a few I/O functions written in C. The performance of the code depends greatly on the efficiency of the discrete Fourier transform being used. The program can work with the Cooley-Tukey FFT algorithm, for which the source code is provided. For better performance, it is recommended to use the FFT native to the computer environment. The program can readily use the SGI, the FFTW and the Intel MKL FFTs. While we have found that the Intel MKL FFT provides the most efficient calculation, the package provided by the CIG web site implements FFTW.
 
-Both the post-processing and the storage of the simulation are greatly facilitated by writing output files in the cross-platform NetCDF binary format used by the Generic Mapping Tools (GMT). GMT is convenient to rapidly display the simulation results as it is computed, transform the output into other formats or projections (for example, to project the displacement into the Radar line of sight of a satellite to compare with synthetic aperture radar data), make animations and communicate results. Although RELAX can output in ASCII format, it is recommended to link the code to the GMT 4.5 libraries. A suite of GMT-based post-processing scripts are available in the \verb`util` directory and required GMT to be installed in your system.
+Both the post-processing and the storage of the simulation are greatly facilitated by writing output files in the cross-platform NetCDF binary format used by the Generic Mapping Tools (GMT). GMT is convenient to rapidly display the simulation results as it is computed, transform the output into other formats or projections (for example, to project the displacement into the Radar line of sight of a satellite to compare with synthetic aperture radar data), make animations and communicate results. Although RELAX can output in ASCII format, it is recommended to link the code to the GMT 4.5 libraries. A suite of GMT-based post-processing scripts are available in the \verb`util` directory and require GMT to be installed in your system.
 
-The output of the simulation can be projected on the fly to geographic coordinates, which is convenient to communicate results to others in a global coordinate system. In RELAX, this is performed with the proj4 library. It is recommended to install these libraries on your system to facilitate post processing.
+The output of the simulation can be projected on the fly to geographic coordinates, which is convenient to communicate results to others in a global coordinate system. In RELAX, this is performed with the Proj4 library (Proj4.7.1 or higher). It is recommended to install these libraries on your system to facilitate post processing.
 
 \subsection{Running}
 
@@ -788,6 +788,120 @@ Let's look at the postseismic relaxation
 \end{figure*}
 %
 
+\pagebreak
+\section{Using Paraview with Relax}
+
+This section offers a short introduction to using \verb`Paraview` to visualize three-dimensional objects and simulations. \verb`Paraview` also offers a convenient way to check the geometry of the models, including the input slip models and the relative position of other boundaries (viscous layers, ductile zone anomalies, receiver stress faults for Coulomb stress calculation). 
+
+The first example uses the output created by the Coulomb stress calculation in the \verb`examples/mojave` directory. To run the example, type
+\begin{verbatim}
+cd examples/mojave
+./coulomb.sh
+\end{verbatim}
+in a terminal. You can interrupt the program after this line appears
+\begin{verbatim}
+coseismic event 001
+ I  |   Dt   | tm(ve) | tm(pl) | tm(as) |     t/tmax     | power  |  C:E^i |
+000* 0.00E+00 0.00E+00 0.00E+00 0.00E+00 0.00E+00/2.00E+1 0.00E+00 3.60E+03
+\end{verbatim}
+as we only need the coseismic model. Figures~\ref{fig:cgrid-1} to \ref{fig:coulomb} show the procedure to import and visualize the model. First, load the computational extent of the model (Figs.~\ref{fig:cgrid-1} and \ref{fig:cgrid-2}). Then, load the source patches of the deformation (Fig.~\ref{fig:rfaults}). Use the \verb`Rescale to Data Range` and/or \verb`Edit Color Map...` controls in the \verb`Display` tab, if necessary. When running your first models, these first steps are a good way to verify the accuracy of the input geometry. Lastly, load the receiver faults and adjust the color scale (Fig.~\ref{fig:coulomb}). The stress calculation includes several projections of the stress tensor at the receiver fault location, including normal, shear and Coulomb stress, shear stress in the strike and dip direction, and the full stress tensor. Additional post-processing calculations can be done with the \verb`Calculator` filter.
+
+The second example uses a model of the viscoelastic relaxation that follows the 1992 Mw 7.3 Landers earthquake. To run the simulation with the \verb`Paraview` output, type
+\begin{verbatim}
+./landers.sh --with-vtk-output --with-vtk-relax-output
+\end{verbatim}
+The first option, \verb`--with-vtk-output`, enforces the output in \verb`vtk` format, which is cancelled in \verb`landers.sh`; the second option, \verb`--with-vtk-relax-output` exports the relaxation contribution for three-dimensional visualization. The relaxation contribution is the total deformation, both elastic and viscoelastic, minus the coseismic deformation. This example also produces the output of the first one, so it is possible to reproduce the same steps. Additionally, you can load the three-dimensional coseismic displacement field (\verb`disp-..vtk`), and create the vector field using the \verb`Glyph` filter (Figs.~\ref{fig:disp-1} and \ref{fig:disp-2}). To look at the relaxation component, load \verb`disp-relax-..vtk`. You can then directly create a vector field, or you can decimate the data set to make the plot less dense (Fig.~\ref{fig:extract}). To plot the postseismic vector field, it is more convenient to move to another time step (postseismic component is zero by definition at time step zero). You can then apply the \verb`Glyph` filter on the data subset (Fig.~\ref{fig:disp-relax}). Finally, you can load the California faults trace or the UCERF three-dimensional fault model using the ancillary files located in \verb`examples/mojave/paraview`.
+
+
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-cgrid-1.png}
+\end{center}
+\small
+\caption{Open the file containing the spatial extent of the computational domain.}
+\label{fig:cgrid-1}
+\end{figure*}
+%
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-cgrid-2.png}
+\end{center}
+\small
+\caption{Change the representation to wireframe to display online the boundary of the rectangular volume.}
+\label{fig:cgrid-2}
+\end{figure*}
+%
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-rfaults.png}
+\end{center}
+\small
+\caption{Load the Landers slip model and color by the amplitude of slip. Rescale to data range in the ``display'' menu, if necessary.}
+\label{fig:rfaults}
+\end{figure*}
+%
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-coulomb.png}
+\end{center}
+\small
+\caption{Load the receiver faults, in the case the Hector Mine ruptured faults, and color by one in: shear, normal, Coulomb, strike-direction shear, dip-direction shear stresses. Rescale to data range in the ``Display'' window, if necessary.}
+\label{fig:coulomb}
+\end{figure*}
+%
+
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-disp-1.png}
+\end{center}
+\small
+\caption{Load the displacement field (disp-0* appears on the ``Pipeline Browser'') and apply the ``Glyph'' filter.}
+\label{fig:disp-1}
+\end{figure*}
+%
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-disp-2.png}
+\end{center}
+\small
+\caption{Adjust the scale factor, points masking and random mode and set the color to ``GlyphVector''.}
+\label{fig:disp-2}
+\end{figure*}
+%
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-extract.png}
+\end{center}
+\small
+\caption{Load the relaxation component of the deformation (``disp-relax-0*'' appears on the ``Pipeline Browser''), then decimate the data set to prepare for a larger displacement field vector. To take one every four points, adjust the ``Sample Rate I'' accordingly.}
+\label{fig:extract}
+\end{figure*}
+%
+
+%
+\begin{figure*}
+\begin{center}
+\includegraphics[width=\textwidth]{paraview-disp-relax.png}
+\end{center}
+\small
+\caption{Apply the ``Glyph'' filter on the ``ExtractSubset1'' new data set, then change the color scale to ``GlyphVector'' and cancel the visibility of the ``ExtractSubset1'', the ``disp-relax-00*'' datasets (check out the eye controls).}
+\label{fig:disp-relax}
+\end{figure*}
+%
 
 \pagebreak
 \bibliography{../../../latex/reference}
diff -r 5e029e7246d8 -r 14d5d55245bd relax.f90
--- a/relax.f90	Mon Feb 06 10:49:06 2012 -0800
+++ b/relax.f90	Wed Mar 14 13:08:45 2012 -0700
@@ -1,5 +1,5 @@
 !-----------------------------------------------------------------------
-! Copyright 2007, 2008, 2009 Sylvain Barbot
+! Copyright 2007-2012, Sylvain Barbot
 !
 ! This file is part of RELAX
 !
@@ -409,6 +409,7 @@ PROGRAM relax
 
   ! export initial stress
 #ifdef GRD
+  CALL exportplanestress(sig,in%nop,in%op,in%x0,in%y0,in%dx1,in%dx2,in%dx3,in%sx1,in%sx2,in%sx3/2,in%wdir,oi)
   IF (in%isoutputgrd .AND. in%isoutputstress) THEN
      CALL exportstressgrd(sig,in%sx1,in%sx2,in%sx3/2,in%dx1,in%dx2,in%dx3, &
                           in%ozs,in%x0,in%y0,in%wdir,0)
diff -r 5e029e7246d8 -r 14d5d55245bd types.f90
--- a/types.f90	Mon Feb 06 10:49:06 2012 -0800
+++ b/types.f90	Wed Mar 14 13:08:45 2012 -0700
@@ -66,6 +66,7 @@ MODULE types
   TYPE SLIPPATCH_STRUCT
      SEQUENCE
      REAL*8 :: x1,x2,x3,lx,lz,slip,ss,ds
+     TYPE(TENSOR) :: sig
   END TYPE SLIPPATCH_STRUCT
 
   TYPE EVENT_STRUC
diff -r 5e029e7246d8 -r 14d5d55245bd util/anatolia.cpt
--- /dev/null	Thu Jan 01 00:00:00 1970 +0000
+++ b/util/anatolia.cpt	Wed Mar 14 13:08:45 2012 -0700
@@ -0,0 +1,67 @@
+#	$Id: Anatolia
+#
+# Simulates the Anatolia colormap in Coulomb 3.0
+# COLOR_MODEL = RGB
+1	54	39	253	2	54	47	253
+2	54	47	253	3	55	56	253
+3	55	56	253	4	55	65	253
+4	55	65	253	5	56	74	253
+5	56	74	253	6	56	83	253
+6	56	83	253	7	57	92	253
+7	57	92	253	8	57	101	253
+8	57	101	253	9	58	109	253
+9	58	109	253	10	59	118	253
+10	59	118	253	11	59	127	253
+11	59	127	253	12	60	136	253
+12	60	136	253	13	60	145	253
+13	60	145	253	14	61	154	253
+14	61	154	253	15	61	163	253
+15	61	163	253	16	62	172	253
+16	62	172	253	17	63	180	253
+17	63	180	253	18	63	189	253
+18	63	189	253	19	64	198	253
+19	64	198	253	20	64	207	253
+20	64	207	253	21	65	216	253
+21	65	216	253	22	65	225	253
+22	65	225	253	23	66	234	253
+23	66	234	253	24	67	243	254
+24	67	243	254	25	90	244	254
+25	90	244	254	26	114	246	254
+26	114	246	254	27	137	247	254
+27	137	247	254	28	161	249	254
+28	161	249	254	29	184	250	254
+29	184	250	254	30	208	252	254
+30	208	252	254	31	231	253	254
+31	231	253	254	32	255	255	255
+32	255	255	255	33	255	255	255
+33	255	255	255	34	254	253	233
+34	254	253	233	35	254	251	211
+35	254	251	211	36	254	249	189
+36	254	249	189	37	254	247	167
+37	254	247	167	38	253	245	145
+38	253	245	145	39	253	243	123
+39	253	243	123	40	253	241	101
+40	253	241	101	41	253	239	79
+41	253	239	79	42	252	228	76
+42	252	228	76	43	251	218	73
+43	251	218	73	44	251	207	71
+44	251	207	71	45	250	197	68
+45	250	197	68	46	249	187	66
+46	249	187	66	47	249	176	63
+47	249	176	63	48	248	166	61
+48	248	166	61	49	247	155	58
+49	247	155	58	50	247	145	56
+50	247	145	56	51	246	135	53
+51	246	135	53	52	245	124	51
+52	245	124	51	53	245	114	48
+53	245	114	48	54	244	103	46
+54	244	103	46	55	243	93	43
+55	243	93	43	56	243	83	41
+56	243	83	41	57	242	72	38
+57	242	72	38	58	241	62	36
+58	241	62	36	59	241	51	33
+59	241	51	33	60	240	41	31
+60	240	41	31	61	239	31	28
+61	239	31	28	62	239	20	26
+62	239	20	26	63	238	10	23
+63	238	10	23	64	238	0	21
diff -r 5e029e7246d8 -r 14d5d55245bd util/grdmap.sh
--- a/util/grdmap.sh	Mon Feb 06 10:49:06 2012 -0800
+++ b/util/grdmap.sh	Wed Mar 14 13:08:45 2012 -0700
@@ -201,7 +201,7 @@ if [ "$pset" != "1" ]; then
 if [ "$pset" != "1" ]; then
 	# cool, copper, gebco, globe, gray, haxby, hot, jet, no_green, ocean
 	# polar, rainbow, red2green, relief, topo, sealand, seis, split, wysiwyg  
-	PSSCALE=`grdinfo $U3 -C | awk 'function abs(x){return x<0?-x:x}{if (abs($6) >= abs($7)) print abs($6); else print abs($7)}'`
+	PSSCALE=`grdinfo $U3 -C | awk 'function abs(x){return x<0?-x:x}{if (abs($6) >= abs($7)) print abs($6)/2; else print abs($7)/2}'`
 	if [ "0" == $PSSCALE ]; then
 		grd2cpt $U3 -C$cptfile -Z -T= -L-1/1 > $colors
 		PSSCALE=0.5



More information about the CIG-COMMITS mailing list