[Rsiena-commits] r46 - in pkg/RSienaTest: . R doc inst/doc man

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Tue Jan 19 17:36:27 CET 2010


Author: ripleyrm
Date: 2010-01-19 17:36:27 +0100 (Tue, 19 Jan 2010)
New Revision: 46

Added:
   pkg/RSienaTest/R/effectsDocumentation.r
   pkg/RSienaTest/inst/doc/effects.pdf
   pkg/RSienaTest/man/effectsDocumentation.Rd
Modified:
   pkg/RSienaTest/R/sienaeffects.r
   pkg/RSienaTest/changeLog
   pkg/RSienaTest/doc/s_man400.tex
   pkg/RSienaTest/inst/doc/s_man400.pdf
   pkg/RSienaTest/man/includeEffects.Rd
   pkg/RSienaTest/man/includeInteraction.Rd
   pkg/RSienaTest/man/setEffect.Rd
Log:
New function, effectsDocumentation, and set some eol-styles to native.

Added: pkg/RSienaTest/R/effectsDocumentation.r
===================================================================
--- pkg/RSienaTest/R/effectsDocumentation.r	                        (rev 0)
+++ pkg/RSienaTest/R/effectsDocumentation.r	2010-01-19 16:36:27 UTC (rev 46)
@@ -0,0 +1,138 @@
+#/******************************************************************************
+# * SIENA: Simulation Investigation for Empirical Network Analysis
+# *
+# * Web: http://www.stats.ox.ac.uk/~snidjers/siena
+# *
+# * File: effectsDocumentation.r
+# *
+# * Description: This module contains a function for documenting the shortNames
+# * and other fields of an effects object.
+# *****************************************************************************/
+
+##@effectsDocumentation Documentation
+effectsDocumentation <- function(type="html", display=type=="html",
+                                 filename="effects")
+{
+    x <- allEffects[, c(1:2,4:7, 15, 23)]
+    storage.mode(x$parm) <- "integer"
+    names(x)[4] <- "endow?"
+    names(x)[5] <- "inter1"
+    names(x)[6] <- "inter2"
+    names(x)[8] <- "ego?"
+    x$row <- as.integer(row.names(x))
+    x <- x[, c(9, 1:8)]
+
+    myorder <- c("nonSymmetricRate",
+                 "covarNonSymmetricRate",
+
+                 "symmetricRate",
+                 "covarSymmetricRate",
+
+                 "bipartiteRate",
+                 "covarBipartiteRate",
+
+                 "behaviorRate",
+                 "behaviorOneModeRate",
+                 "behaviorBipartiteRate",
+                 "covarBehaviorRate",
+
+                 "nonSymmetricObjective",
+                 "dyadObjective",
+                 "covarNonSymmetricObjective",
+                 "unspecifiedNetInteraction",
+                 "nonSymmetricNonSymmetricObjective",
+                 "nonSymmetricSymmetricObjective",
+                 "nonSymmetricBipartiteObjective",
+                 "covarNetNetObjective",
+
+                 "symmetricObjective",
+                 "dyadObjective",
+                 "covarSymmetricObjective",
+                 "unspecifiedNetInteraction",
+
+                 "bipartiteObjective",
+                 "dyadObjective",
+                 "covarBipartiteObjective",
+                 "unspecifiedNetInteraction",
+                 "bipartiteNonSymmetricObjective",
+                 "bipartiteSymmetricObjective",
+                 "bipartiteBipartiteObjective",
+                 "covarNetNetObjective",
+
+                 "behaviorObjective",
+                 "behaviorOneModeObjective",
+                 "behaviorBipartiteObjective",
+                 "covarBehaviorObjective",
+                 "behaviorOneModeObjective2",
+                 "behaviorBipartiteObjective2",
+                 "unspecifiedBehaviorInteraction")
+
+    mytab <- table(allEffects[,1])
+
+    addtorowPos <- cumsum(c(0, mytab[myorder]))[1:37]
+    addtorowText <- names(mytab[myorder])
+    if (type=="latex")
+    {
+        addtorowText <- paste(" \\hline \\multicolumn{4}{l}{",
+                              addtorowText, "}\\\\ \\hline")
+        addtorowText[1] <- paste(" \\endhead ", addtorowText[1], collapse="")
+    }
+    else
+    {
+        x[is.na(x)] <- "FALSE" ## endow? field
+       x[x==""] <- "<br>"
+         addtorowText <- paste(' <TR> <TD colspan="8" >',
+                              addtorowText, "</TD> </TR>")
+    }
+    add.to.row  <-  NULL
+    add.to.row$pos <- lapply(addtorowPos, function(x)x)
+    add.to.row$command <- as.vector(sapply(addtorowText, function(x)x))
+
+    order2 <- match(myorder, x[, 2])
+    order3 <- as.vector(mytab[myorder])
+
+    order4 <- unlist(apply(cbind(order2, order3), 1,
+                           function(x)x[1]:(x[1] + x[2] -1)))
+    y <- x[order4, -2]
+    row.names(y) <- 1:nrow(y)
+
+    if (type =="latex")
+    {
+        filename2 <- paste(filename,".tex", sep="", collapse="")
+        includefile <- paste(filename,".include.tex", sep="", collapse="")
+        includepart <- paste(filename,".include", sep="", collapse="")
+        print(xtable(y), add.to.row=add.to.row, file=includefile,
+              tabular.environment="longtable", hline.after=c(-1),
+              floating=FALSE, include.rownames=FALSE)
+
+        cat(file=filename2, "\\documentclass[12pt,a4paper]{article}\n",
+            "\\usepackage[pdftex,dvipsnames]{color}\n",
+            "\\usepackage[landscape]{geometry}\n",
+            "\\usepackage{longtable}\n",
+            "\\pagestyle{empty}\n",
+            "\\textheight=7.25in\n",
+            "\\topmargin=-1in\n",
+            "\\evensidemargin=-0in\n",
+            "\\oddsidemargin=-0in\n",
+            "\\marginparwidth=-0in\n",
+            "\\begin{document}\n",
+            "\\include{", includepart, "}\n",
+            "\\end{document}\n", sep=""
+            )
+    }
+    else
+    {
+        filename <- paste(filename,".html", sep="", collapse="")
+        print(xtable(y), add.to.row=add.to.row,
+              file=filename,
+              type="html", hline.after=c(-1),
+              sanitize.text.function=function(x){x},
+              floating=FALSE, include.rownames=FALSE,
+              html.table.attributes="border=1 cellpadding=3 cellspacing=0")
+        if (display)
+        {
+            browseURL(paste("file://", getwd(), "/", filename,
+                            collapse="", sep=""))
+        }
+    }
+}


Property changes on: pkg/RSienaTest/R/effectsDocumentation.r
___________________________________________________________________
Name: svn:eol-style
   + native


Property changes on: pkg/RSienaTest/R/sienaeffects.r
___________________________________________________________________
Name: svn:eol-style
   + native

Modified: pkg/RSienaTest/changeLog
===================================================================
--- pkg/RSienaTest/changeLog	2010-01-19 16:26:19 UTC (rev 45)
+++ pkg/RSienaTest/changeLog	2010-01-19 16:36:27 UTC (rev 46)
@@ -1,3 +1,12 @@
+2010-01-19 R-forge revision 46
+
+	* R/effectsDocumentation.r, man/effectsDocumentation.Rd,
+	inst/doc/effects.pdf: effects documentation system.
+
+2010-01-15 R-forge revision 42
+
+	* inst/doc/s_man400.pdf: new manual
+
 2010-01-15 R-forge revision 41
 
 	* doc/*, .Rbuildignore, src/sienaProfile.cpp: added developer
@@ -5,14 +14,14 @@
 	* data/allEffects.csv: new effect, altered effect1-3 to integers
 	to remove bug in fix(myeff)
 	* inst/*.out, *.Rdata: removed stray files from examples directory
-	* R/sienaeffects.r, NAMESPACE, man/includeEffects.Rd, 
-	man/includeInteraction.Rd, man/setEffect.Rd: utility functions to 
+	* R/sienaeffects.r, NAMESPACE, man/includeEffects.Rd,
+	man/includeInteraction.Rd, man/setEffect.Rd: utility functions to
 	update effects object
 	* R/siena01.r, R/simstatsc.r, R/printDataReport.r, R/print07Report.r,
 	R/Sienatest.r: no longer necessary to include underlying effects
 	for interactions.
-	* R/effects.r, man/getEffects.Rd: user parameter for number of 
-	unspecified behavior interactions 
+	* R/effects.r, man/getEffects.Rd: user parameter for number of
+	unspecified behavior interactions
 	* R/print07report.r, R/sienaprint.r: remove extra sqrt roots in
 	standard error of rates for conditional estimation (see revision
 	31)
@@ -23,27 +32,27 @@
 	src/model/effects/PopularityAlterEffect.cpp: New effect
 	* src/model/variables/BehaviorVariable.h,
 	src/model/effects/BehaviorVariable.cpp: new method
-	* tests/parallel.R, tests/parallel.R.save: reduce tests to 
+	* tests/parallel.R, tests/parallel.R.save: reduce tests to
 	save time in Check.
 	* man/RSiena-package.Rd, man/siena07.Rd, man/simstats0c.Rd,
 	man/sienaFit.Rd: made examples faster.
-	
+
 2010-01-15 R-forge revision 40: RSiena only
-	
+
 2010-01-12 R-forge revisions 38 and 39: RSiena only
 
 2010-01-12 R-forge revision 37
 
 	* inst/sienascript: reverted to LF eol-style
-	
+
 2010-01-12 R-forge revision 36
 
 	* all source files: eol-style: native
-	
+
 2010-01-11 R-forge revision 35
-	 
+
 	* inst: added manual and examples to RSienaTest
-	
+
 2010-01-02 R-forge revision 34
 
 	* R/sienaprint.r:  corrected layout of sienaFitThetaTable for

Modified: pkg/RSienaTest/doc/s_man400.tex
===================================================================
--- pkg/RSienaTest/doc/s_man400.tex	2010-01-19 16:26:19 UTC (rev 45)
+++ pkg/RSienaTest/doc/s_man400.tex	2010-01-19 16:36:27 UTC (rev 46)
@@ -230,7 +230,7 @@
 and van Duijn (1997), Snijders (2001), and
 Snijders, Steglich, and Schweinberger (2007); also see
 Steglich, Snijders, and Pearson (2010).
-A tutorial for these models is in Snijders, van de Bunt, and Steglich (2009).
+A tutorial for these models is in Snijders, van de Bunt, and Steglich (2010).
 Some examples are
 presented, e.g., in van de Bunt (1999); van de Bunt, van Duijn, and
 Snijders (1999); and van Duijn, Zeggelink, Stokman, and Wasseur (2003);
@@ -930,44 +930,70 @@
 
 # fix() may not be usable if you do not have tcl/tk available
 
-# Alternatively we can edit the dataframe directly using more data slicing
-# this command is another way to set "include" to TRUE or FALSE. TRUE or FALSE
-# will always be located at the 9th column, but not always at the 11th row as we
-# add or remove rate parameters depending on the model. In general the advantage
-# of this method is that we can save the last parameters and rerun the model
+# Alternatively we can edit the dataframe directly by using R functions.
+# Note that the columns of the dataframe of effects have names indicated
+# in the top of the dataframe:
+# name, effectName, type, include, fix, test, initialValue, parm,
+# effectnumber, effect1, effect2, effect3.
+# The commands below are used to set "include" to TRUE or FALSE,
+# as an alternative to using the data editor.
+# TRUE or FALSE will always be located at the 9th column,
+# transitive triplets will not always be at the 11th row as this depends
+# on the number of periods; further, the list of available effects
+# may change in future versions.
+# In general the advantage of this method is
+# that we can save the last parameters and rerun the model
 # later without opening the editor. (Saving can now be done in the GUI).
-# NB These row numbers may not be the current ones.
+# Note: These row numbers may not be the current ones, as they depend on the
+# list of effects implemented, which is changeable.
 
-        #myeff[11,9]=TRUE   #transitive triples
-        #myeff[15,9]=TRUE   #3 cycles
-        #myeff[17,9]=TRUE   #transitive ties
-        #myeff[27,9]=TRUE   #indegree popularity
-        #myeff[31,9]=TRUE   #outdegree popularity
-        #myeff[34,9]=TRUE   #indegree based activity
-        #myeff[36,9]=TRUE   #outdegree based activity
-        #myeff[46,9]=TRUE   #indegree-indegree assortivity
-        #myeff[48,9]=TRUE   #alcohol alter
-        #myeff[50,9]=TRUE   #alcohol alter (squared)
-        #myeff[52,9]=TRUE   #alcohol ego
-        #myeff[54,9]=TRUE   #alcohol similarity
-        #myeff[62,9]=TRUE   #alcohol alter by ego
+        #myeff[11,9] <- TRUE   #transitive triples
+        #myeff[15,9] <- TRUE   #3 cycles
+        #myeff[17,9] <- TRUE   #transitive ties
+        #myeff[27,9] <- TRUE   #indegree popularity
+        #myeff[31,9] <- TRUE   #outdegree popularity
+        #myeff[34,9] <- TRUE   #indegree based activity
+        #myeff[36,9] <- TRUE   #outdegree based activity
+        #myeff[46,9] <- TRUE   #indegree-indegree assortativity
+        #myeff[48,9] <- TRUE   #alcohol alter
+        #myeff[50,9] <- TRUE   #alcohol alter (squared)
+        #myeff[52,9] <- TRUE   #alcohol ego
+        #myeff[54,9] <- TRUE   #alcohol similarity
+        #myeff[62,9] <- TRUE   #alcohol ego x alcohol alter
 
-# (Alternatively, and more robustly against future changes in the structure,
-# use
+# Alternatively, and more robustly against future changes in the structure,
+# use the following for the last effect:
 
         #myeff[myeff$effectName=='alcohol ego x alcohol alter' &
         #myeff$type=='eval', 'include']=TRUE)
+
+# and similarly for the earlier ones.
 # To specify an interaction between say alcohol and reciprocity,
-# where 69 is the row number of an unspecified interaction effect:
+# where 69 is the row number of an unspecified interaction effect,
+# and 52 and 9 are now used as the numbers of the effects
+# that get the roles of effect1 and effect2,
+# meaning that they are to be interacted, the following can be used;
+# the name will be created by siena07.
 
         #myeff[69, c('effect1', 'effect2')] <- c(52, 9)
         #myeff[69, 'include'] <- TRUE
+
+
 # new, more robust, methods to amend an effects object:
+
         #myeff <- includeEffects(myeff, transTrip, cycle3, between)
         #myeff <- includeInteraction(myeff, egoX, recip,
         #   interaction1="alcohol")
         #myeff <- setParameter(myeff, outInv, 3)
 
+# There is a table of short names etc available as pdf via
+
+        #RShowDoc("effects", package="RSiena")
+
+# or as html by running the function
+
+        #effectsDocumentation()
+
 # siena07 actually fits the specified model to the data
 
         ans <- siena07(mymodel, data=mydata, effects=myeff, batch=FALSE, verbose=TRUE)
@@ -1217,7 +1243,8 @@
 \label{S_multipleProcesses}
 \begin{enumerate}
 \item
-Multiple processes can be used to speed up the estimation in \sfn{siena07}.
+If multiple processors are available, then using
+multiple processes can speed up the estimation in \sfn{siena07}.
 
 \item In Phases 1 and 3 the simulations are performed in parallel. In Phase 2,
   multiple simulations are done with the same parameters, and the resulting
@@ -1292,7 +1319,7 @@
 
 \noindent
 Ripley, Ruth M., and Snijders, Tom A.B.
-2009.
+2010.
 Manual for SIENA version 4.0 (provisional version, \today).
 Oxford: University of Oxford, Department of Statistics; Nuffield College.
 \textsf{http://www.stats.ox.ac.uk/siena/}
@@ -1309,12 +1336,12 @@
 fit tests and Schweinberger and Snijders (2007) for the calculation of standard
 errors of the Method of Moments estimators .
 
-A tutorial is Snijders, van de Bunt, and Steglich (2009).
+A tutorial is Snijders, van de Bunt, and Steglich (2010).
 
 
 \subsection{Getting help with problems}
 \label{sec:problems}
-If you have a problem running \RS, please read through the following hints to
+If you have a problem running \rs, please read through the following hints to
 see if any of them help. If not, please send an email to
 rsiena-help at lists.r-forge.r-project.org, or post in the help forum for \RS in
 R-forge. You need to be a registered member of R-forge (and possibly of \rs)
@@ -1322,8 +1349,8 @@
 please tell us which operating system , which version of \Rn, and which version
 of \RS you are using.
 
-For queries about the modelling aspects of \SI, or interpretation, please
-continue to use the \SN mailing list.
+For queries about the modelling aspects of \si, or interpretation, please
+continue to use the \SN/ \RS mailing list.
 
 
 \begin{description}
@@ -1953,7 +1980,7 @@
 
 For the longitudinal case, three types of
 effects are distinguished (see Snijders, 2001; Snijders,
-van de Bunt, and Steglich, 2009):
+van de Bunt, and Steglich, 2010):
 
 \begin{itemize}
 \item {\em rate function effects}\\
@@ -2802,15 +2829,31 @@
 
 It is possible for the user to define additional interaction effects for the
 network. % and the behavior.
-The basis is provided by the initial definition, by \si, of ``unspecified
-interaction effects''.  Modifying two or three of the columns named ``effect1'',
-``effect2'', and ``effect3'' of these effects allows the definition of two-way
+The basis is provided by the initial definition, by \si, of `unspecified
+interaction effects'.  Modifying two or three of the columns named `effect1',
+`effect2', and `effect3' of the effects dataframe
+allows the definition of two-way
 or three-way interactions. The \emph{effectNumber} of the effects between which
-an interaction is required should be entered in the ``effect1'' and ``effect2'',
-and for three-way effects, the ``effect3'' columns. The interaction effect must
-also be ``included'', but the underlying effects need only be ``included'' if
+an interaction is required should be entered in the `effect1' and `effect2',
+and for three-way effects, the `effect3' columns. The interaction effect must
+also be `included', but the underlying effects need only be `included' if
 they are also required individually.
 
+\sfn{includeInteraction} is an \R function provided to facilitate the definition
+of interaction effects. Such effects can be specified simply by short names and
+the names of any variables required to identify the underlying effects: it is
+not necessary to know the effectNumbers of the effects. (The effectNumbers would
+change if new effects are introduced to \rs.) Information about short names of
+effects can be found in the file `effects.pdf' in the doc directory of the
+library, accessible from within \R using the command
+
+\verb|RShowDoc("effects", package="RSiena")|
+
+Alternatively a new version of this list can be displayed in a browser by using
+the function:
+
+\verb|effectsDocumentation()|
+
 \subsubsection{Interaction effects for network dynamics}
 
 The following kinds of user-defined interactions are possible
@@ -2828,7 +2871,8 @@
 dyadic effects, two dyadic effects and an ego effect, or two ego effects and
 another effect.
 
-All effects used in interactions must be defined on the same network: that for
+All effects used in interactions must be defined on the same network
+(in the role of dependent variable): that for
 which the ``unspecified
 interaction effects'' is defined.  And either all must be evaluation effects or
 all must be endowment effects.
@@ -4021,12 +4065,28 @@
 
 Most goodness-of-fit tests will have the following form: some model
 is specified and one or more parameters are restricted to some
-constant, in most cases $0$.
-Parameters can be restricted by %opening the \textsf{{\em pname}.MO}
-%file, going to the parameters of interest and setting the values in
-%the fourth column equal to {\tt 1}.
+constant, in most cases $0$ -- these constant values
+define the null hypothesis being tested.
+This can be obtained in \RS by appropriate choices in the effects dataframe
+(called \sfn{myeff} in Section~ \ref{S_Rscript}).
+Parameters can be restricted by
 putting 1 in the \sfn{fix} and \sfn{test} columns when editing the effects, and
-the constant value in the \sfn{initialValue} column.  The goodness-of-fit test
+the tested value in the \sfn{initialValue} column.
+For example, when the effect for which the score test
+is desired has \sfn{effectNumber} equal to 46, the
+commands can be as follows.
+
+\begin{verbatim}
+myeff[46,9] <- TRUE
+myeff[46, 'fix'] <- TRUE
+myeff[46, 'test'] <- TRUE
+myeff[46, 'initialValue'] <- ((value to be used for test))
+\end{verbatim}
+
+
+
+
+The goodness-of-fit test
 proceeds by simply estimating the restricted model (not the unrestricted model,
 with unrestricted parameters) by the standard \SI estimation algorithm. No more
 information needs to be communicated.%  When the model is restricted, \SI by
@@ -5907,7 +5967,7 @@
 for only those actors who decreased in behavior.
 More precisely, it is
 \begin{equation}
-\sum_{m=1}^{M-1} \sum_{i=1}^n I\{z_{ij}(t_{m+1}) < z_{ij}(t_m) \}\,
+\sum_{m=1}^{M-1} \sum_{i=1}^n I\{z_{i}(t_{m+1}) < z_{i}(t_m) \}\,
      \big( s^{\rm beh}_{ik}(x(t_{m+1})) -  s^{\rm beh}_{ik}(x(t_m))   \big) ,
 \end{equation}
 where $M$ is the number of observations, $x(t_m)$ is the observed situation
@@ -6475,26 +6535,35 @@
 (Programmers should consult the changeLog file on CRAN or in the R-forge
 repository.)
 \begin{itemize}
+\item 2010-01-19 R-forge revision 45
+ New documentation for the effects object.
+\item 2010-01-18 R-forge revision 43 (RSiena)
+\begin{itemize}
+\item new behavior effects
+\item user specified interactions
+\item new utilities to update the effects object
+\end{itemize}
 \item 2010-01-15 R-forge revision 41 (RSienaTest only)
 
 \begin{itemize}
 \item
    new effect: Popularity Alter, and altered effect1-3 to integers to correct
-  bug in fix(myeff) 
-  \item new utility functions to update effects object * no longer
-  necessary to include underlying effects for interactions.  
-  \item user parameter for number of unspecified behavior interactions 
+  bug in fix(myeff)
+  \item new utility functions to update effects object
+  \item no longer
+  necessary to include underlying effects for interactions.
+  \item user parameter for number of unspecified behavior interactions
   \item  remove extra sqrt roots in standard error of rates for conditional
   estimation (see revision 31)
 \end{itemize}
 \item 2010-01-15 R-forge revision 40: RSiena only
-	 
+
   remove extra sqrt roots in standard error of rates for conditional
   estimation (see revision 32)
-  
-	
+
+
 \item 2010-01-02 R-forge revision 34
-  
+
 Corrected layout of print and xtable for SienaFit objects with both behavior and
 network variables.
 
@@ -6830,6 +6899,12 @@
 edited by Kees van Montfort, Han Oud and Albert Satorra, pp.\ 41--71.
 Mahwah, NJ: Lawrence Erlbaum.
 
+\bibitem{}
+Snijders, T.A.B., van de Bunt, G.G., and Steglich, C.E.G. (2010).
+Introduction to actor-based models for network dynamics.
+\textit{Social Networks}, 32, 44--60.
+
+
 \bibitem{} Snijders, T.A.B., and M.A.J.\ Van Duijn.  1997.
 Simulation for statistical inference in dynamic network models.
 Pp.\ 493 -- 512 in {\em Simulating Social Phenomena}, edited by

Added: pkg/RSienaTest/inst/doc/effects.pdf
===================================================================
(Binary files differ)


Property changes on: pkg/RSienaTest/inst/doc/effects.pdf
___________________________________________________________________
Name: svn:mime-type
   + application/octet-stream

Modified: pkg/RSienaTest/inst/doc/s_man400.pdf
===================================================================
--- pkg/RSienaTest/inst/doc/s_man400.pdf	2010-01-19 16:26:19 UTC (rev 45)
+++ pkg/RSienaTest/inst/doc/s_man400.pdf	2010-01-19 16:36:27 UTC (rev 46)
@@ -469,19 +469,17 @@
 (References)
 endobj
 321 0 obj <<
-/Length 1076      
+/Length 1077      
 /Filter /FlateDecode
 >>
 stream
-xÚ…VKsÛ6¾ëWðΘ0Þ$Û““Øm2c·µÕSÓLÑk‘TIÊ®þ}w±¤"Æòd4# ‹Ýûø ˆÖ‘ˆ~YˆwÆËÅåt‘2<ÍR-Ÿ"©×¹‰œ3\e.Z®¢¿Ø­obåØÞoãDÅžÚ.þ{ùlÓ™­tÜÉ ƒÕÃç뻫QovFª¸sGµ„.»¾jB7\ŒVY”óÜ)‡F‰Ó<“&J”ä9ìÛß»ØJÖ¾Th¼³{A°Ä
-ƒ½¼Ñi$
-×Æ© hx¦àe<ËáÝï‡
-€€C·Ç”ÝW»my˜Mc”dܪ4JdÎÓ	agŠµ5_ñœàšêŸøuˆ<ƒ°¬%Ϥ€Dj%Úp{ùϦ‚T¥!UNÝ>ÑøÛP–ÕOqb´eŸÊï†ºlPq8ULÙÃàÌO'ö$«ŠþgÚºÛÒ•ÛY|l·Ûr]ÎœŽ¤\d!ofäÇÎÙûnôIÚš(!ÅÙ˜¯—	ÉH¦–;LÊא¢^ü»Ða“þƒ`Ò—7µŒ>µ‹?à÷=ö¤šLÈÉ	tà¼Î£˜å¦[e’k©#Ù6f¬ãÕc?t¾Þ)˜' ‰t)4
-äDÂy2}CÍŽã.5û¿
-+Ží4C•€™Ùc3Uõ~u£&ÉÙçæ¥ì‡j}"zjc•±Ž×õ®êª‚:6gw%P&g¯¨Ñâ¬{¦+h›C_õç•
-òqâ¨$P£‡A
-V´õn,ÊŽ»®]w¾&¥aãC¡“çÈn`úØÀ…ﺪD@
-»G¦:F%Iz¤*„Iq€ c®§˜Ñä‰,ê6B²U¹±0§s¬ò%¿Ýƒ5¸ÛÐ6ÀI³¢šNjN3Ö=°¾( Éªfbc093 †–ŽÄÉêÐøº*hdj»¤…pÄÊÉ¿¹ŽkjS”¯Œ°Bž(!$ô•5ØWÂREt³šÛŒZC¹ÞÂùÇf¡ê×H	{ÅYY'ƒke·µçF7R<®6c[nˆv$†SŽ¡ù€2¾–½CôLsiÎ=oúºóÛ«ŽA‡c/©ÙëfŒ™Ä“{ž–¨ÃæÐUûPî|°xŽmÊ<ÝxøÒH¸ØåÛ"+—Q8™q4ýPÖgÍS.¥ž"¸?£åy*'NpË預͜²‰kŒÇGßc8ÅLÌœ+}·­°xç Þ+<ˆpiþ¸Ô“räÇG±õRGù¯à2wódúmè»TRUÀq_5ý\긣øµ«†¡lhº\¥Š®™ :å®qu ù­ÇkõÝW=h'-»E¾dlãËÑèÇípq®‹Bj£ÙG æ¦CVø†$§­È¿û.9ýÌ‘™åðhÂç|$iC¸rf OçÿÈsuE
+xÚ…VKsÛ6¾ëWðΘ0^‰öä$v›ÌØmmõÔô S´ÄZ$U’²«ß],©ˆ±<ÍÀb÷Ã>¾(¢u$¢_âñÃrqy#m¤ÏòLF˧Hjŵ3‘µ†«ÜFËUô»õM¬,Ûûmœh¡ØSÛÅ/¿€m6³•–[é :X=|¾¾»õfgdŠ[{T{Aè²ë«¶!tÃÅh•GŽ;«,%Vó\š(Q’;Ø	¶¿wq*YûR¡uð.ÍÙ‚Å næìåÎ"i¸6V@Ãsm/ç¹S„w¿6 Ýr3v_í¶åa4Q’óTeQ"Ï&„eœ+ÖÖd|Å?p‚{hªVà×Y òÂJSòL
+H¤–Q¢
+Oa/ ÿÙTª,¤jÀɁ Û'ûʲú)NŒNÙ§r绡.TN3ö0øóÓlj„=ɪ¢ÿ™¶îö_…´åvEÛí¶\—3§#©yÈ›ùñŇsö¾}’î‚&JHq6æëåBÂDD2’YÊ­ &9Á5d ¨ÿ.tؤÿ ˜´GÁåM-£Oíâø}=©&rr8¯]”³¬Át«\r-u¤ ÛÆŒu¼zì‡ÎÃ;3â ‘6ƒ¦œH8Ofoè¯óÙqÜffbÿW‘Šc;ÍP%`æé±™ªz¿…ºQ“8ö¹y)û¡ZŸˆžÚX嬣Åu½«ºª Žuì®Ê8öŠ-κgÚ¸‚¶9ôUÎQ© 'ŽJ2å0z¤`E[ïöÀ¢¡ìH°ëÚuçkR6>äjaœCvÓÇ.|×U%ZhØ=2Õ*0*IÒ#U!LŠs=ÅŒ&OdQ·1’­Ê툅9c•/!øí¬Á݆¶	 NB ÇŠj:©9ÍX÷<Âú¢€&«šuˆIŒÁ8
+f ŒT¤t$NV‡Æ×UA SÛ%-„Û æP®HþÍu\S›¢üxe„òD	!¡¯Rƒ}%RªH€nVs›Qëa(×[8âØŒ"T=ãú)¡c¯8+«àäcp­ìÖ¡¶àÜèF†gÃÕfŒaË
+"‰aÇ”ch> ŒïFÊÞ!z®¹4瞍7}ÝùíÕ Ç ŽÇ‡Ã2ƒ—ŽÔìu3ÆLâÉ=OËÔasèªÇ}(
+w>X<ÇiÆ<ÝxøÒH¸ØåÛ"+›S8™q4ýPÖgu—ROÜŸ‰1å.““'¸åtPȦ£lâãÂñÑ÷N13çJßm+,Þ9€÷Ê"\š?.$õ¤îøˆ#¶¾@êè#ßà5\:;O¦ß†¾Ë$U÷UÓÏ%¡N€;Š_»jʆ¡ËU¦èš	¢SÎáúWšßz¼öPÿ×}Õƒfp2e·È—œm|9ý¸.ÎuQèCm4ûÄÜtÈ
+ߐä´ùwß%§Ÿ92O9<šð¹IÚ®œÀÓù?åïuI
 endstream
 endobj
 320 0 obj <<
@@ -633,20 +631,19 @@
 /ProcSet [ /PDF /Text ]
 >> endobj
 379 0 obj <<
-/Length 1780      
+/Length 1779      
 /Filter /FlateDecode
 >>
 stream
-xÚíZKsÛ6¾çWðVê@OÈ-­Œ;MÛ‰é!í!!‹ŠÒðá$ÿ¾ RIÉ”ãiìJ'‰$ÀÇ÷aw¿Ýðn=à½}ÜïÏ7/^¾!Ѓ$Ä$BÞÍÜã"€{D!D»I¼þ/«|†¡_)ûSÎþ¹ùµ»ÇË7Xx<QDÌ|à„Q;ÎAÿV媐Ù,À‚øi>_KY¥ú¶Ûwò!H4sIï9æEa((m^4hG†‘ÀvÎÕ,€Qÿ]š§Ë恌úWö½‹Õîã>("‚ûôþïÌ}j¿§ªÒüÖ~OYÉ¢R‰9 þ—´Z˜ûé×[·‡öÓ®¯.}è±XãO8oÇ^‘o
-ˆ"áhx¸{ÓPc…úóõf™œiæ&Ø—ybÿuž§¹¾vk«…²n¹^¤±™–Ù3u©
-ûOO at B/ˆb.c7¼Î{ù¥y²2¾”}Ä#ŒüpPHŽýÁ÷é=F ô`뮇”h‘B©¥%Uà †Ìž?ˆÁ¼X-í°w2¶§V“ßÌpî×_û/Š14u^P*„M;@ߛťPþ‹k¬±¯4±0„´o ´µ˜÷‡,²hssCŸìnÞØrfãèí¿IŸâH¸lñL[.d¥—ƒ§ðÖ:Ä?³yG40zŸy\–•_;ûÏb¥fÙ.âØ›O;r`_¨J¦YiÝÈjnQ½±ˆ#cÒaoÍ¥øf¯ãB©|àµÙ©Â.&ÂÎZØ°È·ªo 	Ç'ìQ4½Ïà‘ÁDb¸#ƨz³Ðm¸­ÓžB¾jœÐP¦(ƒ''¾‹±#7‡R†°2…ž„Aú/ëò‰ýªˆ‡›¦‰´ÉRô¤5щô
-×pQˆ0Þ$cEþ›§]RP-V¥‹ø_+{NîL™¥·‹ÆB3Šær™f©,6Jx,ÓZ~c>sÝÏùêÜŽ	H©@ ‡’~Z,štïó:³#?^5i۝áA¥lŽªÃP¦-IL# „²ÿ—Ñ
-9¢û9‚Ó~,Úv½vòW}•Ëu¦Fðæ Œ6E£÷#¾R„€tʸHו#º%ÿ¶«çÃsõœ~rD£gÍ‚¶P }Dè¡cZ at 1óÿ¨«,ÍÕ®xÞÍùu¡}˜6”X%u¡’YàÓÖhª>ÐÖÒ€¾UŽZ6Å£¬J
-ôÀ.K5՝3ùýDÀ©D KÄu¥Öe—ÄØÅŸø¹¿úÜù
-éâB¡JÍTùjÊü˯*®«q¡™ŠîÕz4`Kšõ«ØŒ=ÿÔò/:’Ó0B|@¶ô¼Mï:C)Ô\*‡&AzÖ³	O5âøØDSä/T¶v×è¥Öw}ÊÔrX
-ïœ7G ?è„A­s4Â0ìÚaJUüTÚnØR6í°ZfGB	C>"Gôð퇵Åɦ¶Öò©ìwöHHy't{0½<{ÝÞ›´ý¿æÞWùº®ìSK:xãûe dQ¯PNºFÙEÚ´%ìMº‚àß ’lèO`çJÕƒüÉž¶‚!t at N—:_WEWu!³6!NT¥Š¥Ö¥‰åìn¦®Ìê!Yü$f´/~Ž"Ûv=/¾™ìV&©kYÆMïÖbY¤²¢I"~î=HáLë‘®z•'ZÜ$õV£ô~z"™ Bo	!!®™*c“øº¬ ÛM‘ôl©*d^vÛ]zÍ'ä©-Q¾×Ð0x>EÄ'.nÚuäÖM¥òDYX]"oÚž:ŸFB° ø¹ÈG
-¬b"mKô]ZnJCq¥gßñÝ‚ÉÄ°®7·´¦±*Ӎ-ÄÆF2¿U{k“§§0
-ÁLä¢ë“ªíý3ýŒ•á³-<¶ÛCQ/íÒÞ휑ڜñi¦™üÀm9-×ͱŠS“ÌÅ£{OwIŒŽO$éfÇek½E%·[Ùe0®€®ß«xÖlªÝîH`?WU³ƒÒ(„•P|nF.—i\¾2ï7š2­r,mq2Q#7+>«ÅœWãQã#R-Ú¥Z?talÍ;vzöZÇÕî0=j´ùÞ¥%¾êwz9Åæ(wª¹,-©±I%’~͵K6ö¦\DO:*LÛÍM7û^w±lUÔ'›s,dƒGÚ¶€Õ]ƒmVmx☟œá€Mä Mñ^'IjökL[ß–îfÐ;o¸;st8y>½hªáWvÇÊ6ÚhíÝm—áÆˈÖËlËp xî>šïÑ™ÜZë¡Èöhi„0®UfÛêÚ™wyóâ_Õ¢ <
+xÚíZKsÛ6¾çWðVê@o¹¥µ“q§n;¶3=¤= $dqBQ>œäß @J")›r<]é$‘øø>ìî·» Þ­¼÷¯€ûýùæÕëwz„˜0äÝÌ=.B ¸B$¼›Äûèÿ²Êgú•²?å쟛_»{¼~‡…ÇCÁ1ó rDíT8þ{•«Bf³ â§ù|U,e•êÛnßÉ#P„\ }ÐÌ%½ç˜…¡ ´yÑ `2íœ‹Y !¢þeš§Ëæõ/ì{«ÝÇ}#‚ûôáûÔ~OU¥ù­ýž²’E¥s@ý/iµ0÷Ó¯¶n!	 í§]_œÿþö¾Çb?á¼?xE¾56 z0` Ððp÷¦¡Æ
+õçë7Ì29ÓÌL°/óÄþ)ê<Os}íÖWeÿÜr½Hc3-³gêRöŸž€„^Å\Ænx'ö*òÿJóde|)ûˆ3ŒüpPHýÁé=2 z°uWCJ´H!‡Ô‡Ò’ª¿a CfÏß‹Á¼X-í°KÛS+‡Éof8÷ë¯ýŘ?O:¯(ÂgÅÐ+³¸ôÊ¿sqm€5ö•æ#†ö
+€¶suŸÅÀ($ÚÜÜÐç»›7¶œ£qô„…öߤOq$œ·x¦-
+g²ÒÀËÁSxk?â‹_ؼ˜}È<ÎËJ‡¯‡ýg±ÒF³ì?— q쌁Í'‚ÍØgª’iVZ7²š[To,âȘ„tØ[s)¾ÙÃë¸P*xíèXaaZØ°È·ªo 	"ŽØ£<jzŸÀ™ÁDb¸#ƨz³Ðm¸­ÓžB¾jœÐP¦h<N|bGn¥‰B8Èzé¿Q—OìWE<dÑ4M¤M–¢g­‰žI¤o¸†{´˜`!pÀx“ŒÁˆùïfœvIAµX•.âY¬ì9Y¸3e–Þ.Í\(šËeš¥²Ø(á±LShùù4ÎaH"ö0çÿ©s;$ ÝK8äôÓbѤ{÷q1¯39òãU“¶ÝTQÊ樺Ÿ iKÓ !‚ÑÿËè†ÑýAi?Ɔö‚GoüU_år©¼9Ù¦ht5â+EH7 Œ‹t]9¢[òo»zŽ1<WÏé'G”½h´¥è„í#€DŸÓŠ#ÿºÊÒ\íŠç-Ðœ_Ú‡iC‰URj ™>n}€àD} ­¥}«µlŠGY•è]–j ª):eòO@²D\Wj]vIŒ]ü™Ÿû«Ïß..ªÔL•of¡‘þUÅu5.ô`$±µ
+Ø’fý*v½üÔ²áíä4dˆèÁ–ž÷é]g(…š«BåñÐ$¤'=û˜°ðTs!ŽM4EþBek'q^j}קL-‡¥€ñîÀ1ps ðƒNÔ:áA#îö¡TÅO¥í†-eÓ«e6p$”DÈGä€~¶ý°¶8ÙôÃÖZ>•ýÎ	)ï„n聯g¯Û{“¶ÿ×Üû"_ו½sbjI÷Þø¡F#Ö+”“®Qv–6m	»F“® ø7€$ú$¢S¥êQþdO[Á
+: §K¯«¢Ž«ºY›'ªRÅRëÒÄrv7ÓWfõ,~“í‹Ÿ£È¶]ϳo&»•IêZ–qÓ»µX©¬†hÆO¡G)œi"Ò5P/òD‹›¤Þj”>LCìÄyBxKéqÍT›Ä×eÝnŠ¤gKU!ó²ÛîÒk>&Mm‰ò½††ÁË)ò >qqÓ®#·nr(•'ÊÂê©xÓöìÐù4‚Å/=@>i`	h[¢—i¹)1Å•Xœ|Çt&u½¹¥5U™nl!66²ù­Ú[›<>…yhÆ`"]ŸTmïŸég¬>ÙÂSû±=õ2Ñ.íÝΩÍ/M3ÍänËi¹nŽUœšd.Ý{º“Hbtx"I7;.[ë-*¹ØÊ.ƒqtý6XųfSívGû¹ªš”F!¬ô€âs+0r¹Lãòy¿Ñ”i•«`i‹“‰¹YñyX-†à´òèjÑ.Õú¡ckÞ¡„Г×:¬v‡éA¤Í÷Î-ñU¿ÛÐ#È)6G¹SÍeiIM*‘ôk®]²±7mä‚=ë¨0m77Ýì{ÝŲUQŸlα
+iÛVw
+¶Y=¶á‰c~O†ƒh"mŠ÷6IR³×XcÚú¶t7ƒÞqxÃ݁œ£SÀ1ÈóéES
+W4½°;V¶ÑF[hïnƒh¼7^F´^fX†› ÅK÷Ñ|ÎäžÐZ1Û£¥!^q­2ÛV×μó›WÿD >
 endstream
 endobj
 378 0 obj <<
@@ -955,21 +952,20 @@
 /ProcSet [ /PDF /Text ]
 >> endobj
 422 0 obj <<
-/Length 1494      
+/Length 1492      
 /Filter /FlateDecode
 >>
 stream
-xÚíZÉŽÛF½û+tl&Ó+»;7Û°
-±xt›ä@K-
-Šd¸xA~>½‰ÛPcÆÌè2Ԑâ¢÷ª^½ª&\íWpõöìm_®Ÿýò†È•dÒÕz·2€P¬8„åj½]]ƒÐó%ƒàuYҨŠ³Ôûký[wE4`‚ëì·‰<9¬¯/Ž®ïS®?û’µw§w0^$û¬ˆ+›Ãém®}FCx>CôÜ
-¹œg6=<aŸ®î0ì3„†>ÔU^k~ªáåÈ…ƒqÞMŽÓ„Q€d8àÊæâ!xÓ½çJ@ÑAUª(û·L^Rcˆ9^š69Ü/ê*3¹qˆÿ	mñÇ ÛÝÅáÏAéÿyV²VÒÀú*K·±©<Q⠌ҭôN7§Ç0PuêÚçP<„ÈüNÐhÚGõOjëÛxX‚›(Ý«ÒíØÙÁ¶é£[eà®ÿ	|úÑ8
-±`€ÒQ,zNÆ',€H®|ĩÇ;+sUé Š
-¤@EÖÏÅž©éÝRÛ˜æøÉÕ…»úÚ“Ò uÇ%Ùù>It>éj“ʯ©ßrÏ×å8«†7¾ÖO+/…ö{*[”}¢3I¯¿F‡<Q:S~õ|Ê8ÈRå—ñ¶ÍFËÒó†1ðÅ0™M}¥‘;â.S©üDéÔ°Žðç)[îTÄ‘SyW'Uìwµq&š…O.~G‘Öᎃ폣Mº.K#œêÓµŒ6᧚²ªwåyo¬¼7¡«k€ùÊg¡ªØ«tÓHM^dŸuðƒ9x8Ì¦=mp]{ú,“•­åÛÆÚUКºûI«µü6ë•JÝ‘8ÝšÌ6Gõ'zå.³/²:f9&`±¨’#LNk­l*y|ður÷`‚Þc0!»‚ë,¨Î¡%Ö(éC=¯TêgÓüŽ>›V1,e©”÷¦AàCnð2é"Ø`÷ù`|)[•8ãVêýÑõÜ}GgŸ!éiÞ@×;âØÒ§•31£… T vÚo›”?yTäõ­ªšd×7(«¨¨tùžB†ÎB„L2ÂÁ»Ìʃ 3õY¬¹]^&,ßÍ=ºfÍŒ¡É†Xû¿<ÉŠnòòå&vT5M”-
-›ªlLNÖêÿ&©·jø ðÁ“q¶þ¸ØåÀ+cG$p¶EÛ£»›Æ¿L9ù%Æï¢ß_¸±SCkáõÙ¨«ÓhReUú‹ù“;ŽtüVÆž¤ºuftN#Û8‰Ü)¤í"¬_rÉu«4jËõÄ]ŸüÜz4è"ó‹p›˜ïTùÆ'ÏŽ
-UjŠ†^–?½	ô(êìþYH\¾ñ¤Ð©ÖzœÒ¥Ü.+šiWW|f}
-¿‡O!m¾Wv2å†6éMÕ³’%µ —DüâNΓl>ãNؐœÖ¼?ê>éÑÍ~”ÔÎÛdÝéÆfÌ#“ÙAïƒçá¬áÌxæt›ÙÜ8(ëcªf?tˆÙ“Ѿ/‡˜Ì@\D•š_Nøƒ]Rû¡ˆ“9>T¦Ò¿T7‘õàqVtCv>hÕ}lá
-_ºÑe:3EÉ#­¦;NÄ'xDÒ§…FÈð	€K—*nE|W«áb©†Sûb![-™†¶Õîi4»©÷cyGâl¤ÃåËߢ×"P×"üazƒ£•6ݧǩ٧ÿÍÝǍ›¾0D äg7ç´m~ÏÒ}\ÕÛ¸{WÃLtumU2œÙ°ðÒ,,ãçôôhJ¹o&ÿ6ËÌI³ðJ@©µ¹mªèS2\f–³Oû8=ªX&sô¶
-˜A9Nu3ÎêÛ%Õqœ¤Omm›ãû‹s"÷ª{ÛIËÛ&;ä‘{Ê,eÍ,$*’¸U at 7¶,J»öÔ_Òf8䀓ùE¡ÐÝø£Úµ+¾s#ÞH¬¤þe8´¿CP.MXñ Ê&®NàõúÙÅ+v§
+xÚíZÉŽÛF½û+tl&Ó;»s³
+Û@ہ­Û$ZjiˆP$ÃÅòóé…äH܆O`ÌŒ.C
+).z¯êÕ«jÂÕ~WoŸÁÞöåúÙ/oˆ\‰@rNWëÝJÈ B±
+!–«õvu¸çKÁ벊Qg©÷×ú·î+ŠhÀD¨ÿ±ß¦ðä°¾¾8º¾O!BýÙG0¬½C€<½ƒ!ð"ÙgE\y\Noså3ÊAàùÑs7äržÙôðDPð>]ÝaØg7}¨«¼ÖüTÃË‘÷qÞ(Mhœ&Œ$ù€+›O(äàMü-N÷žO(yTDU©¢ìßB0yI!ædijØä0p¿¨«ÌhäÆ!þ'D´ÅƒlwŒÃŸƒÒÿò(¬t1¬¤õU–ncSy¢ÄA¥[‡inNa &êÔ•Bñ"óA£
+hÕ?u\¨­Clãa	®£t¯J·cWdئn•M€K,¸Zü'ðEè¾qbÁ e£XôœŒOX ‘\ù(¤ŸÐY™O• ¨0ÐH
+TQdý\웚Ó[jÓ?¹ºpW_{R n¹$?ß'‰Î'}Úd…ò+Cê÷ÜóõF9Ϊ፯ôÓÊK¡ý‘JÀeŸèLÒëoÑ!O”Δ_=Ÿ²d©òËxÛf£eéy؇øj˜Ì¦¾ÒÈq—©T~¢tjXGÿyJÅ—;qäTÞÕIû]mœ‰fAá“‹ßQ¤ux…ã`ûãh“®ËÒ§út-ã_Lø©¦¬ê]yžÄ+ïMèê`¾òÅD¨*ö*Ý4R“ÙçDüà0|x8,¦=mp]{ú,“•­åÛÆÚUКºûY«µü&ë•JÝ‘8ÝšÌ6Gõ'zå.³/²:f9&`¹¨’#LNk­l*y|ðurû`‚Ýa0!»‚ë,¨Î¡%Ö(éC=¯TêgÓüŽ>›V1,c©dðΔ"¨qc|È
+^&]$;lá>Œ/%`«gÜ*C½±?z£ž»ïèì3$"ÍhørG[ú´r&fô¯”
+ÀNûm“ò'ŠÜ£¾UU“ìúe•.ß³AˆÏB„L2‚w™•@gê³X+r?º$¼LXî!šñr3ch2DqŽµÿË“¬è&/_¯cGUÓDÙ¢°©ÊÆäd­þo’z«†<ç`ëO€‹]¼2vDg[´1º»iüË”#	ax‰ñÛè wnìÔÐZøD}1êê4šTY•þjþdÅßN#]#¿—ñ€'©n›ÓÈöN¢w
+i»ë—\r}ŠUµåzâ®O~n=l‘ùE¸MÌwªŠü㓉gG…*5EC/>½	ô(êüîYH\¾ñ¤Ð©ÖzœÒ¥Ü.+šiWW|f}Š¸ƒO!m¾Wv2å†6éMÕ³’%µ —Dáŝœ'ÙbƝ°!9­;yÔ}Ó£›ý(©+¶ÉºÓÍ˜G&³ƒÞÏÃ9XØñÌé6³¹qPÖÇTÍ4~iŽÙ“Ñ>N–CLf .¢JÍÇoH»¤v¯ˆÓ9>T¦Ò¿TבõàqVtCv>hÕ}lá
+_ºÑe:3EÉ#­¦;NÄ'xDÒ§…FHþÀeK·">Š«Õp±TÃ)‚}1‚ΗCK¦¡mµ{ÍnêýXÞ‘8épùò·èµÔµ˜Þàh¥M÷éqjöéóB÷q㦏s¸8»9§m[ð{–îãªÞÆÝ»f¢«h«’á̆ñK;°°ŒŸÓУ)å¾™<þÛ,3'ÍÂ+¥JÔ榨¢ÏÉp™YÎ>íãô¨r™ÌÑ›6`å8ÕÍ8«o–TÇq>µµíÜ]䘹WÝÛNZÞ6Ù!ÜËPfá(kf!Q‘Ä­º±eQÚµ§þ’6Ã<!_âîÆÕ®]ñ±„ý€ÄJê_†¹ýeÒ€†Ò„U@ÙÄÕ)*¯×Ïþüvª
 endstream
 endobj
 421 0 obj <<
@@ -1261,7 +1257,7 @@
 /ProcSet [ /PDF /Text ]
 >> endobj
 431 0 obj <<
-/Length 3136      
+/Length 3134      
 /Filter /FlateDecode
 >>
 stream
@@ -1272,23 +1268,35 @@
 hÁëúb?Žàn*ñZšöMu,Ú"·
 ‚îÓãàþ£i4p]gåsWtÄÇTÀE@ÓŸI 3íºŒÎÌ›ê8ô†=¶Í7Ѹ²P¯à®@q¬„}›U0Ñ×è ÇVâåYÛ¦#r30µ?¢t=r’ 0b S9¡qÉŽ~+THs±VÚÛš²£É¨_;Úš#Áê¬7[^`²× ÎÖð·[×ØéyᎭ§úk¬ºÐ®¦âeyÞ´Û¢ÞÃ’ ðúC–Ûç:«Šœ¨YÞ7íºÙkÜ“Ø‚I2Ð<ËÐ7uñikÚŽzdA0üxÅÐ#ê×Cñ©&ú¿üÈ—iªáW^.퀔ïKš0•&fi쑤u $kr-4¬ÚpÓ(ò6½Ù— °|`/ô½
 µwõf
-+ê=ÝD»·V0+–׿")õ²o ;c˜—'9‰æKï£=-k;k$À	 }<A,]Ý5…‘~€K¡;×![’¦3Ô¬f&†‘ÇýÖô»A÷<±•DxE]³"±ùv ›çiĽž«”(¬ ”Ø_GqâmšŠ·1¿gÕ±4ÌFÖš%ùŽ`ᣡ]¢©gÄ^p™Wqt²&ìl
-ýZ>Áe©Ç†•òe©DŸ|±Š¤Ãf;[;å+6Oæ¹xLrš¹´×‚Ìÿ4û½)‹úÁÙß<TY}ÉþW³Ãý|‘@ÏÚtg†væ3ɓ˧ûÑdˆ׺<›
-{±f›Æ'+„T—†áKSùžpsß½!Âr®ˆaeŒ¹Âe¶³t$œì&Y‹  fä=üÚèƒZíϲZ¤§‰)q0&„Cßÿruõôô$0Jw¢ù]d¹®H¶ iY9¤ÿµ‘Pdù‘Ú±ò®:ˆ…ÙÕ+i5Q ÆóÑdúB(ë„ @ˆ™BûJ†G!Ö)ðFþsîá:mJéþLô>»ÇK¢Î³ùu¬À‰³²$JVvœzhGbØR·µAs7ž¶Srlf­çõ|%-g!·lcö—ì¿-šPíR/³z?d{Ó}ÞÜîH;1E²0Ž1³cr9šàcÑa®Ei\Y\Ù.e˜ŠD~É.•ˆí&=ÚÛiíqvçPø:RH‡1â€ã˜²R ”`ÃK|h¦»A[€:‰ÐRM+	å¢fÛh v:˜ë1oøæŠûaLæÇ̆‰{a{†”V,p¬”HU2²ü’ÛTè(rãs€ÛwÏ]om¬¢þDwØÍ3F÷6‘êl-&|ªË&Û:æwmS½
-Öî/NÎôÀQ!o³Z´kpQ-é“É{Ñ´ûWœ[B”R‘ž\BúÞ;Œ VaJ2’RÊkŽÄ|ë€ ÒvÊLáöCùŠ.cáâÎŽi
-hƒÏ¶QS!TÜ™¶µ:‚㝖€S70ØØlj­Í(ˆ†A æº:¹š Ž {¡Ž!‰vE‹‰zA¢@øZÙ±ât”öÊq[F^ÔiÐFNztÞ#§ûh-‚“÷dÇã «¬Åÿ¦îËç—'G¾ðOÆYÔ[¼¡E«èü¥ûÒ	x–þ÷…;aòµ&7…¾ùýXrNÃnQ»’$–6&wEã«ÕàêëJÌË>k¨/B+G_ÄhP¬`ˆW¡‚`Ü[(€íI¬ãQnÔÀ!‚TE™Ý—Žüjf–:…
-Y¥fö?8{³àŒW·Wß·Ípüw±ý[¿VЮe
-Ñ8ŽçÊc{‚ý9´1a,Šü¡ÍÆ°ÈIî¼>º}%hrÁÓsWíŒÖlk«ð;¦Û¦¢ÎW·×Äb‚x™?—&¬ëÇhbÑÙžBµbu[‘Ñ)`­¥KïvèD½- ©?SÛ‚Dþ¾…øÍÛ¼mŠ¢BH2òcJù@Ï›lÁ:kã‚ÒŸ
-·õÂX
[TRUNCATED]

To get the complete diff run:
    svnlook diff /svnroot/rsiena -r 46


More information about the Rsiena-commits mailing list