commit 47dd434af8ccb3a852dd50025154a298e59e6c0a parent 6a567cecd48465e6a00d8dd49e2ef66cf6425be2 Author: Eamon Caddigan <eamon.caddigan@gmail.com> Date: Wed, 19 Jul 2023 20:05:21 -0700 Copied existing posts and assets to new site Assets include my publications and posters (which, as I approach the 10th anniversary of leaving academia, I wonder why I keep online). I made a couple very minor edits to some posts' content, but nothing noteworthy. I do mention the new theme in the "About" page. Most of the work went into taxonomizing everything. I make no guarantee that the Rmd files will render into these particular md files in the latest versions of the packages they use (I'm almost sure that some won't), but I am committing them anyway in case they're useful to somebody else. Diffstat:
74 files changed, 15214 insertions(+), 0 deletions(-)
diff --git a/content/about/index.md b/content/about/index.md @@ -0,0 +1,51 @@ +--- +title: "About" +date: 2023-07-24T20:43:04-07:00 +--- + +I am a [scientist](/categories/science/) living in Southern California. I +work in health [data science](/categories/data-science/), and have +previously done research in aviation human factors, cognitive neuroscience, +and human vision. I write [programs](/categories/programming) for almost all +of my work. + +<!--more--> + +In addition to my [posts]({{< ref "posts" >}}), you can check out my [list +of registered pre-prints and refereed publications]({{< ref "pubs/index.md" +>}}) (they're also listed under [my ORCiD +profile](https://orcid.org/0000-0002-4492-2846)). I also host a few [code +repositories under a separate subdomain](https://git.eamoncaddigan.net/) using +[stagit](https://codemadness.org/stagit.html). + +You can follow me on the Fediverse at +[@eamon@social.coop](https://social.coop/@eamon/), but the best way to +contact me is through email. My address is [my first and last +initial]@eamoncaddigan.net. + +## About This Site + +This site's theme is based on +[hugo-theme-readable](https://github.com/cjtheham/hugo-theme-readable) and +[readable.css](https://readable-css.freedomtowrite.org/). + +Except where noted, text, image, video, and audio files are available for +use under the [CC BY-SA +4.0](https://creativecommons.org/licenses/by-sa/4.0/) license, and source +code is available for use under the +[GPLv3](https://www.gnu.org/licenses/gpl-3.0.en.html) license +([why?]({{< ref "posts/use-the-gpl/index.md" >}})). + +Additionally, I give permission to use all content (text, images, video, +audio, and source code) on +[www.eamoncaddigan.net](https://www.eamoncaddigan.net) and +[git.eamoncaddigan.net](https://git.eamoncaddigan.net) to train statistical +and machine learning models with the following conditions: + +* The entire training set for the model must be made freely available to the + public for inspection and adaptation +* The source code for the model must be available under a license approved by + the [Open Source Initiative](https://opensource.org/licenses/) +* Any work created using the generated model output must be licensed with + either the [CC0](https://creativecommons.org/publicdomain/zero/1.0/) or + [CC-BY-SA 4.0](https://creativecommons.org/licenses/by-sa/4.0/) license diff --git a/content/posts/antivax-attitudes/index.Rmd b/content/posts/antivax-attitudes/index.Rmd @@ -0,0 +1,414 @@ +--- +title: "Bayesian estimation of anti-vaccination belief changes" +author: "Eamon Caddigan" +date: "September 3, 2015" +output: html_document +--- + +```{r global_options, include=FALSE} +knitr::opts_chunk$set(cache=TRUE, echo=FALSE, warning=FALSE, message=FALSE, + fig.width=9, fig.align="center") +``` + +```{r setup_data, results="hide"} +# Required librarys and external files ---------------------------------------- + +library(readxl) +library(tidyr) +library(dplyr) +library(ggplot2) +library(gridExtra) +library(rjags) +library(runjags) +source("DBDA2E-utilities.R") +source("ggPostPlot.R") + +# Clean and process the data -------------------------------------------------- + +# Generates warnings for the Ps who didn't do day 2 +suppressWarnings(expData <- read_excel("Vacc_HPHH_publicDataset.xlsx", sheet = 2)) + +# Exclude Ps who didn't do day 2 and failed the attention checks +expData.clean <- expData %>% + # It's good to add a subject number so we can go back to original data + mutate(subject_number = 1:nrow(.)) %>% + filter(Returned == 1, + `AttentionCheck_PostTest (if = 4 then include)` == 4, + `AttentionChecks_Sum(include if = 4)` == 4, + Paid_Attention == 1) + +# Get all the dependent measures into a DF +questionnaireData <- expData.clean %>% + # Pull out the columns and use consistent names + select(subject_number, + intervention = Condition, + pretest.healthy = Healthy_VaxscalePretest, + posttest.healthy = Healthy_VaxscalePosttest, + pretest.diseases = Diseases_VaxScalePretest, + posttest.diseases = Diseases_VaxScalePosttest, + pretest.doctors = Doctors_VaxScalePreTest, + posttest.doctors = Doctors_VaxScalePostTest, + pretest.side_effects = Sideeffects_VaxScalePreTest, + posttest.side_effects = Sideeffects_VaxScalePostTest, + pretest.plan_to = Planto_VaxScalePreTest, + posttest.plan_to = Planto_VaxScalePostTest) %>% + # Reverse-code the approrpiate columns + mutate(pretest.diseases = 7 - pretest.diseases, + posttest.diseases = 7 - posttest.diseases, + pretest.side_effects = 7 - pretest.side_effects, + posttest.side_effects = 7 - posttest.side_effects) %>% + # Tidy the data + gather("question", "response", -subject_number, -intervention) %>% + separate(question, c("interval", "question"), sep = "\\.") %>% + mutate(intervention = factor(intervention, + c("Control", "Autism Correction", "Disease Risk")), + interval = factor(interval, + c("pretest", "posttest"), ordered = TRUE), + question = factor(question, + c("healthy", "diseases", "doctors", "side_effects", "plan_to"))) +# ----------------------------------------------------------------------------- +``` + +## Introduction + +How easy is it to change people's minds about vaccinating their children? According to a recent study ([Horne, Powell, Hummel & Holyoak, 2015](http://www.pnas.org/content/112/33/10321.abstract)), a simple intervention -- which consisted of showing participants images, an anecdote, and some short warnings about diseases -- made participants more likely to support childhood vaccinations. [Here's a good writeup](https://news.illinois.edu/blog/view/6367/234202) of the article if you're unable to read the original. + +The authors [placed their data online](https://osf.io/nx364/), which comprises pre- and post-intervention survey responses for three groups of participants: + +1. A control group +2. An "autism correction" group that were shown evidence that vaccines don't cause autism. +3. A "disease risk" group that were shown images, an anecdote, and some short warnings about the diseases (such as rubella and measles) that the vaccines prevent. + +I chose to look over this data for a couple reasons. First, I'm friends with two of the authors (University of Illinois Psychologists Zach Horne and John Hummel) and it's good to see them doing cool work. Second, my own research has given me little opportunity to work with survey data, and I wanted more experience with the method. I was excited to try a Bayesian approach because it makes it possible to perform post hoc comparisons without inflating the "type I"" (false positive) error rates (see below). + +Participants were given a surveys with five questions and asked to rate their level of agreement with each on a six-point scale. + +code | question +-------------|------------- +healthy | Vaccinating healthy children helps protect others by stopping the spread of disease. +diseases | Children do not need vaccines for diseases that are not common anymore. *reverse coded* +doctors | Doctors would not recommend vaccines if they were unsafe. +side_effects | The risk of side effects outweighs any protective benefits of vaccines. *reverse coded* +plan_to | I plan to vaccinate my children. + +```{r plot_responses, dependson="setup_data"} +# Calculate the change-in-attitude for each subject on each question +questionnaireData <- questionnaireData %>% + group_by(subject_number, question) %>% + spread(interval, response) %>% mutate(change = posttest-pretest) %>% + gather("interval", "response", pretest, posttest) + +p2 <- ggplot(questionnaireData, aes(x = interval, y = response, group = subject_number, color = change)) + + geom_line(alpha = 0.2, position = position_jitter(w = 0.1, h = 0.1)) + + facet_grid(intervention ~ question) + + scale_color_gradient2(low="red", mid="grey20", high="blue") +print(p2) +``` + +The above figure shows the data. Each line represents represents a single participant's responses before and after the intervention, organized by intervention group and question. Lines are colored by the magnitude of the change in response; blue lines indicate an increase in agreement (toward a more pro-vaccine stance) and red lines indicate a reduction in agreement (a more anti-vaccine stance). + +The JAGS code for the model is part of the source of this document, which is [available on Github](https://github.com/eamoncaddigan/antivax-attitudes). It uses a Bayesian analog to a three-factor ANOVA, with a thresholded cummulative normal distribution serving as a link function. Such models fit ordinal responses (such as those obtained from surveys) well. The thresholds and variance of the link function were fit independently for each question. The mean of the function was estimated for each response using a linear combination of the levels of the question, the interval (pre-test vs. post-test), the intervention group, and all interactions between these factors. + +## Results + +```{r run_model, dependson="setup_data"} +# Get the data ready for JAGS +x1 <- as.numeric(as.factor(questionnaireData[["question"]])) +Nx1Lvl <- max(x1) +x2 <- as.numeric(as.factor(questionnaireData[["intervention"]])) +Nx2Lvl <- max(x2) +x3 <- as.numeric(as.factor(questionnaireData[["interval"]])) +Nx3Lvl <- max(x3) +y <- as.numeric(questionnaireData[["response"]]) +Ntotal <- length(y) +nYlevels <- max(y) + +# Threshold 1 and nYlevels-1 are fixed; other thresholds are estimated. +# This allows all parameters to be interpretable on the response scale. +thresh <- matrix(data = NA, nrow = Nx1Lvl, ncol = nYlevels-1) +thresh[, 1] <- 1 + 0.5 +thresh[, nYlevels-1] <- nYlevels-1 + 0.5 +# Specify the data in a list, for later shipment to JAGS: +dataList <- list( + x1 = x1, + Nx1Lvl = Nx1Lvl, + x2 = x2, + Nx2Lvl = Nx2Lvl, + x3 = x3, + Nx3Lvl = Nx3Lvl, + y = y, + NyLvl = nYlevels, + thresh = thresh, + Ntotal = Ntotal +) + +# Prepare the model for JAGS +modelString <- " + model { + for (i in 1:Ntotal) { + # Thresholded cummulative normal distribution + y[i] ~ dcat(pr[i,1:NyLvl]) + pr[i,1] <- pnorm(thresh[x1[i], 1], mu[i], 1/sigma[x1[i]]^2) + for (k in 2:(NyLvl-1)) { + pr[i,k] <- max(0, pnorm(thresh[x1[i], k] , mu[i] , 1/sigma[x1[i]]^2 ) - + pnorm(thresh[x1[i], k-1] , mu[i] , 1/sigma[x1[i]]^2 )) + } + pr[i,NyLvl] <- 1 - pnorm(thresh[x1[i], NyLvl-1] , mu[i] , 1/sigma[x1[i]]^2) + + # mu ~ x1*x2*x3 + mu[i] <- a0 + a1[x1[i]] + a2[x2[i]] + a3[x3[i]] + + a1a2[x1[i], x2[i]] + a1a3[x1[i], x3[i]] + a2a3[x2[i], x3[i]] + + a1a2a3[x1[i], x2[i], x3[i]] + } + + a0 ~ dnorm((1+NyLvl)/2, 1/(NyLvl)^2) + + for (j1 in 1:Nx1Lvl) { + # Constant sigma for beta1, we're treating all Qs as independent + a1[j1] ~ dnorm(0.0, 1/(NyLvl)^2) + + # Sigma for normal CDF, unique for each x1. + sigma[j1] ~ dunif(NyLvl/1000, NyLvl*10) + + # Threshold distributions. 1 and NyLvl-1 are fixed, not stochastic + for (k in 2:(NyLvl-2)) { + thresh[j1, k] ~ dnorm(k+0.5, 1/2^2) + } + } + + # Constant sigma for beta2, the interventions are independent + for (j2 in 1:Nx2Lvl) { + a2[j2] ~ dnorm(0.0, 1/(NyLvl)^2) + } + + # Constant sigma for beta3 + for (j3 in 1:Nx3Lvl) { + a3[j3] ~ dnorm(0.0, 1/(NyLvl)^2) + } + + # Interaction terms also have homogenous variance + for (j1 in 1:Nx1Lvl) { + for (j2 in 1:Nx2Lvl) { + a1a2[j1, j2] ~ dnorm(0.0, 1/(NyLvl)^2) + } + } + for (j1 in 1:Nx1Lvl) { + for (j3 in 1:Nx3Lvl) { + a1a3[j1, j3] ~ dnorm(0.0, 1/(NyLvl)^2) + } + } + for (j2 in 1:Nx2Lvl) { + for (j3 in 1:Nx3Lvl) { + a2a3[j2, j3] ~ dnorm(0.0, 1/(NyLvl)^2) + } + } + for (j1 in 1:Nx1Lvl) { + for (j2 in 1:Nx2Lvl) { + for (j3 in 1:Nx3Lvl) { + a1a2a3[j1, j2, j3] ~ dnorm(0.0, 1/(NyLvl)^2) + } + } + } + + # Compute cell means + for (j1 in 1:Nx1Lvl) { + for (j2 in 1:Nx2Lvl) { + for (j3 in 1:Nx3Lvl) { + m[j1, j2, j3] <- a0 + a1[j1] + a2[j2] + a3[j3] + + a1a2[j1, j2] + a1a3[j1, j3] + a2a3[j2, j3] + + a1a2a3[j1, j2, j3] + } + } + } + + # Convert a0, a1[], a2[], &c. to sum-to-zero b0, b1[], b2[], &c. + b0 <- mean(m[1:Nx1Lvl, 1:Nx2Lvl, 1:Nx3Lvl]) + for (j1 in 1:Nx1Lvl) { + b1[j1] <- mean(m[j1, 1:Nx2Lvl, 1:Nx3Lvl]) - b0 + } + for (j2 in 1:Nx2Lvl) { + b2[j2] <- mean(m[1:Nx1Lvl, j2, 1:Nx3Lvl]) - b0 + } + for (j3 in 1:Nx3Lvl) { + b3[j3] <- mean(m[1:Nx1Lvl, 1:Nx2Lvl, j3]) - b0 + } + for (j1 in 1:Nx1Lvl) { + for (j2 in 1:Nx2Lvl) { + b1b2[j1, j2] <- mean(m[j1, j2, 1:Nx3Lvl]) - (b0 + b1[j1] + b2[j2]) + } + } + for (j1 in 1:Nx1Lvl) { + for (j3 in 1:Nx3Lvl) { + b1b3[j1, j3] <- mean(m[j1, 1:Nx2Lvl, j3]) - (b0 + b1[j1] + b3[j3]) + } + } + for (j2 in 1:Nx2Lvl) { + for (j3 in 1:Nx3Lvl) { + b2b3[j2, j3] <- mean(m[1:Nx1Lvl, j2, j3]) - (b0 + b2[j2] + b3[j3]) + } + } + for (j1 in 1:Nx1Lvl) { + for (j2 in 1:Nx2Lvl) { + for (j3 in 1:Nx3Lvl) { + b1b2b3[j1, j2, j3] <- m[j1, j2, j3] - (b0 + b1[j1] + b2[j2] + b3[j3] + + b1b2[j1, j2] + b1b3[j1, j3] + b2b3[j2, j3]) + } + } + } + } +" # close quote for modelString +# Write out modelString to a text file +writeLines(modelString , con="TEMPmodel.txt") + +# Tell JAGS which parameters to return +parameters <- c("b0", "b1", "b2", "b3", "b1b2", "b1b3", "b2b3", "b1b2b3", + "sigma", "thresh") + +# JAGS parameters. We'll let it iniaialize itself +initsList <- NULL +adaptSteps <- 500 # Number of steps to "tune" the samplers +burnInSteps <- 1000 +numSavedSteps <- 15000 +thinSteps <- 10 +nChains <- 4 +fileNameRoot <- "antivax-mcmc" + +# Since running JAGS takes forever, we'll skip redoing it every time we knit. +saveName <- paste0(fileNameRoot, "-coda.Rdata") +if (file.exists(saveName)) { + load(saveName) +} else { + runJagsOut <- run.jags(method="parallel", + model="TEMPmodel.txt", + monitor=parameters, + data=dataList, + #inits=initsList, + n.chains=nChains, + adapt=adaptSteps, + burnin=burnInSteps, + sample=ceiling(numSavedSteps/nChains), + thin=thinSteps, + summarise=FALSE, + plots=FALSE) + codaSamples <- as.mcmc.list(runJagsOut) + save(codaSamples, file=saveName) +} +mcmcMat <- as.matrix(codaSamples) +``` + +### A "risk" intervention changes attitudes toward vaccination + +When fitting model parameters using Monte Carlo methods, it's important to inspect the posterior distribution to make sure the samples converged. Here's an example of one parameter, the intercept for the mean of the cummulative normal. + +```{r plot_diag, dependson="run_model", fig.width=5, fig.height=5} +diagMCMC(codaObject = codaSamples, + parName = "b0", + saveName = NULL) +``` + +It's also important to check the predictions made by a model against the data being fit, as "[we cannot really interpret the parameters of the model very meaningfully when the model doesn't describe the data very well](http://doingbayesiandataanalysis.blogspot.com/2015/08/a-case-in-which-metric-data-are-better.html)". Here are response histograms for each question, averaged across the levels of the other factors. Model predictions are superimposed on the histograms, along with the 95% HDI for each response. + +```{r plot_ppc, dependson="run_model", fig.height=6} +plots <- list() +for (x1Level in seq_along(levels(questionnaireData$question))) { + p <- ggPosteriorPredictive(questionnaireData, codaSamples, x1Level = x1Level) + p <- p + ggtitle(levels(questionnaireData$question)[x1Level]) + p <- p + theme_classic() + plots[[length(plots)+1]] <- p +} +do.call(grid.arrange, c(plots, ncol=3)) +``` + +Since the sampling procedure was well-behaved and the model describes the data well, we can use the parameter estimates to judge the size of the effects. Here are is the estimate of the change in attitude (post-test - pre-test) for each intervention group. + +```{r plot_change, dependson="run_model", fig.height=3} +par(mfrow = c(1, 3), mar=c(2, 1, 1, 1), oma=c(0, 0, 4, 0)) +for (x2Level in seq_along(levels(questionnaireData$intervention))) { + plotPost((mcmcMat[, "b3[2]"] + mcmcMat[, paste0("b2b3[", x2Level, ",2]")]) - + (mcmcMat[, "b3[1]"] + mcmcMat[, paste0("b2b3[", x2Level, ",1]")]), + main = "", + compVal = 0.0, ROPE = c(-0.05, 0.05), + xlab = "") + mtext(levels(questionnaireData$intervention)[x2Level], side=3, line=1) +} +title("Attitude change", outer=TRUE) +``` + +These plots highlight the 95% highest density interval (HDI) for the posterior distributions of the parameters. Also highlighted are a comparison value, which in this case is a pre- vs. post-test difference of 0, and a "range of practical equivalence" (ROPE) around the comparison value. The HDI of the posterior distribution of attitude shifts for the "disease risk" group" (but no other group) falls completely outside this ROPE, so we can reasonably conclude that this intervention changes participants' attitudes toward vaccination. + +we can also use the posterior distributions to directly estimate the shifts relative to the control group. Here is the difference between the attitude change observed for both the "autism correction" and "disease risk" groups compared to the attitude change in the control group. + +```{r plot_change_rel, dependson="run_model", fig.width=6, fig.height=3} +controlLevel = which(levels(questionnaireData$intervention) == "Control") + +par(mfrow = c(1, 2), mar=c(2, 1, 1, 1), oma=c(0, 0, 4, 0)) +for (x2Level in which(levels(questionnaireData$intervention) != "Control")) { + plotPost((mcmcMat[, paste0("b2b3[", x2Level, ",2]")] - mcmcMat[, paste0("b2b3[", x2Level, ",1]")]) - + (mcmcMat[, paste0("b2b3[", controlLevel, ",2]")] - mcmcMat[, paste0("b2b3[", controlLevel, ",1]")]), + compVal = 0.0, ROPE = c(-0.05, 0.05), + main = "", + xlab = "") + mtext(levels(questionnaireData$intervention)[x2Level], side=3, line=1) +} +title("Change relative to control", outer=TRUE) +``` + +The posterior distribution above shows that "disease risk" participants shifted their response about half an interval relative to the control group following the intervention. The "autism correction" participants, however, did not show a credible change in vaccination attitudes. Bayesian estimation replicates the conclusions drawn by Horne and colleagues. + +### Post hoc comparisons + +An analysis following the tradition of null-hypothesis significance testing (NHST) attempts to minimize the risk of "type I" errors, which occur when the "null" hypothesis (i.e., there is no effect) is erroneously rejected. The more tests performed in the course of an analysis, the more likely that such an error will occur due to random variation. The [Wikipedia article on the "Multiple Comparisons Problem"](https://en.wikipedia.org/wiki/Multiple_comparisons_problem) is an approachable read on the topic and explains many of the corrections that are applied when making mulitple comparisons in a NHST framework. + +Instead of focusing on type I error, the goal of Bayesian estimation is to estimate values of the parameters of a model of the data. The posterior distribution provides a range of credible values that these parameters can take. Inferences are made on the basis of these estimates; e.g., we see directly that the "disease risk" intervention shifts participants' attitude toward vaccination about one half of an interval. Since a single model was fit to all the data, additional comparisons of parameter distributions don't increase the chance of generating false positives. [Gelman, Hill, and Yajima (2008)](http://www.stat.columbia.edu/~gelman/research/unpublished/multiple2.pdf) is a great resource on this. + +For example, we can look at the size of the shift in attitude toward each question for each group. If we used an NHST approach, these 15 additional comparisons would either seriously inflate the type I error rate (using a p-value of 0.05 on each test would result in an overall error rate of `r round(1 - (1 - 0.05)^15, 2)`), or require much smaller nominal p-values for each test. + +```{r plot_posthoc, dependson="run_model", fig.height=9} + +# 5 x 3 grid of plots. So understandable! +par(mfrow = c(5, 3), mar=c(2, 1, 1, 1), oma=c(0, 0, 2, 4)) +for (x1Level in seq_along(levels(questionnaireData$question))) { + for (x2Level in seq_along(levels(questionnaireData$intervention))) { + plotPost((mcmcMat[, "b3[2]"] + + mcmcMat[, paste0("b1b2[", x1Level, ",", x2Level, "]")] + + mcmcMat[, paste0("b1b3[", x1Level, ",2]")] + + mcmcMat[, paste0("b2b3[", x2Level, ",2]")] + + mcmcMat[, paste0("b1b2b3[", x1Level, ",", x2Level, ",2]")]) - + (mcmcMat[, "b3[1]"] + + mcmcMat[, paste0("b1b2[", x1Level, ",", x2Level, "]")] + + mcmcMat[, paste0("b1b3[", x1Level, ",1]")] + + mcmcMat[, paste0("b2b3[", x2Level, ",1]")] + + mcmcMat[, paste0("b1b2b3[", x1Level, ",", x2Level, ",1]")]), + main = "", + compVal = 0.0, ROPE = c(-0.05, 0.05), + xlab = "") + + # Label the top row with the name of the intervention and the right column + # with the question + if (x1Level == 1) { + mtext(levels(questionnaireData$intervention)[x2Level], side=3, line=1) + } + if (x2Level == length(levels(questionnaireData$intervention))) { + mtext(levels(questionnaireData$question)[x1Level], side=4, line=2) + } + } +} +``` + +The only credible differences for single questions both occur for participants in the "disease risk" group. The "healthy" ("Vaccinating healthy children helps protect others by stopping the spread of disease.") and "diseases" ("Children do not need vaccines for diseases that are not common anymore.") questions show a reliable positive shift, which makes a lot of sense given the nature of the intervention. However, it's important to note that the HDIs are very wide for these posteriors compared to the ones shown earlier. This is driven primarily by the fact that this comparison relies on a three-way interaction, which has greater variance (as is typical in traditional ANOVA models). The posterior mode of the change for the "plan_to" question ("I plan to vaccinate my children") is fairly large for the "disease risk" group, but the wide HDI spans the ROPE around 0. + +### Expanding the models + +My goal was to examine the conclusions made in the original report of these data. However, this is just one way to model the data, and different models are more appropriate for different questions. For instance, the standard deviation and thereshold values were fit separately for each question here, but these could instead be based on a hyperparameter that could iteself be modelled. I also excluded subject effects from the model; there were many subjects (over 300), so a full model with these included would take much longer to fit, but may produce more generalizable results. Bayesian estimation requires an investigator to be intentional about modelling decisions, which I consider to be an advantage of the method. + +### Prior probabilities + +A defining characteristic of Bayesian analyses is that prior information about the model parameters is combined with their likelihood (derived from the data) to produce posterior distributions. In this analysis, I used priors that put weak constraints on the values of the parameters. If an investigator has reason to assume that parameters will take on certain values (e.g., the results of a previous study), this prior information can -- and should -- be incorporated into the analysis. Again, I like that these decisions have to be made deliberately. + +## Conclusions + +Concerns about a possible link between childhood vaccination and autism is causing some parents to skip childhood vaccinations, which is dangerous ([Calandrillo, 2004](http://www.ncbi.nlm.nih.gov/pubmed/15568260)). However, an intervention that exposes people to the consequences of the diseases that vaccinations prevent makes them respond more favorably toward childhood vaccination. A separate group of participants did not change their attitudes after being shown information discrediting the vaccination-autism link, nor did a group of control participants. + +### Acknowledgements + +[Zach Horne](http://www.zacharyhorne.com/) made the data available for analysis (by anyone!), and gave useful feedback on an earlier version of this write-up. Much of the code for Bayesian estimation was cobbled together from programs distributed with Doing Bayesian Data Analysis (2nd ed) by [John K. Kruschke](http://www.indiana.edu/~kruschke/). +\ No newline at end of file diff --git a/content/posts/antivax-attitudes/index.md b/content/posts/antivax-attitudes/index.md @@ -0,0 +1,197 @@ +--- +title: "Bayesian estimation of anti-vaccination belief changes" +description: How easy is it to change people's minds about vaccinating their children? +date: 2015-09-03 +categories: +- Data Science +- Science +tags: +- Statistics +- Psychology +--- + +## Introduction + +How easy is it to change people's minds about vaccinating their children? +According to a recent study ([Horne, Powell, Hummel & Holyoak, +2015](http://www.pnas.org/content/112/33/10321.abstract)), a simple +intervention -- which consisted of showing participants images, an anecdote, +and some short warnings about diseases -- made participants more likely to +support childhood vaccinations. [Here's a good +writeup](https://news.illinois.edu/blog/view/6367/234202) of the article if +you're unable to read the original. + +The authors [placed their data online](https://osf.io/nx364/), which comprises +pre- and post-intervention survey responses for three groups of participants: + +1. A control group +2. An "autism correction" group that were shown evidence that vaccines don't +cause autism. +3. A "disease risk" group that were shown images, an anecdote, and some short +warnings about the diseases (such as rubella and measles) that the vaccines +prevent. + +I chose to look over this data for a couple reasons. First, I'm friends with +two of the authors (University of Illinois Psychologists Zach Horne and John +Hummel) and it's good to see them doing cool work. Second, my own research has +given me little opportunity to work with survey data, and I wanted more +experience with the method. I was excited to try a Bayesian approach because it +makes it possible to perform post hoc comparisons without inflating the "type +I"" (false positive) error rates (see below). + +Participants were given a surveys with five questions and asked to rate their +level of agreement with each on a six-point scale. + +code | question +-------------|------------- +healthy | Vaccinating healthy children helps protect others by stopping the spread of disease. +diseases | Children do not need vaccines for diseases that are not common anymore. *reverse coded* +doctors | Doctors would not recommend vaccines if they were unsafe. +side_effects | The risk of side effects outweighs any protective benefits of vaccines. *reverse coded* +plan_to | I plan to vaccinate my children. + +![Raw responses, showing the pre- to post-intervention transition probabilities](plot_responses-1.png) + +The above figure shows the data. Each line represents a single participant's +responses before and after the intervention, organized by intervention group +and question. Lines are colored by the magnitude of the change in response; +blue lines indicate an increase in agreement (toward a more pro-vaccine stance) +and red lines indicate a reduction in agreement (a more anti-vaccine stance). + +The JAGS code for the model is part of the source of this document, which is +[available on Github](https://github.com/eamoncaddigan/antivax-attitudes). It +uses a Bayesian analog to a three-factor ANOVA, with a thresholded cummulative +normal distribution serving as a link function. Such models fit ordinal +responses (such as those obtained from surveys) well. The thresholds and +variance of the link function were fit independently for each question. The +mean of the function was estimated for each response using a linear combination +of the levels of the question, the interval (pre-test vs. post-test), the +intervention group, and all interactions between these factors. + +## Results + +### A "risk" intervention changes attitudes toward vaccination + +When fitting model parameters using Monte Carlo methods, it's important to +inspect the posterior distribution to make sure the samples converged. Here's +an example of one parameter, the intercept for the mean of the cummulative +normal. + +![Sampling behavior of model fitting procedure](plot_diag-1.png) + +It's also important to check the predictions made by a model against the data +being fit, as "[we cannot really interpret the parameters of the model very +meaningfully when the model doesn't describe the data very +well](http://doingbayesiandataanalysis.blogspot.com/2015/08/a-case-in-which-metric-data-are-better.html)". +Here are response histograms for each question, averaged across the levels of +the other factors. Model predictions are superimposed on the histograms, along +with the 95% HDI for each response. + +![Raw responses and model predictions](plot_ppc-1.png) + +Since the sampling procedure was well-behaved and the model describes the data +well, we can use the parameter estimates to judge the size of the effects. Here +are is the estimate of the change in attitude (post-test - pre-test) for each +intervention group. + +![Posterior estimates of change in belief](plot_change-1.png) + +These plots highlight the 95% highest density interval (HDI) for the posterior +distributions of the parameters. Also highlighted are a comparison value, which +in this case is a pre- vs. post-test difference of 0, and a "range of practical +equivalence" (ROPE) around the comparison value. The HDI of the posterior +distribution of attitude shifts for the "disease risk" group" (but no other +group) falls completely outside this ROPE, so we can reasonably conclude that +this intervention changes participants' attitudes toward vaccination. + +We can also use the posterior distributions to directly estimate the shifts +relative to the control group. Here is the difference between the attitude +change observed for both the "autism correction" and "disease risk" groups +compared to the attitude change in the control group. + +![Change relative to control](plot_change_rel-1.png) + +The posterior distribution above shows that "disease risk" participants shifted +their response about half an interval relative to the control group following +the intervention. The "autism correction" participants, however, did not show a +credible change in vaccination attitudes. Bayesian estimation replicates the +conclusions drawn by Horne and colleagues. + +### Post hoc comparisons + +An analysis following the tradition of null-hypothesis significance testing +(NHST) attempts to minimize the risk of "type I" errors, which occur when the +"null" hypothesis (i.e., there is no effect) is erroneously rejected. The more +tests performed in the course of an analysis, the more likely that such an +error will occur due to random variation. The [Wikipedia article on the +"Multiple Comparisons +Problem"](https://en.wikipedia.org/wiki/Multiple_comparisons_problem) is an +approachable read on the topic and explains many of the corrections that are +applied when making mulitple comparisons in a NHST framework. + +Instead of focusing on type I error, the goal of Bayesian estimation is to estimate values of the parameters of a model of the data. The posterior distribution provides a range of credible values that these parameters can take. Inferences are made on the basis of these estimates; e.g., we see directly that the "disease risk" intervention shifts participants' attitude toward vaccination about one half of an interval. Since a single model was fit to all the data, additional comparisons of parameter distributions don't increase the chance of generating false positives. [Gelman, Hill, and Yajima (2008)](http://www.stat.columbia.edu/~gelman/research/unpublished/multiple2.pdf) is a great resource on this. + +For example, we can look at the size of the shift in attitude toward each +question for each group. If we used an NHST approach, these 15 additional +comparisons would either seriously inflate the type I error rate (using a +p-value of 0.05 on each test would result in an overall error rate of 0.54), or +require much smaller nominal p-values for each test. + +![Posterior estimates of single-question belief changes](plot_posthoc-1.png) + +The only credible differences for single questions both occur for participants +in the "disease risk" group. The "healthy" ("Vaccinating healthy children helps +protect others by stopping the spread of disease.") and "diseases" ("Children +do not need vaccines for diseases that are not common anymore.") questions show +a reliable positive shift, which makes a lot of sense given the nature of the +intervention. However, it's important to note that the HDIs are very wide for +these posteriors compared to the ones shown earlier. This is driven primarily +by the fact that this comparison relies on a three-way interaction, which has +greater variance (as is typical in traditional ANOVA models). The posterior +mode of the change for the "plan_to" question ("I plan to vaccinate my +children") is fairly large for the "disease risk" group, but the wide HDI spans +the ROPE around 0. + +### Expanding the models + +My goal was to examine the conclusions made in the original report of these +data. However, this is just one way to model the data, and different models are +more appropriate for different questions. For instance, the standard deviation +and thereshold values were fit separately for each question here, but these +could instead be based on a hyperparameter that could iteself be modelled. I +also excluded subject effects from the model; there were many subjects (over +300), so a full model with these included would take much longer to fit, but +may produce more generalizable results. Bayesian estimation requires an +investigator to be intentional about modelling decisions, which I consider to +be an advantage of the method. + +### Prior probabilities + +A defining characteristic of Bayesian analyses is that prior information about +the model parameters is combined with their likelihood (derived from the data) +to produce posterior distributions. In this analysis, I used priors that put +weak constraints on the values of the parameters. If an investigator has reason +to assume that parameters will take on certain values (e.g., the results of a +previous study), this prior information can -- and should -- be incorporated +into the analysis. Again, I like that these decisions have to be made +deliberately. + +## Conclusions + +Concerns about a possible link between childhood vaccination and autism is +causing some parents to skip childhood vaccinations, which is dangerous +([Calandrillo, 2004](http://www.ncbi.nlm.nih.gov/pubmed/15568260)). However, an +intervention that exposes people to the consequences of the diseases that +vaccinations prevent makes them respond more favorably toward childhood +vaccination. A separate group of participants did not change their attitudes +after being shown information discrediting the vaccination-autism link, nor did +a group of control participants. + +### Acknowledgements + +[Zach Horne](http://www.zacharyhorne.com/) made the data available for analysis +(by anyone!), and gave useful feedback on an earlier version of this write-up. +Much of the code for Bayesian estimation was cobbled together from programs +distributed with Doing Bayesian Data Analysis (2nd ed) by [John K. +Kruschke](http://www.indiana.edu/~kruschke/). + diff --git a/content/posts/antivax-attitudes/plot_change-1.png b/content/posts/antivax-attitudes/plot_change-1.png Binary files differ. diff --git a/content/posts/antivax-attitudes/plot_change_rel-1.png b/content/posts/antivax-attitudes/plot_change_rel-1.png Binary files differ. diff --git a/content/posts/antivax-attitudes/plot_diag-1.png b/content/posts/antivax-attitudes/plot_diag-1.png Binary files differ. diff --git a/content/posts/antivax-attitudes/plot_posthoc-1.png b/content/posts/antivax-attitudes/plot_posthoc-1.png Binary files differ. diff --git a/content/posts/antivax-attitudes/plot_ppc-1.png b/content/posts/antivax-attitudes/plot_ppc-1.png Binary files differ. diff --git a/content/posts/antivax-attitudes/plot_responses-1.png b/content/posts/antivax-attitudes/plot_responses-1.png Binary files differ. diff --git a/content/posts/antivax-bootstrap/bayesian_ending_scores.png b/content/posts/antivax-bootstrap/bayesian_ending_scores.png Binary files differ. diff --git a/content/posts/antivax-bootstrap/index.Rmd b/content/posts/antivax-bootstrap/index.Rmd @@ -0,0 +1,238 @@ +--- +layout: post +title: "Bootstrap analysis of anti-vaccination belief changes" +summary: Another way of looking at the antivaccination data of Horne, et al. +author: "Eamon Caddigan" +date: 2015-09-15 +categories: psych R +output: html_document +--- + +```{r global_options, include=FALSE} +knitr::opts_chunk$set(cache=TRUE, echo=FALSE, warning=FALSE, message=FALSE, + fig.width=9, fig.align="center") +``` + +```{r setup_data, results="hide"} +# Required librarys and external files ---------------------------------------- + +library(readxl) +library(tidyr) +library(dplyr) +library(ggplot2) +library(gridExtra) + +# Clean and process the data -------------------------------------------------- + +# Generates warnings for the Ps who didn't do day 2 +suppressWarnings(expData <- read_excel("Vacc_HPHH_publicDataset.xlsx", sheet = 2)) + +# Exclude Ps who didn't do day 2 and failed the attention checks +expData.clean <- expData %>% + # It's good to add a subject number so we can go back to original data + mutate(subject_number = 1:nrow(.)) %>% + filter(Returned == 1, + `AttentionCheck_PostTest (if = 4 then include)` == 4, + `AttentionChecks_Sum(include if = 4)` == 4, + Paid_Attention == 1) + +# Get all the dependent measures into a DF +questionnaireData <- expData.clean %>% + # Pull out the columns and use consistent names + select(subject_number, + intervention = Condition, + pretest.healthy = Healthy_VaxscalePretest, + posttest.healthy = Healthy_VaxscalePosttest, + pretest.diseases = Diseases_VaxScalePretest, + posttest.diseases = Diseases_VaxScalePosttest, + pretest.doctors = Doctors_VaxScalePreTest, + posttest.doctors = Doctors_VaxScalePostTest, + pretest.side_effects = Sideeffects_VaxScalePreTest, + posttest.side_effects = Sideeffects_VaxScalePostTest, + pretest.plan_to = Planto_VaxScalePreTest, + posttest.plan_to = Planto_VaxScalePostTest) %>% + # Reverse-code the approrpiate columns + mutate(pretest.diseases = 7 - pretest.diseases, + posttest.diseases = 7 - posttest.diseases, + pretest.side_effects = 7 - pretest.side_effects, + posttest.side_effects = 7 - posttest.side_effects) %>% + # Tidy the data + gather("question", "response", -subject_number, -intervention) %>% + separate(question, c("interval", "question"), sep = "\\.") %>% + mutate(intervention = factor(intervention, + c("Control", "Autism Correction", "Disease Risk")), + interval = factor(interval, + c("pretest", "posttest"), ordered = TRUE), + question = factor(question, + c("healthy", "diseases", "doctors", "side_effects", "plan_to"))) %>% + # Pre- and post-test get their own columns in these analyses + mutate(interval = paste0(interval, "_response")) %>% + spread(interval, response) +# ----------------------------------------------------------------------------- +``` + +## Introduction + +In a [previous post]({{ site.url }}/psych/bayes/2015/09/03/antivax-attitudes/) (I don't know why I'm linking it -- there are only two), I presented an analysis of data by [Horne, Powell, Hummel & Holyoak, (2015)](http://www.pnas.org/content/112/33/10321.abstract) that investigated changes in attitudes toward childhood vaccinations. The previous analysis used Bayesian estimation to show a credible increase in pro-vaccination attitudes following a "disease risk" intervention, but not an "autism correction" intervention. + +Some of my friends offered insightful comments, and one [pointed out](https://twitter.com/johnclevenger/status/639795727439429632) what appeared to be a failure of random assignment. Participants in the "disease risk" group happened to have lower scores on the pre-intervention survey and therefore had more room for improvement. This is a fair criticism, but a subsequent analysis showed that post-intervention scores were also higher for the "disease risk" group, which addresses this issue. + +![Posterior of final score differences](bayesian_ending_scores.png) + +### Bootstrapping + +Interpreting differences in parameter values isn't always straightforward, so I thought it'd be worthwhile to try a different approach. Instead of fitting a generative model to the sample, we can use bootstrapping to estimate the unobserved population parameters. [Bootstrapping](https://en.wikipedia.org/wiki/Bootstrapping_(statistics)) is conceptually simple; I feel it would have much wider adoption today had computers been around in the early days of statistics. + +Here is code that uses bootstrapping to estimate the probability of each response on the pre-intervention survey (irrespective of survey question or intervention group assignment). The sample mean is already an unbiased estimator of the population mean, so bootstrapping isn't necessary in this first example. However, this provides a simple illustration of how the technique works: sample observations *with replacement* from the data, calculate a statistic on this new data, and repeat. The mean of the observed statistic values provides an estimate of the population statistic, and the distribution of statistic values provides a measure of certainty. + +```{r setup_bootstrap, dependson="setup_data", echo=TRUE} +numBootstraps <- 1e5 # Should be a big number +numObservations <- nrow(questionnaireData) +uniqueResponses <- sort(unique(questionnaireData$pretest_response)) +interventionLevels <- levels(questionnaireData$intervention) + +# The observed proportion of responses at each level +pretestResponseProbs <- as.numeric(table(questionnaireData$pretest_response)) / + numObservations +``` + +```{r pretest_bootstrap, dependson="setup_bootstrap", echo=TRUE} +# Bootstrap to find the probability that each response will be given to pre-test +# questions. +pretestData <- array(data = 0, + dim = c(numBootstraps, + length(uniqueResponses)), + dimnames = list(NULL, + paste(uniqueResponses))) + +# Run the bootstrap +for (ii in seq_len(numBootstraps)) { + bootSamples <- sample(questionnaireData$pretest_response, + numObservations, + replace = TRUE) + bootSamplesTabulated <- table(bootSamples) + pretestData[ii, names(bootSamplesTabulated)] <- bootSamplesTabulated +} + +# Convert the counts to probabilities +pretestData <- pretestData / numObservations +``` + +```{r pretest_plot, dependson="pretest_bootstrap", fig.width=4, fig.height=4} +pretestDF <- data_frame(response = uniqueResponses, + bootstrap_prob = apply(pretestData, 2, mean), + bootstrap_sd = apply(pretestData, 2, sd), + observed_prob = pretestResponseProbs) + +ggplot(pretestDF, aes(x = response)) + + geom_bar(aes(y = observed_prob), stat = "identity", + color="white", fill="skyblue") + + geom_point(aes(y = bootstrap_prob), size = 3, color = "red") + + geom_errorbar(aes(ymin = bootstrap_prob - bootstrap_sd/2, + ymax = bootstrap_prob + bootstrap_sd/2), + size = 2, color = "red", width = 0) + + scale_x_continuous(breaks = 1:length(uniqueResponses)) + + scale_y_continuous(limits = c(0, 1)) + + xlab("Response Level") + + ylab("Proportion") + + theme_classic() +``` + +As expected, the bootstrap estimates for the proportion of responses at each level almost exactly match the observed data. There are supposed to be error-bars around the points, which show the bootstrap estimates, but they're obscured by the points themselves. + +## Changes in vaccination attitudes + +Due to chance alone, the three groups of participants (the control group, the "autism correction" group, and the "disease risk" group) showed different patterns of responses to the pre-intervention survey. To mitigate this issue, the code below estimates the transition probabilities from each response on the pre-intervention survey to each response on the post-intervention survey, and does so separately for the groups. These are conditional probabilities, e.g., P(post-intervention rating = 4 | pre-intervention rating = 3). + +The conditional probabilities are then combined with the observed pre-intervention response probabilities to calculate the joint probability of each response transition (e.g., P(post-intervention rating = 4 AND pre-intervention rating = 3)). Importantly, since the prior is agnostic to subjects' group assignment, these joint probability estimates are less-affected by biases that would follow from a failure of random assignment. + +```{r posttest_bootstrap, dependson="setup_bootstrap", echo=TRUE} +# preintervention responses x intervention groups x bootstraps x postintervention responses +posttestData <- array(data = 0, + dim = c(length(uniqueResponses), + length(interventionLevels), + numBootstraps, + length(uniqueResponses)), + dimnames = list(paste(uniqueResponses), + interventionLevels, + NULL, + paste(uniqueResponses))) + +for (pretestResponse in seq_along(uniqueResponses)) { + for (interventionLevel in seq_along(interventionLevels)) { + # Get the subset of data for each combination of intervention and + # pre-intervention response level. + questionnaireDataSubset <- filter(questionnaireData, + intervention == interventionLevels[interventionLevel], + pretest_response == pretestResponse) + numObservationsSubset <- nrow(questionnaireDataSubset) + + # Run the bootstrap + for (ii in seq_len(numBootstraps)) { + bootSamples <- sample(questionnaireDataSubset$posttest_response, + numObservationsSubset, + replace = TRUE) + bootSamplesTabulated <- table(bootSamples) + posttestData[pretestResponse, + interventionLevel, + ii, + names(bootSamplesTabulated)] <- bootSamplesTabulated + } + + # Convert the counts to probabilities + posttestData[pretestResponse, interventionLevel, , ] <- + posttestData[pretestResponse, interventionLevel, , ] / numObservationsSubset + } + + # Convert the conditional probabilities to joint probabilities using the + # observed priors on each pretest response. + posttestData[pretestResponse, , , ] <- posttestData[pretestResponse, , , ] * + pretestResponseProbs[pretestResponse] +} +``` + +With the transition probabilities sampled, it's possible to test the hypothesis: **"participants are more likely to shift toward a more pro-vaccine attitude following a 'disease risk' intervention than participants in control and 'autism correction' groups."** We'll use the previously-run bootstrap samples to compute the each group's probability of increasing scores. + +```{r posttest_shifts, dependson="posttest_bootstrap", echo=TRUE} +posttestIncrease <- array(data = 0, + dim = c(numBootstraps, + length(interventionLevels)), + dimnames = list(NULL, + interventionLevels)) + +for (interventionLevel in seq_along(interventionLevels)) { + for (pretestResponse in seq_along(uniqueResponses)) { + for (posttestResponse in seq_along(uniqueResponses)) { + if (posttestResponse > pretestResponse) { + posttestIncrease[, interventionLevel] <- posttestIncrease[, interventionLevel] + + posttestData[pretestResponse, interventionLevel, , posttestResponse] + } + } + } +} +``` + +This estimates the probability that post-intervention responses from the "disease risk" group have a greater probability of being higher than their pre-intervention counterparts than responses from the "autism correction" group. + +```{r posttest_stat, dependson="posttest_shifts", echo=TRUE} +sum(posttestIncrease[, which(interventionLevels == "Disease Risk")] > + posttestIncrease[, which(interventionLevels == "Autism Correction")]) / + nrow(posttestIncrease) +``` + +Below is a visualization of the bootstrap distributions. This illustrates the certainty of the estimates of the probability that participants would express stronger pro-vaccination attitudes after the interventions. + +```{r posttest_plot, dependson="posttest_shifts"} +posttestDF <- gather(as.data.frame(posttestIncrease), "intervention", "prob_increase") +ggplot(posttestDF, aes(x = prob_increase, fill = intervention)) + + geom_density(alpha = 0.6) + + scale_fill_brewer(type = "qual", palette = "Dark2") + + ylab("Samples") + xlab("Probability of rating increase") + + theme_minimal() +``` + +## Conclusion + +Bootstrapping shows that a "disease risk" intervention has a stronger effect than others in shifting participants' pro-vaccination attitudes. This analysis collapses across the five survey questions used by Horne and colleagues, but it would be straightforward to extend this code to estimate attitude change probabilities separately for each question. + +Although there are benefits to analyzing data with nonparametric methods, the biggest shortcoming of the approach I've used here is that it can not estimate the size of the attitude changes. Instead, it estimates that probability of pro-vaccination attitude changes occurring, and the difference in these probabilities between the groups. This is a great example of why it's important to keep your question in mind while analyzing data. diff --git a/content/posts/antivax-bootstrap/index.md b/content/posts/antivax-bootstrap/index.md @@ -0,0 +1,216 @@ +--- +title: "Bootstrap analysis of anti-vaccination belief changes" +description: Another way of looking at the antivaccination data of Horne, et al. +date: 2015-09-17 +categories: +- Data Science +- Science +tags: +- Psychology +- Statistics +- R +--- + +## Introduction + +In a [previous post]({{< ref "/posts/antivax-attitudes/index.md" +>}}), I presented an analysis of data by [Horne, Powell, Hummel & Holyoak, +(2015)](http://www.pnas.org/content/112/33/10321.abstract) that investigated +changes in attitudes toward childhood vaccinations. The previous analysis +used Bayesian estimation to show a credible increase in pro-vaccination +attitudes following a "disease risk" intervention, but not an "autism +correction" intervention. + +Some of my friends offered insightful comments, and one [pointed +out](https://twitter.com/johnclevenger/status/639795727439429632) what appeared +to be a failure of random assignment. Participants in the "disease risk" group +happened to have lower scores on the pre-intervention survey and therefore had +more room for improvement. This is a fair criticism, but a subsequent analysis +showed that post-intervention scores were also higher for the "disease risk" +group, which addresses this issue. + +![Posterior of final score differences](bayesian_ending_scores.png) + +### Bootstrapping + +Interpreting differences in parameter values isn't always straightforward, so I +thought it'd be worthwhile to try a different approach. Instead of fitting a +generative model to the sample, we can use bootstrapping to estimate the +unobserved population parameters. +[Bootstrapping](https://en.wikipedia.org/wiki/Bootstrapping_(statistics)) is +conceptually simple; I feel it would have much wider adoption today had +computers been around in the early days of statistics. + +Here is code that uses bootstrapping to estimate the probability of each +response on the pre-intervention survey (irrespective of survey question or +intervention group assignment). The sample mean is already an unbiased +estimator of the population mean, so bootstrapping isn't necessary in this +first example. However, this provides a simple illustration of how the +technique works: sample observations *with replacement* from the data, +calculate a statistic on this new data, and repeat. The mean of the observed +statistic values provides an estimate of the population statistic, and the +distribution of statistic values provides a measure of certainty. + + +```r +numBootstraps <- 1e5 # Should be a big number +numObservations <- nrow(questionnaireData) +uniqueResponses <- sort(unique(questionnaireData$pretest_response)) +interventionLevels <- levels(questionnaireData$intervention) + +# The observed proportion of responses at each level +pretestResponseProbs <- as.numeric(table(questionnaireData$pretest_response)) / + numObservations +``` +```r +# Bootstrap to find the probability that each response will be given to pre-test +# questions. +pretestData <- array(data = 0, + dim = c(numBootstraps, + length(uniqueResponses)), + dimnames = list(NULL, + paste(uniqueResponses))) + +# Run the bootstrap +for (ii in seq_len(numBootstraps)) { + bootSamples <- sample(questionnaireData$pretest_response, + numObservations, + replace = TRUE) + bootSamplesTabulated <- table(bootSamples) + pretestData[ii, names(bootSamplesTabulated)] <- bootSamplesTabulated +} + +# Convert the counts to probabilities +pretestData <- pretestData / numObservations +``` + +![Bootstrap estimaes of responses](pretest_plot-1.png) + +As expected, the bootstrap estimates for the proportion of responses at each +level almost exactly match the observed data. There are supposed to be +error-bars around the points, which show the bootstrap estimates, but they're +obscured by the points themselves. + +## Changes in vaccination attitudes + +Due to chance alone, the three groups of participants (the control group, the +"autism correction" group, and the "disease risk" group) showed different +patterns of responses to the pre-intervention survey. To mitigate this issue, +the code below estimates the transition probabilities from each response on the +pre-intervention survey to each response on the post-intervention survey, and +does so separately for the groups. These are conditional probabilities, e.g., +`P(post-intervention rating = 4 | pre-intervention rating = 3)`. + +The conditional probabilities are then combined with the observed +pre-intervention response probabilities to calculate the joint probability of +each response transition (e.g., `P(post-intervention rating = 4 ∩ +pre-intervention rating = 3)`). Importantly, since the prior is agnostic to +subjects' group assignment, these joint probability estimates are less-affected +by biases that would follow from a failure of random assignment. + +```r +# preintervention responses x intervention groups x bootstraps x postintervention responses +posttestData <- array(data = 0, + dim = c(length(uniqueResponses), + length(interventionLevels), + numBootstraps, + length(uniqueResponses)), + dimnames = list(paste(uniqueResponses), + interventionLevels, + NULL, + paste(uniqueResponses))) + +for (pretestResponse in seq_along(uniqueResponses)) { + for (interventionLevel in seq_along(interventionLevels)) { + # Get the subset of data for each combination of intervention and + # pre-intervention response level. + questionnaireDataSubset <- filter(questionnaireData, + intervention == interventionLevels[interventionLevel], + pretest_response == pretestResponse) + numObservationsSubset <- nrow(questionnaireDataSubset) + + # Run the bootstrap + for (ii in seq_len(numBootstraps)) { + bootSamples <- sample(questionnaireDataSubset$posttest_response, + numObservationsSubset, + replace = TRUE) + bootSamplesTabulated <- table(bootSamples) + posttestData[pretestResponse, + interventionLevel, + ii, + names(bootSamplesTabulated)] <- bootSamplesTabulated + } + + # Convert the counts to probabilities + posttestData[pretestResponse, interventionLevel, , ] <- + posttestData[pretestResponse, interventionLevel, , ] / numObservationsSubset + } + + # Convert the conditional probabilities to joint probabilities using the + # observed priors on each pretest response. + posttestData[pretestResponse, , , ] <- posttestData[pretestResponse, , , ] * + pretestResponseProbs[pretestResponse] +} +``` + +With the transition probabilities sampled, it's possible to test the +hypothesis: **"participants are more likely to shift toward a more pro-vaccine +attitude following a 'disease risk' intervention than participants in control +and 'autism correction' groups."** We'll use the previously-run bootstrap +samples to compute the each group's probability of increasing scores. + +```r +posttestIncrease <- array(data = 0, + dim = c(numBootstraps, + length(interventionLevels)), + dimnames = list(NULL, + interventionLevels)) + +for (interventionLevel in seq_along(interventionLevels)) { + for (pretestResponse in seq_along(uniqueResponses)) { + for (posttestResponse in seq_along(uniqueResponses)) { + if (posttestResponse > pretestResponse) { + posttestIncrease[, interventionLevel] <- posttestIncrease[, interventionLevel] + + posttestData[pretestResponse, interventionLevel, , posttestResponse] + } + } + } +} +``` + +This estimates the probability that post-intervention responses from the +"disease risk" group have a greater probability of being higher than their +pre-intervention counterparts than responses from the "autism correction" +group. + +```r +sum(posttestIncrease[, which(interventionLevels == "Disease Risk")] > + posttestIncrease[, which(interventionLevels == "Autism Correction")]) / + nrow(posttestIncrease) +``` + +``` +## [1] 0.99992 +``` + +Below is a visualization of the bootstrap distributions. This illustrates the +certainty of the estimates of the probability that participants would express +stronger pro-vaccination attitudes after the interventions. + +![Bootstrap estimates of probability of ratings increase](posttest_plot-1.png) + +## Conclusion + +Bootstrapping shows that a "disease risk" intervention has a stronger effect +than others in shifting participants' pro-vaccination attitudes. This analysis +collapses across the five survey questions used by Horne and colleagues, but it +would be straightforward to extend this code to estimate attitude change +probabilities separately for each question. + +Although there are benefits to analyzing data with nonparametric methods, the +biggest shortcoming of the approach I've used here is that it can not estimate +the size of the attitude changes. Instead, it estimates that probability of +pro-vaccination attitude changes occurring, and the difference in these +probabilities between the groups. This is a great example of why it's important +to keep your question in mind while analyzing data. + diff --git a/content/posts/antivax-bootstrap/posttest_plot-1.png b/content/posts/antivax-bootstrap/posttest_plot-1.png Binary files differ. diff --git a/content/posts/antivax-bootstrap/pretest_plot-1.png b/content/posts/antivax-bootstrap/pretest_plot-1.png Binary files differ. diff --git a/content/posts/art-of-data-science/Cnl03.jpg b/content/posts/art-of-data-science/Cnl03.jpg Binary files differ. diff --git a/content/posts/art-of-data-science/index.md b/content/posts/art-of-data-science/index.md @@ -0,0 +1,71 @@ +--- +title: "The Art of Data Science" +description: This book is a great companion to your boring stats class. +date: 2015-09-09 +categories: +- Data Science +--- + +Data Science is hot. Fortunately, the recently released ebook [The Art of Data +Science (A Guide for Anyone Who Works with +Data)](https://leanpub.com/artofdatascience) doesn't waste space on trendy +technologies, and focuses instead on the enduring fundamentals of data +analysis. I can forgive the authors for choosing a topical title, however, +because few people are better qualified to capitalize on the trend as Johns +Hopkins Professors (and expert data-handlers) [Roger +Peng](http://www.biostat.jhsph.edu/~rpeng/) and [Elizabeth +Matsui](https://twitter.com/eliza68). + +No exercises accompany this book, and although there are a few snatches of R +code, it's not meant to be used as a handbook for data analysis. Instead, it +teaches readers how to think like a (productive) data analyst. Peng and Matsui +break the process of analyzing data into a list of core activities, which +begins with defining the question and ends with communicating the results. +Instead of presenting this as a linear process, they describe an "epicycle of +data analysis", a pattern of thinking and acting that is repeated in all of the +core activities. The authors explain that an analyst will often cycle through +this pattern several times during a single activity, and that the process often +sends scientists back to earlier steps. Readers learn that real world data +analysis is like playing Chutes and Ladders on a board with no ladders. + +![Less fun than doing data analysis](Cnl03.jpg) + +I would recommend this book to any reader who's interested in this year's +sexiest career -- especially those annoyed that anybody would label a career +"sexy". However, I think this book is most valuable as a companion to +introductory statistics classes, as it fills in key gaps left by traditional +statistics curricula. This is particularly true for students, such as those at +the beginning of a postgraduate education, who expect to analyze real data by +the time the course has finished. Stats teachers have to cover a lot of ground +in classes that begin with stories about ball-filled urns (some lucky students +get actual candy) and end with ANOVA tables. In the end, few future scientists +finish the term with much more than a list of specific tests that can be +matched to familiar situations. Although most students gain additional training +during their graduate student apprenticeship, an education in data analysis +competes for time with the acquisition of domain knowledge and more specific +skills. This often leads to a cargo-cult approach to data analysis among people +who are specifically trained to seek out truth. I believe that reading this +book will help counteract these shortcomings. + +My favorite chapters discuss the process of building models of data, and I +really appreciate that the authors describe the difference between modeling for +inference (i.e., statistical modeling) and modeling for prediction (i.e., +machine learning). As a grad student, I had completed my program's required +stats classes before I *really* understood the relationship between "running a +(statistical) test" and "fitting a model"; learning this lesson earlier would +have made me better at both. I also like that the book encourages analysts to +build visualizations of their data early and often. This indispensable process +has become much easier in recent years as new libraries in several programming +languages streamline the process of tidying and plotting complicated data. The +only section that I would like to see expanded is the chapter on communication, +which might have benefitted from a brief discussion on building visualizations +for an audience. I suppose that this omission may have been intentional; there +are so many new developments in dataviz, such as a shift toward dynamic and +interactive visualizations, that it would be difficult to write something that +won’t soon be out of date. + +If you're new to data analysis, or interested in integrating a more formal (but +still flexible) framework into your practice, I think you'll find The Art of +Data Science to be worth a look. It is a quick read and available at a +pay-what-you-like price, so even poor grad students have no excuse not to. + diff --git a/content/posts/design-everyday-programs/index.md b/content/posts/design-everyday-programs/index.md @@ -0,0 +1,92 @@ +--- +title: "The design of everyday programs" +description: Even command-line programmers should think more like designers. +date: 2016-10-22 +categories: +- Programming +- Data Science +--- + +Several fellow researchers at the FAA have backgrounds in cognitive +neuroscience and are new to applied research. We recently started a book club +through the [South Jersey chapter of the Human Factors and Ergonomics +Society](https://southjerseyhfes.wordpress.com/) to learn more about human +factors and user experience research. Our first reading was [The Design of +Everyday +Things](http://www.jnd.org/books/design-of-everyday-things-revised.html) by Don +Norman, and it’s already influenced how I think about design. Norman focuses on +how designers can apply concepts from psychology to the design of “things”, but +these lessons apply to any interaction—such as the use of the popular revision +control system (RCS) [Git](https://git-scm.com/). + +Git was created to meet the needs of programmers working on the Linux operating +system. Other interfaces are available for it, but it primarily exists as a +collection of command-line utilities; this strongly informs its design. People +typically associate design with graphical and physical interfaces (e.g. web +pages and control panels), but good design helps everything. Command-line +arguments and prescribed sequences of separate commands are “design decisions”, +and poor decisions have made Git harder to use. + +In The Design of Everyday Things, Norman stresses the importance of conceptual +models. Norman defines a conceptual model as “an explanation, usually highly +simplified, of how something works.” A “highly simplified” conceptual model +isn’t *exactly right* but it’s good enough to get the job done. People don’t +need to know how the accelerator pedal of a car changes the flow of air and +fuel to the engine; it suffices to understand that pressing the pedal makes the +engine—and therefore the car—go faster. However, bad models cause problems, and +people who are new to Git are likely to have a poor conceptual model of the +program. + +Users who’ve switched to Git from another RCS (e.g., CVS or Subversion) are +accustomed to systems that use a central repository; the repository is “home” +to the code and programmers sync their work to it. In contrast, Git is designed +for decentralized work; each programmer has their own full repository and +merges their code with everybody else’s. While a conceptual model based on a +central repository is inappropriate for Git, users without previous RCS +experience are in even more trouble. Most [follow a sequence of commands +learned by rote](https://explainxkcd.com/wiki/index.php/1597:_Git) with little +intuition about how the system works. In the case of Git, bad mental models +cause users to make mistakes that they can’t fix (see [Oh Shit, +Git!](http://ohshitgit.com/) for common examples). + +![xkcd on Git: users just memorize commands](xkcd_git.png) + +In the open source community, the solution to bad mental models is tell users +that they need a better understanding of how the system works. When I shared my +frustrations with experienced Git users, they recommended that I read the free +online book [Pro Git](https://git-scm.com/book/en/v2) by Scott Chacon and Ben +Straub. The book did alleviate my frustrations, but I also spent a lot of time +reading about inner workings of Git that aren’t relevant to my work. It was +like learning how internal combustion engines work just to find out which pedal +makes a car go faster. + +The key to bringing good design to command-line programs lies in understanding +users’ mental models. Instead of expecting users to learn the details of how a +program works, developers should focus on helping them build a simple “good +enough” conceptual model. In their book, Chacon and Straub introduce excellent +metaphors for several concepts in Git, but follow these with details about the +system. Good introductory documentation would focus on these metaphors and save +the detail for users who need it; Git’s documentation is notoriously useless +for non-expert users (the [Git man page +generator](https://git-man-page-generator.lokaltog.net/) parodies the +experience of reading Git’s docs). + +Developers should also understand how people learn to use their systems. Norman +calls the signals that tell people how they can interact with things +“signifiers”. A command-line program will necessarily rely on textual +signifiers, and developers should focus on making them easy to find and +understand. For example, the “git-status” command does a good job of explaining +what actions users can perform on files in their working directory, but doesn’t +explain what these actions mean (and this is arguably the most user friendly of +Git’s commands). Git also uses many of the same commands as CVS and Subversion, +but from the perspective of the user they often serve different functions in +each system. We can consider a well-known command such as “checkout” to be a +signifier; it's bad design that it does something different in Git vs. +Subversion. + +Developers must understand that *any* interface they create for their program +is design work, and that good design will make their program easier to use. +Norman warns readers that “designers are not typical users”; developers should +take note. The time users spend learning the intricacies of a program would be +better spent using it. + diff --git a/content/posts/design-everyday-programs/xkcd_git.png b/content/posts/design-everyday-programs/xkcd_git.png Binary files differ. diff --git a/content/posts/headlamp-illusion/index.md b/content/posts/headlamp-illusion/index.md @@ -0,0 +1,69 @@ +--- +title: "Headlamp illusion" +description: A visual illusion for hikers at night. +date: 2015-11-25 +categories: +- Science +tags: +- Psychology +--- + +The shortening days and end of daylight saving time mean that I've been walking +a dog in the dark lately. I bought [a +headlamp](http://www.rei.com/product/875355/black-diamond-cosmo-headlamp) +because my neighborhood has no street lights and I wanted to keep a hand free +and find my way around. Since I'm not used to wearing one, I was surprised that +some textures had a "shimmering" appearance when illuminated by this lamp. + +After a few walks I noticed that this was limited to certain materials, such as +the dog's fur and the abundant pine needles, all of which are made up of fine +strands. I haven’t found a conclusive explanation for the effect yet. The +shimmering goes away when I close either eye, so I assume that the effect is +not caused by optics (e.g., this isn’t due to diffraction), and is also +binocular. + +We live in a 3D environment, and because of this a different image is captured +by each eye. Our brains are used to this, and in the phenomenon “stereopsis” +they take advantage of binocular disparity to make inferences about depth. When +different images are presented to each eye through contrived means, interesting +things can happen. Devices like the +[View-Master](https://en.wikipedia.org/wiki/View-Master) or [Oculus +Rift](https://www.oculus.com/) present different 2D images to each eye; when +the differences correspond to what’s seen when looking at a real scene, +stereopsis occurs and the brain constructs a 3D representation of a single +scene. + +![Try to "fuse" these images into a single 3D percept](stereo.png)<br> +*Cross your eyes and try to "fuse" these images to create a 3D percept* + +If the differences between the images are weird (in the sense that they aren’t +the result of depth) “[binocular +rivalry](https://en.wikipedia.org/wiki/Binocular_rivalry)” occurs. When +sufficiently different images are presented to each eye, our percept alternates +between what is shown to each. These perceptual fluctuations don’t occur at +once across the visual field; for large stimuli most observers report seeing +one image interspersed with unstable blobs of the other. In areas of different +luminance, the percept can appear to shimmer in effect called “binocular +luster”. Michael Scroggins has [a good blog +post](https://michaelscroggins.wordpress.com/explorations-in-stereoscopic-imaging/retinal-rivalry-and-luster/) +about rivalry that mentions luster and includes some demos. + +![These images can't be "fused"](rivalry.png)<br> +*Even if you cross your eyes, these won't fuse into a single percept* + +When you wear a headlamp at night, the world is illuminated by a light source +that’s roughly between your eyes. Based on shadows and specular highlights, +your visual cortex determines that your left eye is seeing a world illuminated +by a light to its right, while your right eye is seeing a world consistent with +a light to its left. This is an uncommon arrangement, so it’s possible that the +visual system has enough trouble for rivalry to occur. Most of what you see +with a headlamp remains consistent with a familiar 3D world, so stereopsis +still happens and you know what you’re looking at. I suspect that the +unfamiliar arrangement of shadow and specularity can sometimes induce binocular +luster. If binocular luster is responsible for this effect, it’s a rare example +of rivalry occurring under (relatively) natural viewing conditions. + +I did some searching and have yet to see another mention this phenomenon. Have +you experienced the “headlamp illusion”? I’m pretty sure that this is all in my +mind, but is mine the only one? + diff --git a/content/posts/headlamp-illusion/rivalry.png b/content/posts/headlamp-illusion/rivalry.png Binary files differ. diff --git a/content/posts/headlamp-illusion/stereo.png b/content/posts/headlamp-illusion/stereo.png Binary files differ. diff --git a/content/posts/indexing-matrices-r/index.Rmd b/content/posts/indexing-matrices-r/index.Rmd @@ -0,0 +1,98 @@ +--- +title: "Indexing matrix elements in R" +author: "Eamon Caddigan" +date: "2015-10-22" +output: html_document +layout: post +summary: Why I prefer zero-based numbering. +categories: R programming +--- + +```{r global_options, include=FALSE} +knitr::opts_chunk$set(cache=TRUE) +``` + +I came to science with a background in engineering, but most of my scientist friends didn’t. I often have a hard time articulating why I’m so annoyed by one-based indexing--which R and MATLAB use, but most other programming languages don’t. Here’s a recent example that might help. + +For a simulation I’m running, I use the values in several of the columns of a data frame as indexes into separate vectors. Here’s an example of using indexes in one vector (instead of a column from a `data.frame`) to access the elements in another: + +```{r} +valueVector <- c(2, 5, 8, 3, 0) +indexVector <- c(2, 3, 3, 1, 4, 5, 5) +valueVector[indexVector] +``` + +R veterans will point out that you can use factors for this, and that's definitely true here. However, when the values in the small vector are changing often but the indices are relatively stable, I prefer this approach. Either strategy works. + +Unfortunately, things aren't so easy when the data is in a matrix (a 2D vector) and you want to access its elements using two index vectors (i.e., one indexing the matrix’s rows, and the second indexing its columns). R’s default behavior might not be what you expect: + +```{r} +valueMatrix <- matrix(LETTERS[1:15], ncol = 3) +valueMatrix + +rowIndices <- c(4, 2, 2, 4, 4, 4) +colIndices <- c(2, 3, 3, 2, 3, 2) +valueMatrix[rowIndices, colIndices] +``` + +Instead of returning the six values associated with the six row/column pairs, it returns a 6 × 6 matrix with the elements of interest along the diagonal. When the number of elements is this small, it’s easy to wrap this in a call to `diag()`; that approach isn’t appropriate for long index vectors, since memory requirements are squared. + +Readers who’ve done data manipulation in C are probably familiar with pointer arithmetic. Zero-based numbering makes it easy to combine row and column indexes and make a one-dimensional array behave like a matrix: + +``` +/* When the code has to deal with matrices of varying size, you can’t allocate + an array right away. */ +double *valueMatrix; + +/* Stuff happened, and now you know how big your matrix will be (nrow x ncol), + so you allocate memory on the “heap” to store the data. */ +valueMatrix = (double *)malloc(sizeof(double) * nrow * ncol); + +/* This is how you’d access specific elements. */ +oldValueAtRowCol = valueMatrix[row + nrow*col]; +valueMatrix[row + nrow*col] = newValueAtRowCol; + +/* Can’t forget this when you’re done; I don’t miss C. */ +free(valueMatrix); +valueMatrix = 0; + +/* NB: All programs work this way, but most scripting languages take care of + this stuff for you. Progress! */ +``` + +To its credit, R makes this easy too; everything is stored as a one-dimensional vector behind the scenes, and can be accessed as such. R’s use of one-based indexing just makes it look a bit more awkward: + +```{r} +valueMatrix[rowIndices + nrow(valueMatrix) * (colIndices - 1)] +``` + +I hope this is useful for anybody who wants to access matrix elements using index vectors. More importantly, maybe some scientists-turned-programmers can gain a bit of insight into why zero-based numbering make sense to those of us who cut our teeth on C (or languages like it). + +*** + +### Update + +After I posted this, [Andrie de Vries](http://rfordummies.com/) sent [a tweet](https://twitter.com/RevoAndrie/status/657187336833388545) sharing an alternate syntax that's more R-like: + +```{r} +valueMatrix[cbind(rowIndices, colIndices)] +``` + +I definitely agree that it looks better, but there is a slight performance hit due to the call to `cbind()`. If you're repeatedly accessing a matrix with the same pair of indices, it might be worth it store the bound pair as a variable and reuse that. Here's the benchmark performance of each of the approaches I've discussed: + +```{r} +library("microbenchmark") + +rowIndices <- sample(1:5, 1e4, replace=TRUE) +colIndices <- sample(1:3, 1e4, replace=TRUE) +boundIndices <- cbind(rowIndices, colIndices) + +op <- microbenchmark(diag_matrix = diag(valueMatrix[rowIndices, colIndices]), + pointer_math = valueMatrix[rowIndices + nrow(valueMatrix) * (colIndices - 1)], + array_indexing = valueMatrix[cbind(rowIndices, colIndices)], + array_indexing_prebound = valueMatrix[boundIndices], + times = 100) +print(op) +``` + +Indexing with the pre-bound pair is fastest, using arithmetic on the indexes is a close second, and calling `cbind()` inside the brackets is in third place. Creating the n × n matrix and extracting its diagonal is excessively slow (and uses up a lot of RAM), so don't ever do that. diff --git a/content/posts/indexing-matrices-r/index.md b/content/posts/indexing-matrices-r/index.md @@ -0,0 +1,169 @@ +--- +title: "Indexing matrix elements in R" +date: "2015-10-22" +description: Why I prefer zero-based numbering. +categories: +- Programming +- Data Science +tags: +- R +--- + +I came to science with a background in engineering, but most of my scientist +friends didn’t. I often have a hard time articulating why I’m so annoyed by +one-based indexing--which R and MATLAB use, but most other programming +languages don’t. Here’s a recent example that might help. + +For a simulation I’m running, I use the values in several of the columns of a +data frame as indexes into separate vectors. Here’s an example of using indexes +in one vector (instead of a column from a `data.frame`) to access the elements +in another: + +```r +valueVector <- c(2, 5, 8, 3, 0) +indexVector <- c(2, 3, 3, 1, 4, 5, 5) +valueVector[indexVector] +``` +``` +## [1] 5 8 8 2 3 0 0 +``` + +R veterans will point out that you can use factors for this, and that's +definitely true here. However, when the values in the small vector are changing +often but the indices are relatively stable, I prefer this approach. Either +strategy works. + +Unfortunately, things aren't so easy when the data is in a matrix (a 2D vector) +and you want to access its elements using two index vectors (i.e., one indexing +the matrix’s rows, and the second indexing its columns). R’s default behavior +might not be what you expect: + +```r +valueMatrix <- matrix(LETTERS[1:15], ncol = 3) +valueMatrix +``` +``` +## [,1] [,2] [,3] +## [1,] "A" "F" "K" +## [2,] "B" "G" "L" +## [3,] "C" "H" "M" +## [4,] "D" "I" "N" +## [5,] "E" "J" "O" +``` + +```r +rowIndices <- c(4, 2, 2, 4, 4, 4) +colIndices <- c(2, 3, 3, 2, 3, 2) +valueMatrix[rowIndices, colIndices] +``` +``` +## [,1] [,2] [,3] [,4] [,5] [,6] +## [1,] "I" "N" "N" "I" "N" "I" +## [2,] "G" "L" "L" "G" "L" "G" +## [3,] "G" "L" "L" "G" "L" "G" +## [4,] "I" "N" "N" "I" "N" "I" +## [5,] "I" "N" "N" "I" "N" "I" +## [6,] "I" "N" "N" "I" "N" "I" +``` + +Instead of returning the six values associated with the six row/column pairs, +it returns a 6 × 6 matrix with the elements of interest along the diagonal. +When the number of elements is this small, it’s easy to wrap this in a call to +`diag()`; that approach isn’t appropriate for long index vectors, since memory +requirements are squared. + +Readers who’ve done data manipulation in C are probably familiar with pointer +arithmetic. Zero-based numbering makes it easy to combine row and column +indexes and make a one-dimensional array behave like a matrix: + +```c +/* When the code has to deal with matrices of varying size, you can’t allocate + an array right away. */ +double *valueMatrix; + +/* Stuff happened, and now you know how big your matrix will be (nrow x ncol), + so you allocate memory on the “heap” to store the data. */ +valueMatrix = (double *)malloc(sizeof(double) * nrow * ncol); + +/* This is how you’d access specific elements. */ +oldValueAtRowCol = valueMatrix[row + nrow*col]; +valueMatrix[row + nrow*col] = newValueAtRowCol; + +/* Can’t forget this when you’re done; I don’t miss C. */ +free(valueMatrix); +valueMatrix = 0; + +/* NB: All programs work this way, but most scripting languages take care of + this stuff for you. Progress! */ +``` + +To its credit, R makes this easy too; everything is stored as a one-dimensional +vector behind the scenes, and can be accessed as such. R’s use of one-based +indexing just makes it look a bit more awkward: + +```r +valueMatrix[rowIndices + nrow(valueMatrix) * (colIndices - 1)] +``` +``` +## [1] "I" "L" "L" "I" "N" "I" +``` + +I hope this is useful for anybody who wants to access matrix elements using +index vectors. More importantly, maybe some scientists-turned-programmers can +gain a bit of insight into why zero-based numbering make sense to those of us +who cut our teeth on C (or languages like it). + +--- + +### Update + +After I posted this, [Andrie de Vries](http://rfordummies.com/) sent [a +tweet](https://twitter.com/RevoAndrie/status/657187336833388545) sharing an +alternate syntax that's more R-like: + +```r +valueMatrix[cbind(rowIndices, colIndices)] +``` +``` +## [1] "I" "L" "L" "I" "N" "I" +``` + +I definitely agree that it looks better, but there is a slight performance hit +due to the call to `cbind()`. If you're repeatedly accessing a matrix with the +same pair of indices, it might be worth it store the bound pair as a variable +and reuse that. Here's the benchmark performance of each of the approaches I've +discussed: + + +```r +library("microbenchmark") + +rowIndices <- sample(1:5, 1e4, replace=TRUE) +colIndices <- sample(1:3, 1e4, replace=TRUE) +boundIndices <- cbind(rowIndices, colIndices) + +op <- microbenchmark(diag_matrix = diag(valueMatrix[rowIndices, colIndices]), + pointer_math = valueMatrix[rowIndices + nrow(valueMatrix) * (colIndices - 1)], + array_indexing = valueMatrix[cbind(rowIndices, colIndices)], + array_indexing_prebound = valueMatrix[boundIndices], + times = 100) +print(op) +``` +``` +## Unit: microseconds +## expr min lq mean median +## diag_matrix 1692950.428 1984553.2750 2024360.4989 2031899.941 +## pointer_math 243.356 251.9710 265.7848 260.419 +## array_indexing 332.864 352.2625 373.6505 367.539 +## array_indexing_prebound 149.192 154.6295 165.4170 160.201 +## uq max neval +## 2056263.5955 2201740.926 100 +## 272.5130 331.070 100 +## 387.1940 544.230 100 +## 170.5105 277.498 100 +``` + +Indexing with the pre-bound pair is fastest, using arithmetic on the indexes is +a close second, and calling `cbind()` inside the brackets is in third place. +Creating the n × n matrix and extracting its diagonal is excessively slow (and +uses up a lot of RAM), so don't ever do that. diff --git a/content/posts/instagram-sentiment/category_sentiment-1.png b/content/posts/instagram-sentiment/category_sentiment-1.png Binary files differ. diff --git a/content/posts/instagram-sentiment/cumulative_sentiment-1.png b/content/posts/instagram-sentiment/cumulative_sentiment-1.png Binary files differ. diff --git a/content/posts/instagram-sentiment/index.Rmd b/content/posts/instagram-sentiment/index.Rmd @@ -0,0 +1,421 @@ +--- +title: "Post types and sentiment from my Instagram feed" +description: "Does Instagram spark joy? A look at what I'm seeing and how I feel while using this platform." +date: 2022-07-13T12:28:22-04:00 +draft: False +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +--- + +```{r setup, include=FALSE} +knitr::opts_chunk$set( + echo = FALSE, + fig.path = file.path("figs", + sub("\\.Rmd$", "", + basename(rstudioapi::getActiveDocumentContext()$path)), + "") +) +knitr::opts_knit$set( + base.dir = file.path(Sys.getenv("HUGO_ROOT"), "static"), + base.url = "/" +) +``` +```{r packages, include=FALSE} +library(dplyr) +library(ggplot2) +library(forcats) +``` +```{r data} +ig_dat <- tibble::tribble( + ~date, ~medium, ~sentiment, ~poster_category, ~poster_followed, + "2022-07-09", "Video", 1L, "Business (Friend's)", TRUE, + "2022-07-09", "Photo", 2L, "Friend", TRUE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Image", 1L, "Meme account", TRUE, + "2022-07-09", "Photo", 2L, "Friend", TRUE, + "2022-07-09", "Video", -1L, "Suggested post", FALSE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Photo", 1L, "Friend", TRUE, + "2022-07-09", "Video", 0L, "Suggested post", FALSE, + "2022-07-09", "Video", 0L, "Meme account", TRUE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Video", -1L, "Suggested post", FALSE, + "2022-07-09", "Photo", 1L, "Meme account", TRUE, + "2022-07-09", "Video", 1L, "Suggested post", FALSE, + "2022-07-09", "Video", 0L, "Ad", FALSE, + "2022-07-09", "Video", 1L, "Business (Friend's)", TRUE, + "2022-07-09", "Video", 1L, "Suggested post", FALSE, + "2022-07-09", "Image", 1L, "Meme account", TRUE, + "2022-07-09", "Video", -1L, "Ad", FALSE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Image", 0L, "Meme account", TRUE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Photo", -2L, "Ad", FALSE, + "2022-07-09", "Photo", 2L, "Organization", TRUE, + "2022-07-09", "Video", -1L, "Suggested post", FALSE, + "2022-07-09", "Image", 1L, "Business (Friend's)", TRUE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Photo", 0L, "Artist", TRUE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Photo", 2L, "Friend", TRUE, + "2022-07-09", "Video", -1L, "Suggested post", FALSE, + "2022-07-09", "Image", 2L, "Artist", TRUE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Photo", 1L, "Organization", TRUE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Video", -1L, "Ad", FALSE, + "2022-07-09", "Photo", 1L, "Organization", TRUE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Image", 2L, "Artist", TRUE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Video", -1L, "Suggested post", FALSE, + "2022-07-09", "Photo", 0L, "Organization", TRUE, + "2022-07-09", "Video", -1L, "Suggested post", FALSE, + "2022-07-09", "Video", -2L, "Ad", FALSE, + "2022-07-09", "Photo", 2L, "Friend", TRUE, + "2022-07-09", "Video", -2L, "Suggested post", FALSE, + "2022-07-09", "Photo", 1L, "Meme account", TRUE, + "2022-07-10", "Image", 2L, "Artist", TRUE, + "2022-07-10", "Image", 0L, "Meme account", TRUE, + "2022-07-10", "Image", 1L, "Meme account", TRUE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Photo", 1L, "Friend", TRUE, + "2022-07-10", "Video", 1L, "Friend", TRUE, + "2022-07-10", "Video", 0L, "Suggested post", FALSE, + "2022-07-10", "Image", 0L, "Meme account", TRUE, + "2022-07-10", "Video", 1L, "Suggested post", FALSE, + "2022-07-10", "Image", 2L, "Friend", TRUE, + "2022-07-10", "Video", 0L, "Suggested post", FALSE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Photo", 1L, "Friend", TRUE, + "2022-07-10", "Video", -1L, "Suggested post", FALSE, + "2022-07-10", "Image", 1L, "Meme account", TRUE, + "2022-07-10", "Video", -1L, "Ad", FALSE, + "2022-07-10", "Video", -1L, "Suggested post", FALSE, + "2022-07-10", "Image", 1L, "Friend", TRUE, + "2022-07-10", "Video", 1L, "Suggested post", FALSE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Photo", 1L, "Organization", TRUE, + "2022-07-10", "Video", 0L, "Suggested post", FALSE, + "2022-07-10", "Photo", 0L, "Business (Friend's)", TRUE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Video", -2L, "Suggested post", FALSE, + "2022-07-10", "Photo", 1L, "Meme account", TRUE, + "2022-07-10", "Video", -2L, "Suggested post", FALSE, + "2022-07-10", "Image", -1L, "Ad", FALSE, + "2022-07-10", "Image", 1L, "Artist", TRUE, + "2022-07-10", "Video", 0L, "Suggested post", FALSE, + "2022-07-10", "Photo", 2L, "Friend", TRUE, + "2022-07-10", "Image", -1L, "Ad", FALSE, + "2022-07-10", "Video", 1L, "Suggested post", FALSE, + "2022-07-10", "Photo", 1L, "Organization", TRUE, + "2022-07-10", "Video", -2L, "Suggested post", FALSE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Video", -1L, "Organization", TRUE, + "2022-07-10", "Video", -2L, "Suggested post", FALSE, + "2022-07-10", "Photo", 2L, "Friend", TRUE, + "2022-07-10", "Video", -1L, "Ad", FALSE, + "2022-07-10", "Video", -1L, "Suggested post", FALSE, + "2022-07-10", "Image", 1L, "Artist", TRUE, + "2022-07-10", "Video", 1L, "Suggested post", FALSE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Video", 2L, "Friend", TRUE, + "2022-07-10", "Video", -1L, "Suggested post", FALSE, + "2022-07-10", "Video", 1L, "Friend", TRUE, + "2022-07-10", "Video", -2L, "Ad", FALSE, + "2022-07-10", "Video", -1L, "Suggested post", FALSE, + "2022-07-10", "Photo", 2L, "Friend", TRUE, + "2022-07-11", "Photo", 0L, "Friend", TRUE, + "2022-07-11", "Video", -1L, "Ad", FALSE, + "2022-07-11", "Video", 0L, "Business (Friend's)", TRUE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Video", 2L, "Artist", TRUE, + "2022-07-11", "Video", -1L, "Ad", FALSE, + "2022-07-11", "Photo", 0L, "Organization", TRUE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Photo", 1L, "Organization", TRUE, + "2022-07-11", "Photo", 2L, "Friend", TRUE, + "2022-07-11", "Video", -1L, "Suggested post", FALSE, + "2022-07-11", "Photo", 1L, "Friend", TRUE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Photo", 2L, "Organization", TRUE, + "2022-07-11", "Video", -2L, "Ad", FALSE, + "2022-07-11", "Video", -1L, "Suggested post", FALSE, + "2022-07-11", "Image", 2L, "Friend", TRUE, + "2022-07-11", "Image", 2L, "Artist", TRUE, + "2022-07-11", "Video", -2L, "Ad", FALSE, + "2022-07-11", "Video", 0L, "Suggested post", FALSE, + "2022-07-11", "Photo", 2L, "Friend", TRUE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Video", -2L, "Ad", FALSE, + "2022-07-11", "Photo", 0L, "Organization", TRUE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Image", 0L, "Artist", TRUE, + "2022-07-11", "Video", -1L, "Ad", FALSE, + "2022-07-11", "Video", -1L, "Suggested post", FALSE, + "2022-07-11", "Video", -1L, "Friend", TRUE, + "2022-07-11", "Video", -1L, "Suggested post", FALSE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Photo", 1L, "Meme account", TRUE, + "2022-07-11", "Video", -2L, "Suggested post", FALSE, + "2022-07-11", "Photo", 1L, "Friend", TRUE, + "2022-07-11", "Video", -1L, "Ad", FALSE, + "2022-07-11", "Video", -1L, "Suggested post", FALSE, + "2022-07-11", "Photo", 0L, "Organization", TRUE, + "2022-07-11", "Video", 0L, "Suggested post", FALSE, + "2022-07-11", "Video", 0L, "Ad", FALSE, + "2022-07-11", "Photo", 2L, "Friend", TRUE, + "2022-07-11", "Video", 0L, "Suggested post", FALSE, + "2022-07-11", "Photo", 0L, "Meme account", TRUE, + "2022-07-11", "Video", -1L, "Ad", FALSE, + "2022-07-11", "Video", 1L, "Suggested post", FALSE, + "2022-07-11", "Video", 0L, "Suggested post", FALSE, + "2022-07-11", "Image", 0L, "Friend", TRUE, + "2022-07-11", "Video", -1L, "Ad", FALSE, + "2022-07-11", "Video", 0L, "Suggested post", FALSE, + "2022-07-11", "Photo", 2L, "Friend", TRUE, + "2022-07-11", "Video", 0L, "Suggested post", FALSE, + "2022-07-12", "Photo", 2L, "Friend", TRUE, + "2022-07-12", "Photo", 1L, "Meme account", TRUE, + "2022-07-12", "Video", -1L, "Ad", FALSE, + "2022-07-12", "Video", -1L, "Suggested post", FALSE, + "2022-07-12", "Photo", 0L, "Friend", TRUE, + "2022-07-12", "Photo", 1L, "Friend", TRUE, + "2022-07-12", "Image", 0L, "Meme account", TRUE, + "2022-07-12", "Photo", 0L, "Ad", FALSE, + "2022-07-12", "Image", 0L, "Suggested post", FALSE, + "2022-07-12", "Photo", 2L, "Friend", TRUE, + "2022-07-12", "Video", 1L, "Suggested post", FALSE, + "2022-07-12", "Video", -2L, "Ad", FALSE, + "2022-07-12", "Photo", 2L, "Friend", TRUE, + "2022-07-12", "Video", 0L, "Suggested post", FALSE, + "2022-07-12", "Image", 1L, "Organization", TRUE, + "2022-07-12", "Video", -1L, "Ad", FALSE, + "2022-07-12", "Video", -1L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Friend", TRUE, + "2022-07-12", "Video", 0L, "Suggested post", FALSE, + "2022-07-12", "Image", -1L, "Ad", FALSE, + "2022-07-12", "Image", 0L, "Business (Friend's)", TRUE, + "2022-07-12", "Video", -1L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Meme account", TRUE, + "2022-07-12", "Video", 0L, "Ad", FALSE, + "2022-07-12", "Image", 0L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Meme account", TRUE, + "2022-07-12", "Video", 0L, "Suggested post", FALSE, + "2022-07-12", "Video", -2L, "Ad", FALSE, + "2022-07-12", "Image", 0L, "Organization", TRUE, + "2022-07-12", "Video", 0L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Friend", TRUE, + "2022-07-12", "Video", -1L, "Suggested post", FALSE, + "2022-07-12", "Video", -2L, "Ad", FALSE, + "2022-07-12", "Photo", 1L, "Meme account", TRUE, + "2022-07-12", "Video", -1L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Organization", TRUE, + "2022-07-12", "Image", -2L, "Ad", FALSE, + "2022-07-12", "Video", -1L, "Suggested post", FALSE, + "2022-07-12", "Photo", 0L, "Artist", TRUE, + "2022-07-12", "Video", 0L, "Suggested post", FALSE, + "2022-07-12", "Video", 1L, "Ad", FALSE, + "2022-07-12", "Image", 2L, "Artist", TRUE, + "2022-07-12", "Video", -2L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Friend", TRUE, + "2022-07-12", "Video", -2L, "Ad", FALSE, + "2022-07-12", "Image", 0L, "Suggested post", FALSE, + "2022-07-12", "Photo", 1L, "Friend", TRUE, + "2022-07-12", "Video", 1L, "Suggested post", FALSE, + "2022-07-12", "Photo", 0L, "Business (Friend's)", TRUE, + "2022-07-12", "Video", -2L, "Ad", FALSE + ) %>% + mutate(poster_category = sub(" \\(Friend's\\)", "", poster_category)) +``` + +I've been critical of social media platforms (in spite of my continued use of them), but I've traditionally defended Instagram. I knew that it had major problems (most galling, [internal research showed that use of the platform was hurting teenage girls' body image, and Meta suppressed the findings](https://www.wsj.com/articles/facebook-knows-instagram-is-toxic-for-teen-girls-company-documents-show-11631620739?mod=article_inline)), but browsing IG has nevertheless been a pleasant experience for me. Photos of my friends' pets, children, and vacations are _nice things_, and being exposed to them _made me happy_. + +Recently, Instagram instituted changes to the app's main feed, which were [announed by Adam Mosseri, the head of Instagram, on Twitter](https://twitter.com/mosseri/status/1521589403671355392). I feel like Instagram stopped being as fun for me shortly after these changes were rolled out, so I collected a bit of data. + +## Method + +Over the course of four days (July 9–12, 2022), I only opened the app once per day, on my phone. I looked at the first 50 posts on my feed, and logged a couple features, described below, about each one. I also gave each post a subjective "sentiment score" using a five-point scale from -2 (for posts I actively disliked) to 2 (for posts I quite liked), with a score of 0 being neutral. + +## Results + +What does Instagram show me? Let's first look at "poster category" counts, which shows who the posts come from. + +```{r poster_category, fig.height=4, fig.width=7} +caption_text <- "Data from 200 posts viewed over 4 days (50 posts/day)" + +ig_dat %>% + mutate(poster_category = fct_rev(fct_infreq(poster_category))) %>% + ggplot(aes(x = poster_category)) + + geom_bar(aes(fill = !poster_followed)) + + geom_text(aes(label = ..count..), stat = "count", + hjust = 0, nudge_y = 1, size = 6) + + scale_fill_brewer(palette = "Dark2") + + expand_limits(y = 75) + + coord_flip() + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + plot.title.position = "plot", + plot.caption.position = "plot", + legend.position = "none", + axis.line = element_blank(), + axis.ticks = element_blank(), + axis.title = element_blank(), + axis.text.x = element_blank(), + axis.text.y = element_text(size = 16, + margin = margin(r = -16))) + + labs(title = "Poster categories in my Instagram feed", + caption = caption_text) +``` + +Most of the 410 accounts I follow are my friends'. I also follow a few _artists_ (a combination of musicians, visual artists, and authors), _organizations_ (primarily political and community orgs), _businesses_ (all of which are run by friends—a couple bakers, a couple shop owners), and a small handful of _meme accounts_ (e.g., "dnddads"). Subjectively, meme accounts are over-represented on my feed; I follow hundreds of actual people and only around five meme accounts, but the latter account for over half as many posts as the former. + +The biggest issue here is that the majority of posts come from _accounts I don't follow_. I understand that Instagram is an ad-supported business, but I see more ads than posts from friends. Worse still, I see almost twice as many "suggested posts" as I do posts from friends. + +What types of content are represented by these posts? + +```{r medium, fig.height=3, fig.width=7} +ig_dat %>% + mutate(medium = fct_rev(fct_infreq(medium))) %>% + ggplot(aes(x = medium)) + + geom_bar(aes(fill = medium)) + + geom_text(aes(label = ..count..), stat = "count", + hjust = 0, nudge_y = 1, size = 6) + + scale_fill_brewer(palette = "Paired") + + expand_limits(y = 120) + + coord_flip() + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + plot.title.position = "plot", + plot.caption.position = "plot", + legend.position = "none", + axis.line = element_blank(), + axis.ticks = element_blank(), + axis.title = element_blank(), + axis.text.x = element_blank(), + axis.text.y = element_text(size = 20, + margin = margin(r = -20))) + + labs(title = "Media present in my Instagram feed", + caption = caption_text) +``` + +Mosseri announced that Meta wanted to make video a bigger part of the Instagram experience, and they seem to have delivered. Of the 200 posts I logged, the majority were video. Photographs, which the app was originally designed for, account for a little over a quarter of the posts, with other types of image (drawings, illustrations, etc.) accounting for the rest. + +What's the relationship between _poster category_ and _post medium_? + +```{r poster_media, fig.height=4} +ig_dat %>% + mutate(poster_category = fct_rev(fct_infreq(poster_category))) %>% + ggplot(aes(x = poster_category)) + + geom_bar(aes(fill = medium)) + + geom_text(aes(label = ..count..), stat = "count", + hjust = 0, nudge_y = 1, size = 6) + + scale_fill_brewer(palette = "Paired") + + expand_limits(y = 75) + + coord_flip() + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + plot.title.position = "plot", + plot.caption.position = "plot", + legend.title = element_text(size = 12), + legend.text = element_text(size = 12), + legend.position = c(0.8, 0.2), + axis.line = element_blank(), + axis.ticks = element_blank(), + axis.title = element_blank(), + axis.text.x = element_blank(), + axis.text.y = element_text(size = 16, + margin = margin(r = -16))) + + labs(title = "Post medium and poster category in my Instagram feed", + caption = caption_text, + fill = "Post medium") +``` + +There's a tight correspondence between what medium is employed for a post and who's posting it. Videos are being pushed by accounts I don't follow, while my friends continue to prioritize photographs. + +Since post medium and poster category are so tightly linked, I'll focus on looking at the sentiment by poster category—it would be difficult to tease apart how I feel about photos vs. videos and how I feel about posts from accounts I do vs. do not follow. + +```{r category_sentiment} +ig_dat %>% + mutate(poster_category = fct_rev(fct_infreq(poster_category))) %>% + ggplot(aes(poster_category, sentiment)) + + geom_boxplot(aes(fill = !poster_followed)) + + scale_fill_brewer(palette = "Dark2") + + coord_flip() + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + plot.title.position = "plot", + plot.caption.position = "plot", + legend.position = "none", + axis.line = element_blank(), + axis.ticks = element_blank(), + axis.title.x = element_text(size = 16), + axis.title.y = element_blank(), + axis.text.x = element_text(size = 12), + axis.text.y = element_text(size = 16, + margin = margin(r = -16))) + + labs(title = "Instagram sentiment by poster category", + caption = caption_text, + y = "Subjective sentiment") +``` + +These box-and-whisker plots show the distribution of sentiment scores for each post category. The heavy vertical line indicates the median score, and the boxes extend from the first through third quartiles (the "interquartile range", or IQR). The "whiskers" cover the full range of scores, unless any observation is identified as a potential "outlier". Outliers are defined as observations with values more than 150% of the value of the IQR above or below the third or first quartile, respectively. For example, I was bothered by a photo of a dead bird which was posted by a friend, and gave it a score of -1. The first and third quartiles of sentiment scores for posts from friends are 1 and 2, providing an IQR of 1. Since -1 is less than 1 (the first quartile) - 1.5 (150% of 1, the IQR), that score is an outlier. + +I'm not surprised that I like posts from the accounts I follow more than those from accounts I don't. It's disappointing that suggested posts aren't much nicer to see than ads; these are supposed to make the platorm more "immersive" and "engaging" and fail to achieve that. + +In an attempt to quantify the "experience" of browsing Instagram, I looked at the cumulative sentiment scores across each of the four days. There's no doubt that the actual dynamics of my affect, to the extent that it can even be quantified, is more complicated than +2 + -2 = 0. However, this is a good first approximation of what it feels like to scroll through a feed. + +```{r cumulative_sentiment} +ig_sentiment <- ig_dat %>% + group_by(date) %>% + mutate(seq = row_number(date), + cum_sent = cumsum(sentiment)) + +ig_sentiment %>% + ggplot(aes(seq, cum_sent)) + + geom_hline(yintercept = 0, linetype = "dashed") + + geom_step(aes(color = date), size = 1) + + geom_text(aes(label = cum_sent), data = filter(ig_sentiment, seq == 50), + hjust = 0, nudge_x = 0.5, size = 5) + + scale_color_brewer(palette = "Set2") + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + plot.title.position = "plot", + plot.caption.position = "plot", + legend.title = element_text(size = 12), + legend.text = element_text(size = 12), + legend.position = "none", + axis.line.y = element_blank(), + axis.ticks.y = element_blank(), + axis.title = element_blank(), + #axis.text.x = element_blank(), + axis.text.y = element_blank()) + + labs(title = "Cumulative sentiment while browsing Instagram", + caption = caption_text) +``` + +Each of the four days has a negative cumulative sentiment score, which indicates that I see more posts that I dislike than posts that I like. There's also a suggestion of a pattern, in which my sentiment stays relatively flat and positive over the first 20–30 posts, and then drops. + +I wonder if this is the result of an intentional design decision by Instagram. If they have an internal model of what posts I might like, they could certainly time them in such a way to encourage longer stretches of engagement, and they have the data to figure out what the optimal timing would look like. On the other hand, this is a purely subjective score that I didn't attempt to carefully calibrate, so it's worth considering that I might just get tired of my feed after a couple dozen posts. + +## Conclusions + +I don't know if it's worth an attempt to use my experience to formulate suggestions to Instagram (or their would-be competitors). I'm approaching middle age, and I don't spend much money on the internet; Instagram can get stronger engagement and much better ad conversion rates from people who aren't like me. Perhaps I'm an unprofitable user and this is their attempt to nudge me off the platform? + +However, this has been a useful exercise for me, because it suggests a few things I could change right now to improve my experience: + +* Stop following meme accounts and organizations (these posts provide a neutral-to-good experience, but they potentially crowd out posts from friends and artists that I would enjoy more) +* Stop scrolling my feed after the first 20 or so posts (cumulative sentiment appears to begin dropping after this point) + +Most importantly, it calls into question whether I should even continue using the platform at all. The maximum cumulative sentiment that I experienced was only six (which corresponds to seeing just three things that I really like), and that was only achieved on two of the four days that I measured this. As much as I enjoy seeing photos from my friends (and the data show that I really do enjoy this), it's hard to conclude that the experience of using Instagram is joyful. +\ No newline at end of file diff --git a/content/posts/instagram-sentiment/index.md b/content/posts/instagram-sentiment/index.md @@ -0,0 +1,161 @@ +--- +title: "Post types and sentiment from my Instagram feed" +description: "Does Instagram spark joy? A look at what I'm seeing and how I feel while using this platform." +date: 2022-07-13T12:28:22-04:00 +draft: False +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +categories: +- Data Science +- Science +tags: +- Psychology +--- + +I've been critical of social media platforms (in spite of my continued +use of them), but I've traditionally defended Instagram. I knew that it +had major problems (most galling, [internal research showed that use of +the platform was hurting teenage girls' body image, and Meta suppressed +the +findings](https://www.wsj.com/articles/facebook-knows-instagram-is-toxic-for-teen-girls-company-documents-show-11631620739?mod=article_inline)), +but browsing IG has nevertheless been a pleasant experience for me. +Photos of my friends' pets, children, and vacations are *nice things*, +and being exposed to them *made me happy*. + +Recently, Instagram instituted changes to the app's main feed, which +were [announced by Adam Mosseri, the head of Instagram, on +Twitter](https://twitter.com/mosseri/status/1521589403671355392). I feel +like Instagram stopped being as fun for me shortly after these changes +were rolled out, so I collected a bit of data. + +## Method + +Over the course of four days (July 9--12, 2022), I only opened the app +once per day, on my phone. I looked at the first 50 posts on my feed, +and logged a couple features, described below, about each one. I also +gave each post a subjective "sentiment score" using a five-point scale +from -2 (for posts I actively disliked) to 2 (for posts I quite liked), +with a score of 0 being neutral. + +## Results + +What does Instagram show me? Let's first look at "poster category" +counts, which shows who the posts come from. + +![Post counts for different categories](poster_category-1.png) + +Most of the 410 accounts I follow are my friends'. I also follow a few +*artists* (a combination of musicians, visual artists, and authors), +*organizations* (primarily political and community orgs), *businesses* +(all of which are run by friends---a couple bakers, a couple shop +owners), and a small handful of *meme accounts* (e.g., "dnddads"). +Subjectively, meme accounts are over-represented on my feed; I follow +hundreds of actual people and only around five meme accounts, but the +latter account for over half as many posts as the former. + +The biggest issue here is that the majority of posts come from *accounts +I don't follow*. I understand that Instagram is an ad-supported +business, but I see more ads than posts from friends. Worse still, I see +almost twice as many "suggested posts" as I do posts from friends. + +What types of content are represented by these posts? + +![Post counts for different media](medium-1.png) + +Mosseri announced that Meta wanted to make video a bigger part of the +Instagram experience, and they seem to have delivered. Of the 200 posts +I logged, the majority were video. Photographs, which the app was +originally designed for, account for a little over a quarter of the +posts, with other types of image (drawings, illustrations, etc.) +accounting for the rest. + +What's the relationship between *poster category* and *post medium*? + +![Media distribution for poster categories](poster_media-1.png) + +There's a tight correspondence between what medium is employed for a +post and who's posting it. Videos are being pushed by accounts I don't +follow, while my friends continue to prioritize photographs. + +Since post medium and poster category are so tightly linked, I'll focus +on looking at the sentiment by poster category---it would be difficult +to tease apart how I feel about photos vs. videos and how I feel about +posts from accounts I do vs. do not follow. + +![Sentiment distribution for poster category](category_sentiment-1.png) + +These box-and-whisker plots show the distribution of sentiment scores +for each post category. The heavy vertical line indicates the median +score, and the boxes extend from the first through third quartiles (the +"interquartile range", or IQR). The "whiskers" cover the full range of +scores, unless any observation is identified as a potential "outlier". +Outliers are defined as observations with values more than 150% of the +value of the IQR above or below the third or first quartile, +respectively. For example, I was bothered by a photo of a dead bird +which was posted by a friend, and gave it a score of -1. The first and +third quartiles of sentiment scores for posts from friends are 1 and 2, +providing an IQR of 1. Since -1 is less than 1 (the first quartile) - +1.5 (150% of 1, the IQR), that score is an outlier. + +I'm not surprised that I like posts from the accounts I follow more than +those from accounts I don't. It's disappointing that suggested posts +aren't much nicer to see than ads; these are supposed to make the +platform more "immersive" and "engaging" and fail to achieve that. + +In an attempt to quantify the "experience" of browsing Instagram, I +looked at the cumulative sentiment scores across each of the four days. +There's no doubt that the actual dynamics of my affect, to the extent +that it can even be quantified, is more complicated than +2 + -2 = 0. +However, this is a good first approximation of what it feels like to +scroll through a feed. + +![Cumulative sentiment over four days](cumulative_sentiment-1.png) + +Each of the four days has a negative cumulative sentiment score, which +indicates that I see more posts that I dislike than posts that I like. +There's also a suggestion of a pattern, in which my sentiment stays +relatively flat and positive over the first 20--30 posts, and then +drops. + +I wonder if this is the result of an intentional design decision by +Instagram. If they have an internal model of what posts I might like, +they could certainly time them in such a way to encourage longer +stretches of engagement, and they have the data to figure out what the +optimal timing would look like. On the other hand, this is a purely +subjective score that I didn't attempt to carefully calibrate, so it's +worth considering that I might just get tired of my feed after a couple +dozen posts. + +## Conclusions + +I don't know if it's worth an attempt to use my experience to formulate +suggestions to Instagram (or their would-be competitors). I'm +approaching middle age, and I don't spend much money on the internet; +Instagram can get stronger engagement and much better ad conversion +rates from people who aren't like me. Perhaps I'm an unprofitable user +and this is their attempt to nudge me off the platform? + +However, this has been a useful exercise for me, because it suggests a +few things I could change right now to improve my experience: + +- Stop following meme accounts and organizations (these posts provide + a neutral-to-good experience, but they potentially crowd out posts + from friends and artists that I would enjoy more) +- Stop scrolling my feed after the first 20 or so posts (cumulative + sentiment appears to begin dropping after this point) + +Most importantly, it calls into question whether I should even continue +using the platform at all. The maximum cumulative sentiment that I +experienced was only six (which corresponds to seeing just three things +that I really like), and that was only achieved on two of the four days +that I measured this. As much as I enjoy seeing photos from my friends +(and the data show that I really do enjoy this), it's hard to conclude +that the experience of using Instagram is joyful. diff --git a/content/posts/instagram-sentiment/medium-1.png b/content/posts/instagram-sentiment/medium-1.png Binary files differ. diff --git a/content/posts/instagram-sentiment/poster_category-1.png b/content/posts/instagram-sentiment/poster_category-1.png Binary files differ. diff --git a/content/posts/instagram-sentiment/poster_media-1.png b/content/posts/instagram-sentiment/poster_media-1.png Binary files differ. diff --git a/content/posts/labeling-ggplots/better_plot-1.png b/content/posts/labeling-ggplots/better_plot-1.png Binary files differ. diff --git a/content/posts/labeling-ggplots/ecdf-1.png b/content/posts/labeling-ggplots/ecdf-1.png Binary files differ. diff --git a/content/posts/labeling-ggplots/index.Rmd b/content/posts/labeling-ggplots/index.Rmd @@ -0,0 +1,92 @@ +--- +title: "Labeling bar charts (and other graphics) in ggplot2" +description: "How to combine stats and geoms to simplify complex plots." +date: 2022-07-08T19:32:57-04:00 +draft: False +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +--- + +```{r setup, include=FALSE} +knitr::opts_chunk$set( + echo = TRUE, + fig.path = file.path("figs", + sub("\\.Rmd$", "", + basename(rstudioapi::getActiveDocumentContext()$path)), + "") +) +knitr::opts_knit$set( + base.dir = file.path(Sys.getenv("HUGO_ROOT"), "static"), + base.url = "/" +) +``` + +Bar charts are [rightfully criticized for being potentially misleading](https://www.kickstarter.com/projects/1474588473/barbarplots), but they're still useful for some data graphics. They're a great way to display counts, for example, and non-technical audiences are comfortable interpreting them. + +One way that a typical bar plot can be improved is by removing unnecessary axis labels and directly labeling the bars themselves. For example, if we wanted to see how many counties are in some of the states comprising the Midwestern US, we could use the `midwest` data set that's packaged with ggplot2 and draw a simple bar plot. + +```{r simple_bar} +library(ggplot2) + +ggplot(midwest, aes(x = state)) + + geom_bar() + + labs(x = "", y = "Number of counties") + + theme_minimal() + + theme(axis.text.x = element_text(size = 16), + axis.title.y = element_text(size = 14)) +``` + +This is fine (provided that you can accept that Ohio is part of the Midwest and Iowa isn't). However, we can easily strip away some of the "chart junk" by removing unnecessary theme elements and labeling the bars using `geom_text`. + +```{r better_plot} +ggplot(midwest, aes(state)) + + geom_bar() + + geom_text(aes(y = ..count.., label = ..count..), stat = "count", + vjust = 0, nudge_y = 2, size = 8) + + expand_limits(y = 110) + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + axis.line = element_blank(), + axis.ticks = element_blank(), + axis.title = element_blank(), + axis.text.y = element_blank(), + axis.text.x = element_text(size = 16)) + + labs(title = "Number of counties in Midwestern states") +``` + +There's still room for improvement—I'd consider rearranging the bars based on something more meaningful than alphabetic order, and possibly coloring them—but this simultaneously conveys more information than the previous plot (objectively) and is less "cluttered" (subjectively). + +## How this works + +I'm surprised I'm still writing blog posts about ggplot2 after seven years, but I continue to learn new things about it even after regular use. Recently, I decided that it bothered me that there were "stats" (like `stat_ecdf`) and "geoms" (like `geom_bar`), and I really didn't understand the difference between them—they seemed interchange but not identical. I finally looked into it and came across [this response on StackOverflow](https://stackoverflow.com/a/44226841), which contained the following quote from the [ggplot2 book](https://ggplot2-book.org/): + +> You only need to set one of stat and geom: every geom has a default stat, and every stat has a default geom. + +It turns out that "stats" and "geoms" _are_ largely interchangeable, because they're both wrappers around `layer()`, with different ways of handling defaults. The code above works because I changed the `stat` parameter of `geom_text` (which, according to [the documentation](https://ggplot2.tidyverse.org/reference/geom_text.html), defaults to `"identity"`) to `"count"`, which is the default `stat` of `geom_bar`. Looking at [the documentation for `stat_count`](https://ggplot2.tidyverse.org/reference/geom_bar.html), we see that it provides two _computed variables_, and we use use the computed `count` variable in our aesthetics for `geom_text` to provide both the vertical position and label. + +Getting my head around this has helped me iterate through analyses more quickly. For instance, I frequently use `stat_ecdf` to get a handle on distributions, and now I can label these plots easily. Sticking with data about the Midwest, here's the ECDF of population density for Midwestern counties, with a few values highlighted. + +```{r ecdf} +ggplot(midwest, aes(popdensity)) + + stat_ecdf() + # This could also be `geom_step(stat = "ecdf")` + geom_text(aes(label = sprintf("(%.0f: %.0f%%)", ..x.., floor(100 * ..y..))), + stat = "ecdf", hjust = 1, vjust = 0, check_overlap = TRUE, size = 5) + + expand_limits(x = -15000) + + scale_y_continuous(labels = scales::label_percent()) + + theme_minimal() + + labs(x = "Population density", y = "CDF") +``` + +I wouldn't call this a _beautiful_ graphic, but visualizations like this are often _useful_, especially when getting a handle on a new data set. Here we see that over a third of Midwestern counties have population densities fully two orders of magnitude smaller than the most densely populated county, and we've only had to draw a single plot. + +It's hard to justify putting much effort into producing plots that aren't meant to be shared, and a typical data analysis will involve creating dozens of plots that are only useful for the person analyzing the data. Without understanding stats and geoms, I would never have bothered labeling an ECDF plot; "quick and dirty" needs to be quick after all. On the other hand, labeling the values in a bar chart is something that one should do when preparing publication-quality graphics. ggplot2 is useful in both phases of a project. + +In the words of Alan Kay, ["simple things should be simple, complex things should be possible."](https://www.quora.com/What-is-the-story-behind-Alan-Kay-s-adage-Simple-things-should-be-simple-complex-things-should-be-possible) ggplot2 does both of these consistently. Occasionally, it even makes complex things simple. +\ No newline at end of file diff --git a/content/posts/labeling-ggplots/index.md b/content/posts/labeling-ggplots/index.md @@ -0,0 +1,141 @@ +--- +title: "Labeling bar charts (and other graphics) in ggplot2" +description: "How to combine stats and geoms to simplify complex plots." +date: 2022-07-08T19:32:57-04:00 +draft: False +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +categories: +- Data Science +tags: +- R +- Dataviz +--- + +Bar charts are [rightfully criticized for being potentially +misleading](https://www.kickstarter.com/projects/1474588473/barbarplots), +but they're still useful for some data graphics. They're a great way to +display counts, for example, and non-technical audiences are comfortable +interpreting them. + +One way that a typical bar plot can be improved is by removing +unnecessary axis labels and directly labeling the bars themselves. For +example, if we wanted to see how many counties are in some of the states +comprising the Midwestern US, we could use the `midwest` data set that's +packaged with ggplot2 and draw a simple bar plot. + +``` r +library(ggplot2) + +ggplot(midwest, aes(x = state)) + + geom_bar() + + labs(x = "", y = "Number of counties") + + theme_minimal() + + theme(axis.text.x = element_text(size = 16), + axis.title.y = element_text(size = 14)) +``` + +![Count of counties per state for IL, IN, MI, OH, and WI](simple_bar-1.png) + +This is fine (provided that you can accept that Ohio is part of the +Midwest and Iowa isn't). However, we can easily strip away some of the +"chart junk" by removing unnecessary theme elements and labeling the +bars using `geom_text`. + +``` r +ggplot(midwest, aes(state)) + + geom_bar() + + geom_text(aes(y = ..count.., label = ..count..), stat = "count", + vjust = 0, nudge_y = 2, size = 8) + + expand_limits(y = 110) + + theme(panel.background = element_blank(), + panel.grid = element_blank(), + axis.line = element_blank(), + axis.ticks = element_blank(), + axis.title = element_blank(), + axis.text.y = element_blank(), + axis.text.x = element_text(size = 16)) + + labs(title = "Number of counties in Midwestern states") +``` + +![Counties per state (with counts displayed above each bar)](better_plot-1.png) + +There's still room for improvement---I'd consider rearranging the bars +based on something more meaningful than alphabetic order, and possibly +coloring them---but this simultaneously conveys more information than +the previous plot (objectively) and is less "cluttered" (subjectively). + +## How this works + +I'm surprised I'm still writing blog posts about ggplot2 after seven +years, but I continue to learn new things about it even after regular +use. Recently, I decided that it bothered me that there were "stats" +(like `stat_ecdf`) and "geoms" (like `geom_bar`), and I really didn't +understand the difference between them---they seemed interchange but not +identical. I finally looked into it and came across [this response on +StackOverflow](https://stackoverflow.com/a/44226841), which contained +the following quote from the [ggplot2 book](https://ggplot2-book.org/): + +> You only need to set one of stat and geom: every geom has a default +> stat, and every stat has a default geom. + +It turns out that "stats" and "geoms" *are* largely interchangeable, +because they're both wrappers around `layer()`, with different ways of +handling defaults. The code above works because I changed the `stat` +parameter of `geom_text` (which, according to [the +documentation](https://ggplot2.tidyverse.org/reference/geom_text.html), +defaults to `"identity"`) to `"count"`, which is the default `stat` of +`geom_bar`. Looking at [the documentation for +`stat_count`](https://ggplot2.tidyverse.org/reference/geom_bar.html), we +see that it provides two *computed variables*, and we use use the +computed `count` variable in our aesthetics for `geom_text` to provide +both the vertical position and label. + +Getting my head around this has helped me iterate through analyses more +quickly. For instance, I frequently use `stat_ecdf` to get a handle on +distributions, and now I can label these plots easily. Sticking with +data about the Midwest, here's the ECDF of population density for +Midwestern counties, with a few values highlighted. + +``` r +ggplot(midwest, aes(popdensity)) + + stat_ecdf() + # This could also be `geom_step(stat = "ecdf")` + geom_text(aes(label = sprintf("(%.0f: %.0f%%)", ..x.., floor(100 * ..y..))), + stat = "ecdf", hjust = 1, vjust = 0, check_overlap = TRUE, size = 5) + + expand_limits(x = -15000) + + scale_y_continuous(labels = scales::label_percent()) + + theme_minimal() + + labs(x = "Population density", y = "CDF") +``` + +![The curve of the CDF of population density in Midwestern counties](ecdf-1.png) + +I wouldn't call this a *beautiful* graphic, but visualizations like this are +often *useful*, [especially when getting a handle on a new data set]({{< ref +"/posts/tufte-plot/index.md" >}}). Here we see that over a third of +Midwestern counties have population densities fully two orders of magnitude +smaller than the most densely populated county, and we've only had to draw a +single plot. + +It's hard to justify putting much effort into producing plots that +aren't meant to be shared, and a typical data analysis will involve +creating dozens of plots that are only useful for the person analyzing +the data. Without understanding stats and geoms, I would never have +bothered labeling an ECDF plot; "quick and dirty" needs to be quick +after all. On the other hand, labeling the values in a bar chart is +something that one should do when preparing publication-quality +graphics. GGplot2 is useful in both phases of a project. + +In the words of Alan Kay, ["simple things should be simple, complex +things should be +possible."](https://www.quora.com/What-is-the-story-behind-Alan-Kay-s-adage-Simple-things-should-be-simple-complex-things-should-be-possible) +GGplot2 does both of these consistently. Occasionally, it even makes +complex things simple. diff --git a/content/posts/labeling-ggplots/simple_bar-1.png b/content/posts/labeling-ggplots/simple_bar-1.png Binary files differ. diff --git a/content/posts/reproducible-research/index.md b/content/posts/reproducible-research/index.md @@ -0,0 +1,104 @@ +--- +title: "Reproducible research fail" +description: One of the mistakes I made in data collection. +date: 2015-10-01 +categories: +- Data Science +- Science +tags: +- Psychology +--- + +In most of the psychology subdisciplines under the umbrella of “cognitive +psychology” (e.g., language, memory, perception, etc.), researchers use +programs to collect data from participants (c.f. social psychology, which often +uses surveys instead). These are usually simple programs that display words or +pictures and record responses; if you’ve ever taken an introductory psychology +course, you were surely made to sit through a few of these. Although there are +a few tools that allow psychologists to create experiments without writing +their own code, most of us (at least in the departments with which I’ve been +affiliated) program their own studies. + +The majority of psych grad students start their Ph.D.s with little programming +experience, so it’s not surprising that coding errors sometimes affect +research. As a first year grad student who’d previously worked as a programmer, +I was determined to do better. Naturally, I made a ton of mistakes, and I want +to talk about one of them: a five-year-old mistake I’m dealing with *today*. + +Like many mistakes, I made this one while trying to avoid another. I noticed +that it was common for experiments to fail to record details about trials which +later turned out to be important. For instance, a researcher could run a +[visual search](http://www.scholarpedia.org/article/Visual_search) experiment +and not save the locations and identities of the randomly-selected +“distractors”, but later be unable to see if there was an effect of +[crowding](http://www.scholarpedia.org/article/Visual_search#Spatial_layout.2C_density.2C_crowding). +It was fairly common to fail to record response times while looking for an +effect on task accuracy, but then be unable to show that the observed effect +was not due to a speed-accuracy tradeoff. + +I decided that I’d definitely record everything. This wasn’t itself a mistake. + +Since I program my experiments in Python and using an object-oriented design -- +all of the data necessary to display a trial was encapsulated in instances of +the Trial class -- I decided that the best way to save *everything* was to +serialize these objects using Python’s pickle module. This way, if I added +additional members to Trial, I didn’t have to remember to explicitly include +them in the experiment’s output. I also smugly knew that I didn’t have to worry +about rounding errors since everything was stored in machine precision (because +*that* matters). + +That’s not quite where I went wrong. + +The big mistake was using this approach but failing to follow best practices +for reproducible research. It’s now incredibly difficult to unpickle the data +from my studies because the half dozen modules necessary to run my code have +all been updated since I wrote these programs. I didn’t even record the version +numbers of anything. I’ve had to write a bunch of hacks and manually install a +few old modules just to get my data back. + +Today it’s a lot easier to do things the right way. If you’re programming in +Python, you can use the [Anaconda +distribution](https://www.continuum.io/why-anaconda) to create environments +that keep their own copies of your code’s dependencies. These won’t get updated +with the rest of the system, so you should be able to go back and run things +later. A language-agnostic approach could utilize [Docker +images](https://www.docker.com/), or go a step further and run each experiment +in its own virtual machine (although care should be taken to ensure adequate +system performance). + +I do feel like I took things too far by pickling my Python objects. Even if I +had used anaconda, I’d have been committing myself to either performing all my +analyses in Python, or performing the intermediate step of writing a script to +export my output (giving myself another chance to introduce a coding error). +Using a generic output file format (e.g., a simple CSV file) affords more +flexibility in choosing analysis tools, and also better supports data-sharing. + +I still think it’s important to record “everything”, but there are better ways +to do it. An approach I began to use later was to write separate programs for +generating trials and displaying them. The first program handles +counterbalancing and all the logic supporting randomness; it then creates a CSV +for each participant. The second program simply reads these CSVs and dutifully +displays trials based *only* on the information they contain, ensuring that no +aspect of a trial (e.g., the color of a distractor item) could be forgotten. + +The display program records responses from participants and combines them with +trial info to create simple output files for analysis. To further protect +against data loss, it also records, with timestamps, a simple log of every +event that occurs during the experiment. The log file includes the experiment +start time, keypresses and input events, changes to the display, and anything +else that could happen. Between the input CSVs and this log file, it’s possible +to recreate exactly what happened during the course of the study -- even if the +information wasn’t in the “simple” output files. I make sure that the output is +written to disk frequently to ensure that nothing is lost in case of a system +crash. This approach also makes it easy to restart at a specific point, which +is useful for long studies and projects using fMRI (the scanner makes it easy +to have false-starts). + +My position at the FAA doesn’t involve programming a lot of studies. We do most +of our work on fairly complicated simulator configurations (I have yet to do a +study that didn’t include a diagram describing the servers involved), and there +are a lot of good programmers around who are here specifically to keep these +running. I hope this lesson is useful for anybody else who might be collecting +data from people, whether it’s in the context of a psychology study or user +testing. + diff --git a/content/posts/riddler-2/index.Rmd b/content/posts/riddler-2/index.Rmd @@ -0,0 +1,101 @@ +--- +title: "Riddler #2" +author: "Eamon Caddigan" +date: "2015-12-19" +output: html_document +layout: post +summary: Solving and simulating a probability puzzle. +categories: R stats +--- + +FiveThirtyEight has a new puzzle feature called The Riddler. This week they posted [their second puzzle](http://fivethirtyeight.com/features/which-geyser-gushes-first/), which involves probability: + +> You arrive at the beautiful Three Geysers National Park. You read a placard +> explaining that the three eponymous geysers — creatively named A, B and C — +> erupt at intervals of precisely two hours, four hours and six hours, +> respectively. However, you just got there, so you have no idea how the three +> eruptions are staggered. Assuming they each started erupting at some +> independently random point in history, what are the probabilities that A, B +> and C, respectively, will be the first to erupt after your arrival? + +### Analytic solution + +Responses were due last night at midnight, so I hope I'm not spoiling anything by sharing mine. + +When you arrive at the park, the first eruption of geyser A is likely to occur at any time within the next two hours with a uniform probability. Denoting the number of hours until the first eruption of the geyser as “A”, A ~ Uniform(0, 2). Similarly, B ~ Uniform(0, 4) and C ~ Uniform(0, 6). + +To compute the probability of geyser A erupting first, separately consider the cases where geysers B and C do and do not erupt within the first two hours of waiting. + +Using Bayes Theorem: + +$$Pr(A first \cap B<2, C<2) = Pr(A first | B < 2, C < 2) Pr(B < 2, C < 2)$$ + +Assuming independence of the geysers: + +$$= Pr(A first | B < 2, C < 2) Pr(B < 2) Pr(C < 2)$$ + +Considering the case here, in which all three geysers erupt in the first two hours, the probability of any geyser erupting first is 1/3. The probability of geysers B and C erupting in the first two hours is easy to calculate. + +$$= (1/3) \times (1/2) \times (1/3) = 1/18$$ + +Using similar logic: + +$$Pr(A first \cap B > 2, C < 2) = (1/2) \times (1/2) \times (1/3) = 1/12\\ +Pr(A first \cap B < 2, C > 2) = (1/2) \times (1/2) \times (2/3) = 1/6\\ +Pr(A first \cap B > 2, C > 2) = 1 \times (1/2) \times (2/3) = 1/3$$ + +These disjoint events partition the sample space, so the law of total probability dictates: + +$$Pr(A first) = 1/18 + 1/12 + 1/6 + 1/3 = 23/36 \approx 0.6389$$ + +Do the same thing to calculate the probability of geyser B erupting before the others: + +$$Pr(B first \cap B < 2, C < 2) = (1/3) \times (1/2) \times (1/3) = 1/18\\ +Pr(B first \cap B < 2, C > 2) = (1/2) \times (1/2) \times (2/3) = 1/6$$ + +Note that when geyser B does not erupt within the first two hours, another geyser is guaranteed to erupt before it: + +$$Pr(B first \cap B > 2, C < 2) = 0\\ +Pr(B first \cap B > 2, C > 2) = 0$$ + +Therefore: + +$$Pr(B first) = 1/18 + 1/6 = 4/18 \approx 0.2222$$ + +And geyser C is similar: + +$$Pr(C first \cap B < 2, C < 2) = (1/3) \times (1/2) \times (1/3) = 1/18\\ +Pr(C first \cap B > 2, C < 2) = (1/2) \times (1/2) \times (1/3) = 1/12\\ +Pr(C first) = 1/18 + 1/12 = 5/36 \approx 0.1389$$ + +### Quick simulation + +It never hurts to check results with a simulation. After all, math is hard and programming is easy. + +```{r, warning=FALSE, message=FALSE} +library(dplyr) +library(ggplot2) + +numSamples <- 1e6 + +# Generate random wait times for each geyser's next eruption +geysers <- data_frame(A = runif(numSamples, 0, 2), + B = runif(numSamples, 0, 4), + C = runif(numSamples, 0, 6)) +geyserNames <- colnames(geysers) + +# Identify the geyser with the smallest time-to eruption +geysers <- geysers %>% + mutate(first_geyser = geyserNames[max.col(-geysers[, geyserNames])]) + +# Plot the results +geysers %>% + ggplot(aes(x = first_geyser)) + geom_bar() + +# Count observations and estimate probabilities +geysers %>% + count(first_geyser) %>% + mutate(prob_first = n / numSamples) +``` + +Close enough! diff --git a/content/posts/riddler-2/index.md b/content/posts/riddler-2/index.md @@ -0,0 +1,130 @@ +--- +title: "Riddler #2" +date: "2015-12-19" +description: Solving and simulating a probability puzzle. +categories: +- Data Science +tags: +- Statistics +katex: true +--- + +FiveThirtyEight has a new puzzle feature called The Riddler. This week they +posted [their second +puzzle](http://fivethirtyeight.com/features/which-geyser-gushes-first/), which +involves probability: + +> You arrive at the beautiful Three Geysers National Park. You read a placard +> explaining that the three eponymous geysers — creatively named A, B and C — +> erupt at intervals of precisely two hours, four hours and six hours, +> respectively. However, you just got there, so you have no idea how the three +> eruptions are staggered. Assuming they each started erupting at some +> independently random point in history, what are the probabilities that A, B +> and C, respectively, will be the first to erupt after your arrival? + +### Analytic solution + +Responses were due last night at midnight, so I hope I'm not spoiling anything +by sharing mine. + +When you arrive at the park, the first eruption of geyser A is likely to occur +at any time within the next two hours with a uniform probability. Denoting the +number of hours until the first eruption of the geyser as “A”, A ~ Uniform(0, +2). Similarly, B ~ Uniform(0, 4) and C ~ Uniform(0, 6). + +To compute the probability of geyser A erupting first, separately consider the +cases where geysers B and C do and do not erupt within the first two hours of +waiting. + +Using Bayes Theorem: + +$$Pr(A first \cap B<2, C<2) = Pr(A first | B < 2, C < 2) Pr(B < 2, C < 2)$$ + +Assuming independence of the geysers: + +$$= Pr(A first | B < 2, C < 2) Pr(B < 2) Pr(C < 2)$$ + +Considering the case here, in which all three geysers erupt in the first two +hours, the probability of any geyser erupting first is 1/3. The probability of +geysers B and C erupting in the first two hours is easy to calculate. + +$$= (1/3) \times (1/2) \times (1/3) = 1/18$$ + +Using similar logic: + +$$Pr(A first \cap B > 2, C < 2) = (1/2) \times (1/2) \times (1/3) = 1/12$$ +$$Pr(A first \cap B < 2, C > 2) = (1/2) \times (1/2) \times (2/3) = 1/6$$ +$$Pr(A first \cap B > 2, C > 2) = 1 \times (1/2) \times (2/3) = 1/3$$ + +These disjoint events partition the sample space, so the law of total +probability dictates: + +$$Pr(A first) = 1/18 + 1/12 + 1/6 + 1/3 = 23/36 \approx 0.6389$$ + +Do the same thing to calculate the probability of geyser B erupting before the +others: + +$$Pr(B first \cap B < 2, C < 2) = (1/3) \times (1/2) \times (1/3) = 1/18$$ +$$Pr(B first \cap B < 2, C > 2) = (1/2) \times (1/2) \times (2/3) = 1/6$$ + +Note that when geyser B does not erupt within the first two hours, another +geyser is guaranteed to erupt before it: + +$$Pr(B first \cap B > 2, C < 2) = 0$$ +$$Pr(B first \cap B > 2, C > 2) = 0$$ + +Therefore: + +$$Pr(B first) = 1/18 + 1/6 = 4/18 \approx 0.2222$$ + +And geyser C is similar: + +$$Pr(C first \cap B < 2, C < 2) = (1/3) \times (1/2) \times (1/3) = 1/18$$ +$$Pr(C first \cap B > 2, C < 2) = (1/2) \times (1/2) \times (1/3) = 1/12$$ +$$Pr(C first) = 1/18 + 1/12 = 5/36 \approx 0.1389$$ + +### Quick simulation + +It never hurts to check results with a simulation. After all, math is hard and +programming is easy. + +```r +library(dplyr) +library(ggplot2) + +numSamples <- 1e6 + +# Generate random wait times for each geyser's next eruption +geysers <- data_frame(A = runif(numSamples, 0, 2), + B = runif(numSamples, 0, 4), + C = runif(numSamples, 0, 6)) +geyserNames <- colnames(geysers) + +# Identify the geyser with the smallest time-to eruption +geysers <- geysers %>% + mutate(first_geyser = geyserNames[max.col(-geysers[, geyserNames])]) + +# Plot the results +geysers %>% + ggplot(aes(x = first_geyser)) + geom_bar() +``` + +![simulation results](unnamed-chunk-1-1.png) + +```r +# Count observations and estimate probabilities +geysers %>% + count(first_geyser) %>% + mutate(prob_first = n / numSamples) +``` +``` +## Source: local data frame [3 x 3] +## +## first_geyser n prob_first +## 1 A 640093 0.640093 +## 2 B 221439 0.221439 +## 3 C 138468 0.138468 +``` + +Close enough! + diff --git a/content/posts/riddler-2/unnamed-chunk-1-1.png b/content/posts/riddler-2/unnamed-chunk-1-1.png Binary files differ. diff --git a/content/posts/rmarkdown-hugo/index.md b/content/posts/rmarkdown-hugo/index.md @@ -0,0 +1,150 @@ +--- +title: Using RStudio and RMarkdown with Hugo +description: One approach to blogging with RMarkdown and Hugo. +date: 2022-07-10T17:03:47-04:00 +draft: False +categories: +- Meta +- Programming +- Data Science +tags: +- R +--- + +I converted my site to [Hugo](https://gohugo.io/) recently, and I finally +figured out a workflow to create blog posts using RMarkdown from inside +RStudio. None of the instructions that I found online worked the way I +wanted (for instance, [hugodown](https://hugodown.r-lib.org/) requires a +specific out-of-date version of Hugo), so I'm sharing my workflow in case +it's useful for anybody else. + +## Things to do once + +There are a few basic setup steps that should only need to be performed +once. + +### Setup Hugo + +Hugo setup is beyond the scope of this post. I mostly followed [this +quickstart guide](https://gohugo.io/getting-started/quick-start/). + +### Set a `HUGO_ROOT` environment variable + +Create a new environment variable `HUGO_ROOT` and set it to the directory in +which you created your site. In my case, I'm using: + +```bash +HUGO_ROOT="~/web/www.eamoncaddigan.net/" +``` + +There are (too) many ways to set an environment variable. I edited +`~/.profile`, but `~/.bashrc` will work for many folks. Using `~/.Renviron` +would also be appropriate if you're not planning to use this variable for +anything outside of R and RStudio. + +### Create a location for RMarkdown files outside of Hugo + +You could keep your `.rmd` files in your Hugo site, and it might even be +possible to have Hugo knit them for you. But since I'm currently on my third +static site generator, I wanted to use a separate git repository for blog +posts, outside of the rest of my site configuration. + +## Things to do for every post + +Here are the steps to take every time you create a new blog post. + +### Launch the Hugo server + +Running Hugo's built-in server lets you preview your post as you work on it. +Run the following command in the shell: + +```bash +hugo server -DF +``` + +When you initially run this in a terminal, it will print a URI at which you +can point your web browser, e.g., `http://localhost:1313/`. Go ahead and +open that in your browser. + +### Create a new RMarkdown file in RStudio + +When you create a new RMarkdown file in RStudio, you can fill in a title for +your post in the GUI, or you can do it later. It doesn't matter which output +format you select since we're going to change that in the next step. + +### Edit the RMarkdown YAML + +Here's the YAML block for my last post: + +```md +--- +title: "Labeling bar charts (and other graphics) in ggplot2" +description: "How to combine stats and geoms to simplify complex plots." +date: 2022-07-08T19:32:57-04:00 +draft: False +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +--- +``` + +Change the title, description, and date as appropriate for your post, and +set `draft` to `True` for now. + +The function used with `knit` is invoked when you press the "Knit" button in +RStudio. It specifies that the rendered content (a markdown file) is put in +`$HUGO_ROOT/content/posts`. + +The options passed to `output` tell `knitr` to generate Markdown output by +default. Preserving YAML is important because Hugo uses that to organize +posts, and the `markdown` variant has good code highlighting, etc. + +You might want to set `tags`, I ought to start doing that soon. + +### Set chunk and knit options + +Set `knitr` chunk and knit options in the first code chunk of the file: + +```r +knitr::opts_chunk$set( + echo = TRUE, + fig.path = file.path("figs", + sub("\\.Rmd$", "", + basename(rstudioapi::getActiveDocumentContext()$path)), + "") +) +knitr::opts_knit$set( + base.dir = file.path(Sys.getenv("HUGO_ROOT"), "static"), + base.url = "/" +) +``` + +These options ensure that figures are put in the correct local directory, +and that the links will work online. This specific configuration places +figures in `http://example.com/figs/rmarkdown-filename/chunk-name-N.png`, +and you can tweak this as you see fit. You can pass additional named +arguments to `knitr::opts_chunk$set()` that you like, such as `fig.width`. + +### Write a good post + +If it's *really* good, please let me know about it! + +Clicking the Knit button in RStudio will create a new markdown file inside +your local Hugo site. The Hugo server will see the changes and generate a +new site, and your browser should refresh the site to display the changes +(Hugo injects special JavaScript to do this when you're previewing with its +server). + +### Finish up + +When you finish your post, set `draft` to `False` in the YAML, kill the Hugo +server, and run `hugo` (with no additional options) to generate your static +site. Upload that site to your host and feel good about freely sharing your +knowledge with the broader community. diff --git a/content/posts/sister-probability-puzzle/index.Rmd b/content/posts/sister-probability-puzzle/index.Rmd @@ -0,0 +1,180 @@ +--- +title: "Sister probability puzzle" +description: "My solution to a question about the probability of having a sister." +date: 2023-01-18T21:47:38-08:00 +draft: False +katex: True +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +--- + +```{r setup, include=FALSE} +knitr::opts_chunk$set( + echo = TRUE, + fig.path = file.path("figs", + sub("\\.Rmd$", "", + basename(rstudioapi::getActiveDocumentContext()$path)), + "") +) +knitr::opts_knit$set( + base.dir = file.path(Sys.getenv("HUGO_ROOT"), "static"), + base.url = "/" +) +``` + +A smart and talented friend, who's a fellow data scientist by profession, came +across a probability puzzle that's supposedly given in some job interviews for +data science roles. The problem asks the following: + +> Assume the distribution of children per family is such that the probability of +> having 0 children is 0.30, 1 child is 0.25, 2 children is 0.20, 3 children is +> 0.15, 4 children is 0.10, and 5 or more children is 0. Consider a random girl +> in the population of children. What is the probability that she has a sister? + +Checking her work, my friend disagreed with the answers she found online, and +wanted to know how I'd solve the problem. Since my solution seems to be +different than others I've found so far, I thought I'd share it with the whole +Internet, which will certainly tell me whether I'm wrong. + +## Simulating the problem + +I'll start with a simulation—I'm a bit more confident in my programming than my +probability theory (I've been doing it longer), and it makes some of the tricky +parts of the problem explicit. + +First, we'll simulate a random sample of _families_, since the problem gives us +probabilities in terms of _children per family_. After generating a pool of +random family sizes, we can use the binomial distribution to generate a random +number of girls for each family (naively assuming that the probability of a +child being a girl is 0.5). + +```{r simulate_families} +set.seed(232636039) +num_families <- 100000 + +family_size <- seq(0, 5) +p_family_size <- c(0.3, 0.25, 0.20, 0.15, 0.1, 0.0) + +girls_per_family <- sample(family_size, num_families, replace = TRUE, + prob = p_family_size) |> + (\(n) rbinom(num_families, size = n, prob = 0.5))() +``` + +If a family has more than two girls, these girls have sisters. The probability +that a randomly selected girl has a sister is approximated by the number of +girls with sisters divided by the total number of girls in our simulation. + +```{r estimate_p} +# If there is more than one girl in a family, these girls have sisters +girls_with_sisters <- sum(girls_per_family[girls_per_family > 1]) +girls_total <- sum(girls_per_family) + +(p_est <- girls_with_sisters / girls_total) +``` + +The code above estimates that the probability that a girl (sampled at random +from the _population of children_) has a sister is approximately `r round(p_est, +2)`. + +## Plotting the simulation + +Just for fun, let's plot the estimate as it develops over the number of +simulated families. This also helps us get a sense of how trustworthy the +estimate is—has it converged to a stable value, or is it still swinging around? +For this, I'll finally use parts of the [Tidyverse](https://www.tidyverse.org/). + +```{r load_tidyverse} +suppressPackageStartupMessages(library(dplyr)) +suppressPackageStartupMessages(library(ggplot2)) +``` + +```{r construct_df, cache=TRUE, dependson="simulate_families"} +sister_dat <- tibble(girls_per_family) |> + mutate(families = seq(n()), + has_sister = girls_per_family > 1, + total_girls = cumsum(girls_per_family), + girls_with_sisters = cumsum(girls_per_family * has_sister), + p_est = girls_with_sisters / total_girls) +``` + +```{r plot_estimate, cache=TRUE, dependson="construc_df"} +sister_dat |> + # We'll skip any beginning rows that were generated before we sampled girls, + # since 0/0 is undefined. + filter(total_girls > 0) |> + ggplot(aes(families, p_est)) + + geom_step() + + geom_hline(yintercept = 71/120, linetype = "dashed") + + scale_x_log10() + + theme_minimal() + + labs(x = "Number of random families", y = "Observed proportion of girls with sisters") +``` + +## Analytic solution + +If you're wondering how I chose a value for the dashed line, here's an analytic +solution to the puzzle. + +We'll let _S_ represent the event that a girl has a sister, _Fₙ_ represent the +event that a family has _n_ children, and _Cₙ_ represent the event that a girl +comes from a family of _n_ children (i.e., the girl has _n - 1_ siblings). By +the law of total probability: + +$$ \mathbb{P}(S) = \sum_{n} \mathbb{P}(S|C_n) \mathbb{P}(C_n) $$ + +The conditional probability that a girl from a family with _n_ children has a +sister is the compliment of the probability that all of her siblings are +brothers. Therefore: + +$$ \mathbb{P}(S|C_n) = 1 - \frac{1}{2^{n-1}} $$ + +For the next component, it's important to call out the fact that the problem +text gives us P(_Fₙ_) (the probability that a family has _n_ children), which is +**not the same** as P(_Cₙ_) (the probability that a child comes from a family +with _n_ children). I suspect that this trips some people up, and explains some +of the answers that are different than mine. + +To illustrate the difference, let's imagine that the probabilities were +constructed from a population of 100 families. Twenty five of these families +have one child, while only ten have four children. However, this arrangement +results in 25 children with no siblings, while 40 children would have 3 each. In +other words, a randomly selected _family_ is more likely to have one child than +four children, but a randomly selected _child_ is more likely to come from a +family with four children than a family with one child. Formalizing this +reasoning a bit, we find: + +$$ \mathbb{P}(C_n) = \frac{n \mathbb{P}(F_n)}{\sum_{m} m \mathbb{P}(F_m)} $$ + +With our terms defined, we'll use R once more to calculate _P(S)_: + +```{r calculate_p} +n <- family_size +fn <- p_family_size +s_given_cn <- 1 - 1/(2^(n-1)) +cn <- n * fn / sum(n * fn) +(s <- sum(s_given_cn * cn)) +``` + +This value is equal to `71/120`, and is quite close to what we found through +simulation—but only reliably so after generating around 10,000 families. + +## Concluding note + +I'm ambivalent about the practice of asking job applicants to solve probability +puzzles during interviews, but it's true that sometimes our intuitions can lead +us astray (e.g, confusing P(_Fₙ_) and P(_Cₙ_)), and this does come up in +real-life data analyses. When I find myself dealing with such situations, I'm +flexible in the approach I take: sometimes I try to find an exact solution using +probability theory first, but often I program a quick simulation instead. Most +of the time, I wind up doing both, because these approaches complement one +another: simulations are great because they force you to be explicit about the +assumptions that you're making about the problem, while analytic solutions give +exact answers and are insensitive to randomness. diff --git a/content/posts/sister-probability-puzzle/index.md b/content/posts/sister-probability-puzzle/index.md @@ -0,0 +1,186 @@ +--- +title: "Sister probability puzzle" +description: "My solution to a question about the probability of having a sister." +date: 2023-01-18T21:47:38-08:00 +draft: False +katex: True +knit: (function(input, ...) { + rmarkdown::render( + input, + output_dir = file.path(Sys.getenv("HUGO_ROOT"), "content/posts") + ) + }) +output: + md_document: + variant: markdown + preserve_yaml: true +categories: +- Data Science +tags: +- R +- Statistics +--- + +A smart and talented friend, who's a fellow data scientist by +profession, came across a probability puzzle that's supposedly given in +some job interviews for data science roles. The problem asks the +following: + +> Assume the distribution of children per family is such that the +> probability of having 0 children is 0.30, 1 child is 0.25, 2 children +> is 0.20, 3 children is 0.15, 4 children is 0.10, and 5 or more +> children is 0. Consider a random girl in the population of children. +> What is the probability that she has a sister? + +Checking her work, my friend disagreed with the answers she found +online, and wanted to know how I'd solve the problem. Since my solution +seems to be different than others I've found so far, I thought I'd share +it with the whole Internet, which will certainly tell me whether I'm +wrong. + +## Simulating the problem + +I'll start with a simulation---I'm a bit more confident in my +programming than my probability theory (I've been doing it longer), and +it makes some of the tricky parts of the problem explicit. + +First, we'll simulate a random sample of *families*, since the problem +gives us probabilities in terms of *children per family*. After +generating a pool of random family sizes, we can use the binomial +distribution to generate a random number of girls for each family +(naively assuming that the probability of a child being a girl is 0.5). + +``` r +set.seed(232636039) +num_families <- 100000 + +family_size <- seq(0, 5) +p_family_size <- c(0.3, 0.25, 0.20, 0.15, 0.1, 0.0) + +girls_per_family <- sample(family_size, num_families, replace = TRUE, + prob = p_family_size) |> + (\(n) rbinom(num_families, size = n, prob = 0.5))() +``` + +If a family has more than two girls, these girls have sisters. The +probability that a randomly selected girl has a sister is approximated +by the number of girls with sisters divided by the total number of girls +in our simulation. + +``` r +# If there is more than one girl in a family, these girls have sisters +girls_with_sisters <- sum(girls_per_family[girls_per_family > 1]) +girls_total <- sum(girls_per_family) + +(p_est <- girls_with_sisters / girls_total) +``` + + ## [1] 0.5878486 + +The code above estimates that the probability that a girl (sampled at +random from the *population of children*) has a sister is approximately +0.59. + +## Plotting the simulation + +Just for fun, let's plot the estimate as it develops over the number of +simulated families. This also helps us get a sense of how trustworthy +the estimate is---has it converged to a stable value, or is it still +swinging around? For this, I'll finally use parts of the +[Tidyverse](https://www.tidyverse.org/). + +``` r +suppressPackageStartupMessages(library(dplyr)) +suppressPackageStartupMessages(library(ggplot2)) +``` + +``` r +sister_dat <- tibble(girls_per_family) |> + mutate(families = seq(n()), + has_sister = girls_per_family > 1, + total_girls = cumsum(girls_per_family), + girls_with_sisters = cumsum(girls_per_family * has_sister), + p_est = girls_with_sisters / total_girls) +``` + +``` r +sister_dat |> + # We'll skip any beginning rows that were generated before we sampled girls, + # since 0/0 is undefined. + filter(total_girls > 0) |> + ggplot(aes(families, p_est)) + + geom_step() + + geom_hline(yintercept = 71/120, linetype = "dashed") + + scale_x_log10() + + theme_minimal() + + labs(x = "Number of random families", y = "Observed proportion of girls with sisters") +``` + +![A step graph shows the observed proportion of girls with sisters +converging to ~0.59 as the number of simulated families increases](plot_estimate-1.png) + +## Analytic solution + +If you're wondering how I chose a value for the dashed line, here's an +analytic solution to the puzzle. + +We'll let *S* represent the event that a girl has a sister, *Fₙ* +represent the event that a family has *n* children, and *Cₙ* represent +the event that a girl comes from a family of *n* children (i.e., the +girl has *n - 1* siblings). By the law of total probability: + +$$ \mathbb{P}(S) = \sum_{n} \mathbb{P}(S|C_n) \mathbb{P}(C_n) $$ + +The conditional probability that a girl from a family with *n* children +has a sister is the compliment of the probability that all of her +siblings are brothers. Therefore: + +$$ \mathbb{P}(S|C_n) = 1 - \frac{1}{2^{n-1}} $$ + +For the next component, it's important to call out the fact that the +problem text gives us P(*Fₙ*) (the probability that a family has *n* +children), which is **not the same** as P(*Cₙ*) (the probability that a +child comes from a family with *n* children). I suspect that this trips +some people up, and explains some of the answers that are different than +mine. + +To illustrate the difference, let's imagine that the probabilities were +constructed from a population of 100 families. Twenty five of these +families have one child, while only ten have four children. However, +this arrangement results in 25 children with no siblings, while 40 +children would have 3 each. In other words, a randomly selected *family* +is more likely to have one child than four children, but a randomly +selected *child* is more likely to come from a family with four children +than a family with one child. Formalizing this reasoning a bit, we find: + +$$ \mathbb{P}(C_n) = \frac{n \mathbb{P}(F_n)}{\sum_{m} m \mathbb{P}(F_m)} $$ + +With our terms defined, we'll use R once more to calculate *P(S)*: + +``` r +n <- family_size +fn <- p_family_size +s_given_cn <- 1 - 1/(2^(n-1)) +cn <- n * fn / sum(n * fn) +(s <- sum(s_given_cn * cn)) +``` + + ## [1] 0.5916667 + +This value is equal to `71/120`, and is quite close to what we found +through simulation---but only reliably so after generating around 10,000 +families. + +## Concluding note + +I'm ambivalent about the practice of asking job applicants to solve +probability puzzles during interviews, but it's true that sometimes our +intuitions can lead us astray (e.g, confusing P(*Fₙ*) and P(*Cₙ*)), and this +does come up in real-life data analyses. When I find myself dealing with +such situations, I'm flexible in the approach I take: [sometimes I try to +find an exact solution using probability theory first]({{< ref +"posts/riddler-2/index.md" >}}), but often I program a quick simulation +instead. Most of the time, I wind up doing both, because these approaches +complement one another: simulations are great because they force you to be +explicit about the assumptions that you're making about the problem, while +analytic solutions give exact answers and are insensitive to randomness. diff --git a/content/posts/sister-probability-puzzle/plot_estimate-1.png b/content/posts/sister-probability-puzzle/plot_estimate-1.png Binary files differ. diff --git a/content/posts/tufte-plot/graph_1-1.png b/content/posts/tufte-plot/graph_1-1.png Binary files differ. diff --git a/content/posts/tufte-plot/graph_2-1.png b/content/posts/tufte-plot/graph_2-1.png Binary files differ. diff --git a/content/posts/tufte-plot/graph_3-1.png b/content/posts/tufte-plot/graph_3-1.png Binary files differ. diff --git a/content/posts/tufte-plot/index.Rmd b/content/posts/tufte-plot/index.Rmd @@ -0,0 +1,185 @@ +--- +title: "Recreating a Tufte Slopegraph" +author: "Eamon Caddigan" +date: "2018-07-05" +output: md_document +--- + +```{r setup, include=FALSE} +knitr::opts_chunk$set(echo = TRUE) +``` +```{r load_libraries, include=FALSE, warning=FALSE, message=FALSE} +#extrafont::loadfonts(device="win") +suppressPackageStartupMessages(library(tibble)) +suppressPackageStartupMessages(library(dplyr)) +suppressPackageStartupMessages(library(ggplot2)) +suppressPackageStartupMessages(library(ggrepel)) +``` + +Recently on Twitter, data visualization guru Edward R. Tufte wrote that graphics produced by R are not “publication ready”. His proposed workflow is to use statistical software to create an initial version of a plot, and then make final improvements in Adobe Illustrator. + +I disagree with this advice. First I’ll show the steps a data analyst might take to create a high-quality graphic entirely in R. Then, I’ll explain why I think this is a better approach. + +## Publication quality graphics in R + +Page 158 of Tufte’s classic book, [The Visual Display of Quantitative Information (2nd ed.)](https://www.edwardtufte.com/tufte/books_vdqi), features a “slope graph” that shows the change in government receipts for several countries between 1970 and 1979. Below are the first few rows of these data in a [tidy data frame](https://www.jstatsoft.org/article/view/v059i10), `receiptData`, along with a quick and dirty slopegraph. + +```{r receipt_data, echo=FALSE} +receiptData <- tribble( + ~country, ~year, ~receipts, + "Belgium", 1970L, 35.2, + "Belgium", 1979L, 43.2, + "Britain", 1970L, 40.7, + "Britain", 1979L, 39.0, + "Canada", 1970L, 35.2, + "Canada", 1979L, 35.8, + "Finland", 1970L, 34.9, + "Finland", 1979L, 38.2, + "France", 1970L, 39.0, + "France", 1979L, 43.4, + "Germany", 1970L, 37.5, + "Germany", 1979L, 42.9, + "Greece", 1970L, 26.8, + "Greece", 1979L, 30.6, + "Italy", 1970L, 30.4, + "Italy", 1979L, 35.7, + "Japan", 1970L, 20.7, + "Japan", 1979L, 26.6, + "Netherlands", 1970L, 44.0, + "Netherlands", 1979L, 55.8, + "Norway", 1970L, 43.5, + "Norway", 1979L, 52.2, + "Spain", 1970L, 22.5, + "Spain", 1979L, 27.1, + "Sweden", 1970L, 46.9, + "Sweden", 1979L, 57.4, + "Switzerland", 1970L, 26.5, + "Switzerland", 1979L, 33.2, + "United States", 1970L, 30.3, + "United States", 1979L, 32.5 + ) + +receiptData %>% + head(6) %>% + knitr::kable() +``` +```{r graph_1} +ggplot(receiptData, aes(year, receipts, group = country)) + + geom_line() + + geom_text_repel(aes(label = country)) + + labs(x = "Year", y = "Government receipts as percentage of GDP") +``` + +This plot is not attractive, but it is useful for getting a handle on the data. Whether [iterating through an exploratory data analysis]({{< ref "/posts/2015-09-09-data-science.md" >}}) or preparing a graphic for publication, analysts will create many ugly graphics on the path to settling on a design and refining it. + +For our first round of improvements, we can change the aspect ratio of the graphic and arrange the country labels so they don’t overlap with the data. We should also remove the “chart junk” in the background, such as the background grid, and label only the years of interest on the x-axis. + +```{r graph_2, fig.height=8, fig.width=5} +ggplot(receiptData, aes(year, receipts, group = country)) + + geom_line() + + geom_text_repel(aes(label = country), + data = filter(receiptData, year == 1970), + nudge_x = -0.5, hjust = 1, + direction = "y", size = 5) + + geom_text_repel(aes(label = country), + data = filter(receiptData, year == 1979), + nudge_x = 0.5, hjust = 0, + direction = "y", size = 5) + + scale_x_continuous(breaks = c(1970, 1979), limits = c(1966, 1983)) + + theme(panel.background = element_blank(), + axis.title = element_text(size = 16), + axis.text = element_text(size = 12)) + + labs(x = "Year", y = "Government receipts as percentage of GDP") +``` + +The [ggrepel](https://github.com/slowkow/ggrepel) package has done a great job preventing the labels from overlapping; I usually use `geom_text_repel()` instead of `geom_text()` during exploratory data analysis. Here, however, the segments connecting the labels to data points create confusing clutter. While these can be removed within the function, our final figure will be easier to understand if we nudge labels manually so that they’re as close to their data as possible. + +We can also drop the axes; the year labels will go right above the data, and we’ll show each country’s value next to its label. Since we’re losing the axis titles, we’ll also embed a caption in this version of the graphic. + +Finally, we’ll change the typeface. Since we’re trying to make something that would please Tufte, we’ll use a serif font. If you haven’t done so before, you may need to run `loadfonts()` from the [extrafont package](https://github.com/wch/extrafont) to tell R how to find system fonts. We’ll also further boost our “data-ink ratio” by making the lines thinner. + +```{r graph_3, fig.height=8, fig.width=8} +labelAdjustments <- tribble( + ~country, ~year, ~nudge_y, + "Netherlands", 1970L, 0.3, + "Norway", 1970L, -0.2, + "Belgium", 1970L, 0.9, + "Canada", 1970L, -0.1, + "Finland", 1970L, -0.8, + "Italy", 1970L, 0.4, + "United States", 1970L, -0.5, + "Greece", 1970L, 0.4, + "Switzerland", 1970L, -0.3, + "France", 1979L, 0.8, + "Germany", 1979L, -0.7, + "Britain", 1979L, 0.1, + "Finland", 1979L, -0.1, + "Canada", 1979L, 0.4, + "Italy", 1979L, -0.5, + "Switzerland", 1979L, 0.2, + "United States", 1979L, -0.1, + "Spain", 1979L, 0.3, + "Japan", 1979L, -0.2 + ) + +receiptData <- left_join(receiptData, labelAdjustments, + by = c("country", "year")) %>% + mutate(receipts_nudged = ifelse(is.na(nudge_y), 0, nudge_y) + receipts) + +update_geom_defaults("text", list(family = "Georgia", size = 4.0)) +ggplot(receiptData, aes(year, receipts, group = country)) + + # Slope lines + geom_line(size = 0.1) + + # Country names (manually nudged) + geom_text(aes(year, receipts_nudged, label = country), + data = filter(receiptData, year == 1970), + hjust = 1, nudge_x = -3) + + geom_text(aes(year, receipts_nudged, label = country), + data = filter(receiptData, year == 1979), + hjust = 0, nudge_x = 3) + + # Data values + geom_text(aes(year, receipts_nudged, label = sprintf("%0.1f", receipts)), + data = filter(receiptData, year == 1970), + hjust = 1, nudge_x = -0.5) + + geom_text(aes(year, receipts_nudged, label = sprintf("%0.1f", receipts)), + data = filter(receiptData, year == 1979), + hjust = 0, nudge_x = 0.5) + + # Column labels + annotate("text", x = c(1970, 1979) + c(-0.5, 0.5), + y = max(receiptData$receipts) + 3, + label = c("1970", "1979"), + hjust = c(1, 0)) + + # Plot annotation + annotate("text", x = 1945, y = 58, hjust = 0, vjust = 1, + label = paste("Current Receipts of Government as a", + "Percentage of Gross Domestic\nProduct, 1970 and 1979", + sep = "\n"), + family = "Georgia", size = 4.0) + + coord_cartesian(xlim = c(1945, 1990)) + + theme(panel.background = element_blank(), + axis.title = element_blank(), + axis.text = element_blank(), + axis.ticks = element_blank()) +``` + +## Why it’s worth it + +It took several iterations to get the aesthetics of this plot just right, while an adept user of a graphics editor would be able to recreate it in minutes. However, this initial time savings obscures several advantages to completing this process in code as opposed to switching to a tool like Illustrator. + +### R is free software + +All of the programs I used to create this graphic (and share it with you) are [free software](https://www.fsf.org/about/what-is-free-software), unlike Adobe’s terrific but expensive Illustrator. [Inkscape](https://inkscape.org/en/) is an excellent open source alternative, but it is not as powerful as its commercial competitor. On the other hand, [R](https://www.r-project.org/) is arguably the most advanced and well-supported statistical analysis tool. Even if the politics of the open source movement aren’t important, free is a better price-point. + +### Code can be reproduced + +Anybody who wants to recreate the final figure using a different set of countries, a new pair of years, or a favored economic indicator can run the code above on their own data. With minimal tweaking, they will have a graphic with aesthetics identical to those above. Reproducing this graphic using a multi-tool workflow is more complicated; a novice would first need to learn how to create a “rough draft” of it in software, and then learn how to use a graphics editor to improve its appearance. + +### Scripted graphics are easier to update + +Imagine that an analyst discovered a mistake in their analysis that needed to be corrected. Or imagine the less stressful situation where a colleague suggested replacing some of the countries in the figure. In such cases, the work of creating the graphic will need to be redone: the analyst will need to add data or correct errors, generate a new plot in software, and re-edit the plot in their graphics editor. Using a scripted, code-based workflow, the analyst would only need to do the first step, and possibly update some manual tweaks. The initial time savings afforded by a graphics editor disappears after the first time this happens. + +### Automation prevents errors + +Not only does scripted workflow make it easier to deal with errors, it guards against them. When analysts adjust graphic elements in a GUI, there’s a risk of mistakenly moving, deleting, or mislabeling data points. Such mistakes are difficult to detect, but code-based workflows avoid these risks; if the data source and analysis are error-free, then the graphic will also be. + +These considerations are among the reasons why scripted analyses are [considered best practice](https://peerj.com/preprints/3210/) in statistical analysis. Most of Tufte’s advice on creating graphics is excellent, but I recommend ignoring his suggestion to make the final edits in a program like Illustrator. Learning how to make polished graphics in software will ultimately save analysts time and help them avoid mistakes. +\ No newline at end of file diff --git a/content/posts/tufte-plot/index.md b/content/posts/tufte-plot/index.md @@ -0,0 +1,228 @@ +--- +title: "Recreating a Tufte Slope Graph" +description: Publication-ready graphics should be created in code, not a graphics editor. +date: 2018-07-22 +categories: +- Programming +- Data Science +tags: +- R +- Dataviz +--- + +Recently on Twitter, data visualization guru Edward R. Tufte wrote that +graphics produced by R are not “publication ready”. His proposed +workflow is to use statistical software to create an initial version of +a plot, and then make final improvements in Adobe Illustrator. + +I disagree with this advice. First I’ll show the steps a data analyst +might take to create a high-quality graphic entirely in R. Then, I’ll +explain why I think this is a better approach. + +## Publication quality graphics in R + +Page 158 of Tufte’s classic book, [The Visual Display of Quantitative +Information (2nd ed.)](https://www.edwardtufte.com/tufte/books_vdqi), +features a “slope graph” that shows the change in government receipts +for several countries between 1970 and 1979. Below are the first few +rows of these data in a [tidy data +frame](https://www.jstatsoft.org/article/view/v059i10), `receiptData`, +along with a quick and dirty slopegraph. + +|country | year| receipts| +|:-------|----:|--------:| +|Belgium | 1970| 35.2| +|Belgium | 1979| 43.2| +|Britain | 1970| 40.7| +|Britain | 1979| 39.0| +|Canada | 1970| 35.2| +|Canada | 1979| 35.8| + +```r +ggplot(receiptData, aes(year, receipts, group = country)) + + geom_line() + + geom_text_repel(aes(label = country)) + + labs(x = "Year", y = "Government receipts as percentage of GDP") +``` + +![A quick and dirty slopegraph](graph_1-1.png) + +This plot is not attractive, but it is useful for getting a handle on the +data. Whether [iterating through an exploratory data analysis]({{< ref +"/posts/art-of-data-science/index.md" >}}) or preparing a graphic for +publication, analysts will create many ugly graphics on the path to settling +on a design and refining it. + +For our first round of improvements, we can change the aspect ratio of +the graphic and arrange the country labels so they don’t overlap with +the data. We should also remove the “chart junk” in the background, such +as the background grid, and label only the years of interest on the +x-axis. + +```r +ggplot(receiptData, aes(year, receipts, group = country)) + + geom_line() + + geom_text_repel(aes(label = country), + data = filter(receiptData, year == 1970), + nudge_x = -0.5, hjust = 1, + direction = "y", size = 5) + + geom_text_repel(aes(label = country), + data = filter(receiptData, year == 1979), + nudge_x = 0.5, hjust = 0, + direction = "y", size = 5) + + scale_x_continuous(breaks = c(1970, 1979), limits = c(1966, 1983)) + + theme(panel.background = element_blank(), + axis.title = element_text(size = 16), + axis.text = element_text(size = 12)) + + labs(x = "Year", y = "Government receipts as percentage of GDP") +``` + +![A better but still imperfect graphic](graph_2-1.png) + +The [ggrepel](https://github.com/slowkow/ggrepel) package has done a +great job preventing the labels from overlapping; I usually use +`geom_text_repel()` instead of `geom_text()` during exploratory data +analysis. Here, however, the segments connecting the labels to data +points create confusing clutter. While these can be removed within the +function, our final figure will be easier to understand if we nudge +labels manually so that they’re as close to their data as possible. + +We can also drop the axes; the year labels will go right above the data, +and we’ll show each country’s value next to its label. Since we’re +losing the axis titles, we’ll also embed a caption in this version of +the graphic. + +Finally, we’ll change the typeface. Since we’re trying to make something +that would please Tufte, we’ll use a serif font. If you haven’t done so +before, you may need to run `loadfonts()` from the [extrafont +package](https://github.com/wch/extrafont) to tell R how to find system +fonts. We’ll also further boost our “data-ink ratio” by making the lines +thinner. + +```r +labelAdjustments <- tribble( + ~country, ~year, ~nudge_y, + "Netherlands", 1970L, 0.3, + "Norway", 1970L, -0.2, + "Belgium", 1970L, 0.9, + "Canada", 1970L, -0.1, + "Finland", 1970L, -0.8, + "Italy", 1970L, 0.4, + "United States", 1970L, -0.5, + "Greece", 1970L, 0.4, + "Switzerland", 1970L, -0.3, + "France", 1979L, 0.8, + "Germany", 1979L, -0.7, + "Britain", 1979L, 0.1, + "Finland", 1979L, -0.1, + "Canada", 1979L, 0.4, + "Italy", 1979L, -0.5, + "Switzerland", 1979L, 0.2, + "United States", 1979L, -0.1, + "Spain", 1979L, 0.3, + "Japan", 1979L, -0.2 + ) + +receiptData <- left_join(receiptData, labelAdjustments, + by = c("country", "year")) %>% + mutate(receipts_nudged = ifelse(is.na(nudge_y), 0, nudge_y) + receipts) + +update_geom_defaults("text", list(family = "Georgia", size = 4.0)) +ggplot(receiptData, aes(year, receipts, group = country)) + + # Slope lines + geom_line(size = 0.1) + + # Country names (manually nudged) + geom_text(aes(year, receipts_nudged, label = country), + data = filter(receiptData, year == 1970), + hjust = 1, nudge_x = -3) + + geom_text(aes(year, receipts_nudged, label = country), + data = filter(receiptData, year == 1979), + hjust = 0, nudge_x = 3) + + # Data values + geom_text(aes(year, receipts_nudged, label = sprintf("%0.1f", receipts)), + data = filter(receiptData, year == 1970), + hjust = 1, nudge_x = -0.5) + + geom_text(aes(year, receipts_nudged, label = sprintf("%0.1f", receipts)), + data = filter(receiptData, year == 1979), + hjust = 0, nudge_x = 0.5) + + # Column labels + annotate("text", x = c(1970, 1979) + c(-0.5, 0.5), + y = max(receiptData$receipts) + 3, + label = c("1970", "1979"), + hjust = c(1, 0)) + + # Plot annotation + annotate("text", x = 1945, y = 58, hjust = 0, vjust = 1, + label = paste("Current Receipts of Government as a", + "Percentage of Gross Domestic\nProduct, 1970 and 1979", + sep = "\n"), + family = "Georgia", size = 4.0) + + coord_cartesian(xlim = c(1945, 1990)) + + theme(panel.background = element_blank(), + axis.title = element_blank(), + axis.text = element_blank(), + axis.ticks = element_blank()) +``` + +![A publication-ready graphic](graph_3-1.png) + +## Why it’s worth it + +It took several iterations to get the aesthetics of this plot just +right, while an adept user of a graphics editor would be able to +recreate it in minutes. However, this initial time savings obscures +several advantages to completing this process in code as opposed to +switching to a tool like Illustrator. + +### R is free software + +All of the programs I used to create this graphic (and share it with +you) are [free +software](https://www.fsf.org/about/what-is-free-software), unlike +Adobe’s terrific but expensive Illustrator. +[Inkscape](https://inkscape.org/en/) is an excellent open source +alternative, but it is not as powerful as its commercial competitor. On +the other hand, [R](https://www.r-project.org/) is arguably the most +advanced and well-supported statistical analysis tool. Even if the +politics of the open source movement aren’t important, free is a better +price-point. + +### Code can be reproduced + +Anybody who wants to recreate the final figure using a different set of +countries, a new pair of years, or a favored economic indicator can run +the code above on their own data. With minimal tweaking, they will have +a graphic with aesthetics identical to those above. Reproducing this +graphic using a multi-tool workflow is more complicated; a novice would +first need to learn how to create a “rough draft” of it in software, and +then learn how to use a graphics editor to improve its appearance. + +### Scripted graphics are easier to update + +Imagine that an analyst discovered a mistake in their analysis that +needed to be corrected. Or imagine the less stressful situation where a +colleague suggested replacing some of the countries in the figure. In +such cases, the work of creating the graphic will need to be redone: the +analyst will need to add data or correct errors, generate a new plot in +software, and re-edit the plot in their graphics editor. Using a +scripted, code-based workflow, the analyst would only need to do the +first step, and possibly update some manual tweaks. The initial time +savings afforded by a graphics editor disappears after the first time +this happens. + +### Automation prevents errors + +Not only does scripted workflow make it easier to deal with errors, it +guards against them. When analysts adjust graphic elements in a GUI, +there’s a risk of mistakenly moving, deleting, or mislabeling data +points. Such mistakes are difficult to detect, but code-based workflows +avoid these risks; if the data source and analysis are error-free, then +the graphic will also be. + +These considerations are among the reasons why scripted analyses are +[considered best practice](https://peerj.com/preprints/3210/) in +statistical analysis. Most of Tufte’s advice on creating graphics is +excellent, but I recommend ignoring his suggestion to make the final +edits in a program like Illustrator. Learning how to make polished +graphics in software will ultimately save analysts time and help them +avoid mistakes. + diff --git a/content/posts/use-the-gpl/index.md b/content/posts/use-the-gpl/index.md @@ -0,0 +1,70 @@ +--- +title: "Just use the GPL" +description: "The GNU General Public License is the best license to attach to your small open-source projects." +date: 2022-10-18T20:46:57-07:00 +draft: False +categories: +- Programming +- Data Science +--- + +**Tl;dr:** if you choose to publish some code that you've written by +yourself, and you want attach an "open source" license to that code, you'll +probably be happiest if you choose the +[GPLv3](https://www.gnu.org/licenses/gpl-3.0.en.html). + +There are many of reasons to publish your code (or data analysis) with an +open source license (maybe it's something you've made [just for +fun](https://justforfunnoreally.dev/)), and there are nearly as many +licenses to choose from. Twenty years ago, when the free and open source +software (FOSS) phenomenon was starting to penetrate the public conscious, +the GNU GPL was practically synonymous with "open source". But in +contemporary practice, more permissive FOSS licenses are more popular (due +in part, I suspect, to the [encouragement of organizations such as +Microsoft-owned +GitHub](https://tom.preston-werner.com/2011/11/22/open-source-everything.html)). + +The GPL is a "copyleft" license, designed to use copyright law to spread +open source across the computing ecosystem; people who mix code with a GPL +license with code of their own must release the ensuing product under the +same license. The [MIT license](https://mit-license.org/), which was [the +most popular license for GitHub projects as of +2015](https://github.blog/2015-03-09-open-source-license-usage-on-github-com/), +is an example of a "permissive" license; it mainly protects the original +code author from claims of liability, and allows people to use it however +they wish. You can incorporate MIT-licensed code into a closed-source +project without asking for permission, or even informing the original author +of the code. + +I'm not here to evangelize FOSS, or argue that any license (or class of +license) is better than any other _in general_. The most successful and +important FOSS projects are community efforts, and the choice of license +should be made by the community. But while it might be true that most FOSS +_code_ is written as part of such projects, I would guess that most FOSS +_projects_ are small one-off efforts undertaken by individuals who happen to +have chosen to publish their code in a manner that allows its reuse. If +you're thinking of doing this, I recommend that you license your code under +the GPL. + +The solo-programmer (or data scientist) releasing a small project of their +own is best served by the GPL because it offers a compromise between +maintaining full control of their code (as does traditional copyright) and +supporting other FOSS projects. You might argue, "I'm not an open-source +zealot, I don't mind some projects being closed source!" That's not a +problem; if you release your own code under the GPL, you can still offer it +under different licenses on a case-by-case basis. If somebody contacts you +asking to use your code in their closed-source project—and you should +encourage people to do so—you get to decide whether their product, company, +and business model are things that you want to support. The only people who +are allowed to use your code without checking in with you are other +open-source developers releasing FOSS of their own. As a programmer +considering open-sourcing your project, this is presumably something that +you support. + +I'm actually not a fan of "intellectual property" restrictions; I believe +that copyright and patents do more harm than good for science, the arts, and +even commerce. However, as long as we live in a world with copyright laws, I +believe that we should use them to ensure that our values can flourish. I +haven't bothered changing the license on all of my (small and simple) public +projects—I'm not even sure it's worth the effort. However, moving forward, +almost everything I post will be available under the GPL. diff --git a/content/posts/violin-plots/index.Rmd b/content/posts/violin-plots/index.Rmd @@ -0,0 +1,124 @@ +--- +title: "Violin plots are great" +author: "Eamon Caddigan" +date: '2015-09-26' +output: html_document +layout: post +summary: Fiddling with a visualization technique that's not common in psychology (yet). +categories: dataviz R psych +--- + +```{r global_options, include=FALSE} +knitr::opts_chunk$set(cache=TRUE, echo=TRUE, warning=FALSE, message=FALSE, + fig.width=8, fig.height=5, fig.align="center") + +source("geom_flat_violin.R") +``` + +Anybody who's used the ggplot2 package in R is probably familiar with `geom_violin`, which creates [violin plots](https://en.wikipedia.org/wiki/Violin_plot). I'm not going to reproduce the Wikipedia article here; just think of violin plots as sideways density plots (which themselves are basically smooth histograms). They look like this: + +```{r} +library(ggplot2) +ggplot(mtcars, aes(x = factor(cyl), y = mpg, fill = factor(cyl))) + + geom_violin() +``` + +I wasn't familiar with this type of plot until I started using ggplot2. Judging by a recent conversation with friends (because my friends and I are nerds), that's not uncommon among people coming from psychology (but check out Figure 1 in the [recent report on reproducability in psychology](https://osf.io/ezcuj/wiki/home/) by the Open Science Collaboration). + +That's a shame, because this is a useful technique; a quick glance shows viewers the shape of the distribution and lets them easily estimate its mode and range. If you also need the median and interquartile range, it's simple to display them by overlaying a box plot (violin plots are usually made this way). + +```{r} +ggplot(mtcars, aes(x = factor(cyl), y = mpg)) + + geom_violin(aes(fill = factor(cyl))) + + geom_boxplot(width = 0.2) +``` + +### Violin plots vs. bar graphs + +Violin plots aren't popular in the psychology literature--at least among vision/cognition researchers. Instead, it's more common to see bar graphs, which throw away all of the information present in a violin plot. + +```{r} +library(dplyr) +mtcarsSummary <- mtcars %>% + group_by(cyl) %>% + summarize(mpg_mean = mean(mpg), + mpg_se = sqrt(var(mpg)/length(mpg))) + +ggplot(mtcarsSummary, aes(x = factor(cyl), y = mpg_mean, fill = factor(cyl))) + + geom_bar(stat = "identity") +``` + +Bar graphs highlight a single statistic of the analyst's choosing. In psychology (and many other fields), researchers use bar graphs to visualize the mean of the data, and usually include error bars to show the standard error (or another confidence interval). + +However, when audiences see bar graphs of means, they erroneously judge values that fall *inside* a bar (i.e., below the mean) as more probable than values equidistant from the mean but outside a bar ([Newman & Scholl, 2012](http://perception.research.yale.edu/papers/12-Newman-Scholl-PBR.pdf)). This bias doesn't affect violin plots because the region inside the violin contains *all* of the observed data. I'd guess that observers will correctly intuit that values in the wider parts of the violin are more probable than those in narrower parts. + +The mean and standard error are only useful statistics when you assume that your data are normally distributed; bar graphs don't help you check that assumption. For small sample size studies, it's more effective to just plot every single observation ([Weissgerber et al., 2015](http://journals.plos.org/plosbiology/article?id=10.1371/journal.pbio.1002128)). Till Bergmann [explored this approach](http://tillbergmann.com/blog/articles/barplots-are-pies.html) in a post that includes R code. + +If it's important to display the mean and standard error, these values can be overlaid on any visualization. + +```{r, fig.width=11, fig.height=5} +library(gridExtra) + +plotBars <- ggplot(mtcarsSummary, aes(x = factor(cyl), y = mpg_mean, fill = factor(cyl))) + + geom_bar(aes(fill = factor(cyl)), stat = "identity") + + geom_errorbar(aes(y = mpg_mean, ymin = mpg_mean-mpg_se, ymax = mpg_mean+mpg_se), + color = "black", width = 0.4) + + ylim(0, 35) + + theme(legend.position = "none") + + ggtitle("Bar graph") + +plotPoints <- ggplot(mtcars, aes(x = factor(cyl), y = mpg, color = factor(cyl))) + + geom_point(aes(y = mpg, color = factor(cyl)), + position = position_jitter(width = 0.25, height = 0.0), + alpha = 0.6) + + geom_point(aes(y = mpg_mean), color = "black", size = 2, data = mtcarsSummary) + + geom_errorbar(aes(y = mpg_mean, ymin = mpg_mean-mpg_se, ymax = mpg_mean+mpg_se), + color = "black", width = 0.2, data = mtcarsSummary) + + ylim(0, 35) + + theme(legend.position = "none") + + ggtitle("Every observation") + +plotViolins <- ggplot(mtcars, aes(x = factor(cyl), y = mpg, fill = factor(cyl))) + + geom_violin(aes(y = mpg, fill = factor(cyl))) + + geom_point(aes(y = mpg_mean), color = "black", size = 2, data = mtcarsSummary) + + geom_errorbar(aes(y = mpg_mean, ymin = mpg_mean-mpg_se, ymax = mpg_mean+mpg_se), + color = "black", width = 0.2, data = mtcarsSummary) + + ylim(0, 35) + + theme(legend.position = "none") + + ggtitle("Violin plot") + +grid.arrange(plotBars, plotPoints, plotViolins, ncol = 3) +``` + +### Violin plots vs. density plots + +A violin plot shows the distribution's density using the width of the plot, which is symmetric about its axis, while traditional density plots use height from a common baseline. It may be easier to estimate relative differences in density plots, though I don't know of any research on the topic. More importantly, density plots (or histograms) readily display the density estimates, whereas violin plots typically don't present these. + +```{r} +ggplot(mtcars, aes(x = mpg, fill = factor(cyl))) + + geom_density(alpha = 0.6) +``` + +Figures like the one above quickly become crowded as the number of factors increases. It's easy to flip the coordinates and use faceting to construct figures similar to violin plots. + +```{r} +# trim = TRUE trims the tails to the range of the data, +# which is the default for geom_violin +ggplot(mtcars, aes(x = mpg, fill = factor(cyl))) + + geom_density(trim = TRUE) + + coord_flip() + + facet_grid(. ~ cyl) +``` + +I asked twitter about making plots like this without faceting. [David Robinson](http://varianceexplained.org/) came through with a [new geom that does it](https://gist.github.com/dgrtwo/eb7750e74997891d7c20). Like traditional violin plots, these toss out the density estimates--and currently only work with the development version of ggplot2--but they do the trick. + +```{r} +ggplot(mtcars, aes(x = factor(cyl), y = mpg, fill = factor(cyl))) + + geom_flat_violin() +``` + +### Use violin plots + +If you're into R's base graphics (why?), it looks like the [vioplot package](http://www.inside-r.org/packages/cran/vioplot/docs/vioplot) can make violin plots without using ggplot2. Seaborn appears to bring [very powerful violin plots](http://stanford.edu/~mwaskom/software/seaborn/generated/seaborn.violinplot.html) to python, but I haven't had much opportunity to explore the awesome pandas world that's emerged since I last used python for most of my analyses. + +Psychologists should use violin plots more often. They're ideal for displaying non-normal data, which we frequently encounter when looking at a single participant's performance (e.g., response times). More importantly, previous research--*in psychology*--has shown that viewers have difficulty interpreting bar graphs, and violin plots present a viable alternative. diff --git a/content/posts/violin-plots/index.md b/content/posts/violin-plots/index.md @@ -0,0 +1,188 @@ +--- +title: "Violin plots are great" +date: '2015-09-26' +description: Fiddling with a visualization technique that's not common in psychology (yet). +categories: +- Data Science +tags: +- R +- Dataviz +- Statistics +--- + +Anybody who's used the ggplot2 package in R is probably familiar with +`geom_violin`, which creates [violin +plots](https://en.wikipedia.org/wiki/Violin_plot). I'm not going to reproduce +the Wikipedia article here; just think of violin plots as sideways density +plots (which themselves are basically smooth histograms). They look like this: + +```r +library(ggplot2) +ggplot(mtcars, aes(x = factor(cyl), y = mpg, fill = factor(cyl))) + + geom_violin() +``` + +![Violin plot of mpg by cylinder](unnamed-chunk-1-1.png) + +I wasn't familiar with this type of plot until I started using ggplot2. Judging +by a recent conversation with friends (because my friends and I are nerds), +that's not uncommon among people coming from psychology (but check out Figure 1 +in the [recent report on reproducability in +psychology](https://osf.io/ezcuj/wiki/home/) by the Open Science +Collaboration). + +That's a shame, because this is a useful technique; a quick glance shows +viewers the shape of the distribution and lets them easily estimate its mode +and range. If you also need the median and interquartile range, it's simple to +display them by overlaying a box plot (violin plots are usually made this way). + +```r +ggplot(mtcars, aes(x = factor(cyl), y = mpg)) + + geom_violin(aes(fill = factor(cyl))) + + geom_boxplot(width = 0.2) +``` + +![Violin plots with overlaid box plots](unnamed-chunk-2-1.png) + +### Violin plots vs. bar graphs + +Violin plots aren't popular in the psychology literature--at least among +vision/cognition researchers. Instead, it's more common to see bar graphs, +which throw away all of the information present in a violin plot. + +```r +library(dplyr) +mtcarsSummary <- mtcars %>% + group_by(cyl) %>% + summarize(mpg_mean = mean(mpg), + mpg_se = sqrt(var(mpg)/length(mpg))) + +ggplot(mtcarsSummary, aes(x = factor(cyl), y = mpg_mean, fill = factor(cyl))) + + geom_bar(stat = "identity") +``` + +![Bar charts of mpg by cyl](unnamed-chunk-3-1.png) + +Bar graphs highlight a single statistic of the analyst's choosing. In +psychology (and many other fields), researchers use bar graphs to visualize the +mean of the data, and usually include error bars to show the standard error (or +another confidence interval). + +However, when audiences see bar graphs of means, they erroneously judge values +that fall *inside* a bar (i.e., below the mean) as more probable than values +equidistant from the mean but outside a bar ([Newman & Scholl, +2012](http://perception.research.yale.edu/papers/12-Newman-Scholl-PBR.pdf)). +This bias doesn't affect violin plots because the region inside the violin +contains *all* of the observed data. I'd guess that observers will correctly +intuit that values in the wider parts of the violin are more probable than +those in narrower parts. + +The mean and standard error are only useful statistics when you assume that +your data are normally distributed; bar graphs don't help you check that +assumption. For small sample size studies, it's more effective to just plot +every single observation ([Weissgerber et al., +2015](http://journals.plos.org/plosbiology/article?id=10.1371/journal.pbio.1002128)). +Till Bergmann [explored this +approach](http://tillbergmann.com/blog/articles/barplots-are-pies.html) in a +post that includes R code. + +If it's important to display the mean and standard error, these values can be +overlaid on any visualization. + +```r +library(gridExtra) + +plotBars <- ggplot(mtcarsSummary, aes(x = factor(cyl), y = mpg_mean, fill = factor(cyl))) + + geom_bar(aes(fill = factor(cyl)), stat = "identity") + + geom_errorbar(aes(y = mpg_mean, ymin = mpg_mean-mpg_se, ymax = mpg_mean+mpg_se), + color = "black", width = 0.4) + + ylim(0, 35) + + theme(legend.position = "none") + + ggtitle("Bar graph") + +plotPoints <- ggplot(mtcars, aes(x = factor(cyl), y = mpg, color = factor(cyl))) + + geom_point(aes(y = mpg, color = factor(cyl)), + position = position_jitter(width = 0.25, height = 0.0), + alpha = 0.6) + + geom_point(aes(y = mpg_mean), color = "black", size = 2, data = mtcarsSummary) + + geom_errorbar(aes(y = mpg_mean, ymin = mpg_mean-mpg_se, ymax = mpg_mean+mpg_se), + color = "black", width = 0.2, data = mtcarsSummary) + + ylim(0, 35) + + theme(legend.position = "none") + + ggtitle("Every observation") + +plotViolins <- ggplot(mtcars, aes(x = factor(cyl), y = mpg, fill = factor(cyl))) + + geom_violin(aes(y = mpg, fill = factor(cyl))) + + geom_point(aes(y = mpg_mean), color = "black", size = 2, data = mtcarsSummary) + + geom_errorbar(aes(y = mpg_mean, ymin = mpg_mean-mpg_se, ymax = mpg_mean+mpg_se), + color = "black", width = 0.2, data = mtcarsSummary) + + ylim(0, 35) + + theme(legend.position = "none") + + ggtitle("Violin plot") + +grid.arrange(plotBars, plotPoints, plotViolins, ncol = 3) +``` + +![Comparison of the same data visualized with bar charts, points, and violin +charts](unnamed-chunk-4-1.png) + +### Violin plots vs. density plots + +A violin plot shows the distribution's density using the width of the plot, +which is symmetric about its axis, while traditional density plots use height +from a common baseline. It may be easier to estimate relative differences in +density plots, though I don't know of any research on the topic. More +importantly, density plots (or histograms) readily display the density +estimates, whereas violin plots typically don't present these. + +```r +ggplot(mtcars, aes(x = mpg, fill = factor(cyl))) + + geom_density(alpha = 0.6) +``` + +![Density plots](unnamed-chunk-5-1.png) + +Figures like the one above quickly become crowded as the number of factors +increases. It's easy to flip the coordinates and use faceting to construct +figures similar to violin plots. + +```r +# trim = TRUE trims the tails to the range of the data, +# which is the default for geom_violin +ggplot(mtcars, aes(x = mpg, fill = factor(cyl))) + + geom_density(trim = TRUE) + + coord_flip() + + facet_grid(. ~ cyl) +``` + +![Faceted density plots](unnamed-chunk-6-1.png) + +I asked twitter about making plots like this without faceting. [David +Robinson](http://varianceexplained.org/) came through with a [new geom that +does it](https://gist.github.com/dgrtwo/eb7750e74997891d7c20). Like traditional +violin plots, these toss out the density estimates--and currently only work +with the development version of ggplot2--but they do the trick. + +```r +ggplot(mtcars, aes(x = factor(cyl), y = mpg, fill = factor(cyl))) + + geom_flat_violin() +``` + +![Flat violins](unnamed-chunk-7-1.png) + +### Use violin plots + +If you're into R's base graphics (why?), it looks like the [vioplot +package](http://www.inside-r.org/packages/cran/vioplot/docs/vioplot) can make +violin plots without using ggplot2. Seaborn appears to bring [very powerful +violin +plots](http://stanford.edu/~mwaskom/software/seaborn/generated/seaborn.violinplot.html) +to python, but I haven't had much opportunity to explore the awesome pandas +world that's emerged since I last used python for most of my analyses. + +Psychologists should use violin plots more often. They're ideal for displaying +non-normal data, which we frequently encounter when looking at a single +participant's performance (e.g., response times). More importantly, previous +research--*in psychology*--has shown that viewers have difficulty interpreting +bar graphs, and violin plots present a viable alternative. + diff --git a/content/posts/violin-plots/unnamed-chunk-1-1.png b/content/posts/violin-plots/unnamed-chunk-1-1.png Binary files differ. diff --git a/content/posts/violin-plots/unnamed-chunk-2-1.png b/content/posts/violin-plots/unnamed-chunk-2-1.png Binary files differ. diff --git a/content/posts/violin-plots/unnamed-chunk-3-1.png b/content/posts/violin-plots/unnamed-chunk-3-1.png Binary files differ. diff --git a/content/posts/violin-plots/unnamed-chunk-4-1.png b/content/posts/violin-plots/unnamed-chunk-4-1.png Binary files differ. diff --git a/content/posts/violin-plots/unnamed-chunk-5-1.png b/content/posts/violin-plots/unnamed-chunk-5-1.png Binary files differ. diff --git a/content/posts/violin-plots/unnamed-chunk-6-1.png b/content/posts/violin-plots/unnamed-chunk-6-1.png Binary files differ. diff --git a/content/posts/violin-plots/unnamed-chunk-7-1.png b/content/posts/violin-plots/unnamed-chunk-7-1.png Binary files differ. diff --git a/content/pubs/2006jov.pdf b/content/pubs/2006jov.pdf Binary files differ. diff --git a/content/pubs/2009jon.pdf b/content/pubs/2009jon.pdf Binary files differ. diff --git a/content/pubs/2010jov.pdf b/content/pubs/2010jov.pdf Binary files differ. diff --git a/content/pubs/2011pnas.pdf b/content/pubs/2011pnas.pdf Binary files differ. diff --git a/content/pubs/2013plos1.pdf b/content/pubs/2013plos1.pdf Binary files differ. diff --git a/content/pubs/2014plos1.pdf b/content/pubs/2014plos1.pdf Binary files differ. diff --git a/content/pubs/2016hf.pdf b/content/pubs/2016hf.pdf @@ -0,0 +1,11074 @@ +%PDF-1.4% +1 0 obj +<</Metadata 5 0 R/Names 2 0 R/PageLabels 4 0 R/Pages 3 0 R/Type/Catalog/ViewerPreferences<</Direction/L2R>>>> +endobj +5 0 obj +<</Length 242560/Subtype/XML/Type/Metadata>>stream +<?xpacket begin="" id="W5M0MpCehiHzreSzNTczkc9d"?> +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 4.2.1-c043 52.389687, 2009/06/02-13:20:35 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stRef="http://ns.adobe.com/xap/1.0/sType/ResourceRef#" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#"> + <xmpMM:InstanceID>uuid:b71682ee-1dd1-11b2-0a00-af0078bea2ff</xmpMM:InstanceID> + <xmpMM:DocumentID>xmp.did:0877EB9F9C59DF11A1EBA9B605CE80B2</xmpMM:DocumentID> + <xmpMM:OriginalDocumentID>adobe:docid:indd:61020d5a-531d-11de-9aa3-f47368b35948</xmpMM:OriginalDocumentID> + <xmpMM:RenditionClass>proof:pdf</xmpMM:RenditionClass> + <xmpMM:DerivedFrom rdf:parseType="Resource"> + <stRef:instanceID>xmp.iid:0777EB9F9C59DF11A1EBA9B605CE80B2</stRef:instanceID> + <stRef:documentID>xmp.did:94BE82176957DF11B542CA46BCB5136B</stRef:documentID> + <stRef:originalDocumentID>adobe:docid:indd:61020d5a-531d-11de-9aa3-f47368b35948</stRef:originalDocumentID> + <stRef:renditionClass>default</stRef:renditionClass> + </xmpMM:DerivedFrom> + <xmpMM:History> + <rdf:Seq> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9FB4E5792453DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T11:01:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A0B4E5792453DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T11:01:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7512E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T11:39:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7712E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T11:44:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7812E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T11:50:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7912E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T11:50:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7A12E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T12:07:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7B12E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T12:41:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7C12E5942853DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T12:42:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:18A50C343353DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T12:47:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:19A50C343353DE11A7B5AFBAD2547E18</stEvt:instanceID> + <stEvt:when>2009-06-07T13:01:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:02A88F58BA55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T17:59:30+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:03A88F58BA55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:00:44+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:04A88F58BA55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:00:44+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:05A88F58BA55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:03:50+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0CA88F58BA55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:23:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3A1FDE4BBF55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:34:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3B1FDE4BBF55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:42:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3C1FDE4BBF55DE11AC61FCC07213CABC</stEvt:instanceID> + <stEvt:when>2009-06-10T18:47:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1743EC08DB55DE118224BEA7DFF6EC94</stEvt:instanceID> + <stEvt:when>2009-06-10T21:53:30+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1843EC08DB55DE118224BEA7DFF6EC94</stEvt:instanceID> + <stEvt:when>2009-06-10T21:53:30+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C1B875345656DE1189BAD4E2A7FE97BE</stEvt:instanceID> + <stEvt:when>2009-06-11T12:35:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C2B875345656DE1189BAD4E2A7FE97BE</stEvt:instanceID> + <stEvt:when>2009-06-11T12:35:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D5BD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T12:24:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D6BD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T13:05:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D7BD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:07:29+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D8BD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:07:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D9BD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:07:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DABD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:10:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DBBD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:13:44+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DCBD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:30:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DDBD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:32:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DEBD205E7959DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:40:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A6A577708D59DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:48:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A7A577708D59DE11965BEAB5465F1AFC</stEvt:instanceID> + <stEvt:when>2009-06-15T14:48:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D70F5AF1A959DE11965681505D58AD45</stEvt:instanceID> + <stEvt:when>2009-06-15T18:18:31+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D80F5AF1A959DE11965681505D58AD45</stEvt:instanceID> + <stEvt:when>2009-06-15T18:24:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D90F5AF1A959DE11965681505D58AD45</stEvt:instanceID> + <stEvt:when>2009-06-15T18:26:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DA0F5AF1A959DE11965681505D58AD45</stEvt:instanceID> + <stEvt:when>2009-06-15T18:26:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:178FD99E2C5ADE11A0D7A2F2BACDC93E</stEvt:instanceID> + <stEvt:when>2009-06-16T10:03:15+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:188FD99E2C5ADE11A0D7A2F2BACDC93E</stEvt:instanceID> + <stEvt:when>2009-06-16T10:03:15+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:198FD99E2C5ADE11A0D7A2F2BACDC93E</stEvt:instanceID> + <stEvt:when>2009-06-16T10:03:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1C8FD99E2C5ADE11A0D7A2F2BACDC93E</stEvt:instanceID> + <stEvt:when>2009-06-16T10:11:31+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D547143A305ADE11A0D7A2F2BACDC93E</stEvt:instanceID> + <stEvt:when>2009-06-16T11:30:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:29C2E9866E5ADE11ABF7C8DAEFF9331A</stEvt:instanceID> + <stEvt:when>2009-06-16T18:04:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:66FDCDC7F75ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:06:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:67FDCDC7F75ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:06:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:68FDCDC7F75ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:07:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:69FDCDC7F75ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:07:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6AFDCDC7F75ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:07:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FBE636FEF85ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:43:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FEE636FEF85ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T10:55:24+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FFE636FEF85ADE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:03:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:98355BA7005BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:08:35+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:99355BA7005BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:09:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9A355BA7005BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:09:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:391CDD5B055BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:42:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3E1CDD5B055BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:45:15+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3F1CDD5B055BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:45:15+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:401CDD5B055BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:48:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:411CDD5B055BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:48:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:421CDD5B055BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:49:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E00B7AE8065BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:56:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E10B7AE8065BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:58:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E20B7AE8065BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T11:58:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E30B7AE8065BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T12:01:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E40B7AE8065BDE11A2EEAA979F1448A4</stEvt:instanceID> + <stEvt:when>2009-06-17T12:01:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E66D1FB98967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T10:46:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E76D1FB98967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T10:46:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7C3663EB9867DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T11:49:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:565AC47C9967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T11:49:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:575AC47C9967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T11:51:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:585AC47C9967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T11:51:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:5D5AC47C9967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T11:53:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:5E5AC47C9967DE11B7C8B2C74D6DEFCA</stEvt:instanceID> + <stEvt:when>2009-07-03T11:53:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:53EFF8272E7BDE11B11ECFE82DE77C59</stEvt:instanceID> + <stEvt:when>2009-07-28T09:51:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:54EFF8272E7BDE11B11ECFE82DE77C59</stEvt:instanceID> + <stEvt:when>2009-07-28T09:51:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:57EFF8272E7BDE11B11ECFE82DE77C59</stEvt:instanceID> + <stEvt:when>2009-07-28T09:54:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:58EFF8272E7BDE11B11ECFE82DE77C59</stEvt:instanceID> + <stEvt:when>2009-07-28T09:54:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:22BEEC775583DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T18:59:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:23BEEC775583DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T18:59:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AD8E146C5683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:06:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AE8E146C5683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:06:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B38E146C5683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:16:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B48E146C5683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:16:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CC1691BA5883DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:23:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CD1691BA5883DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:23:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92DBCF4A5A83DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:45:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6AC9B7D15C83DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T19:45:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6FC9B7D15C83DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:21:12+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:70C9B7D15C83DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:21:12+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:00E32F626383DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:32:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:01E32F626383DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:32:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AD8E819A6483DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:49:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AE8E819A6483DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:49:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AF8E819A6483DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:52:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B08E819A6483DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T20:52:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F8966E9B6683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T21:00:24+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F9966E9B6683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T21:00:24+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FE966E9B6683DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T21:05:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:84EDA4FF6783DE11A21EAB433474642B</stEvt:instanceID> + <stEvt:when>2009-08-07T21:05:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:30C8A947D183DE118149954DA24C9787</stEvt:instanceID> + <stEvt:when>2009-08-08T10:15:19+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:31C8A947D183DE118149954DA24C9787</stEvt:instanceID> + <stEvt:when>2009-08-08T10:15:19+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:41C7156CE383DE118149954DA24C9787</stEvt:instanceID> + <stEvt:when>2009-08-08T12:14:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:42C7156CE383DE118149954DA24C9787</stEvt:instanceID> + <stEvt:when>2009-08-08T12:14:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A28493F4E683DE118149954DA24C9787</stEvt:instanceID> + <stEvt:when>2009-08-08T12:20:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A38493F4E683DE118149954DA24C9787</stEvt:instanceID> + <stEvt:when>2009-08-08T12:23:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:91A66FD30488DE11A49BAF932A0E07A5</stEvt:instanceID> + <stEvt:when>2009-08-13T18:00:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92A66FD30488DE11A49BAF932A0E07A5</stEvt:instanceID> + <stEvt:when>2009-08-13T18:00:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A5284F0BA988DE11AC4CA07251F08B71</stEvt:instanceID> + <stEvt:when>2009-08-14T15:12:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A7284F0BA988DE11AC4CA07251F08B71</stEvt:instanceID> + <stEvt:when>2009-08-14T15:14:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:626F8B6477A7DE1185ED9B98A427A88C</stEvt:instanceID> + <stEvt:when>2009-09-22T18:29:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E543016F1FA8DE11AFEEA49B0F976179</stEvt:instanceID> + <stEvt:when>2009-09-23T14:46:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:4573804285CEDE118962F22B032EDEB9</stEvt:instanceID> + <stEvt:when>2009-11-11T11:26:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:4673804285CEDE118962F22B032EDEB9</stEvt:instanceID> + <stEvt:when>2009-11-11T11:30:32+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2072B1368FCEDE118393B4CAA9D9A147</stEvt:instanceID> + <stEvt:when>2009-11-11T12:31:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C0A111029BCEDE11A8E4F61063E5B9A7</stEvt:instanceID> + <stEvt:when>2009-11-11T14:09:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:5D693F41C72ADF11ACCE8D849BE5FC2E</stEvt:instanceID> + <stEvt:when>2010-03-08T21:07:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:260CA0F9CF51DF11AFC198A2F75C57B3</stEvt:instanceID> + <stEvt:when>2010-04-27T13:42:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:270CA0F9CF51DF11AFC198A2F75C57B3</stEvt:instanceID> + <stEvt:when>2010-04-27T13:42:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:280CA0F9CF51DF11AFC198A2F75C57B3</stEvt:instanceID> + <stEvt:when>2010-04-27T13:42:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:536E426DDF51DF118C62D21BAFFFCAB8</stEvt:instanceID> + <stEvt:when>2010-04-27T14:59:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:546E426DDF51DF118C62D21BAFFFCAB8</stEvt:instanceID> + <stEvt:when>2010-04-27T16:24:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:556E426DDF51DF118C62D21BAFFFCAB8</stEvt:instanceID> + <stEvt:when>2010-04-27T16:25:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D94B63658A52DF11B74AA97A148003EF</stEvt:instanceID> + <stEvt:when>2010-04-28T11:28:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:53185DF4AB52DF11A6B6E2F7C4742947</stEvt:instanceID> + <stEvt:when>2010-04-28T15:23:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:54185DF4AB52DF11A6B6E2F7C4742947</stEvt:instanceID> + <stEvt:when>2010-04-28T15:23:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:55185DF4AB52DF11A6B6E2F7C4742947</stEvt:instanceID> + <stEvt:when>2010-04-28T15:23:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:56185DF4AB52DF11A6B6E2F7C4742947</stEvt:instanceID> + <stEvt:when>2010-04-28T16:03:32+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:57185DF4AB52DF11A6B6E2F7C4742947</stEvt:instanceID> + <stEvt:when>2010-04-28T16:03:32+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:58185DF4AB52DF11A6B6E2F7C4742947</stEvt:instanceID> + <stEvt:when>2010-04-28T16:03:35+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6D312B42B252DF1194A3911A4AFC63F3</stEvt:instanceID> + <stEvt:when>2010-04-28T16:09:01+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6E312B42B252DF1194A3911A4AFC63F3</stEvt:instanceID> + <stEvt:when>2010-04-28T16:09:01+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6F312B42B252DF1194A3911A4AFC63F3</stEvt:instanceID> + <stEvt:when>2010-04-28T16:09:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E0235E65B952DF11B23D9DD83050AA6D</stEvt:instanceID> + <stEvt:when>2010-04-28T17:00:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E1235E65B952DF11B23D9DD83050AA6D</stEvt:instanceID> + <stEvt:when>2010-04-28T17:00:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E2235E65B952DF11B23D9DD83050AA6D</stEvt:instanceID> + <stEvt:when>2010-04-28T17:00:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E3235E65B952DF11B23D9DD83050AA6D</stEvt:instanceID> + <stEvt:when>2010-04-28T17:00:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E4235E65B952DF11B23D9DD83050AA6D</stEvt:instanceID> + <stEvt:when>2010-04-28T17:00:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E5235E65B952DF11B23D9DD83050AA6D</stEvt:instanceID> + <stEvt:when>2010-04-28T17:00:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:869694448453DF118D3E99BE1A9EA8A1</stEvt:instanceID> + <stEvt:when>2010-04-29T17:27:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:879694448453DF118D3E99BE1A9EA8A1</stEvt:instanceID> + <stEvt:when>2010-04-29T17:27:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:889694448453DF118D3E99BE1A9EA8A1</stEvt:instanceID> + <stEvt:when>2010-04-29T17:27:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B960A6444B54DF118781F27EF6F1D098</stEvt:instanceID> + <stEvt:when>2010-04-30T16:56:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0005E2B75054DF118781F27EF6F1D098</stEvt:instanceID> + <stEvt:when>2010-04-30T17:35:50+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0505E2B75054DF118781F27EF6F1D098</stEvt:instanceID> + <stEvt:when>2010-04-30T17:41:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0A05E2B75054DF118781F27EF6F1D098</stEvt:instanceID> + <stEvt:when>2010-04-30T17:44:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FD0E6A026254DF11923DBB4078C20F56</stEvt:instanceID> + <stEvt:when>2010-04-30T19:39:36+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FE0E6A026254DF11923DBB4078C20F56</stEvt:instanceID> + <stEvt:when>2010-04-30T19:39:36+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FF0E6A026254DF11923DBB4078C20F56</stEvt:instanceID> + <stEvt:when>2010-04-30T19:39:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:90AD6D64A556DF1186C1CC236BDDAD86</stEvt:instanceID> + <stEvt:when>2010-05-03T16:58:44+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:91AD6D64A556DF1186C1CC236BDDAD86</stEvt:instanceID> + <stEvt:when>2010-05-03T17:00:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92AD6D64A556DF1186C1CC236BDDAD86</stEvt:instanceID> + <stEvt:when>2010-05-03T17:00:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:93AD6D64A556DF1186C1CC236BDDAD86</stEvt:instanceID> + <stEvt:when>2010-05-03T17:00:45+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:560CB882A756DF1186C1CC236BDDAD86</stEvt:instanceID> + <stEvt:when>2010-05-03T17:11:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C990849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:07:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CA90849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:07:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CB90849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:07:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CC90849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:37:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CD90849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:37:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CE90849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:37:36+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CF90849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:38:52+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D090849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:38:52+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D190849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:38:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D290849EB056DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:39:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:90DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:39:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:91DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:39:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:46:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:93DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:46:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:94DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:46:15+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:95DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:50:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:96DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:55:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:97DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:55:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:98DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:55:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:99DE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:56:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9ADE452CB556DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:56:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D8A07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T18:56:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D9A07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:02:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DAA07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:02:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DBA07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:02:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DCA07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:03:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DDA07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:03:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DEA07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:03:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DFA07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:06:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E0A07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:06:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E1A07F72B756DF119BFE9E60916F26AE</stEvt:instanceID> + <stEvt:when>2010-05-03T19:06:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F710DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:42:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F810DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:42:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F910DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:42:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FA10DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:43:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FB10DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:43:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FC10DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:44:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FD10DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:50:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FE10DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:50:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FF10DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:50:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0011DE4EC656DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:52:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:862CBCAAC756DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:52:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:872CBCAAC756DF11AFCAB77BC063E4BA</stEvt:instanceID> + <stEvt:when>2010-05-03T20:52:26+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C526A6963B57DF1183FAD8FD2CE367B2</stEvt:instanceID> + <stEvt:when>2010-05-04T10:42:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C626A6963B57DF1183FAD8FD2CE367B2</stEvt:instanceID> + <stEvt:when>2010-05-04T10:45:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C726A6963B57DF1183FAD8FD2CE367B2</stEvt:instanceID> + <stEvt:when>2010-05-04T10:55:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C826A6963B57DF1183FAD8FD2CE367B2</stEvt:instanceID> + <stEvt:when>2010-05-04T10:58:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CB355E164957DF11B37C871CE2AB335E</stEvt:instanceID> + <stEvt:when>2010-05-04T12:18:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CC355E164957DF11B37C871CE2AB335E</stEvt:instanceID> + <stEvt:when>2010-05-04T12:18:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CD355E164957DF11B37C871CE2AB335E</stEvt:instanceID> + <stEvt:when>2010-05-04T12:18:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CE355E164957DF11B37C871CE2AB335E</stEvt:instanceID> + <stEvt:when>2010-05-04T12:18:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CF355E164957DF11B37C871CE2AB335E</stEvt:instanceID> + <stEvt:when>2010-05-04T12:18:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D0355E164957DF11B37C871CE2AB335E</stEvt:instanceID> + <stEvt:when>2010-05-04T12:18:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:942C9A806057DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:10:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:952C9A806057DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:10:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:962C9A806057DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:10:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FED10E576157DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:13:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FFD10E576157DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:13:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:00D20E576157DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:13:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A883D8666257DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T15:32:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AAADD40F6657DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:07:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ABADD40F6657DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:07:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ACADD40F6657DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:07:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:07:52+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:93BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:08:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:94BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:08:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:95BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:08:52+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:96BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:10:12+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:97BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:10:12+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:98BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:10:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:99BE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:11:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9ABE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:11:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9BBE82176957DF11B542CA46BCB5136B</stEvt:instanceID> + <stEvt:when>2010-05-04T16:11:26+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0777EB9F9C59DF11A1EBA9B605CE80B2</stEvt:instanceID> + <stEvt:when>2010-05-07T11:46:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0877EB9F9C59DF11A1EBA9B605CE80B2</stEvt:instanceID> + <stEvt:when>2010-05-07T11:46:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0977EB9F9C59DF11A1EBA9B605CE80B2</stEvt:instanceID> + <stEvt:when>2010-05-07T11:46:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7DE4E338A259DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T12:01:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7EE4E338A259DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T12:01:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7FE4E338A259DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T12:01:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FFFCD183A059DF11A1EBA9B605CE80B2</stEvt:instanceID> + <stEvt:when>2010-05-07T12:13:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:85E4E338A259DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T12:42:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:86E4E338A259DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T12:42:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:181EDBEDA759DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T12:42:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E4322169AA59DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T13:01:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E5322169AA59DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T13:01:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E6322169AA59DF11B7AB831DDBA81713</stEvt:instanceID> + <stEvt:when>2010-05-07T13:01:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:015B3FADB459DF11A86BF041EFE99E68</stEvt:instanceID> + <stEvt:when>2010-05-07T14:13:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:025B3FADB459DF11A86BF041EFE99E68</stEvt:instanceID> + <stEvt:when>2010-05-07T14:13:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:035B3FADB459DF11A86BF041EFE99E68</stEvt:instanceID> + <stEvt:when>2010-05-07T14:14:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:893E23ADB559DF11A86BF041EFE99E68</stEvt:instanceID> + <stEvt:when>2010-05-07T14:34:26+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8A3E23ADB559DF11A86BF041EFE99E68</stEvt:instanceID> + <stEvt:when>2010-05-07T14:34:26+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8B3E23ADB559DF11A86BF041EFE99E68</stEvt:instanceID> + <stEvt:when>2010-05-07T14:34:29+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DF662795B459DF11A9F2CF61789B5372</stEvt:instanceID> + <stEvt:when>2010-05-07T16:16:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E0662795B459DF11A9F2CF61789B5372</stEvt:instanceID> + <stEvt:when>2010-05-07T16:16:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E1662795B459DF11A9F2CF61789B5372</stEvt:instanceID> + <stEvt:when>2010-05-07T16:16:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BD722D1CCD59DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T17:26:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BE722D1CCD59DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T17:26:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8858189DCF59DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T17:26:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8C58189DCF59DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T17:35:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8D58189DCF59DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T17:35:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8E58189DCF59DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T17:35:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B808725FD159DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T18:11:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B908725FD159DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T18:33:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BA08725FD159DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T18:33:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:484399EAD859DF11AA30FDD640F49D77</stEvt:instanceID> + <stEvt:when>2010-05-07T18:33:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1058493D015CDF1184508932725B2339</stEvt:instanceID> + <stEvt:when>2010-05-10T12:50:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E857C67B045CDF1184508932725B2339</stEvt:instanceID> + <stEvt:when>2010-05-10T12:50:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E957C67B045CDF1184508932725B2339</stEvt:instanceID> + <stEvt:when>2010-05-10T12:50:19+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7F422D59215CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T16:55:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:80422D59215CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T16:55:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:81422D59215CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T16:55:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:82422D59215CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T16:56:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:83422D59215CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T16:56:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:84422D59215CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T16:56:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FCA1DF2C345CDF11B634AA5972CC18AA</stEvt:instanceID> + <stEvt:when>2010-05-10T18:43:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8BD61DA9805DDF11B3EC9115466816A2</stEvt:instanceID> + <stEvt:when>2010-05-12T10:11:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8CD61DA9805DDF11B3EC9115466816A2</stEvt:instanceID> + <stEvt:when>2010-05-12T10:12:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FB0D2C78835DDF11B978A7D498C33CEF</stEvt:instanceID> + <stEvt:when>2010-05-12T10:31:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:010E2C78835DDF11B978A7D498C33CEF</stEvt:instanceID> + <stEvt:when>2010-05-12T10:47:24+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:020E2C78835DDF11B978A7D498C33CEF</stEvt:instanceID> + <stEvt:when>2010-05-12T10:48:29+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:030E2C78835DDF11B978A7D498C33CEF</stEvt:instanceID> + <stEvt:when>2010-05-12T10:50:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92D61DA9805DDF11B3EC9115466816A2</stEvt:instanceID> + <stEvt:when>2010-05-12T10:50:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9803CF56865DDF11B3EC9115466816A2</stEvt:instanceID> + <stEvt:when>2010-05-12T10:55:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:4EF4FBEDF05FDF11B095FF63D6CD5860</stEvt:instanceID> + <stEvt:when>2010-05-15T12:40:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:4FF4FBEDF05FDF11B095FF63D6CD5860</stEvt:instanceID> + <stEvt:when>2010-05-15T12:40:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7B554726F56EDF11ADF5942B78FD772D</stEvt:instanceID> + <stEvt:when>2010-06-03T15:18:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7C554726F56EDF11ADF5942B78FD772D</stEvt:instanceID> + <stEvt:when>2010-06-03T15:18:30+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7E554726F56EDF11ADF5942B78FD772D</stEvt:instanceID> + <stEvt:when>2010-06-03T15:21:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:374DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T11:48:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:384DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T11:56:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:394DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T11:58:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3A4DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T11:59:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3B4DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:04:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3C4DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:05:01+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3D4DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:07:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3E4DEAB56970DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:07:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BAA5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:08:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BBA5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:14:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BCA5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:20:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BDA5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:21:35+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BEA5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:26:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BFA5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C0A5E5EC6C70DF1198DADB372725909E</stEvt:instanceID> + <stEvt:when>2010-06-05T12:44:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EFB25F71C773DF119697F5C0501308BD</stEvt:instanceID> + <stEvt:when>2010-06-09T19:03:50+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F0B25F71C773DF119697F5C0501308BD</stEvt:instanceID> + <stEvt:when>2010-06-09T19:05:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F1B25F71C773DF119697F5C0501308BD</stEvt:instanceID> + <stEvt:when>2010-06-09T19:05:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F2B25F71C773DF119697F5C0501308BD</stEvt:instanceID> + <stEvt:when>2010-06-09T19:05:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F3B25F71C773DF119697F5C0501308BD</stEvt:instanceID> + <stEvt:when>2010-06-09T19:05:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92A876457577DF11B2FE8F1383E7AC81</stEvt:instanceID> + <stEvt:when>2010-06-14T10:59:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7244DA139277DF11B2FE8F1383E7AC81</stEvt:instanceID> + <stEvt:when>2010-06-14T14:44:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1AD1B2195E78DF118548DA14F9A7FB6E</stEvt:instanceID> + <stEvt:when>2010-06-15T14:45:45+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:275899986278DF118548DA14F9A7FB6E</stEvt:instanceID> + <stEvt:when>2010-06-15T16:32:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6D6FD05A0479DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T10:38:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6E6FD05A0479DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T10:39:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:706FD05A0479DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T10:41:30+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B8840EEF0679DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T10:50:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B9840EEF0679DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T10:51:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BA840EEF0679DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T11:10:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BB840EEF0679DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T11:22:01+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BC840EEF0679DF11B99B98D4021FC27B</stEvt:instanceID> + <stEvt:when>2010-06-16T11:48:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:51845BDEF37DDF1185A4850F98A9697A</stEvt:instanceID> + <stEvt:when>2010-06-22T17:21:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7FEA56EB3683DF11B297C3B864B551C4</stEvt:instanceID> + <stEvt:when>2010-06-29T09:59:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:80EA56EB3683DF11B297C3B864B551C4</stEvt:instanceID> + <stEvt:when>2010-06-29T10:00+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:82EA56EB3683DF11B297C3B864B551C4</stEvt:instanceID> + <stEvt:when>2010-06-29T10:02:12+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AE7F8E37418BDF118494F6AC5ABAA51D</stEvt:instanceID> + <stEvt:when>2010-07-09T15:53:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AF7F8E37418BDF118494F6AC5ABAA51D</stEvt:instanceID> + <stEvt:when>2010-07-09T15:56:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6FA5EE204E8BDF118494F6AC5ABAA51D</stEvt:instanceID> + <stEvt:when>2010-07-09T17:15:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:77D2849363D7DF11806EE77488B02705</stEvt:instanceID> + <stEvt:when>2010-10-14T12:50:52+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D0FB441338DBDF11B750D6FC71532885</stEvt:instanceID> + <stEvt:when>2010-10-19T10:33:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:06210C1C85E6DF119F36C4955F00A57A</stEvt:instanceID> + <stEvt:when>2010-11-02T19:16:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:07210C1C85E6DF119F36C4955F00A57A</stEvt:instanceID> + <stEvt:when>2010-11-02T19:29:45+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:08210C1C85E6DF119F36C4955F00A57A</stEvt:instanceID> + <stEvt:when>2010-11-02T19:31:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0D57A72F07E7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T10:29:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0E57A72F07E7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T10:30:44+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0F57A72F07E7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T10:31:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1157A72F07E7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T10:57:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1257A72F07E7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T10:58:54+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:185D5E3C0DE7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T11:14:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1D5D5E3C0DE7DF119378976559B08C91</stEvt:instanceID> + <stEvt:when>2010-11-03T11:25:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EAC25E19D6E7DF11A772A0E2F76F1AEE</stEvt:instanceID> + <stEvt:when>2010-11-04T11:13:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:5A8F0EC93FF1DF11B8B99E1F080B1373</stEvt:instanceID> + <stEvt:when>2010-11-16T11:31:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B8B7A862E4F2DF11A2B6906916AF82C1</stEvt:instanceID> + <stEvt:when>2010-11-18T12:55:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BFB7A862E4F2DF11A2B6906916AF82C1</stEvt:instanceID> + <stEvt:when>2010-11-18T13:52:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C0B7A862E4F2DF11A2B6906916AF82C1</stEvt:instanceID> + <stEvt:when>2010-11-18T13:54:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:4A5238E90CF3DF11A2B6906916AF82C1</stEvt:instanceID> + <stEvt:when>2010-11-18T17:44:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DC71BF886FFBDF11915DEA0354B2681C</stEvt:instanceID> + <stEvt:when>2010-11-29T09:52:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E621C2E7A2FBDF11A18BBD8DA3AB342D</stEvt:instanceID> + <stEvt:when>2010-11-29T16:18:50+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ECB50D40A6FBDF11A18BBD8DA3AB342D</stEvt:instanceID> + <stEvt:when>2010-11-29T16:18:50+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BD5C22893AFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T10:00:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BE5C22893AFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T10:00:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BF5C22893AFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T10:02:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C05C22893AFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T10:58:04+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C15C22893AFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T11:13:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C25C22893AFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T11:13:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0CFD54C07CFCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T18:03:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3D95A38E82FCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T18:37:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3E95A38E82FCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T18:38:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6B27377384FCDF1191AA83B1428B7F5A</stEvt:instanceID> + <stEvt:when>2010-11-30T19:36:56+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EB7CDA9E8562E011A5F7F1C29F7505BD</stEvt:instanceID> + <stEvt:when>2011-04-09T14:14:45+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EC7CDA9E8562E011A5F7F1C29F7505BD</stEvt:instanceID> + <stEvt:when>2011-04-09T14:15:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ED7CDA9E8562E011A5F7F1C29F7505BD</stEvt:instanceID> + <stEvt:when>2011-04-09T14:17:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EE7CDA9E8562E011A5F7F1C29F7505BD</stEvt:instanceID> + <stEvt:when>2011-04-09T14:18:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:1D81B2F3B970E011922299CD07B11E9E</stEvt:instanceID> + <stEvt:when>2011-04-27T16:04:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8CBE1BD2BB70E011B459BDE749F6ACEA</stEvt:instanceID> + <stEvt:when>2011-04-27T16:19+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:846B6FE09E7BE011AB85FA4FBB4415A4</stEvt:instanceID> + <stEvt:when>2011-05-11T12:48:32+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:656D60B8C37BE011AB85FA4FBB4415A4</stEvt:instanceID> + <stEvt:when>2011-05-11T17:33:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:100DBB445A7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T11:22:19+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:110DBB445A7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T11:35:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:120DBB445A7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T12:14:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FB3957D9637CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T12:19:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3EC10BE6647CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T12:26:01+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BBAFE9EA8D7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T17:27:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BCAFE9EA8D7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T17:28:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C469B1378F7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T17:31:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0D7E61B68F7CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T17:34:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8CDA0293907CE011A30FC572DD30790B</stEvt:instanceID> + <stEvt:when>2011-05-12T17:38:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EBF021D16183E0119AD0D1845463B4A8</stEvt:instanceID> + <stEvt:when>2011-05-21T11:41:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ECF021D16183E0119AD0D1845463B4A8</stEvt:instanceID> + <stEvt:when>2011-05-21T11:46:36+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E29439A26187E011A206991E0DE849AF</stEvt:instanceID> + <stEvt:when>2011-05-26T15:12:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:74E871827C87E011A206991E0DE849AF</stEvt:instanceID> + <stEvt:when>2011-05-26T15:12:45+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:013F04E65D8CE011BD8A8E2668F6B91A</stEvt:instanceID> + <stEvt:when>2011-06-01T20:16:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2F5F92379F9CE01195D6E66830E08359</stEvt:instanceID> + <stEvt:when>2011-06-22T12:53:15+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:305F92379F9CE01195D6E66830E08359</stEvt:instanceID> + <stEvt:when>2011-06-22T12:53:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:21F4BC0053D5E011826F9D22BE7372D5</stEvt:instanceID> + <stEvt:when>2011-09-02T16:32:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 6.0</stEvt:softwareAgent> + <stEvt:changed>/</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0D0AE189E3F0E011A44DAD0C23D411D1</stEvt:instanceID> + <stEvt:when>2011-10-07T18:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0E0AE189E3F0E011A44DAD0C23D411D1</stEvt:instanceID> + <stEvt:when>2011-10-07T18:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9F3B6C0EE6F0E011A44DAD0C23D411D1</stEvt:instanceID> + <stEvt:when>2011-10-07T18:42:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A03B6C0EE6F0E011A44DAD0C23D411D1</stEvt:instanceID> + <stEvt:when>2011-10-07T18:42:49+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0B3020EE54FAE011931BD1052C81A81D</stEvt:instanceID> + <stEvt:when>2011-10-19T18:49:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:0C3020EE54FAE011931BD1052C81A81D</stEvt:instanceID> + <stEvt:when>2011-10-19T18:49:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:36CF219DBEEAE111A8BBCE35A8F23E0F</stEvt:instanceID> + <stEvt:when>2012-08-20T17:32:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:37CF219DBEEAE111A8BBCE35A8F23E0F</stEvt:instanceID> + <stEvt:when>2012-08-20T17:45:45+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:484F15DCF470E211BD59876390A8DF31</stEvt:instanceID> + <stEvt:when>2013-02-07T12:36:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ADDEE404F570E211B344FE2A629C5882</stEvt:instanceID> + <stEvt:when>2013-02-07T12:39:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9CE5F11EF670E211B344FE2A629C5882</stEvt:instanceID> + <stEvt:when>2013-02-07T13:03:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7FDB9D20D071E211B4479FF43A216EA3</stEvt:instanceID> + <stEvt:when>2013-02-08T14:45:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:80DB9D20D071E211B4479FF43A216EA3</stEvt:instanceID> + <stEvt:when>2013-02-08T14:46:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:88DB9D20D071E211B4479FF43A216EA3</stEvt:instanceID> + <stEvt:when>2013-02-08T14:58:12+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B7CF39A9F171E211B4479FF43A216EA3</stEvt:instanceID> + <stEvt:when>2013-02-08T19:32:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B8CF39A9F171E211B4479FF43A216EA3</stEvt:instanceID> + <stEvt:when>2013-02-08T19:36:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:86F6301D0072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:29:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:87F6301D0072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:29:29+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:88F6301D0072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:30:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3010E8C80072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:34:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3810E8C80072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:41:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3910E8C80072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:41:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3A10E8C80072E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:44:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:08D3A95B0272E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:45:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:09D3A95B0272E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:57:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:11D3A95B0272E2118830D70841DA0534</stEvt:instanceID> + <stEvt:when>2013-02-08T20:59:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B87AB620B572E211809DE2FFAEBDA942</stEvt:instanceID> + <stEvt:when>2013-02-09T18:05:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B97AB620B572E211809DE2FFAEBDA942</stEvt:instanceID> + <stEvt:when>2013-02-09T18:25:07+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BA7AB620B572E211809DE2FFAEBDA942</stEvt:instanceID> + <stEvt:when>2013-02-09T18:28:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BB7AB620B572E211809DE2FFAEBDA942</stEvt:instanceID> + <stEvt:when>2013-02-09T18:29:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C94B84FFBB72E211809DE2FFAEBDA942</stEvt:instanceID> + <stEvt:when>2013-02-09T18:54:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:ABB58B5B0874E2118F1DA553E0D66C5D</stEvt:instanceID> + <stEvt:when>2013-02-11T12:44:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:AFA1D30A1C74E2118F1DA553E0D66C5D</stEvt:instanceID> + <stEvt:when>2013-02-11T12:54:16+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B0A1D30A1C74E2118F1DA553E0D66C5D</stEvt:instanceID> + <stEvt:when>2013-02-11T12:55:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B5A1D30A1C74E2118F1DA553E0D66C5D</stEvt:instanceID> + <stEvt:when>2013-02-11T13:06:32+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F89107383474E211A64ABB9FC9F2B575</stEvt:instanceID> + <stEvt:when>2013-02-11T17:52:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:19F642DF4574E211A64ABB9FC9F2B575</stEvt:instanceID> + <stEvt:when>2013-02-11T18:20:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3A2913E74974E211A64ABB9FC9F2B575</stEvt:instanceID> + <stEvt:when>2013-02-11T18:26:26+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3F2913E74974E211A64ABB9FC9F2B575</stEvt:instanceID> + <stEvt:when>2013-02-11T18:32:32+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:45159F799B7DE2118D71F14D46E4F7FE</stEvt:instanceID> + <stEvt:when>2013-02-23T15:44:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EEB553D33D82E2118186C91B82E89706</stEvt:instanceID> + <stEvt:when>2013-03-01T12:33:43+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A5868C466A93E2119C5481ECA892FB33</stEvt:instanceID> + <stEvt:when>2013-03-23T09:03:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A6868C466A93E2119C5481ECA892FB33</stEvt:instanceID> + <stEvt:when>2013-03-23T09:04:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:347B3B1E7F01E3119B28C00033A7E711</stEvt:instanceID> + <stEvt:when>2013-08-10T11:41:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:357B3B1E7F01E3119B28C00033A7E711</stEvt:instanceID> + <stEvt:when>2013-08-10T11:42:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:91BDDED21551E311B4EADCE42A231BA4</stEvt:instanceID> + <stEvt:when>2013-11-19T17:58:14+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:92BDDED21551E311B4EADCE42A231BA4</stEvt:instanceID> + <stEvt:when>2013-11-19T17:58:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:93BDDED21551E311B4EADCE42A231BA4</stEvt:instanceID> + <stEvt:when>2013-11-19T17:58:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C6E8C3FF2451E311A2C8C622EF0D7D39</stEvt:instanceID> + <stEvt:when>2013-11-19T19:46:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8DC6C62CA373E311BE7BB1EEC39780D9</stEvt:instanceID> + <stEvt:when>2014-01-02T17:17:47+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:589977450B9DE311B295C864C69EF64D</stEvt:instanceID> + <stEvt:when>2014-02-24T09:52:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:599977450B9DE311B295C864C69EF64D</stEvt:instanceID> + <stEvt:when>2014-02-24T09:52:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:5A9977450B9DE311B295C864C69EF64D</stEvt:instanceID> + <stEvt:when>2014-02-24T09:55:44+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:5B9977450B9DE311B295C864C69EF64D</stEvt:instanceID> + <stEvt:when>2014-02-24T09:55:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:01881B5676BCE31189EDEC4CD1496221</stEvt:instanceID> + <stEvt:when>2014-04-05T09:27:59+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:02881B5676BCE31189EDEC4CD1496221</stEvt:instanceID> + <stEvt:when>2014-04-05T09:28:16+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C26DA1B42BE0E3118A49941912510F7E</stEvt:instanceID> + <stEvt:when>2014-05-20T20:04:58+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:FEB6EE9C9EE4E311A1FAC91DBFC80738</stEvt:instanceID> + <stEvt:when>2014-05-26T12:03:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C295D4E72C35E511A9489FDBCEC6BFD1</stEvt:instanceID> + <stEvt:when>2015-07-28T19:01:08+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C395D4E72C35E511A9489FDBCEC6BFD1</stEvt:instanceID> + <stEvt:when>2015-07-28T19:01:51+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2991BDD97A46E511A7A9AA4040E290C2</stEvt:instanceID> + <stEvt:when>2015-08-19T19:33:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2B91BDD97A46E511A7A9AA4040E290C2</stEvt:instanceID> + <stEvt:when>2015-08-19T19:54:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2D91BDD97A46E511A7A9AA4040E290C2</stEvt:instanceID> + <stEvt:when>2015-08-19T19:55:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:02B7A38B7E46E511A7A9AA4040E290C2</stEvt:instanceID> + <stEvt:when>2015-08-19T19:58:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8993C3033C6FE5119DB3AE8FABBE41AE</stEvt:instanceID> + <stEvt:when>2015-10-10T17:50:10+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8B93C3033C6FE5119DB3AE8FABBE41AE</stEvt:instanceID> + <stEvt:when>2015-10-10T17:50:21+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:93568AAE496FE5119DB3AE8FABBE41AE</stEvt:instanceID> + <stEvt:when>2015-10-10T18:20:53+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F765C0904D6FE5119DB3AE8FABBE41AE</stEvt:instanceID> + <stEvt:when>2015-10-10T18:21:03+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F208E000F4EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:42:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F308E000F4EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:42:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:F508E000F4EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:42:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E366D928F5EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:43:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:A7D05C3AF5EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:43:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:44E07FFFF6EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:56:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:87FAE305F7EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T11:56:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:88FAE305F7EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:02:48+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EE6870A4F8EFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:08:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C2D44247FCEFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:34:11+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EB6E6AA9FCEFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:36:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B0F02EADFCEFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:37:02+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2DCD60B7FCEFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:37:19+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6A09C18AFDEFE5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T12:43:13+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:389B59C225F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:31:06+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:510197D325F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:31:35+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:83BAFEDE25F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:31:55+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DCED5D3926F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:34:26+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:6D562E1727F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:40:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:99AE1B3127F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:41:22+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:7DEB2A3C27F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:41:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:3383547927F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:43:23+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:9B1342A627F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:44:38+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:2FE9BEAA27F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:44:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:30E9BEAA27F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:45:27+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:392C8EE227F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:46:20+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:4607B32929F0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T17:55:28+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CF62405D2EF0E5118A7EE117AA067E65</stEvt:instanceID> + <stEvt:when>2016-03-22T18:32:42+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:B329459C1D05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:55:41+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:39F37BA21D05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:55:52+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:37B30FBC1D05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:56:34+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:671467CB1D05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:57+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E1720EFA1D05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:58:18+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:EAAFDF1C1E05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:59:17+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:DEADED2A1E05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T09:59:40+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:776C794A1E05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T10:00:33+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:E3503CB81E05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T10:03:37+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:D3C7AF041F05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T10:05:46+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:BCAB7F241F05E611B4F0966EA1398D27</stEvt:instanceID> + <stEvt:when>2016-04-18T10:06:39+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:8FDABBC3F24EE611B28C821DBC8A091E</stEvt:instanceID> + <stEvt:when>2016-07-21T08:55:25+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:C17807DEF24EE611B28C821DBC8A091E</stEvt:instanceID> + <stEvt:when>2016-07-21T08:56:09+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:42B8E1B62B4FE611B28C821DBC8A091E</stEvt:instanceID> + <stEvt:when>2016-07-21T15:43:05+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <stEvt:action>saved</stEvt:action> + <stEvt:instanceID>xmp.iid:CA5FEDB5B953E611972782EAB3F32B41</stEvt:instanceID> + <stEvt:when>2016-07-27T10:49:36+05:30</stEvt:when> + <stEvt:softwareAgent>Adobe InDesign 7.5</stEvt:softwareAgent> + <stEvt:changed>/;/metadata</stEvt:changed> + </rdf:li> + </rdf:Seq> + </xmpMM:History> + </rdf:Description> + <rdf:Description rdf:about="" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:xmpTPg="http://ns.adobe.com/xap/1.0/t/pg/" + xmlns:xmpGImg="http://ns.adobe.com/xap/1.0/g/img/"> + <xmp:CreateDate>2016-07-29T16:23:42+05:30</xmp:CreateDate> + <xmp:ModifyDate>2016-10-02T11:56:50-07:00</xmp:ModifyDate> + <xmp:MetadataDate>2016-10-02T11:56:50-07:00</xmp:MetadataDate> + <xmp:CreatorTool>Adobe InDesign CS5.5 (7.5)</xmp:CreatorTool> + <xmp:PageInfo> + <rdf:Seq> + <rdf:li rdf:parseType="Resource"> + <xmpTPg:PageNumber>1</xmpTPg:PageNumber> + <xmpGImg:format>JPEG</xmpGImg:format> + <xmpGImg:width>256</xmpGImg:width> + <xmpGImg:height>256</xmpGImg:height> + <xmpGImg:image>/9j/4AAQSkZJRgABAgEASABIAAD/7QAsUGhvdG9zaG9wIDMuMAA4QklNA+0AAAAAABAASAAAAAEA
AQBIAAAAAQAB/+4AE0Fkb2JlAGSAAAAAAQUAAgAg/9sAhAAKBwcHBwcKBwcKDgkJCQ4RDAsLDBEU
EBAQEBAUEQ8RERERDxERFxoaGhcRHyEhISEfKy0tLSsyMjIyMjIyMjIyAQsJCQ4MDh8XFx8rIh0i
KzIrKysrMjIyMjIyMjIyMjIyMjIyMjI+Pj4+PjJAQEBAQEBAQEBAQEBAQEBAQEBAQED/wAARCAEA
ALADAREAAhEBAxEB/8QBogAAAAcBAQEBAQAAAAAAAAAABAUDAgYBAAcICQoLAQACAgMBAQEBAQAA
AAAAAAABAAIDBAUGBwgJCgsQAAIBAwMCBAIGBwMEAgYCcwECAxEEAAUhEjFBUQYTYSJxgRQykaEH
FbFCI8FS0eEzFmLwJHKC8SVDNFOSorJjc8I1RCeTo7M2F1RkdMPS4ggmgwkKGBmElEVGpLRW01Uo
GvLj88TU5PRldYWVpbXF1eX1ZnaGlqa2xtbm9jdHV2d3h5ent8fX5/c4SFhoeIiYqLjI2Oj4KTlJ
WWl5iZmpucnZ6fkqOkpaanqKmqq6ytrq+hEAAgIBAgMFBQQFBgQIAwNtAQACEQMEIRIxQQVRE2Ei
BnGBkTKhsfAUwdHhI0IVUmJy8TMkNEOCFpJTJaJjssIHc9I14kSDF1STCAkKGBkmNkUaJ2R0VTfy
o7PDKCnT4/OElKS0xNTk9GV1hZWltcXV5fVGVmZ2hpamtsbW5vZHV2d3h5ent8fX5/c4SFhoeIiY
qLjI2Oj4OUlZaXmJmam5ydnp+So6SlpqeoqaqrrK2ur6/9oADAMBAAIRAxEAPwCZ+WPKXl++8saL
d3Vp6k02nWbO/qSip9CPssgGKp9YeWtG0x2ksIGt2cAMUml3A8ayYqjvqkX80v8AyNk/5rxVWAoK
eGKt4q7FXYq7FXYq7FXYq7FXYq7FXYq7FXYq7FXYq7FXYq7FUl8mf8ofoP8A2zbP/kxHiqdYq7FX
Yq7FXYq7FXYq7FXYq7FXYq7FXYq7FXYq7FXYq7FXYq7FXYqkvkz/AJQ/Qf8Atm2f/JiPFU6xV2Ku
xV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxVJfJn/ACh+g/8AbNs/+TEeKonXU1ST
TZV0ZuF6SvpseI25Dl9uo6YqxT6p+Zf/AC0D/gof+acVd9U/Mv8A5aB/wUP/ADTirvqn5l/8tA/4
KH/mnFXfVPzL/wCWgf8ABQ/804q76p+Zf/LQP+Ch/wCacVd9U/Mv/loH/BQ/804q76p+Zf8Ay0D/
AIKH/mnFXfVPzL/5aB/wUP8AzTirvqn5l/8ALQP+Ch/5pxV31T8y/wDloH/BQ/8ANOKu+qfmX/y0
D/gof+acVd9U/Mv/AJaB/wAFD/zTirvqn5l/8tA/4KH/AJpxVlWgJq8enKuttzvOTciCp+Gvw/Yo
MVTLFXYq7FXYq7FXYqkvkz/lD9B/7Ztn/wAmI8VROu6ZJq+my2EU31Z5CpEoBNOLBugK+GKsU/5V
3f8A/V3P/AN/1VxV3/Ku7/8A6u5/4Bv+quKu/wCVd3//AFdz/wAA3/VXFXf8q7v/APq7n/gG/wCq
uKst0TTpNJ0uDT5ZvrDw86ykEcuTs/QlunLFUfirsVdirsVdirsVdirsVdirsVdirsVdirsVdiqS
+TP+UP0H/tm2f/JiPFVfzBLeQ6ZJJY3cNhMGWk9wQI1BNCDyRxv8sVYj+kvM3/UzaX/wUf8A2TYq
79JeZv8AqZtL/wCCj/7JsVd+kvM3/UzaX/wUf/ZNirv0l5m/6mbS/wDgo/8AsmxV36S8zf8AUzaX
/wAFH/2S4q79JeZv+pm0v/go/wDsmxV36S8zf9TNpf8AwUf/AGTYq2NS8zk0HmbTCT/lR/8AZLir
X6S8zf8AUzaX/wAFH/2TYq79JeZv+pm0v/go/wDsmxV36S8zf9TNpf8AwUf/AGTYq79JeZv+pm0v
/go/+ybFXfpLzN/1M2l/8FH/ANk2Ku/SXmb/AKmbS/8Ago/+ybFUbaxee76L17PW7GeOpXnGFYVH
aotcVRthY+eo7yF7/UraW1VwZo0UBmTuB/oy/rxVk+KuxV2KuxVJfJn/ACh+g/8AbNs/+TEeKq3m
KGa40mWKC0XUJCUpbueKtRgeoZOnXrirDf0Rqv8A1K1t/wAjT/1XxV36I1X/AKla2/5Gn/qvirv0
Rqv/AFK1t/yNP/VfFXfojVf+pWtv+Rp/6r4q79D6r/1K1t/yNb/qvirv0Rqv/UrW3/I0/wDVfFXf
ojVf+pWtv+Rrf9V8VcNI1UGo8rWwI6fvW/6r4q79Ear/ANStbf8AI0/9V8Vd+iNV/wCpWtv+Rp/6
r4q79Ear/wBStbf8jW/6r4q79Ear/wBStbf8jT/1XxV36I1X/qVrb/kaf+q+Ku/RGq/9Stbf8jT/
ANV8VTGxuPNumwfVrHQIYYuRbgslRU9TvMfDFUT+mPPP/Vli/wCDH/VXFWTWjzyWsMl0gineNGlj
G4VyAWXv0OKq2KuxV2KpL5M/5Q/Qf+2bZ/8AJiPFUbq2l2+s2Mmn3TOkUhUkxkBvhIYU5Kw7eGKs
e/5VtoX+/wC7/wCDj/6o4q7/AJVtoX+/7v8A4OP/AKo4q7/lW2hf7/u/+Dj/AOqOKu/5VtoX+/7v
/g4/+qOKu/5VtoX+/wC7/wCDj/6o4qyLStNg0iwi062Z3ih5cWkILHkzOa8Qo6t4YqjMVdirsVdi
rsVdirsVdirsVdirsVdirsVdiqS+TP8AlD9B/wC2bZ/8mI8VTrFUpvdXvrW5eCHSri6RKUmjKBWq
A23Jgdq0xVR/T2p/9WO7/wCCj/5qxVr9P6n/ANWO7/4KP/mrFW/09qf/AFY7v/go/wDmrFXfp7U/
+rHd/wDBR/8ANWKu/T2p/wDVju/+Cj/5qxV36e1P/qx3f/BR/wDNWKu/T2p/9WO7/wCCj/5qxVFa
dqd5eztFcabPZKELCSUoVJBA4/CTvviqZYq7FXYqxmbzhNFK8Q0a+fgxXksZINDSo2xVb/jOb/qy
X/8AyLP9MVd/jOb/AKsl/wD8iz/TFUw0bXpNWmkhfT7myEa8+dwpUNuBQbdcVTjFXYq7FXYqkvkz
/lD9B/7Ztn/yYjxVEa9aNfaZLbJarelyh9B5DErUYH7alSKdcVYPPptlaytBc6Tp8MqU5RyamysK
ioqrTA9Diqn9U0v/AKt2mf8AcUP/AFXxV31TS/8Aq3aZ/wBxQ/8AVfFXfVNL/wCrdpn/AHFD/wBV
8Vd9U0v/AKt2mf8AcUP/AFXxVPk0b8vSimR7RXIHIC9Y0Pcf3+Krv0L+XX+/LT/pMb/qvirv0L+X
X+/LT/pMb/qviqY6Jp/lS0u3k0J4GuTGVcRXBmb0+Sk/CZH2qBviqJ1bXNN00Pa3F4lrdSRF4uYJ
pXkqtsrftDFWIfpzV/8AqaLT/kR/2bYq79Oav/1NFp/yI/7NsVd+nNX/AOpotP8AkR/2bYq79Oav
/wBTRaf8iP8As2xV36c1f/qaLT/kR/2bYq79Oav/ANTRaf8AIj/s2xV36c1f/qaLT/kR/wBm2Ku/
Tmr/APU0Wn/Ij/s2xVmHl+4mutKimuLtL+Ri9biNeCtRiNl4p06dMVTPFUl8mf8AKH6D/wBs2z/5
MR4qiNevX0/TJbqOeO1ZCgEsqNIgqwG6xhm3rirBLjVLS7ma4ur7S5pnpykeynZjQBRUmHwGKqf1
vTP+WnSf+kGb/qjirvrmmf8ALTpH/SBN/wBUcVd9c0z/AJadI/6QJv8Aqjirvrmmf8tOkf8ASBN/
1RxV31zTP+WnSP8ApAm/6o4q765pn/LTpH/SBN/1RxV31zTP+WnSP+kCb/qjiqfeT57OXU5Vt5rG
RhAxItLaSF6c49y0kaDj7Yqq+bC41GPi2kqPQXbUVQy/ak+zyVvh/jXFUjrL/vzy5/wEf/VPFXVl
/wB+eXP+Aj/6p4q6sv8Avzy5/wABH/1TxV1Zf9+eXP8AgI/+qeKurL/vzy5/wEf/AFTxV1Zf9+eX
P+Aj/wCqeKurL/vzy5/wEf8A1TxV1Zf9+eXP+Aj/AOqeKs18t1/REPI2pNX3sQBB9o/Z4gD5++Kp
riqS+TP+UP0H/tm2f/JiPFVfzC8kelStE06uClDaxiWX7Q+yjEA++KsN+t3/APv7Wv8ApBi/6qYq
763f/wC/ta/6QYv+qmKu+t3/APv7Wv8ApBi/6qYq763f/wC/ta/6QYv+qmKu+t3/APv7Wv8ApBi/
6qYq763f/wC/ta/6QYv+qmKu+t3/APv7Wv8ApBi/6qYq763f/wC/ta/6QYv+qmKp15WnuZdQkWaT
UHUQsQL22SGOvJOjI7fF7Yqs82Q3EmoxmK0025X0FHO+cLIDyk2A9aP4foxVJPq15/1bdD/5Gj/s
pxV31a8/6tuh/wDI0f8AZTirvq15/wBW3Q/+Ro/7KcVd9WvP+rbof/I0f9lOKu+rXn/Vt0P/AJGj
/spxV31a8/6tuh/8jR/2U4q76tef9W3Q/wDkaP8AspxV31a8/wCrbof/ACNH/ZTirNfLiumkQrJF
bwMC9Y7Q8oh8R+yeb/TviqaYqkvkz/lD9B/7Ztn/AMmI8VVvMau+kzKkbzMSlEjmFux+IdJWBAxV
hf1a6/6t93/3FY/+aMVd9Wuv+rfd/wDcVj/5oxV31a6/6t93/wBxWP8A5oxV31a6/wCrfd/9xWP/
AJoxV31a6/6t93/3FY/+aMVd9Wuv+rfd/wDcVj/5oxV31a6/6t93/wBxWP8A5oxV31a7Ow0+7/7i
sf8AzRiqf+WLG+tr+SS5sbq0Qwsoe4vBcKTyQ8QgRaHbriql5ssHutRjkXRk1ICBV9ZrhoSPikPD
isieNa++KpH+h5P+pYi/6TX/AOq+Ku/Q8n/UsRf9Jr/9V8Vd+h5P+pYi/wCk1/8Aqvirv0PJ/wBS
xF/0mv8A9V8Vd+h5P+pYi/6TX/6r4q79Dyf9SxF/0mv/ANV8Vd+h5P8AqWIv+k1/+q+Ku/Q8n/Us
Rf8ASa//AFXxVmvluA2+kQxG0FgVL/6OshlC1Yn7ZZq169cVTXFUl8mf8ofoP/bNs/8AkxHiqO1V
NMksXTVygtCV5+q3Fa1HGpqO+KsJvbfQVunGnx6O9sKem01zIHOw5cgrEfariqh6Gm94dD9v9Kl/
5qxV3oad/vnQv+kqX+uKu9DTv986F/0lS/1xV3oad/vnQv8ApKl/rirvQ07/AHzoX/SVL/XFXehp
3++dC/6Spf64q2sWnowZYtDBU1B+tS9R9OKsq0PWbzUbt4LibT5FWMuBZytJJUMoqQ37O+KpZ5vs
VutSikOiz6nSBV9aGZo1X45DwoI333r9OKpF+iE/6la8/wCkl/8Aqjirv0Qn/UrXn/SS/wD1RxV3
6IT/AKla8/6SX/6o4q79EJ/1K15/0kv/ANUcVd+iE/6la8/6SX/6o4q79EJ/1K15/wBJL/8AVHFX
fohP+pWvP+kl/wDqjirv0Qn/AFK15/0kv/1RxVnHlmEW+jwxC0ewAL/6PKxdlqzHdiq9evTFU2xV
JfJn/KH6D/2zbP8A5MR4qreY5o7fSZpZZkt0BSskkXrqKsBvH3xVhX6XsP8Aq62n/cLH9MVd+l7D
/q62n/cLH9MVd+l7D/q62n/cLH9MVd+l7D/q62n/AHCx/TFXfpew/wCrraf9wsf0xV36XsP+rraf
9wsf0xV36XsP+rraf9wsf0xV36XsP+rraf8AcLH9MVTvypfW1zqMkcN7BdMIWYpFZ/VmA5Rjlzpu
N+mKqXnCC3l1OJpbbU5mECjlYkemBzk2NY3+L+zFUh+p2X/LDr33r/1RxV31Oy/5Yde+9f8Aqjir
vqdl/wAsOvfev/VHFXfU7L/lh1771/6o4q76nZf8sOvfev8A1RxV31Oy/wCWHXvvX/qjirvqdl/y
w6996/8AVHFXfU7L/lh1771/6o4qzrywkcejQpHHcRKC9EvKesPjb7VFX6NsVTfFUl8mf8ofoP8A
2zbP/kxHiqI8wNMulytB9ZElUp9SXlN9ofZH6/bFWH+vqvj5h/5EjFXevqvj5h/5EjFXevqvj5h/
5EjFXevqvj5h/wCRIxV3r6r4+Yf+RIxV3r6r4+Yf+RIxV3r6r4+Yf+RIxV3r6r4+Yf8AkSMVTnyx
JevfyC5OqlPRYj9IR8Iq8k+yf5v4VxVD+b76yttSijudTv7FzArCOzJEZHOQcj8a/FtiqRfpbS/+
r9rP/BH/AKqYq79LaX/1ftZ/4I/9VMVd+ltL/wCr9rP/AAR/6qYq79LaX/1ftZ/4I/8AVTFXfpbS
/wDq/az/AMEf+qmKu/S2l/8AV+1n/gj/ANVMVd+ltL/6v2s/8Ef+qmKu/S2l/wDV+1n/AII/9VMV
Zx5ZmhuNHhlguJ7tCXpNdbymjN9rc9O2KptiqS+TP+UP0H/tm2f/ACYjxVV8yp6mjzL6Xr1KfuzM
LevxL/u1iAMVYR9UP/VtH/cWi/5rxV31Q/8AVtH/AHFov+a8Vd9UP/VtH/cWi/5rxV31Q/8AVtH/
AHFov+a8Vd9UP/VtH/cWi/5rxV31Q/8AVtH/AHFov+a8Vd9UP/VtH/cWi/5rxV31Q/8AVtH/AHFo
v+a8VTzylB6WpSt9UFvWBhzF8l1X449vTRiR88VXebNRa01GOMa0+l1gVvRWBpQ3xSDnyXxpSnti
qR/pt/8Aqapf+kR8Vd+m3/6mqX/pEfFXfpt/+pql/wCkR8Vd+m3/AOpql/6RHxV36bf/AKmqX/pE
fFXfpt/+pql/6RHxV36bf/qapf8ApEfFXfpt/wDqapf+kR8VZr5bnNzpEMxvDqHIv/pDIYy1GI+y
fDpiqa4qkvkz/lD9B/7Ztn/yYjxVf5nKDRpjIbcLVKm8DGH7a/aEYLfLFWC87T+fQf8AkXc/9U8V
dztP59B/5F3P/VPFXc7T+fQf+Rdz/wBU8VdztP59B/5F3P8A1TxV3O0/n0H/AJF3P/VPFXc7T+fQ
f+Rdz/1TxVNbby3qd3AlzbW2iSRSjkjhJ6EeO64qqf4T1r/lj0X/AIGb/mnFU18vaHqGmXrz3dvp
8KNEUDWQkElSyGh9QAcfhxVCebLqeDUY0i1S1sAYFPpXEIlYnlJ8QYwybduuKpJ+kLv/AKmHT/8A
pFX/ALJcVd+kLv8A6mHT/wDpFX/slxV36Qu/+ph0/wD6RV/7JcVd+kLv/qYdP/6RV/7JcVd+kLv/
AKmHT/8ApFX/ALJcVd+kLv8A6mHT/wDpFX/slxV36Qu/+ph0/wD6RV/7JcVd+kLv/qYdP/6RV/7J
cVZr5ckeXSIXkuY7xiXrPCgjRviPRQidPliqaYqkvkz/AJQ/Qf8Atm2f/JiPFUfqd1b2Vm9xdRNP
EpUGONPUY1IA+HFWFX+oG5u5J7Oe7s4HpwgGmJJxooB+JnBNSK4qh/rN1/1cLv8A7hUf/NeKu+s3
X/Vwu/8AuFR/814q76zdf9XC7/7hUf8AzXirvrN1/wBXC7/7hUf/ADXirvrN1/1cLv8A7hUf/NeK
qq6nqiKFTVr9VHQDTEAH/JTFW/0tq3/V31D/ALhq/wDVTFU58sX19c38kdzfXV2ghZglxZi3UHkg
5Bw7VO/TFVLzYXGox8W0lR6C7aiqGX7Un2eSt8P8a4qkdZf9+eXP+Aj/AOqeKurL/vzy5/wEf/VP
FXVl/wB+eXP+Aj/6p4q6sv8Avzy5/wABH/1TxV1Zf9+eXP8AgI/+qeKurL/vzy5/wEf/AFTxV1Zf
9+eXP+Aj/wCqeKurL/vzy5/wEf8A1TxVmvluv6Ih5G1Jq+9iAIPtH7PEAfP3xVNcVSXyZ/yh+g/9
s2z/AOTEeKonXUlk02VIRclyVp9ScRzfaH2Xbb54qxX6nqf8nmH/AKTI/wCmKu+p6n/J5h/6TI/6
Yq76nqf8nmH/AKTI/wCmKu+p6n/J5h/6TI/6Yq76nqf8nmH/AKTI/wCmKu+p6n/J5h/6TI/6Yq76
nqf8nmH/AKTI/wCmKu+p6n/J5h/6TI/6Yqm3ly3vIr6RrhdUCmIgfpCdJYq8k+yqj7Xv4VxVZ5n0
7Urq9Se002xvYUhAaa7qGUhnJX+9T4QDXFWPfVrz/q26H/yNH/ZTirvq15/1bdD/AORo/wCynFXf
Vrz/AKtuh/8AI0f9lOKu+rXn/Vt0P/kaP+ynFXfVrz/q26H/AMjR/wBlOKu+rXn/AFbdD/5Gj/sp
xV31a8/6tuh/8jR/2U4qjNKs4JLxV1ex0eG0Ibk8MilwafD1nbv7YqzTT4bCC1WPTRGtsCeAiIKV
J3pSvfFUTiqS+TP+UP0H/tm2f/JiPFVTzMkMmjzLPFFMhKVS4m9CM/EvWTktPvxVg/1TS/8Aq3aZ
/wBxQ/8AVfFUcvlidgGXy7bFSKgi+lIIP/PXFW/8LXH/AFLlv/0my/8AVTFXf4WuP+pct/8ApNl/
6qYq7/C1x/1Llv8A9Jsv/VTFXf4WuP8AqXLf/pNl/wCqmKu/wtcf9S5b/wDSbL/1UxV3+Frj/qXL
f/pNl/6qYqm/lrRZdOv5J30mLTw0JT1Y7h5iash4cXdh2rX2xVFa/f6xBL9UsdOS+tpof3jNKIzV
i6sm7KenfFWJ/oeT/qWIv+k1/wDqvirv0PJ/1LEX/Sa//VfFXfoeT/qWIv8ApNf/AKr4q79Dyf8A
UsRf9Jr/APVfFXfoeT/qWIv+k1/+q+Ku/Q8n/UsRf9Jr/wDVfFXfoeT/AKliL/pNf/qvirv0PJ/1
LEX/AEmv/wBV8VZr5bgNvpEMRtBYFS/+jrIZQtWJ+2WatevXFU1xVJfJn/KH6D/2zbP/AJMR4qjN
Ym0uCwkl1gKbMFfUDoZFqWHH4VVj19sVYHfX2gPdyNp02mR2pp6aS2UzOPhHKpEP81cVRS+bbtFC
rrViFUUAFrc0AH/PLFW/8X3v/V7sf+kW5/6pYq7/ABfef9Xux/6Rbn/qlirv8X3n/V7sf+kW5/6p
Yq7/ABfef9Xux/6Rbn/qlirv8X3n/V7sf+kW5/6pYq7/ABfef9Xux/6Rbn/qliqb+WtduNUv5LeX
Uba8VYS/pwQyxsCGQci0qKKfFiqG832K3WpRSHRZ9TpAq+tDM0ar8ch4UEb771+nFUi/RCf9Stef
9JL/APVHFXfohP8AqVrz/pJf/qjirv0Qn/UrXn/SS/8A1RxV36IT/qVrz/pJf/qjirv0Qn/UrXn/
AEkv/wBUcVd+iE/6la8/6SX/AOqOKu/RCf8AUrXn/SS//VHFXfohP+pWvP8ApJf/AKo4qzjyzCLf
R4YhaPYAF/8AR5WLstWY7sVXr16Yqm2KpL5M/wCUP0H/ALZtn/yYjxVMNRtZr20e3guGtXYgiVVD
EUNejbb4qk3+GdV/6vk3/ImPFXf4Z1X/AKvk3/ImPFXf4Z1X/q+Tf8iY8Vd/hnVf+r5N/wAiY8VV
rPy/f29zHNPqslzGhq0LRIAw8CRiqdejD/vtfuGKu9GH/fa/cMVd6MP++1+4Yq2saKaqoU+IAGKs
O84QW8upxNLbanMwgUcrEj0wOcmxrG/xf2YqkP1Oy/5Yde+9f+qOKu+p2X/LDr33r/1RxV31Oy/5
Yde+9f8Aqjirvqdl/wAsOvfev/VHFXfU7L/lh1771/6o4q76nZf8sOvfev8A1RxV31Oy/wCWHXvv
X/qjirvqdl/yw6996/8AVHFWdeWEjj0aFI47iJQXol5T1h8bfaoq/Rtiqb4qkvkz/lD9B/7Ztn/y
YjxVEeYGmXS5Wg+siSqU+pLym+0Psj9ftirD/X1Xx8w/8iRirvX1bx8w/wDIkYq719V8fMP/ACJG
Ku9fVfHzD/yJGKp5aaFqN1bR3B1jUYDKvL0paK6+zL2OKq3+GtQ/6vt9964q7/DWof8AV9vvvXFX
f4a1D/q+333riqM0zSLqwnaafUrm+VkKCOcgqCSp5CnfbFUi8331lbalFHc6nf2LmBWEdmSIyOcg
5H41+LbFUi/S2l/9X7Wf+CP/AFUxV36W0v8A6v2s/wDBH/qpirv0tpf/AFftZ/4I/wDVTFXfpbS/
+r9rP/BH/qpirv0tpf8A1ftZ/wCCP/VTFXfpbS/+r9rP/BH/AKqYq79LaX/1ftZ/4I/9VMVd+ltL
/wCr9rP/AAR/6qYqzjyzNDcaPDLBcT3aEvSa63lNGb7W56dsVTbFUl8mf8ofoP8A2zbP/kxHiqaX
VzFaRevNJHFGpAZ5nEaiuw+I++KoL/EGlf8ALfY/9JSYq7/EGlf8t9j/ANJSYq7/ABBpX/LfY/8A
SUmKu/xBpX/LfY/9JSYq7/EGlf8ALfY/9JSYq7/EGlf8t9j/ANJSYq7/ABBpX/LfY/8ASUmKu/xB
pX/LfY/9JSYqr2mqWV7IYra5tp3VeRWCZZGABAqVXtvirHfNmotaajHGNafS6wK3orA0ob4pBz5L
40pT2xVI/wBNv/1NUv8A0iPirv02/wD1NUv/AEiPirv02/8A1NUv/SI+Ku/Tb/8AU1S/9Ij4q79N
v/1NUv8A0iPirv02/wD1NUv/AEiPirv02/8A1NUv/SI+Ku/Tb/8AU1S/9Ij4qzXy3ObnSIZjeHUO
Rf8A0hkMZajEfZPh0xVNcVSXyZ/yh+g/9s2z/wCTEeKqvmQgaRMWNqBVN74EwfaH2goJ+XvirCuU
X8/lz/gJP+qeKu5Rfz+XP+Ak/wCqeKu5Rfz+XP8AgJP+qeKu5Rfz+XP+Ak/6p4q7lF/P5c/4CT/q
niruUX8/lz/gJP8AqniruUX8/lz/AICT/qniruUX8/lz/gJP+qeKp55TKHUZOLaST6Df8c5XEv2o
/tclX4f40xV3my6ng1GNItUtbAGBT6VxCJWJ5SfEGMMm3briqSfpC7/6mHT/APpFX/slxV36Qu/+
ph0//pFX/slxV36Qu/8AqYdP/wCkVf8AslxV36Qu/wDqYdP/AOkVf+yXFXfpC7/6mHT/APpFX/sl
xV36Qu/+ph0//pFX/slxV36Qu/8AqYdP/wCkVf8AslxV36Qu/wDqYdP/AOkVf+yXFWa+XJHl0iF5
LmO8Yl6zwoI0b4j0UInT5YqmmKpL5M/5Q/Qf+2bZ/wDJiPFUdqtrcXlk9vatGkrFSGmQSpsQTVG2
xVIP8Oa7/wAtOn/9IUf/ADTirv8ADmu/8tOn/wDSFH/zTirv8Oa7/wAtOn/9IUf/ADTiqO0vQrmG
V21X6ndRlaIsdskZDV614+GKpl+i9M/5Y4P+RSf804q79F6Z/wAscH/IpP8AmnFXfovTP+WOD/kU
n/NOKu/Remf8scH/ACKT/mnFVSGys7Zi9vbxQsRQtGiqaeFVA8MVYx5sLjUY+LaSo9BdtRVDL9qT
7PJW+H+NcVSOsv8Avzy5/wABH/1TxV1Zf9+eXP8AgI/+qeKurL/vzy5/wEf/AFTxV1Zf9+eXP+Aj
/wCqeKurL/vzy5/wEf8A1TxV1Zf9+eXP+Aj/AOqeKurL/vzy5/wEf/VPFXVl/wB+eXP+Aj/6p4qz
Xy3X9EQ8jak1fexAEH2j9niAPn74qmuKpL5M/wCUP0H/ALZtn/yYjxVX8wxNPpUsa27XZJT9ykvo
MaMP92HpTFWG/oyb/qw3H/cTX/mnFXfoyb/qw3H/AHE1/wCacVd+jJv+rDcf9xNf+acVd+jJv+rD
cf8AcTX/AJpxV36Mm/6sNx/3E1/5pxV36Mm/6sNx/wBxNf8AmnFXfoyb/qw3H/cTX/mnFXfoyb/q
w3H/AHE1/wCacVTrytZyW+oSO+my2IMLD1JLwXAPxJ8PAAU6dcVWebIbiTUYzFaabcr6CjnfOFkB
5SbAetH8P0Yqkn1a8/6tuh/8jR/2U4q76tef9W3Q/wDkaP8AspxV31a8/wCrbof/ACNH/ZTirvq1
5/1bdD/5Gj/spxV31a8/6tuh/wDI0f8AZTirvq15/wBW3Q/+Ro/7KcVd9WvP+rbof/I0f9lOKu+r
Xn/Vt0P/AJGj/spxVmvlxXTSIVkit4GBesdoeUQ+I/ZPN/p3xVNMVSXyZ/yh+g/9s2z/AOTEeKoj
XrRr7TJbZLVb0uUPoPIYlajA/bUqRTrirEv8LXH/AFLlv/0my/8AVTFXf4WuP+pct/8ApNl/6qYq
7/C1x/1Llv8A9Jsv/VTFXf4WuP8AqXLf/pNl/wCqmKu/wtcf9S5b/wDSbL/1UxV3+Frj/qXLf/pN
l/6qYq7/AAtcf9S5b/8ASbL/ANVMVd/ha4/6ly3/AOk2X/qpiqb+WtFl06/knfSYtPDQlPVjuHmJ
qyHhxd2HatfbFVHzZYPdajHIujJqQECr6zXDQkfFIeHFZE8a198VSP8AQ8n/AFLEX/Sa/wD1XxV3
6Hk/6liL/pNf/qvirv0PJ/1LEX/Sa/8A1XxV36Hk/wCpYi/6TX/6r4q79Dyf9SxF/wBJr/8AVfFX
foeT/qWIv+k1/wDqvirv0PJ/1LEX/Sa//VfFXfoeT/qWIv8ApNf/AKr4qzXy3AbfSIYjaCwKl/8A
R1kMoWrE/bLNWvXriqa4qkvkz/lD9B/7Ztn/AMmI8VRGvyvDpcsiTTW7ApSS2T1JBVh0Q0xViP6S
uv8Aq6at/wBIY/5qxV36Suv+rpq3/SGP+asVXR6pcJIjvqWquqsCUNmKMAen2u+Kp9/jLT/+WS+/
6R2/rirv8Zaf/wAsl9/0jt/XFXDzlp5/49L3/kQf64qjdL1221WV4YIbiIxrzJniMYIrTYnFUzxV
2KsO832K3WpRSHRZ9TpAq+tDM0ar8ch4UEb771+nFUi/RCf9Stef9JL/APVHFXfohP8AqVrz/pJf
/qjirv0Qn/UrXn/SS/8A1RxV36IT/qVrz/pJf/qjirv0Qn/UrXn/AEkv/wBUcVd+iE/6la8/6SX/
AOqOKu/RCf8AUrXn/SS//VHFXfohP+pWvP8ApJf/AKo4qzjyzCLfR4YhaPYAF/8AR5WLstWY7sVX
r16Yqm2KpL5M/wCUP0H/ALZtn/yYjxVMNQs2v7V7VbiW1LkH1bduEgoQdm98VSf/AAnN/wBXzVP+
kg/0xV3+E5v+r5qn/SQf6Yq7/Cc3/V81T/pIP9MVd/hOb/q+ap/0kH+mKtp5VlV1b9N6m3Eg0NwS
DTsdsVZDirsVdirsVSXWPK9nrV0t1cXFzCyRiILA6qpALNUhkbf4sVQH+ANM/wCW2/8A+Rqf9UsV
d/gDTP8Altv/APkan/VLFXf4A0z/AJbb/wD5Gp/1SxVWsvJWn2N3DeR3d47wMHVZJFKkj+YCMYqy
PFXYq7FXYq7FXYqw/wAp+bPKtt5V0W3uNa0+GaHT7WOSOS6hV0dYY1ZWVpAQQRuMVTb/ABn5P/6v
2m/9JkH/AFUxV3+M/J//AFftN/6TIP8Aqpirv8Z+T/8Aq/ab/wBJkH/VTFXf4z8n/wDV+03/AKTI
P+qmKu/xn5P/AOr9pv8A0mQf9VMVd/jPyf8A9X7Tf+kyD/qpirv8Z+T/APq/ab/0mQf9VMVd/jPy
f/1ftN/6TIP+qmKu/wAZ+T/+r9pv/SZB/wBVMVd/jPyf/wBX7Tf+kyD/AKqYq7/Gfk//AKv2m/8A
SZB/1UxV3+M/J/8A1ftN/wCkyD/qpirv8Z+T/wDq/ab/ANJkH/VTFXf4z8n/APV+03/pMg/6qYq7
/Gfk/wD6v2m/9JkH/VTFXf4z8n/9X7Tf+kyD/qpirv8AGfk//q/ab/0mQf8AVTFXf4z8n/8AV+03
/pMg/wCqmKu/xn5P/wCr9pv/AEmQf9VMVd/jPyf/ANX7Tf8ApMg/6qYq7/Gfk/8A6v2m/wDSZB/1
UxV//9k=</xmpGImg:image> + </rdf:li> + <rdf:li rdf:parseType="Resource"> + <xmpTPg:PageNumber>2</xmpTPg:PageNumber> + <xmpGImg:format>JPEG</xmpGImg:format> + <xmpGImg:width>256</xmpGImg:width> + <xmpGImg:height>256</xmpGImg:height> + <xmpGImg:image>/9j/4AAQSkZJRgABAgEASABIAAD/7QAsUGhvdG9zaG9wIDMuMAA4QklNA+0AAAAAABAASAAAAAEA
AQBIAAAAAQAB/+4AE0Fkb2JlAGSAAAAAAQUAAgAg/9sAhAAKBwcHBwcKBwcKDgkJCQ4RDAsLDBEU
EBAQEBAUEQ8RERERDxERFxoaGhcRHyEhISEfKy0tLSsyMjIyMjIyMjIyAQsJCQ4MDh8XFx8rIh0i
KzIrKysrMjIyMjIyMjIyMjIyMjIyMjI+Pj4+PjJAQEBAQEBAQEBAQEBAQEBAQEBAQED/wAARCAEA
ALADAREAAhEBAxEB/8QBogAAAAcBAQEBAQAAAAAAAAAABAUDAgYBAAcICQoLAQACAgMBAQEBAQAA
AAAAAAABAAIDBAUGBwgJCgsQAAIBAwMCBAIGBwMEAgYCcwECAxEEAAUhEjFBUQYTYSJxgRQykaEH
FbFCI8FS0eEzFmLwJHKC8SVDNFOSorJjc8I1RCeTo7M2F1RkdMPS4ggmgwkKGBmElEVGpLRW01Uo
GvLj88TU5PRldYWVpbXF1eX1ZnaGlqa2xtbm9jdHV2d3h5ent8fX5/c4SFhoeIiYqLjI2Oj4KTlJ
WWl5iZmpucnZ6fkqOkpaanqKmqq6ytrq+hEAAgIBAgMFBQQFBgQIAwNtAQACEQMEIRIxQQVRE2Ei
BnGBkTKhsfAUwdHhI0IVUmJy8TMkNEOCFpJTJaJjssIHc9I14kSDF1STCAkKGBkmNkUaJ2R0VTfy
o7PDKCnT4/OElKS0xNTk9GV1hZWltcXV5fVGVmZ2hpamtsbW5vZHV2d3h5ent8fX5/c4SFhoeIiY
qLjI2Oj4OUlZaXmJmam5ydnp+So6SlpqeoqaqrrK2ur6/9oADAMBAAIRAxEAPwDpnkz/AJQ/Qf8A
tm2f/JiPFU6xV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxVJfJn/ACh+g/8A
bNs/+TEeKo3VpdQgsXk0tIpLoFeCzmiUJHKp5J298VY/+k/PX/LLp3/Bn/soxV36T89f8sunf8Gf
+yjFXfpPz1/yy6d/wZ/7KMVd+k/PX/LLp3/Bn/soxV36T89f8sunf8Gf+yjFWxqfnmhra6dWm3x9
/wDpIxVr9J+ev+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+ev+WX
Tv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+e
v+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq79J+ev+WXTv8Agz/2UYq7
9J+ev+WXTv8Agz/2UYqyDSZdQnsUk1RIo7oluawGqUBPGh5P298VRuKpL5M/5Q/Qf+2bZ/8AJiPF
U6xVSe6to2KSTIjDqrMAR9BOKrfrtn/y0Rf8Gv8AXFXfXbP/AJaIv+DX+uKu+u2f/LRF/wAGv9cV
d9ds/wDloi/4Nf64q767Z/8ALRF/wa/1xV312z/5aIv+DX+uKu+u2f8Ay0Rf8Gv9cVXx3EEp4xSp
IwFaKwJp9GKryQoLMaAbkntiqj9ds/8Aloi/4Nf64q767Z/8tEX/AAa/1xV312z/AOWiL/g1/rir
vrtn/wAtEX/Br/XFXfXbP/loi/4Nf64q767Z/wDLRF/wa/1xV312z/5aIv8Ag1/rirvrtn/y0Rf8
Gv8AXFVVJEkXnGwdT0Kmo/DFV2KpL5M/5Q/Qf+2bZ/8AJiPFUfqdzd2lm89jbG8nUrxhDceVSAd9
+gxVhF/Z3mp3cl9eeV5HnlpzYXLLXioQbLQdFxVD/oR/+pVl/wCkt8Vd+hH/AOpVl/6S3xV36Ef/
AKlWX/pLfFXfoR/+pVl/6S3xV36Ef/qVZf8ApLfFXfoR/wDqVZf+kt8Vd+hH/wCpVl/6S3xVPPKe
nNaajJIdFfS6wMvrNO0ob4ozw4t40rX2xVMtev8AVoJDZ2WlNqFvNDSSRZOFCxZWToe368VYj+hH
/wCpVl/6S3xV36Ef/qVZf+kt8Vd+hH/6lWX/AKS3xV36Ef8A6lWX/pLfFXfoR/8AqVZf+kt8Vd+h
H/6lWX/pLfFXfoR/+pVl/wCkt8Vd+hH/AOpVl/6S3xVmvluA22kQwmzOn8S/+js5kK1Yn7R8euKp
riqS+TP+UP0H/tm2f/JiPFV/miGOfRpo5Laa8UlKwW1fUajr0or9PlirBP0VZf8AUvat97f9UMVd
+irL/qXtW+9v+qGKu/RVl/1L2rfe3/VDFXfoqy/6l7Vvvb/qhirv0VZf9S9q33t/1QxV36Ksv+pe
1b72/wCqGKu/RVl/1L2rfe3/AFQxV36Ksv8AqXtW+9v+qGKp95Osre21OV4dKvrBjAymW7J4Ec4/
hFYk32r1xV3nGyt7nU4nm0q+v2ECqJbQngBzk+E0iffevXFUh/RVl/1L2rfe3/VDFXfoqy/6l7Vv
vb/qhirv0VZf9S9q33t/1QxV36Ksv+pe1b72/wCqGKu/RVl/1L2rfe3/AFQxV36Ksv8AqXtW+9v+
qGKu/RVl/wBS9q33t/1QxV36Ksv+pe1b72/6oYqzvyvDHBo0McdtNZqC9ILmvqLV261VOvyxVN8V
SXyZ/wAofoP/AGzbP/kxHiqp5n9P9DTep9Y41Sv1OnrfaX7NfxxVgv8AoX/a+/4XFXf6F/2vv+Fx
V3+hf9r7/hcVd/oX/a+/4XFXf6F/2vv+FxV3+hf9r7/hcVd/oX/a+/4XFXf6F/2vv+FxVPvJ/wBX
/ScvpfpPl6Df7309OnOP7NP2v7cVd5w+r/pOL1f0ny9Bf94KenTnJ9qv7X9mKpD/AKF/2vv+FxV3
+hf9r7/hcVd/oX/a+/4XFXf6F/2vv+FxV3+hf9r7/hcVd/oX/a+/4XFXf6F/2vv+FxV3+hf9r7/h
cVZ15Y9P9DQ+n9Y41en1ynrfab7VPwxVNsVSXyZ/yh+g/wDbNs/+TEeKr/NE0cGjTSSXM1moKVnt
q+otXXpRk6/PFWCfpWy/6mHVvub/AKr4q79K2X/Uw6t9zf8AVfFXfpWy/wCph1b7m/6r4q79K2X/
AFMOrfc3/VfFXfpWy/6mHVvub/qvirv0rZf9TDq33N/1XxV36Vsv+ph1b7m/6r4q79K2X/Uw6t9z
f9V8VT7yde29zqcqQ6rfX7CBmMV2DwA5x/EKyvvvTpirvON7b22pxJNqt9YMYFYRWgPAjnJ8RpKm
+1OmKpD+lbL/AKmHVvub/qvirv0rZf8AUw6t9zf9V8Vd+lbL/qYdW+5v+q+Ku/Stl/1MOrfc3/Vf
FXfpWy/6mHVvub/qvirv0rZf9TDq33N/1XxV36Vsv+ph1b7m/wCq+Ku/Stl/1MOrfc3/AFXxVnfl
eaOfRoZI7ma8Ul6T3NfUajt1qz9Pniqb4qkvkz/lD9B/7Ztn/wAmI8VVfMk5ttImmF4dP4lP9IVD
IVqwH2R49MVYV+m3/wCpql/6RHxV36bf/qapf+kR8Vd+m3/6mqX/AKRHxV36bf8A6mqX/pEfFXfp
t/8Aqapf+kR8Vd+m3/6mqX/pEfFXfpt/+pql/wCkR8Vd+m3/AOpql/6RHxVPPKeotd6jJGdafVKQ
M3otA0QX4oxz5N4VpT3xV3mzUWtNRjjGtPpdYFb0VgaUN8Ug58l8aUp7Yqkf6bf/AKmqX/pEfFXf
pt/+pql/6RHxV36bf/qapf8ApEfFXfpt/wDqapf+kR8Vd+m3/wCpql/6RHxV36bf/qapf+kR8Vd+
m3/6mqX/AKRHxV36bf8A6mqX/pEfFWa+W5zc6RDMbw6hyL/6QyGMtRiPsnw6YqmuKpL5M/5Q/Qf+
2bZ/8mI8VV/MTyJpUrRXMVkwKUnnUOi/EOqsrjfp0xVhv1m+/wCpi03/AJERf9k+Ku+s33/Uxab/
AMiIv+yfFXfWb7/qYtN/5ERf9k+Ku+s33/Uxab/yIi/7J8Vd9Zvv+pi03/kRF/2T4q76zff9TFpv
/IiL/snxV31m+/6mLTf+REX/AGT4q76zff8AUxab/wAiIv8AsnxVOfK01zJqEizaraagvosRFbRo
jg8k+IlIkNO3XFXeaZrmPUI1h1W009fRUmK5jR3J5P8AEC8TmnbriqTfWb7/AKmLTf8AkRF/2T4q
76zff9TFpv8AyIi/7J8Vd9Zvv+pi03/kRF/2T4q76zff9TFpv/IiL/snxV31m+/6mLTf+REX/ZPi
rvrN9/1MWm/8iIv+yfFXfWb7/qYtN/5ERf8AZPirvrN9/wBTFpv/ACIi/wCyfFWZeXXkfSomluYr
1iXrPAoRG+I9FVUG3TpiqZ4qkvkz/lD9B/7Ztn/yYjxVW8xFhpMpUWrGqbX/AB9D7Q+1zoPl74qw
z1J/99eWvvh/5qxV3qT/AO+vLX3w/wDNWKu9Sf8A315a++H/AJqxV3qT/wC+vLX3w/8ANWKu9Sf/
AH15a++H/mrFXepP/vry198P/NWKu9Sf/fXlr74f+asVd6k/++vLX3w/81YqnXlVpW1CQOmkKPRb
fTfT9X7Sfa4Enj/GmKu81NKuoRhE0hh6K76l6fq/af7PMg8f41xVJfUn/wB9eWvvh/5qxV3qT/76
8tffD/zVirvUn/315a++H/mrFXepP/vry198P/NWKu9Sf/fXlr74f+asVd6k/wDvry198P8AzVir
vUn/AN9eWvvh/wCasVd6k/8Avry198P/ADVirM/LpY6TEWFqpq+1hx9D7R+zwqPn74qmmKpL5M/5
Q/Qf+2bZ/wDJiPFVbzHG8ukTJHbR3jEpSCZxGjfEOrF06fPFWFfo+7/6l7T/APpKX/sqxV36Pu/+
pe0//pKX/sqxV36Pu/8AqXtP/wCkpf8AsqxV36Pu/wDqXtP/AOkpf+yrFXfo+7/6l7T/APpKX/sq
xV36Pu/+pe0//pKX/sqxV36Pu/8AqXtP/wCkpf8AsqxV36Pu/wDqXtP/AOkpf+yrFU78p2s8GoyP
LpdrYAwMPVt5hKxPKP4Somk279MVd5stZ59RjeLS7W/AgUercTCJgeUnwhTNHt36Yqkn6Pu/+pe0
/wD6Sl/7KsVd+j7v/qXtP/6Sl/7KsVd+j7v/AKl7T/8ApKX/ALKsVd+j7v8A6l7T/wDpKX/sqxV3
6Pu/+pe0/wD6Sl/7KsVd+j7v/qXtP/6Sl/7KsVd+j7v/AKl7T/8ApKX/ALKsVd+j7v8A6l7T/wDp
KX/sqxVmvlyN4tIhSS2js2BesELiRF+I9GDv1+eKppiqS+TP+UP0H/tm2f8AyYjxVV8yQG50iaEW
Z1DkU/0dXMZajA/aHh1xVhX6Ef8A6lWX/pLfFXfoR/8AqVZf+kt8Vd+hH/6lWX/pLfFXfoR/+pVl
/wCkt8Vd+hH/AOpVl/6S3xV36Ef/AKlWX/pLfFXfoR/+pVl/6S3xV36Ef/qVZf8ApLfFU88p6c1p
qMkh0V9LrAy+s07ShvijPDi3jStfbFXebNOa71GOQaK+qUgVfWWdogvxSHhxXwrWvviqR/oR/wDq
VZf+kt8Vd+hH/wCpVl/6S3xV36Ef/qVZf+kt8Vd+hH/6lWX/AKS3xV36Ef8A6lWX/pLfFXfoR/8A
qVZf+kt8Vd+hH/6lWX/pLfFXfoR/+pVl/wCkt8VZr5bgNtpEMJszp/Ev/o7OZCtWJ+0fHriqa4qk
vkz/AJQ/Qf8Atm2f/JiPFV/miGOfRpo5Laa8UlKwW1fUajr0or9PlirBP0VZf9S9q33t/wBUMVd+
irL/AKl7Vvvb/qhirJ4/y+0B40dhcIWUEqZBUVHQ/Biq7/lXfl/xn/5GD/mjFXf8q78v+M//ACMH
/NGKu/5V35f8Z/8AkYP+aMVd/wAq78v+M/8AyMH/ADRirv8AlXfl/wAZ/wDkYP8AmjFUfo/lXS9D
umu7H1fUeMxH1GDDiSrfyj+XFUl842Vvc6nE82lX1+wgVRLaE8AOcnwmkT77164qkP6Ksv8AqXtW
+9v+qGKu/RVl/wBS9q33t/1QxV36Ksv+pe1b72/6oYq79FWX/Uvat97f9UMVd+irL/qXtW+9v+qG
Ku/RVl/1L2rfe3/VDFXfoqy/6l7Vvvb/AKoYq79FWX/Uvat97f8AVDFWd+V4Y4NGhjjtprNQXpBc
19Rau3Wqp1+WKpviqS+TP+UP0H/tm2f/ACYjxVH6nqC6ZZveNDJcBCo9OEcnPIhdht44qwTUr601
K9lvWi1uAy8f3cIVUHFVTYb+GKoX/Qv+19/wuKu/0L/tff8AC4q7/Qv+19/wuKu/0L/tff8AC4q7
/Qv+19/wuKu/0L/tff8AC4q7/Qv+19/wuKp95P8Aq/6Tl9L9J8vQb/e+np05x/Zp+1/birvOH1f9
Jxer+k+XoL/vBT06c5PtV/a/sxVIf9C/7X3/AAuKu/0L/tff8Lirv9C/7X3/AAuKu/0L/tff8Lir
v9C/7X3/AAuKu/0L/tff8Lirv9C/7X3/AAuKu/0L/tff8LirOvLHp/oaH0/rHGr0+uU9b7Tfap+G
KptiqS+TP+UP0H/tm2f/ACYjxVf5omjg0aaSS5ms1BSs9tX1Fq69KMnX54qwT9K2X/Uw6t9zf9V8
Vd+lbL/qYdW+5v8Aqvirv0rZf9TDq33N/wBV8Vd+lbL/AKmHVvub/qvirv0rZf8AUw6t9zf9V8Vd
+lbL/qYdW+5v+q+Ku/Stl/1MOrfc3/VfFXfpWy/6mHVvub/qviqfeTr23udTlSHVb6/YQMxiuweA
HOP4hWV996dMVd5xvbe21OJJtVvrBjArCK0B4Ec5PiNJU32p0xVIf0rZf9TDq33N/wBV8Vd+lbL/
AKmHVvub/qvirv0rZf8AUw6t9zf9V8Vd+lbL/qYdW+5v+q+Ku/Stl/1MOrfc3/VfFXfpWy/6mHVv
ub/qvirv0rZf9TDq33N/1XxV36Vsv+ph1b7m/wCq+Ks78rzRz6NDJHczXikvSe5r6jUdutWfp88V
TfFUl8mf8ofoP/bNs/8AkxHiqr5knNtpE0wvDp/Ep/pCoZCtWA+yPHpirCv02/8A1NUv/SI+Ku/T
b/8AU1S/9Ij4q79Nv/1NUv8A0iPirv02/wD1NUv/AEiPirv02/8A1NUv/SI+Ku/Tb/8AU1S/9Ij4
q79Nv/1NUv8A0iPirv02/wD1NUv/AEiPiqeeU9Ra71GSM60+qUgZvRaBogvxRjnybwrSnvirvNmo
taajHGNafS6wK3orA0ob4pBz5L40pT2xVI/02/8A1NUv/SI+Ku/Tb/8AU1S/9Ij4q79Nv/1NUv8A
0iPirv02/wD1NUv/AEiPirv02/8A1NUv/SI+Ku/Tb/8AU1S/9Ij4q79Nv/1NUv8A0iPirv02/wD1
NUv/AEiPirNfLc5udIhmN4dQ5F/9IZDGWoxH2T4dMVTXFUl8mf8AKH6D/wBs2z/5MR4qr+YnkTSp
WiuYrJgUpPOodF+IdVZXG/TpirDfrN9/1MWm/wDIiL/snxV31m+/6mLTf+REX/ZPirvrN9/1MWm/
8iIv+yfFXfWb7/qYtN/5ERf9k+Ku+s33/Uxab/yIi/7J8Vd9Zvv+pi03/kRF/wBk+Ku+s33/AFMW
m/8AIiL/ALJ8Vd9Zvv8AqYtN/wCREX/ZPiqc+VprmTUJFm1W01BfRYiK2jRHB5J8RKRIaduuKu80
zXMeoRrDqtpp6+ipMVzGjuTyf4gXic07dcVSb6zff9TFpv8AyIi/7J8Vd9Zvv+pi03/kRF/2T4q7
6zff9TFpv/IiL/snxV31m+/6mLTf+REX/ZPirvrN9/1MWm/8iIv+yfFXfWb7/qYtN/5ERf8AZPir
vrN9/wBTFpv/ACIi/wCyfFXfWb7/AKmLTf8AkRF/2T4qzLy68j6VE0tzFesS9Z4FCI3xHoqqg26d
MVTPFUl8mf8AKH6D/wBs2z/5MR4qreYiw0mUqLVjVNr/AI+h9ofa50Hy98VYZ6k/++vLX3w/81Yq
71J/99eWvvh/5qxV3qT/AO+vLX3w/wDNWKu9Sf8A315a++H/AJqxV3qT/wC+vLX3w/8ANWKu9Sf/
AH15a++H/mrFXepP/vry198P/NWKu9Sf/fXlr74f+asVTryq0rahIHTSFHotvpvp+r9pPtcCTx/j
TFXeamlXUIwiaQw9Fd9S9P1ftP8AZ5kHj/GuKpL6k/8Avry198P/ADVirvUn/wB9eWvvh/5qxV3q
T/768tffD/zVirvUn/315a++H/mrFXepP/vry198P/NWKu9Sf/fXlr74f+asVd6k/wDvry198P8A
zVirvUn/AN9eWvvh/wCasVZn5dLHSYiwtVNX2sOPofaP2eFR8/fFU0xVJfJn/KH6D/2zbP8A5MR4
qreY43l0iZI7aO8YlKQTOI0b4h1YunT54qwr9H3f/Uvaf/0lL/2VYq79H3f/AFL2n/8ASUv/AGVY
q79H3f8A1L2n/wDSUv8A2VYq79H3f/Uvaf8A9JS/9lWKu/R93/1L2n/9JS/9lWKu/R93/wBS9p//
AElL/wBlWKu/R93/ANS9p/8A0lL/ANlWKu/R93/1L2n/APSUv/ZViqd+U7WeDUZHl0u1sAYGHq28
wlYnlH8JUTSbd+mKu82Ws8+oxvFpdrfgQKPVuJhEwPKT4Qpmj279MVST9H3f/Uvaf/0lL/2VYq79
H3f/AFL2n/8ASUv/AGVYq79H3f8A1L2n/wDSUv8A2VYq79H3f/Uvaf8A9JS/9lWKu/R93/1L2n/9
JS/9lWKu/R93/wBS9p//AElL/wBlWKu/R93/ANS9p/8A0lL/ANlWKu/R93/1L2n/APSUv/ZVirNf
LkbxaRCkltHZsC9YIXEiL8R6MHfr88VTTFUl8mf8ofoP/bNs/wDkxHiqr5kgNzpE0IszqHIp/o6u
Yy1GB+0PDrirCv0I/wD1Ksv/AElvirv0I/8A1Ksv/SW+Ku/Qj/8AUqy/9Jb4q79CP/1Ksv8A0lvi
rv0I/wD1Ksv/AElvirv0I/8A1Ksv/SW+Ku/Qj/8AUqy/9Jb4q79CP/1Ksv8A0lviqeeU9Oa01GSQ
6K+l1gZfWadpQ3xRnhxbxpWvtirvNmnNd6jHINFfVKQKvrLO0QX4pDw4r4VrX3xVI/0I/wD1Ksv/
AElvirv0I/8A1Ksv/SW+Ku/Qj/8AUqy/9Jb4q79CP/1Ksv8A0lviqK03y5BdXsVve+XZLOB+XOc3
LtxorEbVHUimKp9/gTyz/wAsrf8AI2T/AJrxV3+BPLP/ACyt/wAjZP8AmvFXf4E8s/8ALK3/ACNk
/wCa8VTjT9PtdLtUsrJDHDGSVUkt9oljuxJ6nFUViqS+TP8AlD9B/wC2bZ/8mI8VX+aIY59Gmjkt
prxSUrBbV9RqOvSiv0+WKsE/RVl/1L2rfe3/AFQxV36Ksv8AqXtW+9v+qGKu/RVl/wBS9q33t/1Q
xV36Ksv+pe1b72/6oYq79FWX/Uvat97f9UMVd+irL/qXtW+9v+qGKu/RVl/1L2rfe3/VDFXfoqy/
6l7Vvvb/AKoYqn3k6yt7bU5Xh0q+sGMDKZbsngRzj+EViTfavXFU31/WLmzdrCPSrq/inhPOW3DE
DnzQrUI29BXFWFfoqy/6l7Vvvb/qhirv0VZf9S9q33t/1QxV36Ksv+pe1b72/wCqGKu/RVl/1L2r
fe3/AFQxV36Ksv8AqXtW+9v+qGKu/RVl/wBS9q33t/1QxV36Ksv+pe1b72/6oYq79FWX/Uvat97f
9UMVZ35Xhjg0aGOO2ms1BekFzX1Fq7daqnX5Yqm+KpL5M/5Q/Qf+2bZ/8mI8VVPM/p/oab1PrHGq
V+p09b7S/Zr+OKsF/wBC/wC19/wuKu/0L/tff8Lirv8AQv8Atff8Lirv9C/7X3/C4q7/AEL/ALX3
/C4q7/Qv+19/wuKu/wBC/wC19/wuKu/0L/tff8LiqfeT/q/6Tl9L9J8vQb/e+np05x/Zp+1/birv
OH1f9Jxer+k+XoL/ALwU9OnOT7Vf2v7MVSH/AEL/ALX3/C4q7/Qv+19/wuKu/wBC/wC19/wuKu/0
L/tff8Lirv8AQv8Atff8Lirv9C/7X3/C4q7/AEL/ALX3/C4q7/Qv+19/wuKs68sen+hofT+scavT
65T1vtN9qn4Yqm2KpL5M/wCUP0H/ALZtn/yYjxVf5omjg0aaSS5ms1BSs9tX1Fq69KMnX54qwT9K
2X/Uw6t9zf8AVfFXfpWy/wCph1b7m/6r4q79K2X/AFMOrfc3/VfFXfpWy/6mHVvub/qvirv0rZf9
TDq33N/1XxV36Vsv+ph1b7m/6r4q79K2X/Uw6t9zf9V8Vd+lbL/qYdW+5v8AqviqfeTr23udTlSH
Vb6/YQMxiuweAHOP4hWV996dMVd5xvbe21OJJtVvrBjArCK0B4Ec5PiNJU32p0xVIf0rZf8AUw6t
9zf9V8Vd+lbL/qYdW+5v+q+Ku/Stl/1MOrfc3/VfFXfpWy/6mHVvub/qvirv0rZf9TDq33N/1XxV
36Vsv+ph1b7m/wCq+Ku/Stl/1MOrfc3/AFXxV36Vsv8AqYdW+5v+q+Ks78rzRz6NDJHczXikvSe5
r6jUdutWfp88VTfFUl8mf8ofoP8A2zbP/kxHiqP1O2u7uzeCxuTZzsV4zBeXGhBO23UYqwi/vLzT
LuSxvPNEiTxU5qLZmpyUON1qOjYqh/02/wD1NUv/AEiPiq+HXeEqPJ5okkRWBZPqrjkAdx9OKsl/
x35Z/wCWpv8AkVJ/zRirv8d+Wf8Alqb/AJFSf80Yq7/Hfln/AJam/wCRUn/NGKu/x35Z/wCWpv8A
kVJ/zRirv8d+Wf8Alqb/AJFSf80YqjdL8y6PrNw1rp8xklRDIQUZfhBVa1ZR3YYqk3mzUWtNRjjG
tPpdYFb0VgaUN8Ug58l8aUp7Yqkf6bf/AKmqX/pEfFXfpt/+pql/6RHxV36bf/qapf8ApEfFXfpt
/wDqapf+kR8Vd+m3/wCpql/6RHxV36bf/qapf+kR8Vd+m3/6mqX/AKRHxV36bf8A6mqX/pEfFWa+
W5zc6RDMbw6hyL/6QyGMtRiPsnw6YqmuKpL5M/5Q/Qf+2bZ/8mI8VRGvTTwaZLLbXcenyApS4lAK
LVhWoKt16dMVYa95qMjF5PMmnOx6s0MZJ+k2+KtfWb7/AKmLTf8AkRF/2T4q76zff9TFpv8AyIi/
7J8Vd9Zvv+pi03/kRF/2T4q76zff9TFpv/IiL/snxV31m+/6mLTf+REX/ZPirvrN9/1MWm/8iIv+
yfFXfWb7/qYtN/5ERf8AZPiqc+VprmTUJFm1W01BfRYiK2jRHB5J8RKRIaduuKu80zXMeoRrDqtp
p6+ipMVzGjuTyf4gXic07dcVSb6zff8AUxab/wAiIv8AsnxV31m+/wCpi03/AJERf9k+Ku+s33/U
xab/AMiIv+yfFXfWb7/qYtN/5ERf9k+Ku+s33/Uxab/yIi/7J8Vd9Zvv+pi03/kRF/2T4q76zff9
TFpv/IiL/snxV31m+/6mLTf+REX/AGT4qzLy68j6VE0tzFesS9Z4FCI3xHoqqg26dMVTPFUl8mf8
ofoP/bNs/wDkxHiqt5iLDSZSotWNU2v+PofaH2udB8vfFWGepP8A768tffD/AM1Yq71J/wDfXlr7
4f8AmrFXepP/AL68tffD/wA1Yq71J/8AfXlr74f+asVd6k/++vLX3w/81Yq71J/99eWvvh/5qxV3
qT/768tffD/zVirvUn/315a++H/mrFU68qtK2oSB00hR6Lb6b6fq/aT7XAk8f40xV3mppV1CMImk
MPRXfUvT9X7T/Z5kHj/GuKpL6k/++vLX3w/81Yq71J/99eWvvh/5qxV3qT/768tffD/zVirvUn/3
15a++H/mrFXepP8A768tffD/AM1Yq71J/wDfXlr74f8AmrFXepP/AL68tffD/wA1Yq71J/8AfXlr
74f+asVZn5dLHSYiwtVNX2sOPofaP2eFR8/fFU0xVJfJn/KH6D/2zbP/AJMR4qreY43l0iZI7aO8
YlKQTOI0b4h1YunT54qwr9H3f/Uvaf8A9JS/9lWKu/R93/1L2n/9JS/9lWKu/R93/wBS9p//AElL
/wBlWKu/R93/ANS9p/8A0lL/ANlWKu/R93/1L2n/APSUv/ZVirv0fd/9S9p//SUv/ZVirv0fd/8A
Uvaf/wBJS/8AZVirv0fd/wDUvaf/ANJS/wDZViqd+U7WeDUZHl0u1sAYGHq28wlYnlH8JUTSbd+m
Ku82Ws8+oxvFpdrfgQKPVuJhEwPKT4Qpmj279MVST9H3f/Uvaf8A9JS/9lWKu/R93/1L2n/9JS/9
lWKu/R93/wBS9p//AElL/wBlWKu/R93/ANS9p/8A0lL/ANlWKu/R93/1L2n/APSUv/ZVirv0fd/9
S9p//SUv/ZVirv0fd/8AUvaf/wBJS/8AZVirv0fd/wDUvaf/ANJS/wDZVirNfLkbxaRCkltHZsC9
YIXEiL8R6MHfr88VTTFUl8mf8ofoP/bNs/8AkxHiqr5kgNzpE0IszqHIp/o6uYy1GB+0PDrirCv0
I/8A1Ksv/SW+Ku/Qj/8AUqy/9Jb4q79CP/1Ksv8A0lvirv0I/wD1Ksv/AElvirv0I/8A1Ksv/SW+
Ku/Qj/8AUqy/9Jb4q79CP/1Ksv8A0lvirv0I/wD1Ksv/AElviqeeU9Oa01GSQ6K+l1gZfWadpQ3x
RnhxbxpWvtirvNmnNd6jHINFfVKQKvrLO0QX4pDw4r4VrX3xVI/0I/8A1Ksv/SW+Ku/Qj/8AUqy/
9Jb4q79CP/1Ksv8A0lvirv0I/wD1Ksv/AElvirv0I/8A1Ksv/SW+Ku/Qj/8AUqy/9Jb4q79CP/1K
sv8A0lvirv0I/wD1Ksv/AElvirNfLcBttIhhNmdP4l/9HZzIVqxP2j49cVTXFUl8mf8AKH6D/wBs
2z/5MR4qv80Qxz6NNHJbTXikpWC2r6jUdelFfp8sVYJ+irL/AKl7Vvvb/qhirv0VZf8AUvat97f9
UMVd+irL/qXtW+9v+qGKu/RVl/1L2rfe3/VDFXfoqy/6l7Vvvb/qhirv0VZf9S9q33t/1QxV36Ks
v+pe1b72/wCqGKu/RVl/1L2rfe3/AFQxVPvJ1lb22pyvDpV9YMYGUy3ZPAjnH8IrEm+1euKu842V
vc6nE82lX1+wgVRLaE8AOcnwmkT77164qkP6Ksv+pe1b72/6oYq79FWX/Uvat97f9UMVd+irL/qX
tW+9v+qGKu/RVl/1L2rfe3/VDFXfoqy/6l7Vvvb/AKoYq79FWX/Uvat97f8AVDFXfoqy/wCpe1b7
2/6oYq79FWX/AFL2rfe3/VDFWd+V4Y4NGhjjtprNQXpBc19Rau3Wqp1+WKpviqS+TP8AlD9B/wC2
bZ/8mI8VVPM/p/oab1PrHGqV+p09b7S/Zr+OKsF/0L/tff8AC4q7/Qv+19/wuKu/0L/tff8AC4q7
/Qv+19/wuKu/0L/tff8AC4qnumeVrfU7NLxb/U7cOWHpzSBXHEldxxPhiqL/AMDQ/wDV0v8A/kaP
+acVd/gaH/q6X/8AyNH/ADTiqP0fy5Ho9y1yl7c3JeMx8J3DKKlWqBQb/DiqTecPq/6Ti9X9J8vQ
X/eCnp05yfar+1/ZiqQ/6F/2vv8AhcVd/oX/AGvv+FxV3+hf9r7/AIXFXf6F/wBr7/hcVd/oX/a+
/wCFxV3+hf8Aa+/4XFXf6F/2vv8AhcVd/oX/AGvv+FxVnXlj0/0ND6f1jjV6fXKet9pvtU/DFU2x
VJfJn/KH6D/2zbP/AJMR4qnWKuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2KuxV2Ks
P8p+bPKtt5V0W3uNa0+GaHT7WOSOS6hV0dYY1ZWVpAQQRuMVTb/Gfk//AKv2m/8ASZB/1UxV3+M/
J/8A1ftN/wCkyD/qpirv8Z+T/wDq/ab/ANJkH/VTFXf4z8n/APV+03/pMg/6qYq7/Gfk/wD6v2m/
9JkH/VTFXf4z8n/9X7Tf+kyD/qpirv8AGfk//q/ab/0mQf8AVTFXf4z8n/8AV+03/pMg/wCqmKu/
xn5P/wCr9pv/AEmQf9VMVd/jPyf/ANX7Tf8ApMg/6qYq7/Gfk/8A6v2m/wDSZB/1UxV3+M/J/wD1
ftN/6TIP+qmKu/xn5P8A+r9pv/SZB/1UxV3+M/J//V+03/pMg/6qYq7/ABn5P/6v2m/9JkH/AFUx
V3+M/J//AFftN/6TIP8Aqpirv8Z+T/8Aq/ab/wBJkH/VTFXf4z8n/wDV+03/AKTIP+qmKu/xn5P/
AOr9pv8A0mQf9VMVd/jPyf8A9X7Tf+kyD/qpirv8Z+T/APq/ab/0mQf9VMVf/9k=</xmpGImg:image> + </rdf:li> + </rdf:Seq> + </xmp:PageInfo> + </rdf:Description> + <rdf:Description rdf:about="" + xmlns:idPriv="http://ns.adobe.com/xmp/InDesign/private"> + <idPriv:DocChangeCount>3194</idPriv:DocChangeCount> + </rdf:Description> + <rdf:Description rdf:about="" + xmlns:dc="http://purl.org/dc/elements/1.1/"> + <dc:format>application/pdf</dc:format> + </rdf:Description> + <rdf:Description rdf:about="" + xmlns:pdf="http://ns.adobe.com/pdf/1.3/"> + <pdf:Producer>Adobe PDF Library 9.9</pdf:Producer> + <pdf:Trapped>False</pdf:Trapped> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> +<?xpacket end="r"?> +endstream +endobj +2 0 obj +<</Dests 10 0 R>> +endobj +4 0 obj +<</Nums[0 11 0 R]>> +endobj +3 0 obj +<</Count 22/Kids[6 0 R 7 0 R 8 0 R 9 0 R]/Type/Pages>> +endobj +6 0 obj +<</Count 5/Kids[14 0 R 15 0 R 12 0 R 16 0 R 17 0 R]/Parent 3 0 R/Type/Pages>> +endobj +7 0 obj +<</Count 5/Kids[18 0 R 19 0 R 20 0 R 21 0 R 22 0 R]/Parent 3 0 R/Type/Pages>> +endobj +8 0 obj +<</Count 5/Kids[23 0 R 24 0 R 25 0 R 26 0 R 27 0 R]/Parent 3 0 R/Type/Pages>> +endobj +9 0 obj +<</Count 7/Kids[28 0 R 29 0 R 13 0 R 30 0 R 31 0 R 32 0 R 33 0 R]/Parent 3 0 R/Type/Pages>> +endobj +28 0 obj +<</Annots 175 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 176 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 177 0 R/GS2 178 0 R>>/Font<</T1_0 39 0 R/T1_1 38 0 R/T1_2 54 0 R/T1_3 53 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +29 0 obj +<</Annots 180 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 181 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 182 0 R/GS2 183 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 43 0 R/T1_4 40 0 R/T1_5 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 75 0 R/Im1 77 0 R/Im2 76 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +13 0 obj +<</Annots 184 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 185 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 186 0 R/GS2 187 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 40 0 R/T1_3 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 79 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +30 0 obj +<</Annots 188 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 189 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 190 0 R/GS2 191 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 40 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 81 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +31 0 obj +<</Annots 192 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 193 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 194 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 43 0 R/T1_3 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +32 0 obj +<</Annots 195 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 196 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 197 0 R/GS2 198 0 R>>/Font<</C2_0 84 0 R/T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 43 0 R/T1_4 40 0 R/T1_5 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +33 0 obj +<</Annots 87 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 199 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 9 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 200 0 R>>/Font<</T1_0 47 0 R/T1_1 40 0 R/T1_2 42 0 R/T1_3 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +87 0 obj +[117 0 R 118 0 R 119 0 R 120 0 R 121 0 R 122 0 R 123 0 R 124 0 R 125 0 R 126 0 R 127 0 R 201 0 R] +endobj +199 0 obj +<</Filter/FlateDecode/Length 5014>>stream +HWko85"%YϠۅdSbȴF5f~K=R(P)2y{9aYdwsII&3Ilr3K67|T'=fzVmi +,Y.'=}}2wWlghBqTRoX+뫻CKL2/(Y<_bqի c\v5f/fus1阣CtƑK9xf{y6jh[wbhQ+9ߦ9uqyAjaUm3mˆW<]P?votA'J2E"LF[:>)N"]?4|2d۞~S풉70%9ciT"bgd2>'eĢBW3+CH68hL{؟Ś3rE;zFQc1!G*8K +wMswmIB}큸㣖XXc` +07yU;r$9]mY<h@A:v$h*tsB&D2]\(yc{}q;]) +fX:ZWT-sNywo,s|}#ˆ4_vkFI]$uBF[RqVZgՆ3x]Wk?<V-jy]xC +^XasN*d9W|e^p#HT:,e6m5-:3βXp +Xh#9#4ЙL~xIf>toǯgM,@DAܷJhz^-WDvr:~HPÃ"%tU;y]wp*4j⨨6ZfK\<V`9? HYYtlZzuչ7(D,'0.|8l6Uy-Hb8NWyډd^lYa(j;<uRP>&{~G)tw$c#[q[ +zUc'Q6hya9P_եiNׅ!$zTnAӔ55DsOZ ֖S9hmq;l?RdtH=(ٶ~ +7LZ7Z$[Ani!sU-!K@_y0TI闾4WUy$m۠\7$z?G6{#N6t`eύZXg>"wj`QAЭ`vh!ZD<éGu/ +,Ð9d=NIt]5aS\VX8 +P-\.BU:1TE.,Sz<N85G[hmkػuױi3?eĪsV|TUXH(Zf+H$=nfB=nԦSrvhJ+ 'd b͡ C~l,yU.2Q +^˺C8$4<H +Vh{hpifqG=?PWЪK"* +@aJH&D>*ǽA}ͧ|[܂rZUjZ| +FTM=AHF+:h;+ +Rkq]d'oZ`+p RQ+;i0[Sybq;ngDK.8 +*u};Ǎ݇"X7H+z0Ā֠ Ϛ*uR?l$`PDr(Y}L{f(1wt8l*ȸ1v'{T7x4{j1_PQ>1Z6&b9_ycjh]~WL}T s!^.[ygj,elj2Rk)-;d5F,:*M2Eu +jB̛B^t@0>ӟ*`H`gbFlkZ4Q{{$K'|psNNp9R/iB1t&@7:sոkh58U95a};m`6-`.Q։j +H5d~'yPyU ""o]4V9hW&5voVq$u +KA<k[burW?)`E垠ŪcM:[qjVntm.0Dz=<hzPܮxϢДZQؚ$1Bi;:EUEo΄,yևA'i۰W95m[4Z` +vT+c,4c::ӦvzF0Q086.j mMs`4#0>'y9N.rCeA}Xr\!Scp7D`b*4Sm{X^#yn0>(s͂XXؔ@ftn>{s<p QYSP*AH!ӲӍ*e|olj;ƹ ꒜2,weMu#~׆IpQ]7PrE$&08N>V$ΩBi{h4)fze v:THLVlp|fevض,jJmyۖ3/FmpwҠCw^e d['\E)ɭu=c3Q-&#G +endstream +endobj +47 0 obj +<</BaseFont/ZOYSDK+AvenirLTStd-Heavy-SC700/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 112 0 R/LastChar 87/Subtype/Type1/ToUnicode 111 0 R/Type/Font/Widths[296 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 592 0 592 0 592 592 592 592 592 0 0 0 0 0 0 0 722 648 685 0 611 0 0 741 278 0 0 519 0 796 833 611 0 630 574 574 0 0 981]>> +endobj +40 0 obj +<</BaseFont/ONQEFG+TimesNewRomanPS-ItalicMT/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 106 0 R/LastChar 151/Subtype/Type1/ToUnicode 105 0 R/Type/Font/Widths[250 0 0 0 0 0 778 0 333 333 0 0 250 333 250 278 500 500 500 500 500 500 500 500 500 500 333 0 0 0 0 0 0 611 611 667 722 611 611 722 722 333 444 0 0 833 667 722 611 0 611 500 556 722 611 833 611 0 0 0 0 0 0 0 0 500 500 444 500 444 278 500 500 278 278 444 278 722 500 500 500 0 389 389 278 500 444 667 0 444 389 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 333 0 0 0 500 889]>> +endobj +42 0 obj +<</BaseFont/ONQEFG+TimesNewRomanPSMT/Encoding 101 0 R/FirstChar 29/FontDescriptor 102 0 R/LastChar 176/Subtype/Type1/ToUnicode 100 0 R/Type/Font/Widths[564 479 549 250 0 0 0 0 833 778 0 333 333 0 564 250 333 250 278 500 500 500 500 500 500 500 500 500 500 278 278 0 564 0 444 921 722 667 667 722 611 556 722 722 333 389 722 611 889 722 722 556 722 667 556 611 722 722 944 722 722 611 333 0 333 0 500 0 444 500 444 500 444 333 500 500 278 278 500 278 778 500 500 500 500 333 389 278 500 500 722 500 500 444 0 200 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 333 444 444 0 500 1000 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 400]>> +endobj +179 0 obj +<</BaseFont/Helvetica/Encoding/WinAnsiEncoding/Subtype/Type1/Type/Font>> +endobj +101 0 obj +<</BaseEncoding/WinAnsiEncoding/Differences[29/minus/theta/greaterequal]/Type/Encoding>> +endobj +102 0 obj +<</Ascent 891/CapHeight 662/CharSet(/minus/theta/greaterequal/space/percent/ampersand/parenleft/parenright/plus/comma/hyphen/period/slash/zero/one/two/three/four/five/six/seven/eight/nine/colon/semicolon/equal/question/at/A/B/C/D/E/F/G/H/I/J/K/L/M/N/O/P/Q/R/S/T/U/V/W/X/Y/Z/bracketleft/brack\ +etright/underscore/a/b/c/d/e/f/g/h/i/j/k/l/m/n/o/p/q/r/s/t/u/v/w/x/y/z/bar/quoteright/quotedblleft/quotedblright/endash/emdash/degree)/Descent -216/Flags 34/FontBBox[-568 -216 2000 891]/FontFamily(Times New Roman)/FontFile3 141 0 R/FontName/ONQEFG+TimesNewRomanPSMT/FontStretch/Normal/FontWeight 400/ItalicAngle 0/StemV 80/Type/FontDescriptor/XHeight 447>> +endobj +100 0 obj +<</Filter/FlateDecode/Length 609>>stream +H\j@\%&~4 B<ج1D{<yJVP&s춻tnMr~^[?U~|_a,ʼx\i7r:Sw~MEmof8I4\"VKE_)r^z{k]6Pϟ+bs.MaxKr|ɏU͂^T,mz9"/q5po=7X[7feog;㗑of#;-h:#gti0G#?i0G:#B)t +B)t +B)t +B)t +B)t +B)t +},0YB+J¯+J¯+J¯+J¯+J¯+J¯4+JilFflFfa`36`36`3648{k[`vco~w~w~w~w~wf}EkȞ16<Y7 'a_45yfaZCyy_ +endstream +endobj +141 0 obj +<</Filter/FlateDecode/Length 10054/Subtype/Type1C>>stream +HTkPSg>1$9nT9xNzAobѭ7DtA) \bLIBPL ݀1˽,rW)VE]ζLNzٟ;ygb0'4ЖBqaf@qXԻ!Z͠(|)0E93?/c2,V*TRH@!$qTL,HRcRTaRR&%4/'n(wdSRq;DķaHȎsX̏LKIUBT +ui?IA_Al?hr ~ B! +# w_@`eU9-FY豾-\vVb=mi'c$D$KVa^^*Rb&Ѭ92%:2UsI%X W /x +:4Hl*-NVdtbt4"5(3_ºt<a7Ńuݩ 741D +@L5"!IQjU4 r7ڧĦ~fuZƸ={ͼ 摝PQ<{8y{]x`I!ȅ"ۘPB\S4&3gi^W-kz:{]5~Ig%jղd&h(^W} +UKSdi@;D3bRfU:eW15_YJ4F9rEz '?e8%Ƽr6X<(5^yD5208CzuN +UA>v:n?y>rcqQqLq8ilcazi`?l.hYhDa<]4g-Ea'i0$3H#5zȍ[dKrPG`M5gh%VfDSb2Y5ި1*UUK%0/դח1ENJ֔Lh?vG'v<[hYل 3خɄ_6CY<0Ϥawv:l=fZwW;}&y*ܻ40ꀗ#{uEF +;IdNq)Wn;:,лCxࡶ?X{|=*/#RvxHFNgi +_tuN(:/{DI_\%߸744<ghre&\#g5q쵖ΘsN;j;)ZuNoB@B67B,!"AEN\QιM2Wҙ.t<}ϳzK79Gۯd1 1$Җheǟ1vRouYPĿL +*B0O.!G+rs^?G^]GAF0=ʘб٩@bw&Kb$6Z]*D +Mq>]j):2_GNmپ_q.["ЉPQC׀N,"ߌO&}d~1oVH*,]Y1XU/%B5n\w0i/``:`S0 EaY,J%z?0{[iۿCb[q6[*bim +()JSzHuѹCBq+o.! à,KzEz!.k<4RkWS +X`bpvEYz'-U%kmfd>$EhӶg)PO%ƱKWK/e7>M;Qc]IxQ2Q,rʐ}#c};@b`GӰNJ<zF"4٦ȴozMO``]żNh{nnA>7>G'c7y0oSˁ%|irv!,jo]ݱX٘`jnA>YJ6t^zRr}3 +FpL2T lvӝzocBS7idu0kܘWQ)bH#3Ǯ&p?tc̔w(S2}F"j +tF֧iʋ:jҭ&S"g:<0zKbO3mM)! +e=p,ײ~`9cddС]ٵf 49\z<TVYRکR;T)N(w,{o\@OLqmGu!FܤL(e3`?TH)39u6eA۔Π?9ߑEͬhMT%(Zug1KHGyIJ!azgQލ +ܳ.!|x!.\1 +uZ.h +dg* 9WQ'Whj +[;CJCk8lN{;lwF C:Y'49!J$IFr6CY{#GKΠ%WJ-[p +VIƠh +$:Z]nm#l`ް]p4ݦFUJmX6,,#֧:#$LbpxOQec+N\K`1GWdW>.)p1cD[Չ<Av) +5G&QY/Ejqß琥pF>Ua<" Ui3Obum +ej|_«4 +c{N~ބI; P,!$f37ZŶKKj-OeYd[^0 c4[2iN;ާ\ed(t4ս9w<dyJbLnqZ:RH)fFڦVRC W$F|X6;0LZ>?|xr2ifu NUH}k*$Z-1hq>G/;X3(~X8%L8A +w6uf]VC65)#ǫ۫"Oh(,IVA_r1T.)Vr*յ5Ƭhz!#e9]zNşuM9``.D1. |ܯmYiG؏Jm5GGIn#t4:zx`KW +}vr||yG=7˨%kEEUIбƔdBHg6XZbܴ|aG{jFma_$ȉ?G&B<3S+}`(@fWG,"#ī={9Nc8& +KaF +Zll\v>~eN A>D_ܱrm0b9S VսY#ҫMVeK!Gs0s䨬|7Yh %XyBWBr{I ++E"jl >R%$ZB:0~S<fS3d.QyH̊&%$]Cd+ѡH3I5BU̵ g4t"rwp?dsDLA!1נV$9_?{*EvlV`ߨۥܿŞ:Ft듄>i썒$RޏXWpeӐl5;5N"qL8FĢ}N>N02GlN: ⣲6WIrҥ/'LԸJI)5\\(KF:}͏!k9dn8Y@wٝEY_aoXgfDЭT*&m +Kwo/J܈ /5+=hjhw'v(fmӪTV(5|z+KD<6kEXZpP m u>OAa4ؘf_Mcx%!!(}pccy\FQi6V`l)yYʝm#KqT +1۰=fq_ +T`72_d 64Œb4TS0ͭC鑡ywo*>g`iw.H`!Xseu+~ +)!ҷ}A f6VpVX?szRQ|ݢ`k`jAI"9IRZ'mm&=`3:=F!Э!O$uBZ,bDbem5)be]]6<VE獺:}u5FY/ +FUڤ6vua1ϙ&!-RrI[nRcmUj6r!m|M}6`B ]"%Mu&tK+5aE#^Z $Ȉ7>_v| +kűٍ,̍څrm|(->Uw4 +aR^n?N<z./+鳫ԍ_TK@ip}%5JD~<Hx &)A(qX.<H-}9Uts6˿~UJ쥥B:JbJRҭmѳsdfl*2q!L~SRxt>3p[YR ONj3 jB#'dg3SGJo߂Pe0px~y4=[DE؍lvykø#22w(02f^&h7hjrV&)ZY:Z=GAOE}zn{} +8{N!^=n/`_~q-XͱZ&|p<ѰB>21s鱤!QBAx +W.k훙O:uʜF'"H&Iĸ}lrh'/qF9A}qR. #>7m5(PtGg_4{* T|F4ᴊnq'd/Y߳}82oM9WZ&i1pQq4Fdb<YwOaRìY0vA_gXљIˁJذ5RF/:8jLY2إ(ǗRx5W$*/bw#VrȬqA I)t⦲|b_ɫ〖YoD/}HFtNREǖ*ůF HLr870Ca5r܉&1Z(u"+hhB_DqY6;>EيM?E<d[묖شȬfԀGՔf Xxc4V(kO!%iSѐiwXimē1]aeHj1q^eF(T)MJ0*kyܩWuՆ1&LO+ܷbVrMXUeFB6fjd_a=ʪXUaW +Y^(uus̀ׯ +)Uj|f{W];<|m1g|k!*buP%uH*j..FMtIN3;XS'+?ka;)$4w\9q<A,_P:OͧfS%<U +TϑܖF^ȩTtP#LO>ȬIHn}ZLWxP58Sm8YHl !UlۄNx*s&nZ,6ܬؕ@$Kr(e%4ƨoP˖WΧK;mV +YItvKVsh)XNfzco<R*xg$;2hаv5j˯# +,`F<=CdžNuPod|רJj/eFq^C)M.얖R +|xO|v_-րJOt,:LYwJK +z8U MtRdldp2y!%͏¶sxO6$y(QOm._i$<B'(EQW<|YnFC*wy>@w@!Dҏ!0^/{C"#}-H-)y),`<\ X ^Z37pTx_pAYw +se(_0uq9[~ +[mFpԛ:F-Ҷ`:L;ڐˋ:ׁ +Щ2t"&y}uxLZ> +ډ|L@!5f(Vg.fK8'=$3s=\>]x~>X^m ۷4A-'/,¨{uFZH(_F)Ժ̀k\ O?tB*t~Z%u:` t7dMH +endstream +endobj +106 0 obj +<</Ascent 891/CapHeight 663/CharSet(/space/ampersand/parenleft/parenright/comma/hyphen/period/slash/zero/one/two/three/four/five/six/seven/eight/nine/colon/A/B/C/D/E/F/G/H/I/J/M/N/O/P/R/S/T/U/V/W/X/a/b/c/d/e/f/g/h/i/j/k/l/m/n/o/p/r/s/t/u/v/w/y/z/quoteright/endash/emdash)/Descent -216/Flags 98/FontBBox[-497 -216 1120 891]/FontFamily(Times New Roman)/FontFile3 140 0 R/FontName/ONQEFG+TimesNewRomanPS-ItalicMT/FontStretch/Normal/FontWeight 400/ItalicAngle -17/StemV 72/Type/FontDescriptor/XHeight 442>> +endobj +105 0 obj +<</Filter/FlateDecode/Length 528>>stream +H\n@<Ct؉h +r\a W+ +r\a̹GЏA?~O [ +0 +> +endstream +endobj +140 0 obj +<</Filter/FlateDecode/Length 8301/Subtype/Type1C>>stream +HkPSgs96 +x,DXkwV,PKBHJ\D AEE*UDhhkipP=;;;{C,o/Aѻ/9(TGu1?դ$sS8DzKE-Ѳ\ԒX^WV +EB^'/+ +mQ +UF`TMIZZeyʙfyd2^XBV(Xk{<PbAaYorYAXl:y+JX +k+,5m /W'^|)Z1`9bN +_=>Zd%>o<*97dܛmw/<ׯ?wQ"^_+6d- dσyMv/k]\*Ԫpt S%\ \?P'>\ +5W=W{`U6eC}zJ`"=фx\WdP{{]ۇ#SbB,GbRMX!eȑʉ0oj:rW1mIfjʤēS{=xTTc;Q4>@=%vdۡ\$Y]x;ZX9oIJ!ˌu%|& USZ a Rǜ^źխJF01e̲bHqf*2AU!\5[nN:MgO^!fӃ7#hl;ACAXrer~1w{6!M@\)X.'ّ\c +M?ecެ$7jΐw,cA력onlƹ\0i@ӡ*9Mp[Qcpysj34 Ow(`/4P6g +]^PۊՕ۪ (]Z<G@ +puVXi+ .8]&ݶ.iuؤbD;ӮKcح?-(&9ݶ~|!L*R ޥ`B&P}P9Fp۰yΙp6Mkt5N=ϩ)?~P͔{Okw|I2i/(8Rf&*V6J4Z܃;-S@`75BޚW +5SP, ZJuK[ll@8&t6IӖ)?|YMߕi?y\FܪJ$ +hcɪKȹ˓"'c8ԵCm&V^^vst-yo?ϕ:C7w++5Fu59_ݴG~@N먽B4C.S'?,py$LnҺ*2xߊo+ +=rTM-]g_e|$eHYUyzw 4X]_H>ul;dй$gzƲ<d ?,Db-1RȨX0iU{k%Gz{ccgfO汆>4gH88x߰okm&v +e$un3$i9>MD 12iл)f("d^NX<YS-@pV(#x]-2Tvpc|rDXH`AW̛$ +3e4T +m#g՟_=XM|w'´Nr<&0]&BֿaAYD0D`=1W'QF$zJͼB%$3Oj+#2e'l 63yf +d~ ++c +Ҝ!_:TMLm |ߖ!IM//&QϾ`˽٧o3Qh0ШYJc8qВF5Ų7H{ɛD/δMrFx0za~= +9yq(rX N1)&*CוZl>\ ]~ql?[#8pQMUmǺf/zz_Bv0$n˧UhKHXUk+Dgyu֪5MM2s#Pqc|%Ώɂw`3BjFYڵuTejժ tZ爏q|T>,=!xi(0$=XbBb/3rTη6ӴE~_:X7;%~uD@Eգ|%Sr.0;0Fӱl)s:$e\B3M6MMCphK6{F` wo!z6lK^+rdQ-lډWYLMd*Q2{ +Ms(nT#[gO3+E^keF3@2溸uq*TD!|ԃA<6\`K4XQ1Mg394t!xǮ]ᄗtFAԋbNߧ^xA$e,pMzaHc\Q8jqGD\*{5fɡu5yiq!,L NH255d'T@Nq9Q4`hi=a^[\yO90= rv +vd>8ϾټQ=/ٌ-+VHmQE$gNz߸xJ.ҥMG@u2qREu}&?MṖA^"ހ @<Ԓ`{[XViyi=ݩT"}5wQ(T&a +/?t~!Z`؎"BxpDZ{'}ktVW4y\X +k+{do;uoYZ96qqE龳>2ك4}b[d7;OXW?Zh%~Y + -]~Jļ(002fq#}A0&RB^ĬeWPuXڏ?qϏ?7ީn{PPzWwM^y=V؇z[hz@C.vN&mz[m\d,&VXT%LPDk]by +CN!V$lhn;u{2T̫diUMmS[µP*7Reޠ +&Vs\q>9M%j陖сMޔi53;>gث½ߏ^!T> +M:sj +չ벩]&1MBcZ*P(Th4]6i}>|w~,>gvGة5铵-0B'@?bl*}72Y~$ӧ!ԑĄǀ2-u!>ȇy,*("\e04Of5,m=[J<ـ&%@egLƝ'o=^sYy77+6w I(!͠$d8[fVcQ&]L3Em<e%Z?4eIDz0;VVeo^LLEQ9I9nٿ)ϙ]%mL$lRwZbf!'1(DcBHA$i~6FK ۠P&Yqx}ݭn@i*܌J҅ReY +mj}R[\{w7WQh8a l͝}[ݭ<;qɖO@,$1t4i֒$zXA?0K5(RFju>TS +r(B!Q$GzF}'H8V-CSTMLk{[X}Z&qcĔDRf2WL4LJ2,pЌP +Τ4QṯCG_U^wqHٽSs0B]'ʹo{ MOQ;٢$#3@y0cp]Hȉ-|lQu8D!HTz-Y˥H=7\yCkcƊ9ZA*˃ߨ(: /;&4.à'FgSku3ؐIGinbӞlVI6#X8Ce H]дn5p@a4q[Z;!1lïvZP'Gfue\R %` +!RQFh?1nS$6c?d +SY#prI_x/ina /:N&d~eHKnUR`t&^F9lU- +endstream +endobj +112 0 obj +<</Ascent 939/CapHeight 708/CharSet(/space/one/three/five/six/seven/eight/nine/A/B/C/E/H/I/L/N/O/P/R/S/T/W)/Descent -250/Flags 32/FontBBox[-166 -250 1160 939]/FontFamily(Avenir LT Std 55 Roman)/FontFile3 139 0 R/FontName/ZOYSDK+AvenirLTStd-Heavy-SC700/FontStretch/Normal/FontWeight 700/ItalicAngle 0/StemV 120/Type/FontDescriptor/XHeight 480>> +endobj +111 0 obj +<</Filter/FlateDecode/Length 331>>stream +H\j0l/J͡Ye{V'OJ3$_䠪kQ78C[qo^#\[`z=w_S74PnTE9/y2*x}o-BY^ZyQ߉!>ZWTEHLTh?Kإ߭WĖÐ*d{T8e΄3\8g>GD43LbY3OD?cDt2ID'[u*$|b>SE*\K*rΕJsp,'Íw[F<{:uㅸE~ +endstream +endobj +139 0 obj +<</Filter/FlateDecode/Length 1704/Subtype/Type1C>>stream +HLTPTwwދ/ v&)JW'B VW\]1$mϩ&j[F +fdB|A8 +s׳Nz.Νs~3q<K۰`Mz~kJCŅ!tl9x-٨=aqH6{ + +Jt0K7ti#"|ɰ+6"@ +v +&6Tb('{Vkpݐ9泥?+I}q=O1"';]%41Mf;b g0Pv$C4]{(;yl@|7.J.69pa!RXbYd9Dy,eõDm70|DC$hcX,`'ZF$O +k*VN:-;zBzCRk) ZffNf +endstream +endobj +34 0 obj +<</AIS false/BM/Normal/CA 1.0/OP true/OPM 0/SA true/SMask/None/Type/ExtGState/ca 1.0/op true>> +endobj +200 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +36 0 obj +[/ICCBased 88 0 R] +endobj +88 0 obj +<</Filter/FlateDecode/Length 2574/N 3>>stream +HyTSwoɞc[5laQIBHADED2mtFOE.c}088GNg9w߽ + +V)gB0iW8#8wթ8_٥ʨQQj@&A)/g>'K +x- +ꇆnQt}MA0alSx k&^>0|>_',G!"F$H:R!zFQd?r9\A&GrQhE]a4zBgE#H *B=0HIpp0MxJ$D1D, VĭKĻYdE"EI2EBGt4MzNr!YK ?%_&#(0J:EAiQ(()ӔWT6U@P+!~mDeԴ!hӦh/']B/ҏӿ?a0nhF!X8܌kc&5S6lIa2cKMA!E#ƒdV(kel}}Cq9 +N')].uJr +wG xR^[oƜchg`>b$*~ :Eb~,m,-ݖ,Y¬*6X[ݱF=3뭷Y~dó tizf6~`{v.Ng#{}}jc1X6fm;'_9 r:8q:˜O:ϸ8uJqnv=MmR 4 +n3ܣkGݯz=[==<=G</z^^j^ ޡZQB0FX'+t<u-{__ߘ-G,}/Hh8mW2p[AiAN#8$X?AKHI{!7<qWy(!46-aaaW @@`lYĎH,$((Yh7ъb<b*b<~L&Y&9%uMssNpJP%MIJlN<DHJIڐtCj'KwKgC%Nd|ꙪO=%mLuvx:HoL!ȨC&13#s$/Y=OsbsrnsO1v=ˏϟ\h٢#¼oZ<]TUt}`IÒsKV-Y,+>TB(/S,]6*-W:#7*e^YDY}UjAyT`#D="b{ų+ʯ:!kJ4Gmt}uC%K7YVfFY.=b?SƕƩȺyچk5%4m7lqlioZlG+Zzmzy]?uuw|"űNwW&e֥ﺱ*|j5kyݭǯg^ykEklD_p߶7Dmo꿻1ml{MśnLl<9O +zpg_XQKFAǿ=ȼ:ɹ8ʷ6˶5̵5͵6ζ7ϸ9к<Ѿ?DINU\dlvۀ܊ݖޢ)߯6DScs2F[p(@Xr4Pm8Ww)Km +endstream +endobj +117 0 obj +<</A 128 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[117.759 446.478 238.5 438.175]/Subtype/Link/Type/Annot>> +endobj +118 0 obj +<</A 129 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[51.0 436.978 144.959 428.675]/Subtype/Link/Type/Annot>> +endobj +119 0 obj +<</A 130 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[67.4549 408.478 193.618 400.175]/Subtype/Link/Type/Annot>> +endobj +120 0 obj +<</A 131 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[98.4894 370.478 174.111 362.175]/Subtype/Link/Type/Annot>> +endobj +121 0 obj +<</A 132 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[379.336 569.985 456.0 561.683]/Subtype/Link/Type/Annot>> +endobj +122 0 obj +<</A 133 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[268.5 560.485 321.832 552.183]/Subtype/Link/Type/Annot>> +endobj +123 0 obj +<</A 134 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[338.709 512.985 456.0 504.683]/Subtype/Link/Type/Annot>> +endobj +124 0 obj +<</A 135 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[268.5 503.485 358.454 495.183]/Subtype/Link/Type/Annot>> +endobj +125 0 obj +<</A 136 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[438.075 446.485 456.0 438.183]/Subtype/Link/Type/Annot>> +endobj +126 0 obj +<</A 137 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[268.5 436.985 456.0 428.683]/Subtype/Link/Type/Annot>> +endobj +127 0 obj +<</A 138 0 R/BS<</S/S/Type/Border/W 0>>/Border[0 0 0]/H/N/Rect[268.5 427.485 329.729 419.183]/Subtype/Link/Type/Annot>> +endobj +201 0 obj +<</A 202 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +202 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +138 0 obj +<</IsMap false/S/URI/URI(http://airfactsjournal.com/2013/09/thunderstorm-flying-in-the-age-of-datalink-weather/)>> +endobj +137 0 obj +<</IsMap false/S/URI/URI(http://airfactsjournal.com/2013/09/thunderstorm-flying-in-the-age-of-datalink-weather/)>> +endobj +136 0 obj +<</IsMap false/S/URI/URI(http://airfactsjournal.com/2013/09/thunderstorm-flying-in-the-age-of-datalink-weather/)>> +endobj +135 0 obj +<</IsMap false/S/URI/URI(http://www.icas.org/ICAS_ARCHIVE/ICAS2012/PAPERS/904.PDF)>> +endobj +134 0 obj +<</IsMap false/S/URI/URI(http://www.icas.org/ICAS_ARCHIVE/ICAS2012/PAPERS/904.PDF)>> +endobj +133 0 obj +<</IsMap false/S/URI/URI(http://commons.erau.edu/jaaer/vol13/iss1/9)>> +endobj +132 0 obj +<</IsMap false/S/URI/URI(http://commons.erau.edu/jaaer/vol13/iss1/9)>> +endobj +131 0 obj +<</IsMap false/S/URI/URI(http://www.R-project.org)>> +endobj +130 0 obj +<</IsMap false/S/URI/URI(http://CRAN.R-project.org/package=rjags)>> +endobj +129 0 obj +<</IsMap false/S/URI/URI(http://www.ci.tuwien.ac.at/Conferences/DSC-2003/Drafts/Plummer.pdf)>> +endobj +128 0 obj +<</IsMap false/S/URI/URI(http://www.ci.tuwien.ac.at/Conferences/DSC-2003/Drafts/Plummer.pdf)>> +endobj +195 0 obj +[203 0 R] +endobj +196 0 obj +<</Filter/FlateDecode/Length 5974>>stream +HWmoW, ;A +86*[]2qO',;woղU;Uuw D +AuROʭZqeAZvYZ^ג8 ڳ\-D +i}rcy>)"$ږ2mI3Ic(B;jXJ\ˋ,$]HGw}8csHqV[@'X$,~mǬf~ղl6o( +.ou~|hd̬06n>6Y~ Kcc1^lY|e%6jK2H<Mދ}`I筽$yZ +p%{6+X E&FeZQ\*Opa`lkX +]?zge^TmoAu]Ziħ۳O#./,.R;3$wy(J$U:$p+Z5DGt4>hA-Ly-s Lq;Nv&y;:vL:ޘTReس%-pjEfuL|/U}_,Eܫq\"iUC2|_y+ڤҜ7q4o_ջzz%dnNl)jYFhU8 +~6l} +)vd뎲R<-p#GVIƎ21BN&uOI1*հP"jIQ<l\ vCV ;5Owg/¥보,a͵9,JE'jS7W*#ͼZS\ +U2Of2F@um!a7"yl1<{ 09[MyCf}?d +VY>4"z8Doz]NFVͦcj9^#\熳yڇa] +kXx?1I,%剸m:__ʼnxy,!xīi+npڵr?5@E#q/<:{JM?hTMj9Nmr~*xgok%og$17=OP42o՝ ^*gLQaLz?y8vt2iq`*")ń=ƉxGѩF.Z^E]'lVOG!S:/io3H]4 ^'n'l{snzWYtw1`"3 m>grLs^^Þ!)/jI_&\OVL~e(vt@ru +7n6c3e y2ʻ+2{c^n.Zl&"(v~{9lZ_ )aB үgR/8dRϣQ@89ɏ\/9"^3K{"l,xjY,SZ`9'g8^ hVt%zWqGc-L[U*i~z=BCZILgPJ2 +vs+:Nߙ.8^ൽ'zM]Bd9O)Y&~S+,7o\ϫl;ې4DӷvF>+)EDc0$N"'9&/mmH8_3?) @,dwԹhg_ +qx +0*bekW~B +,-hx`4;Cy)XL$`Jf|8ǚc9T*3Rtd]wE^/è=0.@ +G\N^}<Az{O'r[pχwT=!|gCx̭qlؙ1TJYo>Ev#ŞuV*{~`FUSqpMӡ?P +Tzb1wC xCI?z}'h8.cGV춲=)|JF{KFYVSՕ}-KF,˜L-u虙AgVzļLT>*V`FJ8 +F{_'bѠUĽsħ պLuOWlzk%3;_ߺ<oG@cE0`NΞZLeGf^uSfV7wҠDh1E~i"(A-l6IFPdq+>L?d/Or +Z,fbN͘x~k[yt%o)aoXVmW|jfn玘6?2d˷{J:4-/.ni.cJ2c~VVհNz}mzA h ͗`R!s\W#9w+6xOi0y--Pi"Dξa3"mX֘M%s,tkکl&'ԅʲh&ԶHJsrplw"#TU\C1avHz_&%)kq鎖tLcQw.|JX#9;i$Z2p̶f3~!(K4nYn bfq"~$,hB&hCdrݡcCՍL`D[BKskqcZp?~]~֚R +x?kHSE;ϯ%ff<I8`*ZJ£{,SZU}Y~ɋU;51)YfD&ro!cM//ED90 +m*(aK܆Zo2F+fr2kO^Ԭd7%f* e^B[c$+t)J6:o z K+7+a?txgla|3DtI +Pn;rl&|5f|?Ի +4FeZo~^+mchI}O +oF%S3QvdnDtM//P$E1mvܹfp18Sɜdawj]*Td`T +9Lh% f?H'U +m+%-85$Lͤ,NRXgE-!~@MTОw2oaM4~gWg{%lExz& C405? +endstream +endobj +84 0 obj +<</BaseFont/JLBVNQ+SymbolMT/DescendantFonts 115 0 R/Encoding/Identity-H/Subtype/Type0/ToUnicode 116 0 R/Type/Font>> +endobj +39 0 obj +<</BaseFont/ONQEFG+AvenirLTStd-Heavy/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 90 0 R/LastChar 118/Subtype/Type1/ToUnicode 89 0 R/Type/Font/Widths[296 0 0 0 0 0 0 0 0 0 0 0 0 315 0 0 592 592 592 592 592 0 592 592 592 592 296 0 0 0 0 0 0 722 648 685 0 611 0 778 0 0 0 0 519 0 0 833 611 0 0 574 574 722 0 981 0 0 0 0 0 0 0 0 0 537 630 482 630 574 352 630 574 260 0 0 260 870 574 610 630 0 389 444 389 0 519]>> +endobj +49 0 obj +<</BaseFont/ZOYSDK+AvenirLTStd-HeavyOblique/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 99 0 R/LastChar 117/Subtype/Type1/ToUnicode 98 0 R/Type/Font/Widths[296 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 574 0 741 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 537 0 482 0 0 0 0 0 0 0 0 0 870 574 610 0 0 389 444 389 574]>> +endobj +43 0 obj +<</BaseFont/ELNWVA+AvenirLTStd-Black/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 104 0 R/LastChar 122/Subtype/Type1/ToUnicode 103 0 R/Type/Font/Widths[296 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 741 0 685 759 630 593 778 759 296 0 722 537 944 815 832 630 0 648 574 574 741 704 1000 0 648 0 0 0 0 0 0 0 537 630 482 630 574 0 630 574 260 0 556 260 870 574 610 630 630 407 463 407 574 556 0 556 556 500]>> +endobj +104 0 obj +<</Ascent 953/CapHeight 708/CharSet(/space/A/C/D/E/F/G/H/I/K/L/M/N/O/P/R/S/T/U/V/W/Y/a/b/c/d/e/g/h/i/k/l/m/n/o/p/q/r/s/t/u/v/x/y/z)/Descent -250/Flags 32/FontBBox[-161 -250 1135 953]/FontFamily(Avenir LT Std 65 Medium)/FontFile3 145 0 R/FontName/ELNWVA+AvenirLTStd-Black/FontStretch/Normal/FontWeight 750/ItalicAngle 0/StemV 152/Type/FontDescriptor/XHeight 486>> +endobj +103 0 obj +<</Filter/FlateDecode/Length 416>>stream +H\ێ0"фxLC@]v:mD'C9ltH>7vtn"}Kc,uS_exSyx]VuwJ\M=:9Z5}-[I869~o'T]MȕB*_"[[ό;ҩ<ө<70g΄3f#lAQ\2y#aʞ-N>HnӰIc,=x"{D4iӈaO#nn فQ D}(;DACe(;Hve(;Jv(Ȟ>`> >Jx1%<F~sFs~<''jԯ +endstream +endobj +145 0 obj +<</Filter/FlateDecode/Length 2754/Subtype/Type1C>>stream +HlUPTW^Y];q-f%/e {duXAc@Ӧ6Ii/#3)#jhV9w=ۙwlfs9wWiTjzMY[$TJeNwrfFRDy)fls8\oѹ0029owg4jW_vr;E17vY8*jpKbF\7].\r,JKt%#K]x!:=M,wDt%C*͗܅[\㮰yE2LLH +R*Kv#9"HLvʫvJtﶹĤ#D[Ca)ET$4Y&%wnᴗ;]e22C*PRRY*Q-aT+TDjFѨR}UTiZuQJ]U?Lլdj~њ9ړ:]A26Ҥ_$M2<5rjk!KB<!C}9 gh9)u鯥S{P'6k <$(b7O{GjSvX,>eǎWLrW]ۣ7*VNl9xɰ"E}>w#5dwё^]aؓ hcd,}&0}!,RuŻn B*L*x3p{ D{@h(DL' ,\& +2 +QQ&X1}O~b, +frzOxҜC;7\^.lZe-X0)ٝdY/u@a'Pj<{zR1e<4z5_D+D2A//C#Fڤ㕾lf%h8(#H9 60Jϊr<@AJ,*\ .I$eg3urQJC4!+|~oL~&52^"]m.@.YAy6Vā)@88EJk WV@m.oA2qH_~!sw0)B3EX6DhA`>63Jp=t1OvlEx26Nz>ݿ&>.]$ȿ\wjf:/8;'ݓu| Zd[;4w087c=pΚ<6kx5H$E!߃<vL}3؍3ŷȗ$bcRrrCdtXɳ666kfhUNJehgZpa6@ЎG2 + py*&#oe0>J%ؗV2Bp E+ep}2o|`3ᜡA:H :>[++4ܻ残-':^<ˁ]jDYXjl?g&0J`5tjhbA_^o,A8tSҪsB6>kiILY*3h\!s5ъa֞mgS]lVbN&Zԑ6gZc8h.X{5'4CFtDtPص|5 +Iتe]jN}<m# /7ybps[N0S R7|0&RUoo7y6rɺ9Q:әkjaÿFς3<ܕs%xB44aJZjC3x z[ҏ:e/jHy1}xV6tmkq;Zms8@\vSwC +b0 +d||^%d,TS +X_c +V{%\&!$to'fg4a8ߩ5fzX:PM3YTXW͍4&:fdfE;jJ6K3 +Boo#.<y["%Ŷ榓X2( !eG@jf[ZP\(+gJPRC_(㘏RAD`\w'焛+ +Q/s$;QsHҔ|!d {pCnwR{%t$ҁT&j,VAhP'6yCN1c=j,2Dd0 +|q7"CBvznrQG +endstream +endobj +99 0 obj +<</Ascent 939/CapHeight 708/CharSet(/space/F/H/a/c/m/n/o/r/s/t/u)/Descent -276/Flags 96/FontBBox[-165 -276 1185 939]/FontFamily(Avenir LT Std 55 Roman)/FontFile3 144 0 R/FontName/ZOYSDK+AvenirLTStd-HeavyOblique/FontStretch/Normal/FontWeight 700/ItalicAngle -8/StemV 124/Type/FontDescriptor/XHeight 480>> +endobj +98 0 obj +<</Filter/FlateDecode/Length 284>>stream +H\n E|,E<RE0Nj0Y;@JE9hrXQ7V{ƻWތeeڨإU1NvG&jNϰ8%o^7Sޝm4tыtr@Ij4MW;9;*lF''zioDAqQ3_d]g +]b*ć] +::99%%53*1G~yyy?E0<sQw)))7: UW +endstream +endobj +144 0 obj +<</Filter/FlateDecode/Length 1252/Subtype/Type1C>>stream +HTQkLWa1e`&R-TQ(>@,0,,آ}hQqQXVob/IiIjs^Y=;;a0eY*iq^)+9+e9rIʳjLx1Lb$ oc`칞X_"WO +=dfҜxZ<0$]y=R鴹R"z$tp,&Y[R!0n""ڥQ)&|*vɑ')B+m+$(w^#&9ݒx +WyA!I.T҂<ET|$$/5N;)}DH&RH$#j{Q"#!f,+JR>ðǼ0Y0aLyVIa1 ˖߇Y|a݆Xpy䣋hu)W,'c;#PcEqts!0;vpA/nh/>~-{sMj +v`t8wޣf¿"j6ځ =5C߇L`g͕jx40m0y3ttcym#*HkiW0X#7gIݼv]o[4}??` j:rɞ֞S+q^A[ñ`U!rot8uBWziTf4q'Cv{ZP=BpF?g͂Dphh(ǕNV&])-as_c?s<K\Q'ȴ^yME5^P:4=6A[aj0F~҅K#6n +xK:w_ +fD7YE9z71f)SY)jx=&T6+/lݭ)u:Q&\r+CDf0d%{'G[55#a&Q9"ַg?zzwV9M`2;d| +endstream +endobj +90 0 obj +<</Ascent 939/CapHeight 708/CharSet(/space/hyphen/zero/one/two/three/four/six/seven/eight/nine/colon/A/B/C/E/G/L/O/P/S/T/U/W/a/b/c/d/e/f/g/h/i/l/m/n/o/p/r/s/t/v)/Descent -250/Flags 32/FontBBox[-166 -250 1160 939]/FontFamily(Avenir LT Std 55 Roman)/FontFile3 143 0 R/FontName/ONQEFG+AvenirLTStd-Heavy/FontStretch/Normal/FontWeight 700/ItalicAngle 0/StemV 120/Type/FontDescriptor/XHeight 480>> +endobj +89 0 obj +<</Filter/FlateDecode/Length 421>>stream +H\N0y +&RՂ? +?BPG# PS&MAa}?B.|f]<ӛ7Oo<yxn I6?לcL74s.1IQe_ +endstream +endobj +143 0 obj +<</Filter/FlateDecode/Length 2953/Subtype/Type1C>>stream +HdUTW<%8dFty"TR*Vdhn+.պrծZm*Y +vE#kl?$3w12F)gd2٤ғL XQj"+ &+@5sqdexnIcǻ&ۧe2kAa3'nNy>B=SHJgXR)$l +6Bt)R"|!EZDZQ :Efg^.څAܘg+sZE[`vhJerHkfG\6%B0-BRbtMV':JԮ+sXk^%ʔ=i`FFa+J&H΄2t02fcDfɐ30L8Yʤ1̧UY]yA@R+5!erC&o߰?MrOzGu'gϣ13y}̿NJc*}|vf״IdܦQJij;P=;Vy1tN3wޙk5^Avjp8 "D9#P+>'!Iu7&͟I6tAqU>݄qF&s5ˇ+dpA=2t5&FzB]-Vq_ U&t'DpboƆs-+,x6Cw1V2:Ժ{nE/.8+cs@`u~Jna|P'jF +Age[?8up7LP _Es{sS x`iN&IgU(1@|]& +wgp6,ݐǰG0B<i;bܾFr/<%\J_0{zRKTFL(p=F +kzNjj +hE~#z:1DiWKAӼ{T#!Bf)rO>I\#|՚)4|ZSTNEr &fi.rS S!M]ȥW +M^ʷAZ^%}D,:ެ}vzP*-2#hYU%#?$DlMчh@_Iq(å9uc4UKZ?lpwSWe0`h(!<&es^s?^<Y/m?[ޢxR|-͠gK39<BpqIZ+5g/%BW4AwxzJEeOۥR18F(yQ +,f!L{JaLQsF-ٳP|:h' bMo.rӯgլm/CiI)ܙ̄ ֧gdfbM;A}"x}s!HR)1jTP-RJNh8zQa+A-UnR=h轍CI#IbqwWR]Ta< 4g7jgU?iC8O=jkY> n'-f9ϦS#l-v_[O]n#54 /g;9|lK_/RBVuwVu?~¸4\%we+@v]2~D4Rc +m7]u!֯wOv\6>CEcr6_&Rg uƍWFz{BrJ/p{-eAPp oϻˬGh?]LJo:_M91@9Q10rǮ?(Q4 hHsX}yQ4o/Emg 3f"2~h/O"j֢R>Ze&AKZfe# FFbm?JL%3YB#|Ν*s/{{>DFYJ|<|NZɰ84m%Ҋs8//ZuXTܠ=}pAǮ+Drb#MA?XnGL0_] +ƶF` +!pnzSleCEآ7l"1O$]p=X<~OXb\^N焬¨ݴ7Z0,TaZMMs|&4IJ`RnHIh_T7^_$Kn!^q;#--7;SҬJ4) +pƢ] +ŰXj5 +2a,%?6F_m҉;]X +~y`GyhD)8$փ`Q5stJ$=A홢b»ԍ``F 5a:ok5MoWozb`216)'z~|XnCԒms֒%s+vvFTe +/#)Fl CQ>2SKɹ-}7A#F&fP xf`tTtDrbA~w(-<{deT#,"eSjtVtGW&i"5I=e3ɍpQ! +vh$v1Ta=7ҦXt">/pQ~ +0 +endstream +endobj +115 0 obj +[142 0 R] +endobj +116 0 obj +<</Filter/FlateDecode/Length 230>>stream +H\j0~ +Cqv1ȡXpl%3,QC~:?[>27C 8DžBc u6{Wn7٤:gZk"ΙW8<QWȁF8|^#nI'4xdզtN=$̟cM0.zuȖFTu%@"($Oߩ~p_7ãMeLq'߃{(0KdkJ1PQ? +endstream +endobj +142 0 obj +<</BaseFont/JLBVNQ+SymbolMT/CIDSystemInfo 146 0 R/CIDToGIDMap/Identity/DW 1000/FontDescriptor 147 0 R/Subtype/CIDFontType2/Type/Font/W[120[460]]>> +endobj +146 0 obj +<</Ordering(Identity)/Registry(Adobe)/Supplement 0>> +endobj +147 0 obj +<</Ascent 1005/CIDSet 149 0 R/CapHeight 700/Descent -220/Flags 4/FontBBox[0 -220 1113 1005]/FontFamily(Symbol)/FontFile2 148 0 R/FontName/JLBVNQ+SymbolMT/FontStretch/Normal/FontWeight 400/ItalicAngle 0/StemV 75/Type/FontDescriptor/XHeight 500>> +endobj +149 0 obj +<</Filter/FlateDecode/Length 11>>stream +Hj +endstream +endobj +148 0 obj +<</Filter/FlateDecode/Length 3742/Length1 5911>>stream +HV}tfv$eCB! 6> +wx2L-L-_g4X e<k˃j)b8{W>ru}r%H9Oۡ¡VGoD$$n]y4۴%VBtS.Hu=@@`~y_R%l|BTFNPռ|brY~V|bTC C3-F8%l4\s$!}Qt SPs` +~&屆}#gdAZ:Q>)^?hs<gGH<T1=eQf+mr֧p}}Cͦ8,c.7r8fig3p-/6` 41^b)f19YX[9؇cF㩎碧h'2t'5'߰$89X<y;yKM6*"B39 l-{d#2 Cm`k5Opz=҈mL۹zGI7>ak;Nh(rTES-]E-ƈqb)jEX%CDIqE̗^RHeT+Wv(Ҧ|T:05o?+3jng5~`ΧW5E9LcZǵ^U=|gqq~2nʯ/(Fr}ILsyVzjmfVY8/b*v=EJITΑBJ/ȟ˽rVyVJRP6*ە1-/%uZY}]jm˰UآvcSG-D|ΧFrRO"9"mPLy + 6,ǗKsdr6" +5,8:lKۏ~ +:(s<BQqQSZ(S'(69N;pdc[3a&\K]<6ORpD +s)hZZЃzMnʅrs +s;%<4ie2!\?GzP8F";㙑МionUuor!ˮ/,^*O8y䱣w'0ܞnE-P+/q֒<X_w5 +OWEhscbβ0Fj,!C?7penI$~C +Y\D`e +BӀ9U8+0އr͇.ڨ1cmeB%>'S-sX 맘\481|?d1 TTsFpZ7߷g6%K_3e밒Z2ה6VS 0e@O|S$Njq9-<'=וئt5/Fnss_oolZk[F͡W)<<#;I ,͔@V>FQ軌4/7ܓ=u[w88(7R/QhR=t#RhI;Pmu$dڅB1%XV|(덲BhәG?`4ϓsytR*>wsPە:%HՔiU=iv,{Vu2;*/i%٩$7*W +%DI+I]I)y]Vu:MVUUV%UPI3<: 첕,R2dKa{*`RĀh@j<FJl,.K=V2-j=RVmal(mJ؇U=2\7LcXf|aw֮ۖ?0K.N+ +B4IMZGAH=5\NUq!Sfg=<p5āԁ͎xΚWqG4s$:S_><^B#6"YtdПn{L(r>zB!nC<]nQBN6EG~aؗgYfBǮLg˗pSMX04Ꙧɱ0<;aP|r]~d,3.9 +endstream +endobj +197 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +198 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +203 0 obj +<</A 204 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +204 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +192 0 obj +[205 0 R] +endobj +193 0 obj +<</Filter/FlateDecode/Length 3862>>stream +HWrkEH7dykdYbV*5Dp1hk$g +o[E$3m&LUіqŚ9y}{N#<eV]!v 2xXU)X\ Ƴ_qBU'(2\θ,vyQ*S73X:/cxVYܬZLWBM[DG7;f/\28=Xnyv2KÅ`Y^|WT d*ܖ韞Y'vkhLQU"l)/.@+(v[Mfӣ\MB3^|r%OXL%$ohn{ɲ:'QJv?"D(c)` ܾ|DMWZ>1s[K`oűT +ry2(ߚX>cW,ؾ`.kZ6+eV!$u"7[ZlPwc' +'Mۼl,>m#Xdڳb;t+ >hwUn+UxCWw˼x +0XT~Qe=wm{mbl6"J}f38Ԍ "46"$892~͓gۘ'-JMڡ!j87 +$[wkNmSO`o!iL +</.noجis݆^3U/Gfm/8 +LTWSDjPfLU4UYO]t#?rt x$3&U'jlW!Ibr_\N8aF!,Z* +}džpz<D' 4Q#|o3.6X +NAr]QWD/!(sW%Ju蜚5kUFM<$rs7. +o* A9l$n8qXCyTjJ-)ddb p^ShKrUtaE0ἓ)㩌Z2N+U%4.=ezr!m\GQ'\F-iecUFo[1E +F@5( [V]F0Gw\J0ݯ߾Ij/GTOP^f2P|>a9s +[q)G2:IlI{bgU.qJD袪(\r|vFg8 +}˛C.ͩG=/۶D>WE(Xȅ J\IDy.]ҔEǖ̙s~bRFm儜?ntI95#d.`aK~%Ǒ9{ϗ/?17"|c-/pkzZn0o2cVy:i;(taނz̍[tf{}:`?Wwvﮬfo21u9zH$Y_ }r>srwB.a5z=`:Z\8$e2|4؈l!Xb<DhQg^nR[,/2DSiAgoD,ܹ37WAi0kx,d[O_/WFf\Hks~B}F4!.&~*D&*6mޤ?3T5-+VGw@p"&/J{ƖRW]Ř;,SV+£'LB7Ou5,>~\m{*8]4a.l|'FcZ.Yhxܸ@D'횄\ov(RqcJOcW3 +3$]EmyYXj4M.-D]Iͱx*<l l?qfpȝ~ֵHV7?CJہt*$e҄$ digICᧁfm;u4Mܘt7 dGsg-q[4Hڸ}ӑ:T<Qj8,?Alĉ CVPk\XŲmmd7R.z65ʼnu~ܢbb +&>̲5y{q!5}mNm?oKmAi-r c, En(('CQft2LݽjWݗۿ1g쏪WqΞNu/7ݽ?3ѣ97f<~~:c{!+<7CN**J'Q0]Tn_s +endstream +endobj +194 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +205 0 obj +<</A 206 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +206 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +188 0 obj +[207 0 R] +endobj +189 0 obj +<</Filter/FlateDecode/Length 3561>>stream +HWmWB*N4 +Y vM +to! +hǧnZ塝9evpòoi"Pu?gC"} eQ.A9B}AxKgYTJF\h:]UH@>>{o[DaD&Z]Fmf@'ɪ +IF 4)3 rMSn ?hAܢh +ntu@!7q<Nm~ +=wjt +QO{ (kaF`h"j~MIǨ +d#~VTSO2RTߨ)CUSO\CdRb.H-R1N'ͩ +TT|lu_}A70LP`*8Lz\dV +ZVHD)ۿtF+Tk@MHP5(@DhCy˩2ftە +NXy-gyEba!ݕA6tT slh +l Ы3&.ᶡzқM3mZz2yHGSN,&*1hޏI`'d'BSi[%.XzhfPω5}=i֙e4"AJn]ykbpR2ev܃Sv|OIWvR +-r~l%q_ZgluCxD]mg"mNaTOk$|0'='"$eˮ(`'ͼL4Z +[;f:Eg-6(0?o &P7Ӓs5daeY,H0Dmy^f3,R>3CRY~l}^4fceƂs9cڂG4c@tnzѐ}EM[Um0WӢbSYa5y]LX}%}\D7tl)+u +,eAcg9ڊ;X@r|:Zfv45Z@|yaE$(82>[U)pܬx +*VbC|-QUJ=IL&:;c;]QN'7iPR\W|" zM~˱ߺӥB|6`EC5e>,jES[)3n%\'R4yd҃lC#>Nʓ*.&ӌNLVX$E=/utO`k©n¡Bg + c5>)4lmrkJ=w^Y6`@ + +g}G*vf XGQ̩'!ILN^YLfjV)k>~_b].YhaiaKܥs/b> +:'=V;zxuYqhDa[{REO^4-}h036 +}-qշ_PGv奞(" +endstream +endobj +81 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 467>>/Filter/FlateDecode/Height 731/Intent/RelativeColorimetric/Length 226747/Metadata 114 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream +HWpTK6 +[|>/ӽ`KqNw)ʡPQ$^=YzFs c=Nmtr}0o# : +*QCRaR!ĂLrƄ+ab-I0#EZ:\ʕdQa05ZU"v_Xh2ɧYTNgfO~"%))ņ~d~rz9.YRA5ɩLb;b"a #(UØ %@KLLII|j+2D"`jgEETap +u|!Zt!Iwa㦞"·-2@bLjyzfRȤ|d<""B|@Dxm(GTyENQV[d$>tF%UBg34 &@[=:6kPڠ)q.]Y;).1m,i{ {]dZ3ÆPD}֓u>&G.lX/5ܺQ7]st%O# +EwA&WCmy{Wz]ONc'o^v{<~Je`Лx/G.4&M +cCm5۶b9[_dԄ BiZL܈j3hh1/.Z@ [2dUN0f{UpyX?$m@cOH-w_srѳl_05zQ{ll,W=:kT3n`ȹ+ꯖ>1Єɓвط(okT ߟ^zA.v/J'%*J᧢V5yexi/Ө300 ˀd([Mc)r4.4rDqQi\[qWJLZ%)RcՀPmν}+~Jsf=sf{yc8~٫7uL& +K˒$\Gb+J3j³ zExh%e&r;Xrǎ䧫*v6oI'B$wkբ|vY(O}f)\, %8;'X~^x9 +'D3W%$wrL yy@KQ/2LwQ``Db|VZE!5W`y/_;G<UsLTފo]]\qB!S(,b紨K l[xt<#Kqn<@$v)yɕ}ӦyD!Ky|T\&)em]зt0Qc8W`FlF2k;+Y.EՊyTCS-.y49)kkmUKamn +_D7⥬N'=f<ܘ%CHޮa weTj(`T5.J拥_?n4=]2DUtJ绻0BO} E(,wGlg%Z V=$=khivو+;3s8wG(<Nl]ٞUXzӑ `3[pKzIl?jcsigzn">l&S[VתH\<BvU)5vkOsE +ë+&6;4#L/>5R{c6⿻TM֫6 q5npHWBnJh5=#[1EWvbKb4:!19&<X`Uz36A/FFEO 70o9>kGٍ )T<(YB=bmIjK>O]#OVYmCFN_ic%z*kw-lh8[1K}ui~[-/߳g0-OY77XBÕ-~ݥ$`#e@Ԭ @ц{">'Ao.GL <&ˆS빂,Sp>,<.},LA5Dj6!R,qt A#0\R,E#ʩ,p9qmմIJˌYy>W3oy}z,c#VzwYFzA {N[7&@y^mjt{HuQVϜsShr-}fiG`BфW=sqn4L=͕<'W E>~a\e˓<K^\݆kTA IGAޯ=Jh)ׄ25?}H#l%ϵ]C.:NƅyӉd\pl!Mf0׀pa6^$6 w?iƏUkʸoa`|%67<-Nf2C\mʈ_ea5VZc4'Et[=O:2ѵa `pzS? +a勮>Ye#9-b{Aor a$Z47V{UK3a!) Kr6Um]y~\zkj쌣( +oy!YJ.DQ C(UY>Q;b +GbRدGAi̾QȑxN_JNa6+<"j$<#S?3_ +S_ <kgxWRf~@#$] +U\3u5އ'1"upTu"p0 wRۊ,:gɶn"0 _$A|j1f/"vΛ`9:x +G1Pd 0^P3x{gIG7dž 搊%}y?kva[:,p}][EQ\FcOl/ )@QHȾIn;uf3x۔g: +f}o$^/^Y]8e0Ň[1)8 +-4ߝ^4˼QK=lgG`tkUz$3z<8$Sfca4.o~+KHX/Uia|dP!L]`#]͎2wn̜⊒̃CmΤ 00gPTGN_[}7Z_2˙$l# |}'AercyTu#@4Pw)QbډŰ{{IJj(]݁mZ^A"rik:}8:1^.OHKݳRѤ&2F->FӠ~0k)^i/_.)#Y@<˕]wY؉} +;Dsv{#I<b&Oȹ[Q +kǬitxI- `@Ec,y t{=ׂUԖheGz/4RC+ +"cQCdJe#;#/2<5h|Pt9ȜM4R\C!oW8ry&{DtL95̇I5& +MtX<4"B}wc_$JiS$=+iӇҶ/iԠ>/kJܘK] jEK$"ʅ;Lu;f6}W5mʿlt9@u]Lֻ)y#,-s5Y-tGM4$JfDAF(aωXFtClȪ%2H%DndZ3HZ$jTf\MK:Q$* +}VHuu!C<u(LX\ԥ[j-V1i x99nLfdSQTm*MV!jC5\x*$`*J2jB#6x#C|{`'Ee] +{'v9qrLG`-rəp`GUX>@a= +L{p4gFUq/܀q;(r(2;5ecU,gޠaM?"o-K.쉉y#&,My`:;nE +[t,BV$i:O67%(=>H0 +PZ ]o$a19iDFjAÃfJ!?((+kHD +KƚIrH5&_3~_7 B{Uկ'/4zČ9>kV_ws`I%UbկdLmH8(QDCp5wdTU@dPօY8evm!șOxG0ܤ~W\lt+Up;pۣ6pf-?04<0pԁiSnd*9Vl9YAН_a܁V5M=Lv/]Ὤ̓]jd?A"Zd<yySXtՊ_n%~[=n8.[pC>)ޔqHNp;PIۇΜt7ߎ8TzK/vW\h>rTm}'M:cͺ+wW]=+W}U_ܵgLL~Av3Q +.&Rsy./zt?U(D_UV|x͇oYI՜O]cD$7^N8%D>9OS@U H+=`h4/dI=a2E۸]P/\;U~2{/ +!-`uԘ{wN=38hL٤Gm!-`kس{ǐéj$BTI +r3{wvL.6hݞo7nܐJ@#2\y[>¨RQE`qomMZ╯6~; +lUO]8K`)dQ}'^\^$qTUEPdYYwx +LíR5݁;{oА")N%+/N"e: !q+6]}bcTԿ\BlF+`SrW&5ژد!-58K3|̭Y* :&_|荮 .:ń@mJZڢU{yIt$exE1 +# +f1MNiFSH2XܷrFm3KCOEi +r/$P M+8GD mNэ) +mH]Bw}>kmTڻ/O7xV-8:u[RǶ8ΎQr0'x + ZaL5}<{/0m<XUUbi̸FsozԄI +Q4',H7gAUcxzD~aX>ahxwXhDTTd`O;&\TXH:pb.nRNض/~巯/u@Y#Uq머{@J֦.-Q0*OyjpFڧf4T|+}Ci}FWP\ /W<FU@DODUbBʁQMaX沕K]+(;Y&d䗂 R~q+B@X3C*@ŵ+==jfrmlu'111v|2z/vSH + +W5ܻ%&Ø. + +եysc嗔^wG<v/_0#^095>Χu\ +5?zrO_^6bMc+xc.inErN{nrn[ƣ[9}rf쵿}μ&}ɂP!_$ǐ%c+&\%{+giɫV +BH.ᚠQDĖU\9Yk6Sz){(3qC2 +@Uו$BD#!4%٭=-mɅ/~ǧN>S}rBu!"n|!o)ȼ <"Woæ毕9B8 Pt/U:"jT<CG['E+צd#Ycߪ'@)cQA^u:teCg1lİs]AZBˤ?&eWWQeE]Sr2~V2y3EQ{ZnwwmmU*Ab +FKY+j&D_>1@QSBޯx_tDtU(w[ @6Kdrj}jjmzj듓ɴZq ^o*^EQor_.}8xg_x4O&esgYG'R*Bl*A7Gx.o<ɌiȱܘEc&A$:Zxmh#ay?(ʧ +T(BW$:ԍEBܵf4瞳w&^v6DhFo/:@t0*^e{ +Sg枟xdІ>Z٭wvb;DtmR!-Gq2p9W#Ef-=:6(PfJ.uщo~3YYtVRtVt2үؼ_|*^/}+gFrx'.O\:#Go}6;1N`OϪ1oD]㺈wAuN-5-J^p<$^miOpTќx!+>ěm/-ܘLvhL": +o8&z%,`NANХ-xʃK}})-(*wŤj/*3Gu++`? "]Jc}5oaMzJO3$<s?~ҭ?'_2셛z>)$a/X¯YIaE٥ܫx!ZK2'hwuط[ZM?:oJO݅M9r : +JF2\Kf禵I6d>3RQmU4XT_l˹@.+."^J#}}9Zb5NKkSUv!HDQU*,% +ko"nlA]xI$ǎeْ(ޝz#/ZHh"E.9{oz?v[|3\;s10":8{* ؓVBAI\8^u],ݍˑXqJYC]xS^2LeK,wd1Xffk%=:,#dPb_5j*PXɈ5^LwzplBB8;5:5d"_8O]oJj蠽6qX`N^j}}w**[7o5讃J#;^ނU{kV6\V_xßOp:8ЁRCH[\vRV><QE;}0UP{<G8'Gny|ʯGrU]q1Lhk`l T &xpyn}kɹ>(`AivJA2̗y#e-x05`iH~@8e4 +-l Q̴(@htDXZ0a>kTy~E˲|SrO^ >{uQNGExD5ӥld8w>0;_$Mֶy n7u3&sYYI¥~N53b0=^#XI0NSwEL]x]n̹*ÂohzjF`Rʆ1 645s{|^}wtꘈ۠P6)֭Tv^HË4:S #@B`Zr"3Tt7s套{{+ +>^xBPCo㈴'H|*E#n*5duΔlWTexO(㲂9&ieh2͍Xy-Rᘃ'/˦].e%cۛ,]WAF0YP*vx-B\o]~]XXxg7m'pҡϢ`H_<v`@6m4n6liufktΜy幥߾yJlZDc +lw8s~Fh=HQ5M==}?3>\Fh4ݓ䫊iX:MFbQi*Y8拉@0lڐMRKpҁ'G/fa[ddӼJ1vii0Ąf| *[w\ssa<^H% +vA VðH7X֤g-|6.Tx8dn<I#¦j谣7!ii0^_ͭ]+7S|3?!eU3-|9'hZE8dj|'ub&״ȹdVB֔{<OOړ39L^G8P'$ؒ1y!`GG/`nOXvj2*J2LdFSKҕ\J5tlͦom,\9<235DS5:'\x0`\z$ZW7Q9:{lۨ,z,pKLL%yʧ_~uFo0,H܁%t}X:6y'9H|ᳰ>]N{R +e:xZ*l|px*s0h_ٜXt#.)wgy2+fk}aA2-ju0 +8坭X7 +|MŚ)6;,@nӗ͊&HVj +NĂ"G,cv`]+ՁWza#j0Y/&;d8$Ii@3aLBi' )!!0if +V,gn<'#OpRݜ$iq1ץ=XZ&6+71.Kvxޒݽ`S2$k␘k(ܲ +p$)fqdAXܤ%7vYFk4YU5V)맻'!*"@"l +{L_#pV":dRIyێNŹE_䪮g.|{4gr<qJo] F"j\*^-\źMRApꀊbIXWuU$=ᰇ\ٰx۟\˷V_^Pv*a1Dz;Y&Ɛ1fł7G0Sl&eZG.@ñs +}1FND,CpnOjZ}-=}m{k}[Ͽtw6cnP] )&fwT/r!lĖ',Uzove܆x|:Ld S9j{$z{Ӷ9n/]udEC~YѦEoTS;/Jj)2;&8#d̃8 +8)1B8KcN0N>0l|Ö%YeJ+ɺչ]dcHgNGHg|+yVO~"Apr6Sшƿ'#`2 `p8=xMF٪k.2QejO&ʔy>$$19y>͐S0ߓ˗qisM"aY#pO2*O%49<µДP~&jhp8C8bC8rH$ +&q.!%)ǎy}jw~.ݟ'5K#oqY(iF``@dt[]xܚ:$f{n=j٩gt<]=ۘm2ܒͯʏ5}FNe-J: Lx4c:6`D0cNUYMW̗$)'"EրeǻLh$F@z5_8sᜭ +7~R,8۲jݼsK6o!hbS+jFVݘX_͊;w/MPlUu.zK$Fzi!f0V;t = +E~' +l7zny8X)%˘Vm(lv(@:rP\d$c\ANSl䨘yk|utSԥE7`Wl9̗'.l|g@\A;w:|*?خq?`'PV?u5F7oϛ?A`pfѕ~P1W]<@CŜ=n^8`AÆAD_p;j1.F #c~ +sSbuurGoYއNR9ھf%\~;FZ, +rfrIϺL_Ouj¤ll\ixm2p +<i^Z80 +tcgzcUb/ny}_iږ23W8mk5{H+R8&0.o,ޯ 3 +Rt F[ڢuU!< +貂TS*%T`'1l?0y +PO!g$6cx +E?1L?cˌ{eMX{ʍۚ,-ºGBYrwbP +uj<S^|}̎Gd4eJTc` ++,<4MZ¼A\:[.!|f~L"Ik!%EcTELgGXHAZ7mO$ܸ%Olevs}27{{D^Y;t? +L0 +BP + + "$8F%zxla%9s /81s*eHI@Fjٲ'>ضSU4n$BTR'mRCTm! +A]kòF_g`ƌъNF0B;b$Y˿& v0}ɢ6crђ}Oēm,ӷoߞR[Pyʤijm'kԐs p8;J^D"]:&)0@`s]n4w^Q_/S$:FQ|5R&snL ZB;ÚDf;⌡wFۇeOifCs +-~EzPX]X0362SmNX&gR1\75sz\~݊zqʙ6 +AE%K_uA@E +Y]$v|QiQgd'Sj(YȚ̰-XhN^Mb84yĻ?8?8 +Ad ЁKI~d́x@w8V!ʍg579NlD%| +&&`3Px9a8nNGA䛜iӴ>,bmUc|Uj(6{Ijz>)^ԥs8năx=!H +,0!S!XO&k +A1@"`1h] +f(bR[{s;a7arӒeGw<~Ɲ>A"*z!s^RHgf5k~z,]ӞGg.jC&Aj[( +4vWXFq!P}9L-+ +^QD%!? 0*+C7azuC&|]2OyBB@[s'5:aey?,gݿ^w$9ƍm;\Uh}~s/)\;5\A|Ik״3=5v, +kz|\ ɌY23 +6ؓ);,4^:Xegk-Q dNdl77S®ddj`iJEwU:~E8Ōv>I><2ALj+F!< )\om.=qڪq|m!CR,v/軕nG\=ܽ|{mYw=SO!_PO!?0`r۶`_5;?vDVbb-#hح5E7Kjeq!R8x0C9ju]e*7<}kPw*z I~AUs_J$ l_pq%x};N,:~#qbf ؋4 Ilё>?G}%^ٴz"+/+JZr +"~<yZ>i~)Ίi+7ԬZ!v]P?5Zvk#mSNu1ji߱3%,۾KC$)ٯ'bS\q[A0(& ZZ̹ċ߲tHjO+NyUGJCVApvKwS15<XLM_AM]i +uވ=AYb74,{ԗΤ!ٻ}"=r~:V^I߃ʴi1ݯJ]\{EuQ+(I\n;74ܼ|eg=#Y[w9 R>hs>dZEe,]Ò>=2;< +#e8E.cmjQE`cof`FnI5yq$H04z0a +jJBT5eBki!H|]7|j.'֮v!sfP +F~ۧ:2s2~{eVy6}4C(hs!A78&j^U @U +?L5CTWpp0wV);zjڠԠ0&I<{EzZOb$˖KqӅa{1iáS[qO˛sJd&eT¦[{Ɛ5ntqSJΝ;f̏OgIޭ +yjћ{J{6G6Sp-^j +8}]#; +Z,MA//T\ǰ%;x!ij-"uP[)3J^:'J镫!wźcv"RɐʼnrUnpOXe +8Ws[V0pdh0ˇ"j!kJMc*oS&yPTj3ذ\}MO2fvD|Vl,Z(yƔjYd"A۲\A1ՍO3:{q\hT}^FD6,єusmAbnPhuMW)$Jxx)ض^ &xa8 +\ +tuzsc7yk=w]<дj%q]їpXD}Pbn9Ȉh;!6(L]gCAf*P +KG uq`Rپ&}Ɔh>vD99uŦ֡tSthjޏ8&ݓT80|j~?/r +'ʀZsLfJ +~}gTF&4oaxHk۪4WNaytbQa]zhс;$' + +z&a$zZh庞rvYf?h|HT,!];нßeoYΆw66kˮGBcF:oR!3?W75]bEw2(6HbMLK2EO,M/+?fIcf*em|t5٢&h8@tP`iq +8`}4oQR?]<gR(FmG~U`|_x;]q !$σJxUSфcG6jW}9!j)AUpMUrSXK|ۃҖѽ(mUvyvmn4ٴni٦Ͷ5FkZvW]#*>PT#(])KA70ü`^0;33<wڤmēsOIz8Vi^e,M&[QR)DL+XZ͋D{mTBqH]1"IBtՏlkdu,]ڹ+fG|3o[Yя7h1oq=&W8ҩ2C!=Pg3KԚ<yc~?047ܐÄ߱rzM{}k +]@78ګ<k\+|ZAL)?C"d o~-PP` +G^p8</pȫ7K2>8XB|= V/RcT +s%}Ҫ'73zI/G܍܁{?\``P펣)+W{/f'VKw($>qR&5Xh1^XJ'$xId%KY7ܬ}m8uC^%mƅK/"!Eꧼ`72Cg5Ny Ij17Ga\͇6'4IxqF"g~.-/>ޟ$KPV٤2ǔ)@+O]Jss2YUICڗ_1%]l:5$?|L/$JtWCnpJϧ*(4(Q' +=0Qs_ՂT5bxo|o#28uq.%~@,@lb+f#h$yb{R'ORT.Z^y99rRgxD}nkXj*hgy%(-:M 7E&C"J:1vDr + +-t_41h;`\5-;y7mC"wwvPG3JA"[(BNŨccxwmᝩ& }FtvTQZo0'/R1"vl*;&l"8uYW{sJ tQߐ]T +pрEA0F !b@(DHpf1 +8$>Ew1 +O[%~ MQ4pi7X1$Aه:DL6 +iB4OyK]9g͒07mM5x og{حHL)Z*mLq;IIdd^3h]QtwJJ3Pi?urF}JFo?_UeOpN"lĖ54la<LQ nCZ.C`cieZPpD7TXO$T?$n߹A=[`xp`jQdIQ/>|f~x̕7l%oX'fǍUaNz^CʵAԉ#VR\eJk][wnX%JT塃f Z kh*Z,M +x;A3ڏ1S'>Q!:%GO~:0oX +9: e-4H4Ho*oX;bu +<]m {PTサhMS3v'j;}$c!j}錃|" %*/T,>]]y}oMf<sܳ{=w~.rM&P(`DRQA #hGh>VD|(ۡounz~^|9F_36:AXe*r7VC1cC65WIWǔSG}oK>+'ye}.Ml{o 높)-\Pua[!iZ6ma/( NodF,<o6n$|wEwS߹qG/<X:]i$OiH$ŜQ;t=A-:Cslu^xEY%xo활A +q'KQ;[&şRoߗ[ |d؆fk<OfQ,@5Dh78Da"86gQE쿩|z"C3HZxqb/lUH؏0W |`p>&o[BeyJY=: +7p)3Om8c_fêϮ_oua組 W֧m0ɶ蝦ի8nC~$|8ֵ#w^;Hab`~Aĉ@]qbaeyo~ojݖ+7UHoL:tNsndZ*>yszt +f428* %fc]>ia_:W(j P*O9tgZ61eFl<ȃ'-}~sɽjORRylHBjHJ&Tsw? +8}ؾâ0d +m˖VM +g V +kU_8WWMWܹi.ޓyf20ԍȠOGͳ=i4cac<ţ$c,Ch2)<t@Vxn/w4 +?5u=s +o1OhH>-qy ·l[TmC t/@lɌ_#dƖ:o%7;6vddOp`ko~`͕\%p +c9\2foQϘھv \XͶpp;mظWb|3o./wemI7'H*֭֫] +'HcfOYGd3ӶoAEcQkNw}κۺGn.nPR$sP!DMbgiB\YipUUU!+TZ"idhkrRSX*-,%jϧP,J"xIzF#ťI2 + +4)fٸ(ߴLh&\J9pX!!0aG9ɽiފr5:1̱קӌ{-_# bt-k>D.Hfpy~92i8YX{^9ojN8Q9 oB, +$Tpn+$02F^"DI`L`)Gdܤ&7¢I؋_ +0H+</RFD[C'TS˒Ðjy%3:w^є~wƕӗ_8_UneCט!Job@ṽ)q,zx~+7bᐬ9lS{4ͅ +1V9^75<߃ဳ] (ЅZ6G\_Wי1ǟٳ&y.mhybY=~Iw[)[eF0>;XNr^wCCXTbjM]d\Ũ/A?d0e{b)a!bK+#] 8f"$3+ +4p#"7+KoՄZyZ+Byb8F4NNNOL{j&ߙ}j/.79JԸ}|7@u`(!@s qxȨHX,pCN@@PddLmF 6$p`>}!TUL+g +y`838xC(E> a,оD0q +"r#.ȱ.,}{}+ԗe[{=gcxS_斏/>VmHaعdAr55>x/{xUV/9h&%P[Ǵ3^nlo>k*ӃfaX<<_3i==nT8igZ6fs,eş@d DKZ((jTHTwZՉ"ɋuI?#6jx)>Иma$$R-cm=#eB*o"s̼3DfKTŋGʂ:;;qN1hʙL +B`?/s%x!,4x+.+v`B:01TXE9<E8"X*6ؤٯ ҘIӕk;/}YriX+RX;:ڀP$7Dg +i-@&J~EElU3G/^7Uf|ټꚻfqsԥL}<R0FwVbi9\PmJ@ް!.-Է +?<^zau11k:c8`,|c̓һyvA}evJ?K7 n*ɋ^:>SG.g^^y`ƊDd˝ٺUn>1&'<L#-s @քm rHe?4Y;U3uQv|asn`x٥wk%Nm2gNj,86TRw5էq@x<1Iλ]ˏ0LK$±_Mw,i& )LJڐN +әI:%2m&CBM4 +6Q, +$)V|{Wz#?_N2G<H6kͲ\5ҝNVWOƁ N3k&_m-d)<FX2hɫz{o9%g/S$Tov0qP \M2N0J]A^܄Dtq(RpFöOIY%^w6jB -sӇlT~]ֱg`k]9iK7F=?|3FH_s^Xf&sJPI~'"[>;Rɡܒ|oUԫON1; +YmŜh̚ W>%er,U`iiaEgLyxIj yH4j&-A_`mZ3yPյNIk٣]}W9^(Xl8*7E)4(KM5in~7R <@Hx֚ij*9 fkIጳ|wE^w$M!P/sUXXq<pB02~AYoq.#$)2#n4oZK<b0]8 u όXp\xNRi`cy˙@[4W*FʔNf)*]]jKUO +&'WܲñhZ\*K&7'X,q#^j2!M`(xق;D ֗^&W7wJΖ)SH0+!pޤPrc0#Sf-X;PZZhJaǃ^tjH^ Iyh80EM}Ge[ 7W{e-o˳D!du&~U뫽;>$雉bu-D4%@Z:V|K͔.m/xW/x-5ڸ< +f,p P=v&s=6RQT"~v +S/7#m*8<|/&Ish +fI ksTva^oOΰpT~v8۟gr +cEDcbBplɦsWdFM98%>r<("!@˗$년F#&r-X5N9OK9RLjWϾҟ-/Z+;ʟX7ΜMDi6&'";HmL22lė2ॗ +0 kXwvUY@w|ܵ\Ь[+;?fH1$"s/mmP?E@;{`AEǕ̡f97ud$:I63m軙N/$vڴMShhցv@lM1`SclKdɒls~!ܕC?LVڻ+7llqYMPxx +P^;֨ (3o;}LשyGˇ'{Ga[Wskd#^7{KM?xKN%īXjm +B@zFukg8(^Y~t]^UYC@^v'pVew#SVO5ͽ!bl=oWJeӋőё +&WF"}:]=J\J*@"dxaRfJ?)?=y[{}DžQ/pN.'`"F +@/7ecYPc,ʰ,Ĉm0xzSHH?u}c|Fq_|/҈wЪ*GZ*%jHm~IUą@BHIi)!&`!8`c'^{iz=f{gϙ?k'OGh{{\*ܜqT"M9s7%sd߳o}kR?={):,?K>{"BC])$<a-/J8]`ôǗx2 +^n +%" +gge9һq_ro<1i'nP2]b.L4bW^Kah[{H4VSRGr +Wӻܨ+; +1x5IڟH9#d,Pj62#)\5hP2QwY _Y/<y_d ЋˣrcZ*gAWXZNpwZ &CP74ip"CH +fS43E0Vc<JmҜ{X:De"5⎶:<Z<dz+ǕaE $$XGV"]+B걋w ++cBYzAӸ +^%dM+mDJP!mMB0 ,xp(%ŗHL/=V"g^v+xuT0B4kЌEu +c獚zK@C5K&!NQ"KT^B5ge +LAEI\W4X:ЎaP3qR(3'J%gʹQ] Fv:oO6nnnuE~DUtWcWj#K6$Ĉ;t;joϡ\#UH\: +FBR q<f +#v#s3v?7ʙk- +槭/uh.^eKM@k|j]#Q1vx{ݱ#hٳְ54ĆTarX"RZRn 9PA'œ_<rE2jw aS7$>ҹ=i2GS]5Fv lalh#m9S%T${k]|3NQTa)|q',(WrjGϧ> dEx>3^9v+ociBn! ,ni~ %W^Hp/C[b+ҍ~~OV3s4Nch38|Ae!Vn7tO~MO_^gM6hX56 x*,cH89SI$}XbtRY+֜~aѐIJ{(+R\ +',}R_t)o4a'^;8v~Тßv,7Ω=.,o0n_騽2r;ͨT;J0 +EF_.|^xeq<[0fq-3[<rC}h?FMk/_lg5.ı0k>wm +k\"|5%r4|=#Z!ƅFQhnkB諹be +y) YT!7{{e r{կ3b'K6_Z::S(O3Gr<=f@խ{jKj?3=W݉A° +P=Ɩ/9?Xdw8r*3kٳ{u˞=QHvhDhF Wu%8KB4uglluO +;Pk;ێcVt\\PAD*#$IHB$L 9 /m]=0gBr}yk73ygr +eZwRjz|KqҶڣÌL5Qv +NB2&Jk<ަ2bL%$ +DDn|B́P' bD"`%ΝN!Il .ANJcbF4}8Il >a:>Ϗ!v f{7IâG[:ヌli:с|$Y`CiaelyPolfeWcC\ +x744#.>?HDd"2 +Ź55Oqj1]]6IћQ8Ѯqo_DBd<*5H>b +C7З +^!tm&).Gl +x>{_k!{1z^rSې4\c),%ScWƺ%or-|+Uz.ٿN* j>+bjqkKݩH"J;<̌ƛ \J[&EQtk^Igpp^^*O'nJJ{㲖~ZG-ӊR@hX{k\}T-63%ReE'[EiΑ,;P-[ƘQb&]Z7%ހ{?1:byPwyWkJ1f2d!*cAPH +C{cʚ6:\ю]nX5?E>Zx2A*kxDOO,4uY,CM,t~TdG7˵?LzjnPpyKKVACr +,ԅp8k!Ft/*B(!cuƉWZ:'4D!^dE÷ySsQoN[8ַ;ܞ51o.v=K#~TP{pJgvI4WeɟTTpRe /&0, +\"eU4 ,Gve~ߗ=aaEiJ۔{|S*ukKˊk[&t +wwd.Y:dAgDt* ~P_8r|+b7m=o[<m1LJBSTRMPMFAtQ] \&2wY|;όm-3z>LgfB`sUkM/j|=/XOu:Af`dDrZ!;Jdmş;24A +d?> +B0HTlEBK,56)-pyݾe.zk[#-OR*s]!+Nmvq\{:Üϛgc;ҫFs6r2-\cxpI`g^M/r`_` +6 1/8^yf^@$6bb{W9^or}4lPaSY(7WKO#zf/~7YT'o{|sTͭhz`M{^Dp1hvg,b0uRtZ64gs2p.#]vipuJ|"D,*x,aP]=UQVUP?>Ѝ^\cF75b+P%u[IJBc:\C_LkGflJn:sXd:~^~#D W P03+c*xk1T PK"tQ3Ic9CЍ!?98$_PXA')%OI<g@c˃3FoMmDF|߾eY)q욵zL䰁#h'c<<!aP0xuT,L:AG iRgom$%FMMqxcƐkŹD"ˑKR\hýJ)3=u6!$xEuWOYݥ֡eSV?[{()훶xtм +?iHK@QSZ:G'c2*4YL@Hn*'v3qj]3]VM}cIZ&C鹨*fcDŽٻF2FTfw0z` 'LnT&{˿lzuqBw\)E""_/\蛷QOMU-6Oq:8m$Zvltݎ,@4cd+¼cH=#GF<<FI; h(#**#BS}o,FgՔm:n`oi)SOws+s5=╋FzQL{'M(4/o^Su{ѐ' Ç=m2ۥ恲n>W0G,f%"tg:bƯXnGaGzWp__z#.·2Βcr6*^-4:'tx4RIi&CHU3M>.UB:lt:| 0T(v; &SE x-s>lXQ(H\r^,B]0\3 +_!گZ)>ƺON\me[lӥU@u j7U6= Zҧ(hc2L&Qs|2"x +G<(xLR]J\BYVd^A~qqWIvC2;i2=I=;8M뤞qcNxc6 1bXĩ[BX+J++|'ϰYJTմsRv%sؘz[f~[<9jEY[E x:#$CmTz-Ц!$=B&@8LC9TOlcs|4O}?J{ x,xmI'1Z@46et.1RwnϨCro"5-L\H+Ze~_tj1G +'^'Of_j>:!j3CdNTV.m!/ħ$<i(ߐ!45 +3}ʖѢ i|冚6Q_b)uM\$M5zUfc0d\mR.˭!JBQGN]ԧ; +{p +w1,gxC\YF͔WVo2J^k +wV(QT͜ڬex] +[5Lz=jJjC&-8PiSOTi틓҃0XtP%(~oYñ}АB 0/Q(m`LF#jjwLKrB9-=ÇX[fmtRWGNQ&Ș/iD÷{qCmt"MhʘbZJN|$h<aab+ݣ!.8ic0 +H20 QèM,țYpt(:Dښ@ϒHD|0rӮq}^X;-?T6e+yÈ́0dxA`g? +.m$_1 +Mx{Qj+Us}& PnmRQrPhFvOk"`|wN]l|/bشy^ L8B]Bݻ. +nZ,!kÓ]ym<@HJlVzU*`¤?M(G{Dgة%ah# )q +14ʷ* x8/a/%&9bphm`RͱZOw`>A.|fWk.No <*) +ryd@ptN)o:nKb+TaMbٜϞ%]Eq[hVz_$Ӂ!;bTZK2SsMjfJʷ `<;e2tPN܈"0oo:2RMTJ5 +WkřH|=EuT"UYC6F"22N)#?<\g,{(Y-%%Ru~9[f9x]֭2Xhc '1l)Lw5/wR=:A8`p(/ڵV`PV;3*3M4t\-x?ȷpo?~!Ãz_k4nLN7XeĶ!5uBܙ{x.Z,$S Ŝ>iAP +|JzvŪlܝtnbᘅh-GX[m-a1Oc|Ϛ^晗 +FJ>(EVPFfTmwzʃEaWᅃLJ9~] +#*I^X <es{4v| +1NrO,Ҝere.RVvv'qj4.xX_<ʦh[I} Co +ku8+[T"ARZP_'=[(HC04Y쒜3cs']o +5Zõ8W@W;8[I'd}6Qozq_Lsq5v䛝EaZ@jt8ffd||ZLqٜrưf*Q0u#T:OI)y^Y/YcцqB'K@ 2Je +j%D2]ۏߝ1K(bLǡ|>24b,}1I}1LYqnPrfU7,ʪ3W 8!TzR&3dmJ.[)T8,\tF+]{pŎ:Z'i3=7cuvࠫB+ZorjXU9rDjL6[`!8cH)\v ƳiEhC^P$"UOk0;#Pv{Aih.( + %>䔛>p;nyxd/wH]Li)զV:/6u+wԬ0-/d݈NGլB5mBiWˣJ&'+V4)n1 +M(`cj%Y-뽻ZֻY?~t{ssyuVw:٠Fĵ:F<a +@f*6|GcjF$h0R=#\rG +Tw%ֹ^RA:$#x?H8i<"ͦ3tgH.(/<2`@E^ImClbW(HR`O/Sd/sm*i/,r5g=u:l2I˄ByJup5PɄ|RGp<s172 +=dr=6-Yn[l饼<` +`%V}a9UXȑ<ʕg),`FD8rYwl7-Y&si_ziI/^\>\_xw4%'[/d7`"ΧQ?K2K@YjV0<! +@:vMeykXvx,=X%3X<=~>,zYǶ[ZBFbC.!E!dLU!65hB>aUCԘcF%\mh"d//مr?Iu"ͥ-4åQ:=uVHB|ik+Tsx<#0H?W't!x<`G<'ϝ_0RpAV :'ݻ{gkK@Ls#jB"?_V,| 3 B^CH8"x+xwΒwA>EJL,M>R:J_E +X<oXا`(s\l0J4z/5do#1jz_:/06ΩeUVCcjc0+4ToP64>ֺu_~eg[G|hB*GfM0C>$D~pRQr'ĉGCW+Cܗ#eOL3gt!G$%߫T#y|2Y +J+VDO/Qfz,}&;~|n.*57oz!==\*x)`Wz_x[p mbjmbN*iV?Ѵ6G;\"b)jGsz#_|.$Rل0% [s@5|E<VC +UY .\KY:f7-#w*6L5ۥOҩf_syֵI]g͎vvy438F8\$dLpmSL.ciZ_VfT*>oBjj;MݵgŮ25`DB*k`W]JS*+E?Ta|p-;wve*R*+MP<vJ;o(J +-eAjmbO[ +LSAU*iǪPXBS}*u?U +v%w;:t7`R4YM"uulbWЌRiSPڲrvlRuwӴMR(T^u.\`.3EfvDjѵw__ZJlW¦J(3GlKˀꧨrEj0dco^L5adTN +k~N*MJT`u0I8jߔ +`틑mV[>@ʘ**U\ &Uו~snBeY5 +g^?03Vk'n{tCfa07[71۷vg]7wOˏD'-խo_\ص(j}}DV/Z.|}{1\lG/-]usS:r(`LFP #gdr{٣oh/nFrMOO_y;Chlo~ӵ/@l102x` Y~o=~~abo⓿a4kޑe=4rxԏp28<;:{/Vty{o-cpxJ:ħkXFl{X +^RKjQJL=F@f6+s2x]<Qe~]SRd]u*Ͽ&KEgBҙxH_W'vK#u6 /M>g2[,^KT:n|ũo~&,!r!MiupLlEA$f+:Ҽ~K:P ?T,0#UE8w$4D/c~|.CV8̗tĞ42m˦JjēZr6ǏK%~&a%M_JLo~~L}m~VV?^ץéז*b<5KFgKC7E~ʌ/om1Dg=KP?*s̈́J\ZڸԷAp[K*Ryris=x=,L/j.,,Z>WD*ao7jQ4J% ]8i&~1m[Ri5u,I Frap;?d`^*ug?Y-4p+$5 5"al&}@>ECtX.:LqueUP4ŌZk묖!૧(@l%A\FqE~BpĐn`3|[x +.n'Ȟ":xt=0'Lh9PƱ +?#@eiP!ePU CRP^76&iFϤ(&#F:kgCTV˩ "W IR$huP EF0L0h)y,TNܡWŸ>]xǫ3gqI>K}-:'Ԍ1ӬD^ +Ɂz +ƕi)Z*]EY?~oxm0hg#'x|ɓ~q=r97}$Hĉ'O=ltuzZ4ѼõX]IL2ib;n6lDcEYȘ^kc$Ȼ aݮ>\={,!%SGE B{O:N6mAl;'N?jj Ʉ|Vm9sɓ'FpI~b]@e%%m)GLL5j<7M].Ҙ+p^9M5yY2ꭉ ̣Ǐ^xO\ZGC;H:gv¶-[{NG:hOɍt['dgɓ?ؼyzj*S=bZOw.V #:8@Z3֥(DQͰw n<V?A + ]v_8x+TߌX-,BB(wI ++l; AFDZ$иSNoVru2-Q!j%xkk+e{8ٶ ayvLA/}؈۠OV"l7e%#>ƉEmVWO,¦#l}xyELPOJ^e +8fmB9e2AV .h캩=lȳ\FKJZk*zckQnmwɘ>)1Qo݄}+`@>;!ۊ"ĉ.uZNbQp;W=wus#\gRb>n]Ni簏66չ_pviRQN5{.V?+P7Q!@jŴ69a +TFlDHS{!>ItrBE 1źNc2C#cfORlCql;@vGcSG<(x%C +!V7='.LOBPH~eR#N1Gi0<(GjDz1˔c͓э%,f GlDJFw~mtneWYR uu`.%UE7^|Ĝ}0@yG$ PA)svb g@Mj\L*<'dRr~ϦSL6#ڧrTgsMW䃀a_2\J2-ӣMosL:kՁKʨ2d0KI3paR^vPϤ2t*4$|(KXU*^MǍGɈRk|@q)8~7vLbBA|g#G?30ܙ=JҬ+^Xͪ{GuC<ޒÚ +]oAELɹSy)@Q2k\C`aً/~Ʒ@(c>7+x2M:wo^h#|.v,\NALD³ɵF $a/ʝۻf+&^63{$r.CG}p)^z禃(/-qO!^/*!.-m!.l\[yvhjq\ˡ?y= +7?~dv)=寞7=[<mw5@#uxNAZ +A @ +j4@Ht%D.<ԦIL+Y>bHҨJ4Bf3s;@ZNH<x{ֆ[WZ/N!ҵ湄^Eux=섎zQ&MB\6zN E 5`p"b.po_4'on<v.t@ȃK(M9X/8 ]V˚\'?;gO_<./Y}ɾ(N&)rC_)b{KyU"p% wKF٣Yѱ \^D`R2mIDP^.,ye?J#ui;$8"Rl@NcHQL(ʟ1qذQֱQQBF>uq`>x;e^}vKR*ԷZ8Gֿ'> zw헏o>tZB" +-ˢp@ +:xZRNh%Qx$*]˗j{e@j7꼈6 ^>?1@yr"h<UG&XG8/2H gQ].GKf~"^N_<;L<PEWO8E"vJ/;4e0 :@3NDE}/5,\{ظjib=_7nQqִ"0`SS'ޒ6R:A +zm͋KU7br?VIS~Cn +U\ŶqKmD3eQR#+L@rL0QI_^PxPrí/FYo˦ɯ݆e(OE7&)@ATh-~5Тb + +H%"x:;<XwWSᔪ7.J">Q)C +$4r{x=řٸuy6HYyth)0%eOWٝOwA`)wk1>/ 풬z` 7.)x + +L5ŒrF>_n6"SlbfJgm@S&1oukzྰѣ#LA:x +q/4h\K3[z~)"̣2t"Xb#RRWRUY'F{6!<?5D؇+/%#Ʋɦ2Y"~326;f* Q$jr%pP5bȠ H3, l2RTBiCƔ{Bc""̣L&Sܢt(jFYGZYã,ѵ.`FפKTXI#ãx1%X4ܷa207e-`YE&+,"y_%ΉO|/'WvD ;/x}Qy qq6ϳ%-PRSs8uHU3EپiG\8 +u1p}XE'5Rl(7rnpRI9 T_()}͖?'>bmF;b >,xe4υ!Ք}ŗo:ȷ1dT<dCp5\<丹 IϼQmEަ:>ۻY +DDAA(V+BTBPA"(Tm/"ԇiVkӤij.Mr{r>93>ΜgZ{A- +0*9^[]&vMYCi+v?5jR%"=HhhM$HpbJ6%x~\3HjСqjLmU$\R,X\ANe{QWnId6&p,fm1{{68x[|p5mj?MXpփXD{gg閻&wʫU:,]`yW;t@4 +,tޕFz<P;VRo'F)9JBeh;N\0QieVbM1ډt1ɒnadA[e+IKXw(1.T2q1%:VR^$2kࢨ#C$O1 +Z~Pffgf[RmP(r+iW6eعf˘XZa.*^'-|FAw67"Hw㗖?$No§:NJVdXF+@I-U*fslNWJey.mdž.u^CÔlH֓ԓP#&9:@▭[m۾}[vw.= K67OUq=e=3=9zϾ.S:?Ng{mݲe?x"e|4f)*4HR7Dccf_HWEr9j + sf`ߟ}ӫG#cn +'&755v;xzVsyb"%!nh)E-b +` +** + +Q@|+T*XAaTYW]EH*QUTPA +>$ "g23@=ܓL2sg]|if켩.<;ۇKt\/,*.(;)"J +?6{P*/*,**(ޫupIa\7ܮ0[>*v~]x) +̘O|RH-pr-mlד +rv+ojcyWk kG,+pG;Lޜ=D:oKLuEGkcʑNN6&bk +ȑ|y%;L>uSAjK3Ltߢ-,?D)'B<2nARJz3fYi^fVEp06#]fb9jt%.UL\xUrjriB!vY7wx8:N8\.oeWӬ!)s}YbϏޫŵLh@6;eIkf:K}:FA R]z!.OCXF:F۳j6~nd`b#KyVz|emǯ^>lFL'Όxt =IRCjtop`%Iy788_vp ^F4 +OsJ5m!3m˒`}5k(/= +}B\z +ص Ab.g9 +^w|-^+3 ũ`wԨA<r/i +:ʫPru^}=#Ae!Lka?dڝ uOvd ##sР~*V.7Zyyp[d +I11*y#5یsUӛ0_ +Zl?'w,O3BVԦ+~[4o<I.VJ,'0?\`АO$\jK +Paq"^$=}C?Rv%aY<ԸY,bK@/U -]VېvЂǁ +]QZBثᑱP*GpVhSQ + *r)4ۚ/T3|ٟct|Q +ǩx/A$42;k_7oXtp$GL<4b2n*x/<z)*~1AI%*%5W7͝Pͤ"K+7i-2kSƋ*:60 7Y4[c|Џ*:7^+J?R +g0ks/G]vTCTf&pgxq"U*ڴ(QeT/Y@-\am:h5ZJ`NR׃((F`~vDjfS}'{4$G|sOIHL;8[Vp2^ÀxǍcK\ +'/J=d"ڇ}8~jl&dzlD(h`?iAsN <nZIw7/ +mC/^bT,rXq>_D3wblPi9Gg?'f +GH#G[bJL׳<ɤ ++ +e#koΫ42roRQ += +BFΙ %F= +D;';hI?mf/6r@W")%+OAa괛zvwy׃{(2E: +i3V+)mzzNU% +b"VzbCa툜7jE@Y8FYgNJ#ߕ +MNsw.{_ge8 +Pe% 6)Z%<ʲA9Sؕb{TC%o_Oj4r$Lo5CN°ڤ>tW +Y2-!n)42Z"[#LwYΖcvX_wsdx;]>kΘVZ:)=ߊt@<WŁ{-0YaJhܗmةaA@/Tx+4^U0bͷu(#4(4r"afEjQmX@tUڗ4 3t(1$lD \-,NIx&/<LZ>r:ڗ.Чal4Z|:Kvu3â0.IX9kyB?eH7QEhL\!vfr*}9X. +D4]i"= +CLZ;*ey'jsbe +8t, +f"E`;:\j +@p.߬Ds&UAaڍ8|RBMF<?@6Nm*kV~NR訍+)}IJʩDIbKm +hU݉x'7x7n^2Ͷ>ɛhVP *bʸZ>ŦS7nX7ۑyD6 մkYkSM)E*g,8'}nVˎ2;KɧnXR +`K-:35<mq#HblS¦9g(Z3G;B_#ɢ)z~s`;+Ċˮڤ + +\!"T)Ol)BP>d +f_,Te6:\HdنgxiJr+iTw̰Mc9t$n?,dpaOKs|54ȵY g +Kj +n<_G6KI-a&$DG3ne0eGA^pB BU*6AUX,RiV +.WH<4 Mh4O&m9ta0Ma+(9QuLΦp5 NmƟ|OQ%܊gKnSa +q*?iE0kEH[{7ٴߤ&J|F`KQ=}:n +/җt#7"#Ӿ(?yaÇUi(ƒaը1i_eA` +\51|S&K4tt%?g}݃},3X%a`krEmwׯVuUL%?6^|2Lxb;̧G<K;]q+$meF*th`8e|wl)mH +Yb_`y;ODxxfjPƍul?[ FJVŌni6{U5 qh7n:bs +mԲǕGUSC{[x/1j+MBȳ`+~z-'PjdԳ{QFEoJ>xQ"cJN7=EXV +%wzops~`wt_ w|U@ =<ۍ0g!}^l?0*J$<Q͗2B|]~bLږk;mѶ*41GyjC'$I30o]q֘ȿAfu२؛%u\l;(F핣Wm>T%J-{K2J$$ +YDeE\4F n0FhVQ\] +R5rU(30WHqt3==M}6qn5 4"cxovggDD,1!.^eI BEGG|bɖzxoNc<ϕ5R<%o0zW*ז{N]*SCqb<CXn<`m9z+g'Z3Wp:N +ϩxf(0&MըG*-oh"0.0zkN'hkc|c>3r8l4fRϩ$ڶ-0kȢES>3At5^ިRwՄ&VW\/SU>PHiWvi!]))}kT[Kh4 H!98;Nb-x6`g@lDƳ`aLmxDyG2ϋh;5䤦xKБ6&7xx騇DE}xFx{qٔU)%t%Ńqs㒇zk8IBki=7]%U0]N3/^.(.8STW\X2qﮋk}Iա|]G+:1(~*^jnnt!N1a6M%#E*y;~\: +܀g9~W5o5%3p4Wǻ\wH+~qC)NDPSO=CL=Hݱ!xfab6<4tVppHϛ{T"x&b@`͋~d8F/WDP%Kpȶ^s?3bF[gw#!ƫN1bXz̮ᢴ>=rRdR4^Wy[ܫY.6}?`e-۠쪚3gNc0b8\Qp -0y[--^k+g<纃]{25=C߷zR4Z+~8h$VĨ8!&9㲬Us}$wy*Wtؤ5 wp1XGpǓ? +6ZPwB40/;2fyv3.c'2H B^>.#kH3X4x?W:+!] +|qN6ٔBL:Axըw'nML7oNHܺrEo6':ڡaHGd80qa +Kk"`JX"$5F- 8jW1m&d])x(5W {?CaF YEI +r֧ϞpHK VccB#;?:&8r͇3)+N4}t- 19He(#NH^p +r.>2q~n+{t?#bMeOhڢVNo=4RP_|Кs5@omc>en?8f'#{ҧH#3<ٿ&ڹè@%:ZVr/,3J#\B˲4`E@;4]>Xik?ݲ=勔RRmqAy=d=oY[JP}뱚P 3TzA=?/ica"`yÓ:xct0 Q< ++oP*噮cm?ۃ;~BV~$GyU +D 5ZD&hp"(FEEQLը$-(İ/Ã{w{{HLtr徻==JMFET㝫'8ky=&3u9Gl$AaoF[u qeACFe<1H29[ϴjF<ަVkxcZbtE$CHt닾#+RVWk(CxԆH(UaRCLLLLMM݆`!OVh4E$Xӟ?v{n<xX +\&8(0ࠠt{TK +W?/&A^] --z]sgOO0fD +t`)WYϮ W:)1H`Hsb!c#3+j՞Q_xalu +m~96SvF'%~5nߵFE7 +gnh͟;q̐̚xzU;A"L+ +;o[ZcDrsӍ "eŎjxo:sQA9AE eFRh`4s0|C[H v_B{T$@@Њ, +vfҴRUB˗dwҕ̃guϕ[bn%w4>Z,pmAqY +"UA;sn~2u_33.?`,@ޢ{NƊ..nnnsҳZ9Uʫˬi9Qս+&RM⃦QL*i)d +|tTpwuy{xŕ0mܺ!{<UpFm}o54KDxdVkGō'sYK~ +#T= ;9z]WXa祊3Osjֶʭj<9#f+8IJZǩZ֎hؑqd1c@ +==3r0?2VXIuiB^$R~(`kpx\ޗ)EW}G$'<9p?$}mok WW[k7\( +^[W"p2W͆Y|8_P3YXgt%l4VCD1>wcFk4dmG_֊hD3s bK[ +0 +at.m5j +[+ł}x!Y(x^Eݎ)叝~ҕh%^T_%z{1*ע RQQ1-kqkxkI7%3Lxo}* +A IKԞ.]½ݢC^V[ +^aqnviWN5ً_F@K,NxUTl83EE]2< +֧x +H-ox1x}AJhz}J#K8o6F(Tj75h&d7fjr\Ҁ^4t7- t>A'5T9OMWQmLFJD}/epgo^ +#wI:L4WDR_W>w&> +]qsxk{V^WڗxS6*xNʓ]q;zg$sx5_a^Hx'Gxq8ApZ5ͤi@>Űܸ^[-?)?گJOޑW0W'x +ٺќxԡx;ه{~8ܵVxLe1-x=x5wvᄏxś9wg +Wӓe,{"^ƻm9e}&%tkI|d8D8W6w}w\58FT!iRx"W=ӏcKv'f,'/W۪xl}H2^`/K@O9p8a|ޑh;)+hE<Yz><b#t\Մ?S@xeAuP V=xϲ(4:kΰ=ߛ[|Z.x<.AɜMqxm/\`:0hᔜ;7 +ﲺhdc6Uu"W5g-cU]+؟bNbveh)1_w7ޘKQ<.?xWRBw]rд}xa< +x/EN+¸bjdkv⮋)H+ruˠ{.%#Dl|sCVl<IBݴ s]3kx+xx0oIp)Gu)|xax/E0K +dhנs&QFx%HZܲݔ)"mƋTq»rio*A(fHJ]gL?y_xQlF4`fS!: +F_x:O_?aS^l끸p\<Yi5d=j6P;hЇ߳;r/z=;hK*+FفO8 +&xYC/6 ̌Ǟyc`ٗf[{;Jk)s#{9N5or7e^hŵ +4G~^x!xtBkQ CG,`T:>|,l9dV|'/vT(`^@_$Y -hʪǾvhi:~W0yp$kd+nVwx I-2^ԍ;z݉cjHv[5*4^j56^༠DQnǧ +^oo4G, s ܦ8<N\ujRf xQiU*D)CxMVQ>tAі4zyD' xmEɤa`-/kF\ǂ +"8>՛hI9u3l#AuLzo#znΙ*}J3G\sy5v-ݥש=FO%T^.::0[ܼ +9<#+E8>m#FW66B +x)ɲ<>I҄S+ZmxiAݡ*}s66J+xFo{B9OX)zqk՞^^kZM]/pAE%>b8sul8L/QwG0X<y43Y\TY,8Dp +%7鳓D(u*b=FgڭF5A6&!SE%x" +TW4RFR4*xˤZf0iax^ +#ʡ܈ ʪx"$ ! A g'kkTS!JuJw~{7x~g +1#j&PX;Df"U+5I$5c/BŕfQygq<3lbyOjq#KC;͋)0{zG/ +;*. +^eVl]\9't;Jv<um9Zࣟ} 56ڀ1DzD|HsZ/NfBQ$g$߷v.㴲y,&-+t_n\5o4nsrm9eLJ)㫮MB}ˮOw;Ւ!`,I fu +]*Kx0 +AJ^0 +rX&p7]lw6iH&J/H0ir}݈cӢ.ԤLeLN9xΛEpoXdtHd(=8d땟"neLL.Kf=}Ӂځ4v'fnۏ[WW$ Pyv>\ +KΝ;52`>ϻiA>ۏti?%9Y&RU&߲b:tk+^epf`*KddvveL[oe YЁ!}>^;O +^zpp4WiJK +/8b/Bp@pB#Ue:MhS@wW&Ќ5EupNUTjaMhKeߙQ(y_1q"K<z?a=Kw~ӗ,'D >qΫMc*x,aHO9#$!Y.Ѱ:ӏ"+qMo[HP|8Eߟ<x.XS*D:d)N:(;7b備˂߿gSwr]ס@pä)iS +zxL1L&&`m>w680,&t7h$,9[%H̸ +bXR`eN^/*IiQ^B鸞E=:Z"gՀ*C>3t[aJD~xzQʹ~CnxJXZRaHWߗiQ%͵LL)4ƖJmTdǪ5=mܭbxc伀b#xoi\}pɊb-ԒƋb{]FE}VАc,4y͠,`"lTUneim+(sܞw6'hc[vbl.pnYlBMȊ7Ŏhܤ20УC2d +k'ܚ;6BŶr0XI8]lFbDX#<R['cOWc*_n.ﭖUٴ(GG]FpDrγyshG#xw֡,Af | gՅ<ei L;[Fw~pBPސ!'K]k(YB}{de +GTplK͢|N۞iLw6 ^?ۃM#PUAY2!qsQ5OKy@1AZꬸc3o8≸q*79Y k(e̓ZIU|do+kja͈:[Wy\S&0 )ʔ<nVP _;#xot{1`iE7}CGTsGBySni`܀c]7ڜyXƉfjE9`8 +Ă@^xZ-$I~U^҂N+&_rW:d66~5jv~ +}k2Sģ5"NV`mAP+yCVyR*pok5$rjxd]PZ<[ZNuuV|qUѝYZv[D< +)/@%"2Hbn.yw}dvkwfvFI~_9cz9:6G1rj6z%$֘9iLj%gk,ʜvܩ27-xcPyG ٿ&oXsv02?ۈB0xg74I}͒߷ $vsbBĸG-Df=vnpt9,O9=PH8:8~MIP<Sbi~zp7/4qkC.sؔۯVOzJą1W/ݰ/PyX+GlMeA<B<ݑpXL?ܾ"*b}rd`Urv^U 1sE1C([ Pg~qN*xUqgǼG( +3OM˿7D{jxffzr[KQuSY\loZ|ŧ>:yOek[HT{͢-VS~n +FPM+s˃8|`ء<S Ć}J)B7QhE{-\mΐʕՎX8DEmMk +nfʨ1bccbDGG.(z h +iB@F'4z32m .i38Рӧu7yЋ]ɟ +$TZC2 +tg2h4:nkEЙ17QQ~e1eec:"WFHwm9<M5\sg +D*TT알"j*[O]zC)2RcV!PTZ3Pp](j@tZ /N'?Ki;,# +]l'2[w +qFER5,,K@;",gBxw)$pGyw+sħq1"! *B+ކаaz_(.uٯt7lTu}R[!ԽmA:OiA5|.z] 5iQhA0v=T?AUaB?XJ|Z"Pq4^ 'N}h8Na +Poᇼ!d pC#G=<"a͈946^'25X⎈i;2.k5m(>CLyW>L1@R$lf4u^B;xj#h8Y<6. +A7MwS_CWFwyG^ioY~䵕w^#jz]ۭ'Z-T[x(6_%jx;0xjė]oGIJ[p/Qa9g4_lSyVёBo Fhxy߾%`ڸ-m]JSʾ9 I|!VGϡ/ebbR6\XW.2m8!*8h5a ^a/18>"`N FBH.D8i:94Y/zNI5}r;E:xMNOFQexvٽƋ)5Bp7ZusdsI[iʾeگuȡC:ejz$&-n&xVxa,N(N9Vl1d?O9vX[I1:F<aޣ`:-]<-N ?|iWyq]MUg8z\ui۷ +!5W!TxL;E1?|ggE5>,nml Y-Ōn<c +{w-yY9쐰Kp=YA@lδIIOW_Uk5M̚:s:}`(8, ¥?xs/^khժn_xg/0QXtN'&$:tZ̿N-W+|<N+Kze_(^ӓ)3|!^]RChpr!{M zt/,lkIaˡѱ"a`(:nOVV}h'^Zy8qbBǻT6VstO%MӇTBD>W ju\ŠdIO.]Qo8恩X +EWF~G5ugq<" DXPj.UK:ֽ;آN{2n3b]PW"" aBJ!!/yKԞ7'<$'w~cBc +0a=ɊCzYwgWMLxܔVjI}~&imƉ*cTۄ'uj;o?DrP'$m7[KbLw]ёXQY+wŕilTF-z)OdkX +z2cx<}gϘ=1cPL¬h>a6Ch[TzUPu/3]nz]M@Ҍ +eyy~;6:^FVu'.8dǀ H*[n:Q +ZOM dM=xӾANc8PGF>hA> l_a?g^<,O$mk|N +rJ飓2J)$D$KAup<kF"Z̀$q ++ƺvАd^;MqcgS6Y +mnaD`ΞwfKϞS"hZkzhbFeш!WHtjqqՌ7nlpHqjEE=hlq<Qtp_Ȉ +sHwZ7BUk#rd#ej +T.7v_(i8TmRl©b}F +ݞ8[բ/bE{'Nc{wo[kkb&@K8FBͦ[u[hAPJs#[,-V̙ܧG"~zW1CQ?YO0Y<0L{ҟcdL[Lo/|0el=vw&~uҌj[+;l*;+w +'Uqb̞̈ĎHj!Dш=1<4sZSEŽ4:ڪKءii PNڽx82Ihs=[Z&J<yrp+fIn\l4B[A97w䆰Bpha(E?ٖ4'hpIBg=OKYUp2R"|o.,h /q0z~_nX?35 +6//}WUSaU +k!ԃ^%"5쇻7e"4^ +sx7VOHW6Mps9tM%,,}cé55O+6~<S'>nڬܻbq*^0->ГܝgTUr/f$K:/J8'ɠdg&G(4|!3$|q~yP?ӕbcʼnQ!S|ra)5+ugzB$Zpk;5ʧW)^cDӪM- +K%OVAiB`P^djK/G2oF*k32Agz!IҜ=uN_j<nCPM N0Pu.K" +`VHx9w)38pzYa"vp$#:}&ta}Pѻ%E$dvLP%<#,d.oMC8r^oSgsx͞rΟ12<^;v^[6?ekqAyou-fЅAo-6;ۥ +Ayye+Vy\+{nf +n$>tWDrC.M2dz+d +$zaWzS9[~5y \UZzHukVj(B P$H@H$!$#jwF;ۿ֝!y}~NG3\g&,8(u K,V7ƅY^s7_*;6%R_,urrnR=>^+UVw ʕr:(- + VTu^'%n:퐝öV㸴$xG˾:۞:Xeak + +w$:懯WmsνdZ|fV;Iד"ElIdsB4έNObUSZf/mMs-՜Bnw!7KKt-Ï؛֭9dFi +9xwOr$y %ȬIM?\1 U8?dq}]]²8bH1?Õ4sqTVGErAzk (;߂E7ߕ?xҧ_#4aS@% (CA>kFx3ht(H +0nٺsϕ[cF*)ɼ?δ-V]YiɎ~+ީPҖs}#Ɗ*_R$#^%ŗ]1u&&Kg3Gq/|K~x3ev6/9 +99Aon6!ƔiXi0屄*{#`cKd/dck*H; VG>[;RNP8}g&~)&b"NUkʦcb +zUq,eHY30ySx!]L2Z%X1R4e1|SۨicZUo69ۿ9Ö;jf+um2S&xY-88fToYioœ9~p0|okXMgt(|Z=akhTڅЙ$7F3f]I':;9n۹s1֭rp&E<Mm7<V諻x΄/Y(Z3K>\ +6}hbk4٘ϰσٸܟSbJR@l$0%R嵲8v};oXV&qz'Zܭ,A9xr癵tc:DgTep, +=RuM5Xy +T62^:I5+ue?Sئ[j| Us,C$EB[%W`%`si`(X4۹P] +/KHm%T5L:[+Uu <s)⯽/P.!G!x/eś*R%x(ޝ<g P/#U{H'2.4,w*},Hp&^քz?+}Iuz=5kX@}{9ib]}4^0èf`WIA0IH`?C|7]+Ib'K?尞RRU#ν i^mV"=u/|_Ƿ>7YZ%SoC +YQpu tauSfQܡ5 ȇbUasmXh*zk=tT`<Ts6J1&" +2g +}e6Ƭ2 [ +/A-Zh +( =9P-m`uuq}Oא)u8&jP!qHi(1G4JP0@em/~dA寧\"[ն-vv"ڳe \d=3Ͳ\'ٺ\ +ap!,$h[ZK4Zqp*2̓j;Փ7L՛KI$YVhz8(V$!)_OQdW<*(A_̖Q*?QnSJb*w-?lR(ɪ*EnUb*qrrE@Dq800}gw0ͣu羺9;^xQ8>2$C/. `ʆ91/mdq1Ոw5(mά5PXrN-?r\**]|Ŋ崶V +V'LYgP#Fl,xa_y˓Srѫwtewv:_O4.=w*.tV'p@0bO1:gn>&G_Uz7>9_~nϲ//*ٓU}4¥'-ܗUtuOv뿽P̢}?d}J_f^ڛSxdωSW)BavI*V?[jaG_z??}kPWT2&L(օ]辳:l9B6>$O/{}=)wgurǟzGƽMc~@klZs9[[wj6{SNדI_ëcSדn#39H@~ + +mr:*xw1ݻx8^q!?zi'O5!.' +0hTAσ)6.$,IG5Ku!#)7 bPLE'P +$$$D:U?Ҿ[lp,tǎ۷oozj4Llݺ͛VϠ,++25[=#n{f=ڑ/xuu۷'{hpo]]]VVכdhaBSSSHnveb{O8g߽#9)1)1!311 W8-HJJZf +">[$'n7lؐDj$J; ݆bͱ840iӦ[tfzVppf"E L/n̝I%{+Wiv!&TǏϟfAo;abNokp +tȑ?͗ŋwuu/!=aQB%^K,ċ3pfd: B +PA0f4R4Bmmmx{{{l8t^u0xqjh^Pī5-E#W'40U,$^:C~*@ +,A[d _=yyyJ`dIF/MAx-(+5Kxi$+: +2x"R]e .=O#f>.W9%ި&^Ӱ3^k9wnd,5⭫;yU322jfsNם;w-}/Z"zV00l5KxNgyy\VVot$ݸqcJZ[[kDkjj N:3>4MIIxsss-rڵ~ڰaCQgtXE.kll~[eEDhhh|6lذaÆ6lذaÆ6lذaÆ d6l0H! +!DW!]ct$HmSԿ62 ).._AbH*SiD(WNc + a} +iLdA!Gm٠NBL) zTv/\<2V8|ȣɄ{en81Ѡ5"эy!WyPjc@ n1ĊAq6YMk36jX2d\j3E+qKj-D1b +O&;n]h7aOH R +" !ݎen4iA,[$W +ǂ8Et4˔-is"=miЎ3q%;DeBIwܮpag!A)Ÿ2"$B&FZsÈRqܵs½Mm.T(>)x!@]:KwFmeLnYKҢ\]f;ϕkUxߙNzNtMBk!5đoX%7V %kԔBlR˄P)=]3~Դ]cfY/CJ_Ki Qbmg4Ј : DuI+z +-ʼnYyґ6bXLgxUmReE#A"9P7Kx2*VXu64&ტ*EY I$Y2kz~%<pⴂWIWTbl$XI|Fs͙#;_~{ӯSY"j[ߧ#$08RTS0qWbASy;eqlQA@ +4|ə13wƏ J0G7 :1֮xm(W9שossfd[eGsUR +z9xsY'l~:SJ{TZԑ=/6 R2)\$"mi}xV>6uxBJg(Z)m|)>IɩiiɃ3m\șx'xx@`A^}wܸĸA㧜u +-KzDr|08A+M%/#.!_RS F=5 >/ߴ27gGB +)\~lbbGdt79gM>>"rswZ +Sh<<Zq/щ)@s7lsc(ֽ[EȦ(oЀhqſںeOMJN~9ʨo#ؑ8`Hz?&W]2#kVv?Ķѩhf +m +2zx>Viߺ )kx~;TUSED! `j-7N8j5i˾>""q WjURoAO~;&Ԥf +4tg/jV:m;SlNdw]5Gc+XyGMYqRSIQ*RH B_lӫWzeW'S.Zf5Ҋq6;C#~QNNyx&d(#saĘ:+NmSӖofx5 +0m1)u`uG8O90o꤂ُkWI8_X.Ug$t0Sq7?̅/Ꭹ:zQz5z3Ȥcp2bAgIuTL:3ϻ*z.NL=\Ɣy<*dE!?sBpRK{b*6DUӡK:< +I߾%F@øzS0N'G,:%&:nw^z8EQ@5C :8/J$T8lw*61=2AzMgZ8ƒ-d>c수{zzJ' "cP=y/8Y%e#+8&0a95Bust&@a?0(ʿP>^sν__~NhѬEsߨiɧ[Ɏ!][$^q'YБAxU?1t)D*!2EdS2D%YN7YJ+^r{X8+woٽfIϿ..m".KL_.P]]咝Qn߿{&Θ߁[˫ >eSFn"q^!22ߜ++*ޯx߫kH{2Mϡ@;o*\7"s\|aŊhjسyȠ4q(Z`ooТ8q$:&oby"n*U}zCk46sIӒXIE#^]Fn\0oSq{ن'kVb o:HG$sI?E~*<GJ=5g<dDrtPKK@z9_;͍g~[eH"l +n !^n^!869gM-[ux<G']0:9rDYd+73"zU/.^V=ˉ)=ݳ4J +dڝ%w}pHfN`!6e&^Ow u 6Q8&@\:}y*Qr%*@z^4n9P媩$EOo1Rqe^b,ݳ퍞<|q[d/l"F94I'N$M''+>m#g=8K#!⛡;Ҷ[waX +<M>{?y>}n_tPcAc +[Ű7j08}s'xec.e?BA"W<QIv^^beD`KG^*0u=aށ!Fڈ+ R>juwˆ|pزpĽu;\܋n/&+b}oO4dp/\{ɱ3[Ҷ <]T7ˢza{V/|]w,.pмv-hy$f2~Yo.hBH\4u:NLP-;X(ՅuK[,X8lܱW\A-n<oAS$`u<t6o;XXЯ`E/upr|FL ɈMᱲ[M+_l*m@IdEO%f+_Lq6o*_-M@ lIyԙW19씨H¢WW{ «M77$9j꿼~CoYLPt N4U>RM⛂jo9}ve_'-MӠ +cjo9Ϫw1jN6qf Pz#CwIB_m5m%:8fT5O +PEʔKD֧6%ݥܖ_>=ssjR>5 Eؖ)lbiE3s8k1SpAVB1[[.j7FqitMUFQ?Љއx*->6amkMv$]gΎ{Gk +FjR(4 ñ,v<`%B ")Rd0R(ṮkԌz +Dh;vz` +-6QF2 +V7/#<٬uH@9悥ï}ke[8N~Z7Pī +ro4a WoYɦIA@{f38` r[VwΖSKc^x +XGxgt 4.{Һ=0,瞝T[M)M.>S-g#Mznk} :-0xBLR+ɘ%oNJU;ܜcǚen3k"2fz̑1{aym;M&,tj]xfO/A;ʏyHŜ-KgbEzpěKfW1pQ^YuFsΘڙZy!(V`}}:+t9Nź[ɽu^0Ӿu2, q|2+wպ9$h.4|❏cÇ-[ڕ:ְ{okWro}s +!/s+|o//~z܉=˻?u;{/[aa2- 0٣?}ȷ@~ҝO4j]%SzH<]=q'#MsRY⒪vmtqMihj[cZ:G I"U a<r1z/|~w)\11H\<C_XZ^GwoBXB6=7l +60TwZZ(yHsf]>S}Wc=>䘆m{CQٯr3'u+zV.k˔}!<mKQD_KX'<>yD녋?0,W<s&f~ư%p~نuq|k*H`_B"A(VdET(($)j1ڤMImh5$mS4ZڼfsyuΜwIs̙JZֵ_9YͱsȷFd +DZb-O/H.-[9'z;>hndN$4Q4Ԓ +{cxweVd`(-GyW?{pIm@T2PW[ozMw\k ˵}YEEj/XyO>Gpf+Tv;og9TYЅBIE$ +v)y?-벷進%[77~+.eKl)[C~ROP0JJ-x'FA04tw||&&&XeRjL65*.E};.Z-Ϟ +G9Џu]o<u8omo?Fd""e`b V:߾_sկ?I߳22x'hRԜ] ޢYJ! +MƍD? %8~oJP +P\2PLn`R|alngz9wk6ٸ}]g.}TYGacl0T$Aݘ|sZ֤扴2lε(**Oe|AfӪBOeZRĦF(ȩ-E=g(86/R (@G&ft)t@3{ VHŔ8dBUdyR{̓ANImizoއu[Řb-@n\3ܪV.}N̎Omطdo0e햭`_b>/fnL%- :~dA)7dH$ѩJA,cT(!84y)SL28ǦG\mmhxh0<0l6"<ȵFYGhs#P%?+msMsJߛ`A9JlZT$}iL#c'- +o1q<ZvCebc`"27$G1y%RbY3$$GپLsHhBd*=4aEc6|JIY7dTE|R'S7:/:(8-^q%}'-CP]{_:L|,uc4ra=Nc7Hm-[<9zk[;"t.fX!gz0l(ޫd$B"ނk+)6XKh<Y ͬ=б/%=9"HI&g9X5Z$hȌ6743z+ڠtt'B:GAk=Bv4DGn|^rxPVج~6<6;1rH0 +wF;lcaX<5.%{w\GThǎOw>rI/am+m }N~@fN A:~Eq\L@eq= A1`D<`\MnФԬwb®f5&n+c QTD䞣=+mm▯(߁h;Ͷ`}}E)T +A [xҢ\y'dj"U}A?<qh/p",T:bؕY\9#ո]."pՎHt ~dU2^o 8,M2Q~HX3uW +}Nz<PtgI:OqJbɋD'M?dFlaJ7h3osBy0p$'.a:[\mrtOH[W#0s;MBQK:p^xEW-Q½ s%39Y7NY&Wf%Q(|2f̱ J +6BW$Ҏ+L*)E{Yjgd6tUY`iT(YE]4Cܙ+E|~fX*x$O; XI[8i82Fҝ@)&^=Iv Kj-$)5ӜesvVV[ځʎmp16G'U[ +ʁǨ1iP\'7,b?K9WBĊ`ɶ.!S3O76J~r,[]bie +f;6V>ևj(agmjhUEP#xx'L%eȵ(k ?+ +aE"bYzDqaϛ e8_ARRߵkVIY3U;Qי;Rj|y2FI"" +'8<E[B( Ë@֫gQ/ME+.8.X/l{A{6^'-PY6!.̾ +$}82~~ڜ_(óH.HTCWp h4gS7[Y̸HC;N5;:() B/x{3OVQxIj^4&om)K3F]n,,yabɚ-\¸_>?9=`Ǜg4kgl>T>*ԜkZXrxN 9obȧI}`Y~'voat?̩ojnIvUA}c,}k#JJbewXf,[3s9+Gdu0ٸ5!,v-{uu7~uF +%ZJHwk06ȓRn;rv҂χ*~ʲwS⧢T.&n8eVIE~qAIIr|;ly^ak9$sxAo~l\r@Rx4*EPĸV8R5gM7piK۱{n^o +QzM7'ǬQ)_'3.\07mv"t48q%:OmpȢoMtQ%d=m.eTᓛ,h҂ leXhrcmE)Q\PE@QAQpiPf7w3ULtT|~Ky# +vIX@ݡ7pLiߜ6}Px) +BoȗxM̓7].]>H.L:S|fL +W֖~B~i}?`oN2߅26h߬Q59Nl}P \]YځŜ3ZvİV'f[0;ǶAiJ3钸=1X!b}l- +ġOWev|f屡ayL H(>i^y@8_Q%ee߭I`2aW)9 ݤI/[>(]D[]O8LHvhU~z"Urّ +oLNPh*-3?@UYpيP5(0FݿhSZj4l]HcCl-|I*`Oj#Nͣ| +3's33h9=Fj>@DbIq@_XxppHW^<,۞s ,,}ځ +{OK_AQ]YFu7-,( `4("F7K$")583E"( 4ׯߜd*o*3U]o.`x>jB_Zg>Noƾ}fI>23 I[5z#@) 鷝xo$&LAo\1r[ wbu)f$JE(Aב4ǷޕW YJlΗ!ӂ5D3T nXpܿo/6k;M4+#Cf=sbuxVFCwPw{WȢX"bƢ!FnB7룋 + +' ӜCr.:i)&$1mEOj[|=4=àMyA_a^L]w_cV}hck辎5ZX郩|UV`Y[J7[걾˃?!y%͝XIM9^ +05AHGz +ZV[]3ő5$ +vpـ1tW-: s'MZ[6h4jۮMf2sps`GV,pm?f)gfw +PkuWN"h:=c#EBjۀ<ʮڭk?{z{{9HetڠQ(?7Bl#ss:ҎWr$vc:*xz5P|%\r}Q=-Sqno7g(oo;#@+-̄~>SClV錃y;wWbXK=1 r[@kK.и +'Ab|RHL01wfmjkF)DZZ!Q@A$Ql#P +QAkEqc}zwv>̜;mC=+sg{[Y8E\\m5sn'?yYg_叽@,;z?@چ)_9ŋ;ٹЫg>z9E>=~ȊfMbwOCN +!I>/G^oJ0'g~ Q}8-Rș$3 3;^-SRř0+O$z,ͲХJ1V :A!!'QE[.(rd<S4Nn$2´;0{w +d$ Gqpjq6G%(t.DDpm}3Z=P';I,pĔ 9Kj-a{94e"2B $GDiQP3-iKjX,D*fT +P)/@Z@3anZa4Z(H![@T5QrmtX=d TRԙ +vvӯZUCHxZ2V11ౠLKk!I|zHdxLeDnCAs좊OuQ8h +73Ӣ.-6eTZq9sg-Чv{AaEUn;%(d%y6pSW!^[ΩF0`TeҌ[!ƲM;KFsgK"gZ0 ,d~?$% +3$Hh#{R+Ӏ.i5q\ +꾯%78yŜR['R s: `'QwJKW}_ +ijvr`97M!vg%.:TQ[@uB6}_t3C,~ +lYH9Whk- +~wqD}~hҺ)ǜV캉k0('9mkGJ^vu.IrcROiS#z꒽Z6kΕ/(.*Z"&2R<C=KZŢ8Ḩp~+?,`âj/VSW.^A 8?cyBu + dÎ()dċI) d*ցnK4Р؊Tp +qM+fLIo}U!u&$g!#W;[VQS$%Mؘklqpl?oea1jݗPa<y/}ٜm:V1-bj9Xh6~H٬_wlyO~OͅY;0"y]~QP|M32ۤn`ܩS{<ߙvt/նblۆK;pv.c5a)ƨӍ:629zv{Aեwa]ggѣG9-=-9wvl2c]avf>*(3`d3rrc3+RΟ<V0*/&?kzVx-B +k'cWF_=4ȵ7˽e/5XKm[=EoZl<~Hܟ8aCSE%Đ/XqOw6jQ8"|n~6RK?y.324HԾU[gx/lE/U0TgzrAm$N[{}`X/օDB~yBaҜB`ɕڝxWWĥsvLo`u7?Xn*7">vuvZ0^t]t{\8w쿃{wnk]w0H!uş#kt[zt#Ae#]ȐWO:nܸ!Cs3s^ d]w0qaE"?Fnuu>_8fI&?nب8"a?h[ҟӷ c^F{f";fl@NP%%5%E&U\Uy"|M+OE˪5bq$(ÿ́a}d-"f[,3dDPaW,|ֿef}ndէZe,Ɓ@1}~e&<Ŵi bۯ}vżͧ<KpC0"v"v~ӊw漒333sx{OgK|%߬Ǯv$@egn^0[~M Q!r,t7^C,}o[3ۦrejK_fOȊΪ9yj<^|k"`*,OH,l,~v#?}[K{vtx;t ;Xv^'֒M_/QO`Qc8el~s~r#L@dX\z^{>d#i`-aGOsgev̉~up00)ٽ{P%UFB\o҄GIDYZ2LOX̆%2{^}rԟ{<ltȜɆǟxfӮu0)~Eua|"7awAJ"0QZoTkZA@K58NR#H +LA"@P*Aqaag~@:Nlda=恘اz^7UqMUnkUxA!BOCp +2k,b2,SԴ74<6HhbS,B$`2AW{lMbڄ!tP@c)./Rtk@2 !B#Ma_w|[QBӣcS'c,l;:U+ַUD{tSs[m2c/K$G獑<o[E>+L +^'y2¹+VBȌ$+yܵa@0ガ {:xodkbdd\I-4VnZG#acŮah'>2vriRayTAձª[ҿGJTܪPc85xg%f> W! +0P_-w\7gjA40q$7꾻^(vu@(q艱s&gIrEt֥;XD~3^e澷wn1:2Z*/;nP$gHUT6؟Kј%ڥI`uhҿOs~<H'VnK5K^Vk:GYf$ +nngklwk)T>}x'=3O^]i#UC#7)(l͎{#ӾZ`.=4Lxі:8\H{'`ChZF$|eois*R\X!߮=]]6P1infA%q.@=n8C/bfe4<g&pF(XEpgBp-r_jIP$$KLJl9YF,a]X4ihƠiۺ^`xTF]6v~Tze}Y̑9&oF:_ [}Wh`;"ˑ~(CI<J7u0p@vPKm#M!B#t~m&o:qcDnj@|؋=[$26wI'A!f`IyNlݢFlvQa8/P qo߄Z]-kgi QhuN;j)dbs"0ް^9(6NYPzDJ>q[;_{LG,=7Ar=vMaCΪoZ/Yj~~>Zinb]2j<أ'Қ:umo_T~6]vB̖WH W=;ZɁ'l7rrH ДfMu2Yq?Өn_]u[Wyo GዛPxC-v(i1u1''eř^AUZF.,^Xܪc5( +[hpؘ75>9[4f2k,i]95֛t%]MI9w;1\[=w,| y04;9ޙW,Q=~x1wCV@ {0Fڊ.|A̐K?#YQi/Vƺϓ/~tR(xq3PJ|fe@EߺI/ag8 +rU%gwOv}NnY'٨싊KY]Z̹:-A^3$+NUoq\U4{4nh +rX}ED"b#4]CMFsۋ+S<R" 4&ӽЁ_&߿mA2=/M;bx`!p8]c-wx3ſ`d_z5^^5"!O& +G|\Iu-&/R9"F!Vк3; +yM:P7Є!4Hn[#b.1}&P/J.H:{ +d_@6%ފ,u, Q6nhaɩ^Gpv(K +l'8PTD"K}_8Ѽ fwȱc&ai>EꓒW.X*Oz +>8w}!7Z⢉M+ p൴۱M:/nJJ܄a҄(dzI\"OUu\Xwlߑ,Q#L`Ns6gsNޫ_ +8^ C' &yWQԭweG7 -#b +u7\26/ySBsg?d3G:H`-p8hmʎ%3*x$pNe_qAN~tGzd MyC!0-?fLưFU^7?+$.-=>gltsrRp<58iJ^M;8^T?I@7eO<b=~pY\?tie2bvEFݲtͦШ%?Ii6~)dQ%iQo;glOm|o<]r!anK]U镒W !m]NMFѡh4uxoNXesИCICDz-,6KG + +(b9ll-T҂Y/ԟS_!:<*v-kamLƸQ6_7O6y!].vTD?}%NSuX;閵,KX@<3]2Gh($M.1}l$ۿjA0f<gXCwզ{tF@7`Y=h=(R?Kt* r@fazHW0TEV?rz4|~T "C>JZ^GGxy9M},{bπY/k{tz!!;sJ&a +gLߪbbha9^? +^ݽ.˲{zĘ'7{s9;aP0 I&;q$#9ew%^CrQAQ<hYO@Z8$s|H!#@ޞ]?HyV]RewWo!..wQAB~LXR6/-XZQD)\"yk#\xFoE+a^77?,GiqצϞQv9NX-|pO䤦fGhDSpxڪ'u>и*{젳'>eV&*:FS7$f?laJX?Ҍ_m,9=dYvgAJaDma^u jhhhR8]7̈́<bXdX0 +9o}K!c +4ˊ}Z*-;./`QSmeU$?HXah2N?.ȇѴ>OVY^j58vJ#0fHHr@o%ܤXdg.Wiuz1=a!ɃK{`)U.;ݶZ]gsmÞxQ gc Eq l{^AƇZ5^Z,^ƇX12n)3v8fXQ\ʧV rxt +10H _AQp5!!Uj7*%=j^xc4}9!$Ab81ƶ +NlbgKY,C"O`h|C@TŤ@sb 0`X +STB$͈İbHwwR:p>Y6|%˄Ѭyta{xL3[/t +boWt/&/;DgvܔTdajʶGv=1yJծV]o4<%z塱vgp~wUwJ~mqE?Aul+@Sȋ +MHa+r +9S&7ȕ4-^ +>qdzfcO\ x&\~r7S? }+][)hX5zA_Ӿ5iIdBFOxKb.NU<vㄑP +Yt 5of6/Ea r@dei7ⵑٕxx?lΦF#FJ.DM +6DTK$XU$%e@tZBSEEKär\}o +ce_:vc.HoR6(D+?_:rުQҶdě|mQQq~|RrjBy:^Sԉt/qEJd?+ͩ08^L($v.NJ9~xϏ^y%}3/o ++FFcT")R4RD@РbDA)LA^d(0Ýs{_V4sg{_&4rA#%>q?:dEtkGq5.νBQ0~GW?8y',LUV3~1d;̽,txU*"y6q)3}|Ko:iYbD4\_aVZbPLte{ Yty*L>%Ajī/lVyr5Bd-4HgһG6"-@9.vD=,o:k(i0YP.9Fsxf?=RZ5"A)f} + oWԚ5Q8}~PBIN%w^aG/&&ꀒ$YCURkyH-~M<K4F@G5+ANf.=s +卵&jdWiwjޑEe}4coȖGcu{GMVyT&)5gψT)[%cX`yHKE&u#<2BɐQ.yM쿧[gk&RxK*@9 +)S$`dUoYl5c, (Ƒf9ݔ5|s +aP+i>,7BOӝfAܬ> +."3#[Aԣ +۷Jm<[rP8sRE +@a٫fU,ry;:3/L5oO ,=L !2 +olhTI}fbłH!~چNfJ~=Qg Y.0x)r_dD7-CJU>V9`QŞ#qeb(E [oEBE-|c +&a0/(蕰YWsfώɩ`b0d\,aF _ cx}s$K8Md٢o/G?0mx֑M)ԉZL@14H]\&8kvYd'˗odGC(H̐!bh!I8:U!9nU崪Pvo=)j$P*x݉j"500W*kO_q]>'TĘ&SfynDB:V]aS#kS^`vO1BӰSܮ?i@(p6a!! ɞ/u^!%"u܀qi({yFVң`@~@QCЖs( >?֫ +31㸚$ᨧ..B:^ C)g"GA:uݖۖDǶ"2<S,Q +R]CFoz~s9 % +m܈YYkSƯYY#'1}6(c14\"g_5#W;.5>,l8|uu:QoT&xڼ6D(&zA5#ΜOx-j4aD(tA1}t4=ym2!tnVϭY].X}jzcGt0AJX?.JrE3/BJ>5".+S}kx\2{nbBl"3ݦIuS%&~|q28͌n\;-:PFG$Ip``f~bΗcz)ϤP:7%-kiN:~ +R +2[#8p8KA6Qq/ +BHOZt)q5$꩜3i'7b&hݚ}J?UmoɁ3;ث5E-ܞ0eZIGefhԜPKo9 :RL8`('IbVa4D~jS~5>k.^+eT}r͌p*Vp^;=,В{n|'F7P__;ǥp'7kNFOvݓ%1n_4@-f)UPO +5+N%P5=ާI9g@_afHi6pikxFmKQ f!L':1 +#@SՀi;/.v[*Gȫ94NYەkܘMnKjT': 2&.qI.͠}IxtZ"x{=|kQ?跔68E"$7y=퐽ʸd琊#ҀKc;DJZ65.l瑮Wl8Fhk"9}{ђy&"HnE@CE\RQ`Xg"|Cr{ExYT#M+ߵm|DڡX}((.HY?p +",Pi}\#+C=b2n^RnLQ~m&iMp:~M٠.m(Q{l{r/. +x5N꜌NmSƇ2@8f}Ѓ;=}:t!g։(I0^\wT"-k)WI? `Tܘ}5Qi&~h%%,Homlfs&Nuq\jUڗ<R4ASV3nDoKʒOA2Fataכ3(4edowVGWcBK;ͼ.6sm +K[HZDHled1*4u.z0'X:ɾ8% Fȴ@'o]_?#% H{dHT5@wJRgF{pW'x*٨LV$Z +E{viͯ*EOI +,Vߵ5:8\SQar[xj(m")d4cHzm1Y\:8·̶u8Vj(ZeUJzYEJQk( (rQEWܒC+yu33}.bYTcC_0^0gq!;Y9C1nCv +Ѥt;]m<qm? :kx,aABЬI`¦. +TL:鮑dHXN2Djo1>sAk +jz.wg'dÅ +٪!1\m/V7W~7*>@$9*{E;(Gm7_EOj K]toё6@NtA`vf[CFË -;J+ݫ+I$H%\<[[Y`lꤊ[`Lb0'rЅ)K8k -3Ҷ^}@ yn2X29bR%ދ邤Hқ&&Mz93~qL#?DzL;T{U*ȍ(PnwCyᎼMf~~Q"Fɝ4;w͊?Zh0cN]E}pPJ!H|fb@ǐatu^;dt`@y짃0ŶsW;$4^]RJҰ;\Ձ@a䨍0Y7ne(xY/^YLK7td'(Dnv>n{7#@מbJZL(CvL>+#enP9HEh +V Nbwl2^*[C:z˰TH<MsdE-1)ln'|iVN쬠Gmfệ>U\)#״qL=uP꾣Fat7~zL_=ӄW +ή#<&r%viƄ5eEPm:V BB7x +l+:ܹSOr 1(fKǛߚM`S1g;C_gfц{םb(_#a}s~tf@t #Y-})"<Wo*4O=4̘٪]u1UU$SpcBw>+O_QfAefsOɻol߈@psCs;cocV2S"6ĎwB6jY<g͆%:%t]NDL +nTCT}%9ACjQ3GzeKԠ7!Re9nM_|wk)'I$2*xez@P]3ܔ ++Dt<j82#kIJ@`J?ΧYyQp08@^{r+nyVOR[Cѕ9{}T(n8W'| +b+Ql=Iv~;E]6m|i> }8&ܐߨޅgQ:M.8 + +M5Ҹp_T%q&kt:P<=ͨ.0.^α`nԨ?Duj8FOt#7>g4_UiF+On_[Ÿ]͖7C +T^;zC\??ޑ"1r`՛owxKq:a=)Jr/wZ,B-oa*Fז晦_X6:8yxvMv+02{ug[-KL.XGv7tLބ#SY~ۇp鹣ۮ{ʆ9kF +h=yx*bO0{zPJcnhj^ +\Y9پ]'>5ZM:fSW*v=KӉIr7HމfovIt"Q>ν5ްGkr'\ +8 m"-i>OXZ>w:dp˯6z:3~~/%N1w j+?~ OjBJȭX>0Ɛm)3[L'5-RPrV"ӥn`srŴeQ:{Œti{^@ݯyl")s*VٓC:m0뭱Vqe4h"J$O4u +9n4Xhd +xXj{upBue Q.ⴺˤ;,)u $eFA2L=NR18]!(9RJ<i4iSGfNLLF֠:4UR<X 9z^ͬ_)?LyF`G@'rO`7Kσ4_+<(7J-&/)ʜ#P,-?N,3`fh.u%.xZ$ '/ŹQaeƒ1CG ,@jY< +t82"'˩7df>Tai9aP&Cf()$Gk +nSBtDS +ƄURBn2ФT_&Gs1fNT<CSz!u)K\x~FFN oJl^W9x&cCkVFiU7aB#.|FC1fF?0,S~)2A0"s2{X2"zToEǐjCNEGHBp[/v{Ypi.tm1Ͷ36_{|xvgGn898zsxQ +Z*)]3*hgDШhIf1\%lWGFBE`4/6A*UJ?{;WQq#Y aUD2W>NgbG"T^ +(U,|Chj=jL#x{nWwb IOf}u<7n?M&]>Wbh><_?61ԞuER^Wjo5L !9|"TW`ue3-*NĨkjPdպ& +Ta&hm0L +V9{vlMե]1?[Lt\pɵɿeHīFhۿL쳐>7C"#@Ԉ0R6ĩRJPi6 ++voݝ&Ǜ?|1+yvnpzr\Y_Cfu&iFM(U3eeUH%y]]VؕUÙ0U +9("4ye^K{A`ȘQ5M1>d/E%U)*&!VITw6b:Nij\!lu~NApOd +ד~V8`[\MdxL`2IC}u\q#CoZ[V8M[4E"ۇ> +*Zȴ7<:E_xj1x&L=ޭosV_8 u&j F'v72XF'վs%кg}Il`z.F]nkݶv Z4UNw]ylul)^C䲯H:̅ +gHPܣFwӅG/yB?7R&[oeG&{˫{#oA7m<LRZ5 >\% ! +HjAiI*qRѣMBRC=5,UIQ:Yj*j]|x:6^)lCqR59APekXb].P7uk +%-FF\; W-A? +CAEmmƥ697 2&=&PhaY>Qm啜^Wͩ5NlQ#ߟG=DĊo,UrDOp)|e#p.}MάzŽ}3y}e;dՃ#OxV}HIyV)iMAjD +Ȃ-,x@M) y Pչ-[nF +ҺRؽⴌ P颮{KԼ +7 +kD@2&GI}FұRZ*?luq6.E*R%zl*-̕Ue:Ϲh%rF_&-D ]⚒kGzҔPc4OubG Ӣnsr)uCѥT{8ƪu^5Bd1*rI9=G!o?#idm5sƜM#f6D\a";NҒAJlQ6ؠD6pTm AY?K3KZ"eJ1O7gDj'տO={BaxEo$.}M^{¹s2y'x`LLT{Ų%/4<B(q+ +N]˟wo{}Zy2?Y(T|>O_-[w<e_>n?^m̔NTNKf}^_ +#ԹBY'D5ھ;zep*qe..BOxg58x +}Zş)F.O'}5w3^IAeǩ]%S.b`KZ!w_?ԥ߽=t|'nb%pE.O-2_)5 +)UV&B;lkl#El<'*.qkGQ~M3ħ7uEw5 H"b7۱[jՔ3]6KScڧLE%+)xUPV$ʭ4d\E\sTo̷ +eB]Q F{ҧze祱uUGRќbŵ!;כ-26Lz:9*"ODI!%ʊ$K:1M.tUY'|V֨ե~ez (>,sy̢ظrFTYyૐ5!R|EDF8,+9>dͶQ/mܗ>u՛>!ҥo}0P7XZA,<K ,g,<6uVMTlYLlYV!HPmޚ?gc[rU0YeH+A:ya5>nb1S~=d_F{ƼS`}"6lu]5\9!8VcxdCX<v qd"?'GwgloIY5wҘs6ib^ohMq{O}<㐮ir!P^ +MQD +'pck8Q*U᰻TQ@-RW?Zm<Rٯs23{( nUҧkaSIVnLu +/xƬb>^t[A͎&WF]c}*ڗ2 bmhIZӗaD۽StJ@Y$`Q!&︙eML`OځfmS^_nB8Q4gG̸,P{ +EnsOowd'eD @Qn?0qBcF$kk$gs$k8 loI5'4A"G#qpN!(flS8,^^D;(j}c/x6 +;B^k^ﵧ#Р^p#ok/^!}li4qC߮t8Vv_[6qdH<F=.ďޱ&El(}"'ěOmQ_, +*V7jRzc͡<p\uNܝgzӚ;R֡#]N9$݃2%G!$Ei=Ak\/sfMILIx~h}ky#c7r}&J9]f]H=$fD$LEM̫^3/EiI. +֞؉x<""߀/I"k䋎 +ep Q;f(ĠߍnjgW .0XDwvg$Pxv4g9vkoo"0`ӐruTLj +(A +*kA",".{{;v89w}I?+$zٚjY]Y]\x2(˛<7i&FGY|o8+r<pTN*\a K +xEο4ZFwIL&i>kIocL]vdفT E};**qhg;p㪇g1ȕs;]a5Q6L7q~uMԗ#NRC-]j#"S0,-'<~upi"501>KP(xuXzV#tlb14bD7d>=9d7u5E1.-NhyuZGթFBRfm?g5@U?.} FԜx@9[ͨe:1,`ֺa6:"zEh.<02XOiGnA'Cj-) + +*++ +kEyq4l 1 osYby7,^ [.ovP褍lɢoC/c^&$yGxYЂ.P\ol˸^?kz f@ЕNS·}<\&5*+vlvfx!3y|omC|~רǺen+*5WKXVaݶ'Ao,hꔸ;̹F]3R@?04K;ۋ[eb#\Oy%N'zKZFa4ʵ~Sj{⣎9ecfM'n,;mv(^=F,Vt幻qvN}]=VYTDRP4rv٩QV;<,%l&Xa*5.9!xU,B1NI+X-pᨩ֦W]R>F͔E3j|J[J|/d<o''^Yx,Vthbvd°p&3ţۋ'f@99 +Xri3m۰zk)o>o!py hMyᇜbbmV*KfUzKX#A:WOxzY&f95e?9ˌ9 N8S~u$\ߴϩR7k +\-1N"{nv%lsXGb `!ƜeCSt-M/a)2DkK\njf~8\WJFbA")f/=Vwce@0JӞz]d pMᚲ9hNpLQe& +<\̝wZ#,4='j]3a_?i u4 >r->8jw8^&rhŁ-dt1WϠu.Fz=g~O jJ؋*=@"HbKgLteՆRT(/7Sz<wu7V쬪vXBTfWQ+|T5Q֟ziBSkMNoū` +̏}^anC@N&1=dUNߚtȃiIxa)~OSI!zv6ny^Y/DT.Ӕ9RppczVӶ[25gh_1<Ɲ1-gJڬ8Di5YEt92K_asVxDLh9k(hUᑖp1 /T]J>=w^=(81Rqg6~xj +%j'D@R*.VbIv҉Eses~{2谹@nsN94.jU4JTdA=빷tmiDdX^y9 +QCҚYbhg9:[烰5'ǻ8$!xE&UsNWQg&G@?=;06Cz}`o{ jÝ2;M]ctk.[Ԙu&υi{Cf:ppH犀>>YI8V`ec/-Xyl;I\H`"uqhVQMA7;>&p<qf4*1*/$vݗ +T<h%6 +Mhŭ9'xx+4,]'G<EFgѫ]7ʷ>*oÜtCLɰpnrOtfnk^AEOܞ7xBL|kĨ9^vB7*b)*^B,vȋU,A5?`ᩰx^E7i-6XhbP~37ƒ,i+iè=ހ/FQp3D()Zqyr,ڿ:~O0ɏG +RWJpL=`x%u +@?C +Wׅ:/¸~! xx~{y>PWkUxͧjyU/Ե-U]^k<0o.LxCTw0?`m:Sr)or#Ggsɖ<IH]TkyS9#0TY/X3ΨsR8SBwOl^Ok]q)dcghz4{Ur1~GI6\|ڦwda5-_½xwAlx屨<,we{?ҿoR%BZb7jCâaf8/oE ,4.|+RGUWTӨ(1|8zZZ%O̹ط1;lWEl6(]^^a]Bw{fXY-<x=NO1^7`߄?iEZx)2ޗ^i,*.d҂R>:uN?Kv kŻJ% g1n23Ula.63ĶN +ч䓋9V<?do6]_`C&\jd5hP:;G>8Ui4"AIv{e0AtbQoEΧa*Xb~֝w`I&Oὐmcl5VC#yQx/gyoO}`jf>~(7W38xQu)n_vģh'4~H~4^ +bf+CMR+Eӣ`'BJXrHNN~xpnuHj/ʌ:'^G,Gu]Lj]efw:;tha +m7z/|Ӌ +ncweԂC +!*rw6>_ ixku3 nցiMuj@xҩ}xcLUjAQmP݁\Vdx%^B+33zjH D*3ޜx<<)zH8Ø`rX_穰Fn +>SsE?$(&t$V*ݖӔO|*D?Kt,i-0xxK +XC0Uq`_/۶ymOS?`=(a/^G[5]VtsAlC;IsY.KܜTDJIc[7HY7[}>bN<GJ"C~<w~Y@WYbR~BĜrMREͳ3x\@ +& >|G 3XlR+BQFMUޑo苖"'E͋Uq652'L^x֊c~<a +1JFɱj:nn!Q []چa#gG~_n+>ֶHR9$lPx xmΦ~ +e]5&xy4'3Z@fB"ȏ~O\n}/3By1zĉlPv NHrfm0 l'6ӋҲLfiDwB'8)ƨXP<,c3io<Cxh)!qOjYۥ6HkZu߽7R6>m0 Rު?Q\r^42`mM%_E%xlpB^1y\tkVtl^DNÜC)bi +3^ +`}y}N"KDlm&6wzsH$F: +YΏě_kW',6 +&ݹUre|cAmʻrL lG,]:&ų]8vW*K1QK<oP(haEBV|r{=3Rh8x?b=)=Qt<-ڝ,77˴:,zxwRp{%]M$V0P@t|H{1M;,LwaK_ˬm +SAWSCfv2V;7tbKrŵjNq؎ԋD&L( bXzh{3$pp=;iz^w +/~lAjh +֥kXr7 JL3h}(&VD94̵&YG:~wjˊNW5@ݣ:#ACp& +E[ + +!i"ꭐ4{ +m>OUom&m:StZ.ʩ7_(cl=ƪx'!N+l~RlnxOB /"SӧhTPx#Vx:y՚TƲb6?i:ٺx:ohwP<^SAo߫Z⭓31[@h#-k~78(B5=)M$QH߉YF#+{TZO/ Z_\;=C Ng'%:[]xlVxQ^.G)rN'+$E8TfTLmLi]MRϥ^G eŋm9<M6h|hy {59?v:_DhxCX0]wra68kOʍ\2l'8t7_02$u9 +^<52B&3@iv6;EHj Q/v\T5P.mTQG=8(q+O§BC{mDh;Uso['k +w+C:\T/YIYzsO!R wu0w//l[˂@GҎD0/"]G(~';aЇۓw?|<cbQE.-!&G~nZ/g{Z7Oe{1B"TmkQm_y{*4#vήoHi27Fhe,_ekE|yMn&(Ԉ]ݒƉL|/STqVr*/S'39I㬖LkZ3*P{8UܠxuP88qPy_v4>Gl1Iv +5~#᷃WphXmVIun6u-+|KLѶp#&(}6SWʣmގ1՝fUdɌW|;#|j-b3U蚚qZy^/" <xu5Fd)B#mq<ʷ٢eٶe-ê7P?Enz2jKkkGu`Q\~/AAFY 8f?M7߅mbRpsd(8'UJ2-,]^/Ek*vJQϦkLί$,SHnpyM0|5%7 +TV"ڊ,}!Hz/pΑIKyS4 TQj%Oœ*zEL'0jܨӠz0j-=|@9BXBsLR! +D r& &k6$Uqf/L5w~ $I$oO/oyة)wr2ڕIAwci&<.{жvßDMWq% +M.hBe1[L +?Ez,2^Y0j2l2B0'@@!BhE̜`ыۄiYuo >1IE1 EN7ҟ&_x=ÓqW\HCy@kWۚ+]),U;&s7)7lm.fѕg'r^EWʘVQik"-~w)c4*ct4/;]nn.@W$/?75`?J}D +gW{8<-%\K$6{W+ ;B`iaVF#!v_nnWUW#ј68=xo|[z)ls +c?KI]EX-tε> ۄ1cmԑG~%)j.Ie> +.(-c"k>ڶoErzv*AW):(&3Uĝr]}")I-,tUɤ+zT"X':u_7xJf-8wK1ewm_fo칮&`:4&!_-L5f#:x!h +I?.)NMF% Qc{ǏVgNrp];z7#d)(ZB\-'o5{8:UΛLz=Q~"_PSliR{G:F7Xex4UF3:W=`m~U`~Qrq[{ +0 #ʟ-F4#'R!q̳71H7Srٮ0TIY$?5`O4=[T.[S8: +#!۱Md9-IN1v.fxҞM5FFU8KQxSޡoblV}yS5V1wo[q[l mM'>Ӵ'v2jLx0l((H0"BJ*KQ҂;8GRQGdGD8Uťn̸P+G,Ha$nnr7?{rr{Om< +Tjr0su@f;W3@v`cK@QmG,qx.bVw!y:V6=q9쁗 + +ٰ/gd65^/nd1FWCUтiyeQƌWPE<xΞx4CPc 5:PT˭$#Y@bOB8Rgt[5H^~ORkJUO|b,cOl~ݙ=faluu?[ +狨|(C,U*Ci>m;YȝI]SR|uDss@(TcہIu[ʇtyC!?ƕ +%<SwHs<!&!hB$o344zM +;O'Ő2^d|1؟ +:#2f +Ax+6/7{36-!xo\ng`{Y~L >0db+_W+/9=`]`ߵn~L<o1iBYDmgge +敡r*9Ff7 QNeԕPn.h:bNgTZGETU(G`\PP@@ {7&:S眙g_yI}6,& VG7(aHe + +uL&P3 V48<Log\>Skx|nI2UjD|:LdQ7kϞ';Wj=+0 *:"rg<ò{xx6^ +z[pNGǟ$1T +IFfH:c%kʅ-WhdqFkciA#]"fm~5l]\?h~ĕ55\6iگ7 +m,6g*`pvjzB3)crbb 4aM"Lgj0̘~#ƴiBXw_%ty&7(8lexrf7+ͤR2 +7',ODR3Ux7mX|D*UC<ʼn]?w'A}V/|"T)DAa/OsTYӖn'VEavc㰯FqYG5b|ao&oVXTBmysqgfmT:N]$+enEgȧ1F_Iud&Fĝ +`˱s,c#fpzw=OD}[EfߒԀm#f 1&)2xvM/iNI' +Xul/8w +\@gEo_x- (5Y/GhAk]{aU(RjWlM[)>>өH +xDSVoھP|%KjG~>1PoKf*nʤCD=!}"@WM!AK]YN +t~ n{Lrb'rR9֊o*l` +gAe7E}24t*h0쒫Ϯ2J"TNz_&Ii)a)t?u~0o梯~lR<M=2Ve禈{/2쎎Z9kN5Z(>!'V/5'2!xISyT-$VS,WYǝ=DJ=D}^֝50reۓm8G5ݠ1w4\W30)N/&;d&L(%MSZL4ВfM!ifHvʑLb +MaFƎ15Pmlal:v%$]$YWktoW&W:<kFooW~}~\cWF<CԜʓ/fS8HR~?RU1Wx!+z0zPmDVYAs ++ʛۋ>/0@hT:x1oq+T1$n폷I?Kv+_=SxsH4Q:c[h{G)--jݬ@e^>LV.f|-6՝;j:u7lbbۤτn_?\MHYS-*>"dY<-߾*< Pjv +[ +~Pg[o͈[poNJ!9]"!~i<夠cS*W~qg4v6Խ7Y@ 5h++F4Ⱦ3);'C<hsI/loOzqSu|xž*/[YvCtL>[V,M,彿0~_Ձ3r{[-Yvzّ^g[~ik6(SQ?mNch:6AFvVB8>5z:EaR@!13A>$z(D_Z<=!19y7W|k燇X5<0l3Ą5{OWdz/_и=,eW?}!e+a]?.N-<l)=G_ڻtOE*{8^t\uJ&l?mAƉKyr@jfSgT/]a[.j2<t<O"3<9,^Dι vz"8K}{m'=M26eEIF̼?1iccv+HAsx-&l##bM! +%N&LJNJb}m-ŮUq2Z%nEGӘ;[ʰNQ +>s\9CԤKɛ?*BB%e4٧x3WmSRw֯ў)o9 Yݴ̊яsR-H]9r,ca2te[jIS2Ń i`=Im/[R xq#8osE_?sDZ .$; y!cލ"GΑ9wXB@ +5p ޗNs"C,>KG[:A!8Y:)ڃ{L&IkTݍ(oUz4"VXjoނCMc6k"7dX +S_˾r]; +pˌqzͪiQr +4]7=wh̆Ly, Y@Ź2*< 5d?6};dGj +nRzJ9iv d*-(WXȐ{cTV&2z x(jHp4*A"x+ MNQ܈D(Z˼sDvA("غ`zC,N6 +jT:}s7Κ'8 4<Z¡πy'[\khfrDCƉΓH]"hʗ$vDf)aBۏLv{,SgB)0̘wP(=m|h:3M,asl|8K+I_AQW +?Bg&7}<>:st\T@g]X >n-ݮrhѸU֦QKΖ-Qvܨ{H=& +Cǁ4@a͖Y[ƭu +eքcH8!qp e,al0Px`#JC4Du' + +;<#9nnF݄Y|?E &Pb.T`ٛe""*D?kt +KnZi;*d?,ԹKSM +. +gzJ5 +e57 +ɄOG8ҏLṚ}[+hX0aZ4։u*0X]FCEs{]Mzպ!-=]okjDbQMmiʩ|ng]ٟN+?wzW衷vTcxM:;>0+ĩY/w(O_gxler'<[]Ps%;ҒK-yJn2VccaO+p> + k:H^u%]o)4g04`xK~Yoharҷ]Duj`X/s rMEPzQVnՉH=J:FⴏM*zst}@iL՟}LuTcqJ+FjPi=fmཆKvM`+m2l`u(?30x^(wTa% +#XG@e5Ub4w]Vh,jfR6b%}XfPMzAs]4 fOqWF2DG +?lQݷ6_pyVzj=PSvx;!!9%ƽ7N7J]B'UC/JH]4cqRbdt[?<5@KT%MpkӸ +5!yhŪ{*4=R3&|<~Z|RYfz?-?sCA +BTwER2233y<~&/?tOa`ԄXCh +$)eńF2DA8_ +0CR~A^wblVS_ +JF +,҇.hNR*-nqڷ[IC{V7""c#yZ=5uR{f̨#ųӽ XC@j<2no!.ʉbV$uPnfƏ"ys#":#F~4YVo֍L>y1QscE_sj?Y n͟'ȯ:;Qs^y#ƻ۸_nj5|bJ&9s0WMh-{G +8';\aֽO>9ISa;!eNHHnp`u/9/:ش.|ijo>usg +2Q"n(19VXģ&j5"Z4nQe@A +.1j4b,0Kfafm~<'5Ysn{K5=ɏ51:Aa'pT#Bp#ȏ 'I9II~&ʖ90lK슅Kh[\iGz`e +^P (Zۿe(]W{r1:9i!@.N Ⱦ_cvҮ]a3k4^Q[r[(^~;gǪ>-!u:|MKgxٔ-0U鲫3vjEQT]b6+ ֪o_}ƌq5HaM6];aĘPt@ytXE_y`T[]0NJaX"=HRcQo22;8Ve+k:{=BE$sh#F^_w}o~O'7d:ߔZx[?gDKH#qVu.KG +\k=&g*ES"}DuOI}ox-x[x$>モ?ۜp/Pa"Hٮ84f+H.xx&MNJi)`56;lԄR]jG_hT~=A n2, y=ٚiBe. +=/}hqLxةKRy#:;+rM[ҽ:\</z\[1j{VCdJ~ѓ41Y.m}V.;s8ߟ2wS'NpM^s3MsNىhz`h1ur$$`W,F}>OUZEIf@BR>v'0T҃8mC~YƷ_hb~@KQg7r96'YSanWJN6X;9E@,wFXbFNPj(v/V:%|iVLsO%gf=YW-\ӽEVfq.^#-)Bm`Q:EdL{{ux3թO[S֬r8#ԙ^=ԧTwvwsCݰ)xqv,H\BѴQs|26lPW5_6(l/ +1j(քo4m&--E_yhA|@? +C{p}ȃ. +Fl~e 0/a+&X̎wB}ܧ-LR794 +ԃe>~33]).<S1;*nJ_}{vз[zm;:EsN^B0a/Wc^#!Am$kI|Rjq u>SnlH¿N q$:'(0he\+g/Z:58sB(jlX9+,2:leh<+9T7gl؟7E<UL&x9|U|iX];֥OOڒI68d sAJM8Qݽ9nq(g +*w9{[| }+q!,$Jf87D">ht7y\i ܐn\Ǵ'EK qH1$E:!3c GW#]6͗Ghtz_/;+oXU^bur#Ryᜤg$p=i`wjzUuJ<^;Cl-ޖ;;% Z%~,sErZI9}qЎfıY$|u?#:]8aBy?',pߟo[=:ID,4.Hπz-VFx_$<CwPpKW1d/zSPH[6¦ET5I{7Z`z-iZYxF7+1D1ʣ[1yHS*V +t<`@X=>L^/Oך?\bczmIӡ/xZSY$jӚ +՚!^rD_/Ma~r0!@ +مa^gDwC3=h3jҵ?cY>lnRrk{!Xu<ݝ~?]r&(6Hz;w0Ml,2ےۃj؎J{Ld;$FmAA'fY/[t9|P^R;TUm>~e[TӭSYk{QhQPVҫE(rP2Am|>A۾)ecd7z|IӠoN&!$pQZhBR6".rnlG沼cV;# oV(Z?7tQ6N]Ӱ{uU@2w1O0! I5W|qr0z_Eܑ"+o[+;lr@mg +n3"*D! l0{LDrnrZ0q_&YS䢡$Wl:"^ -(؛anq./M 8Q4č-uvO>nt4qd?Ex[ +2Ҩ + R ,}0+TqjxE +'b\!;!P4[ӷM7kڮzHZh+]vzAUsZ28F(oҨ1۞y/Ekh'M`!uNxމQEQ%DߴAő +H8GeբnkLhQ]D$% 䂼!~^mǿ:}&ɛy_lY&'5[5<Sڑ:8i&6$yq +H}BW%kLI5~& +-ԟvc((V\R`[J.1P\ðqLQԫ~q=L*j xk_S~!Te1>w|$ԁD$`9\:< [7بZȗ"@0`X_ٱxp'pEwgo^wY/P芴_R#\sjB&vA١z +"*PXIæ]ngPRfw]Ȍo)ZSՔs帺-PKWx1v+bR74#BYT`"RΙD%Vhg]$0v3ÂXu"~5n0Z?Bd6݄04UHu ~_[1Ń$OZ(ӌWM]žѪ# X+Cu& +YeFʊ pfLjCQ8iN^#j8yK$Je-kwL!|Iձ7oUM4p:g/rݝ[['RE ++K<,y+W_+Cr^eMdEJ="A}\W(M7J { 5ED !;?QDx)Qo͞N׃Ҙ6ᾴoa' 9x8j֝rO?̖,<u9ϋ=_rۊzh28T78:Lr lO&tߟH^_ '\ysOKؓDWx+#k2x>Y9W{oRY(*ާ}"u@olW[(D*8SقnܺcQւVJQf?,.3j(.f5t4(:.?Nq<͵Nh0DžҘ,j7Y~cKT:BS!8h+ +:L3Fb# +`jV*`%Vzzf^4JYba͈Ul08`η׳&ul٠>v'\bR|n"~bX띜)m`dTW%*-bhx+,2BO^G))iY';չ<ш\QX,%F_*<Mwb>r+~4'6~ +Dkn5KtSͷ0xyۖED"8yx7 +ymQm@PVLH3)T&:cP2و ++B2a1 %_fm[WC$/E/v>@ozٻ^uRY")Nl˶\^xحZr$Q$1k R @8``9 +-PmmR᪾Ӳ~UWϧ\{dDx>]sb:,0шn.nn1]㔞x,)?{g$!*D)=Aʫјݵ4o1Gj05AfϥѾ^ܳf{2hG蛕'*eHquPz7Xw9~۞n qP F` +:>ߺgGI"NZ`iΫ34qSLiq}lsmQ*/̠+ns?䁷⿊4ێ/{ ?D wϫ*7DD73(k\M^J䋃U5cOo'b= +L + +jq۸])T3}cymX</#~+?6eɇ>9[ +"m.BoKx +HVOFT0E_xYfԢVUop$c%i囂t?5Fn!b[GE)ĚQv4 +۲jɒ[jI-`$@\[OO_wk@. z-X?/܌E`3`pP-6a-| :ѣ#Gps0:bͶ?m~}a'?[#gFG#wO&ap+`MXF.}F;u%p3t<9J#M9X%1!"qXi{g<d@ÍGfl!KwMPwFS +*NuPlS1z!DpNFCw=!hwm> +J] +S+u8˵˴y*ݶRJ_͂NQQj?Tmjaoi +U`Tf.6ju<딺-ze* +m8[Uں%J-+TՁۊZ` Df~v=8l#:m-jsd +ðg訠fc!! ֥0HVxʹ)lu0'a I +$D4oʸ'K`I贘imVLSA&U*̴Pi\ +ʌJ,ÖW +aJf% +G)m#`j/7N:_[;eTD!w2J&+OKC$>VȬj4"IQ8V&$I"˱KŽUA%$I644TWW,UKGucS>թjѤou/i!uuu%M\iii5de@gRf4ݻ;wܢ +0= +*֭[{^aìǼ?(+ٹcÆw]{{Q.Koo/̙3U彚éSc~=D?2<<|$vY\k'OЀ9yb$Ά$lv[[X{h<jܕ}{jՒպv8zKܧJcH6Xlݾu{``kV`zO֯0ii +jQs3YTl9_o-|WRD;CڝBEIl^,5oe+?_ܭ"\T +U^ۇ9rdl + +Kc+ɛLd*xv(Wʋv/9S|o_RK:RU]]uV+)K5V"^Ѽ*DibU*3J"~Y,gee7Tnϸ_9Z`8-mXAdBҡ4O +z*Yv2Gf.RtzP)"8!' +>DlDw뎬N|]<Ч5$!aZ-,B|%ըBP"af-Ҥ 7W(T!Ya +hQ)j~#*Hg4Z砜_<0 +!9W9z,_͞z:BBTL`cl:%ցzIs!r$@#Kc%u`_WVpQBuiiBDwt*Y!s +;feXmҒ.\ +Ȉѝ*)v&]Lb^ +t(;qH7M:$'@r}<LN_n{$|N&OCPRMQ),iX =4U-+6Q&\nnV!&'5mf8oY`Cس}(ۖ$VXa@)~I+I{9<x 벴?zD iKeH,,| +J(qML^Jΰf>U)Gd!+T +h 1ͥb^xgeDÌHx5N!*kR_@.ly+&?GB9w0 +i}Q\KǧĦu{IsJjӪmf7Ǿ+^_} + Y~rǟ"f0Ԩ8GLnk,x1W?۰--K}:L;\^bSʖ_^[5T`bhIݯ,[rXHa7o+Z6~,VG>0"XQP=2jd//.]Ϯ>}ס>enuoM-˖Ι33#i\^lidL#~w;_/(+?cZ4qA DD#ZjըH0DcFOh6jjBA`x,Yٝם9wf|Ol̷,;3w=w<|z\EG@q<ΗzҮ:l9< c +tJTs,c7ߋ9_Ls0tCAڥ⭡usAB%+a +|?cϱrOnWHϓ;S=;G+?Db=垀n0[11<f +>p'oɺwHHЖ}t%*}-_i%C:W05v^)Ȫ٨~jBƩ'[g?ۡ㼤iqhFhCuI[gC|],ɫVY^I'VDЎmKLJJeY3/k(Qzl:U=0ȶ<NxxGn6mOIN akhW8@N%,O#Ui_dr_7]ȀԜ!wi(@kذio$ede,^rwwEutX%z/ 2>:QfdOErsK ++_ +;s+/qjtL6V;D*n w"P?Oȴ쬗{u5%۴!i|xԄՍTxyUKjc{~8X}UI?gŵP)@$*>^u0c p;?$^hR?iΩۦcIqq bAk>L^$5-c?oX"(s8m;z܌eo<3S7$˼fh-˜5!q1NN`SK! +}n{5_p;>˳˄B{]]Ikb. +/C(ac5Ϟ4a䔷x6H9D1h%eKw +\k֜v +9yW,?^ױݼw5_M1fQ>J-b ;R'aEbBdNCq +!?| CA¼O8{Tj|PS,RZ!J9o6Tf,]4ij09B(%\|}+YzNvEƄ[z@x! - Pxc.J~(.v"Ne +=W@FR/V4dءz +]:|Zr9EփuzvKj o<rn*(6L;lG'& +/48nJ)qHrb&$'7-l.G6KwE;;#<fb# F7V9D+OkX/]ZVdh\?+՜`d +>ԗ{TUǗN#sYS5m`2"&@4MAmЀZZZSŌJfV>`Tr+;3{@Gc.sgO[6)HV;#~=ܺe(Mp` As [Ϗ5l.]=Q\MQoccdVtiΔɵvx5Sr>ޡj5?<9*9yZ{ثas[`p*5iA:Q`姱NeMЎ{ +i|Cb*ڜeC/q) +S@@xoQ? +4:&UŢ^@jGzEeGsr0WojjsB@F("o|x~Y+%v[QֲEOkxͲ^z^Q^}&d̘do1sĤIIO\E@ҌM0U`Šܑk/%2lM,<k/><4u[Sȉ=3iq)?_x~A#My+/<l,c +"y8C'b00Tl1NIE'U1PX;XtMRBꔵi,{aĬ-tphoeQ!EI1AlS5KC+h8f +@NxoD_+^{"vȆ=7>jD@ߐE[Qxg3 /smTuL<ls7#/Brm?.۴JuX>˻ H/`C:<;ٖUKm +R{qlũۮD f /H.[f7RƝ*JBNzcz̛-Hzm%x#Xhn@na] &2̩ȗM:bw6U3Mۈv*Ǿ/.RRISTXQQ +D(JPEj 1ɠM~c[ubUXDuAG]5iAdkhad5k7ѕ%:6#gwΝ$X!V7o[6gؐ:p,# +Nڮ\;( S{{#*DtDӥ{"9x6Uj<r\d)XgK߽a /@jwn 8"/16 +k|+A9+eEO.q*v8:tWIYق>_6jݹquO7sW(?J +tW}p{PPE56UA77"+}Fl܉RlҖpH$GCL}&Z) +<n耠7-" +W_u0^&Ɇ,xVGPd沣SZ9{$gΉp +ٛx ?x$ZP +AaC%FBYp +$pN +*3[b4f.,:4YʈS@\GLf֏{ohAM 81f}e[t̑M2Z]V"P +}sΞs{{˂/=,C7СL2*knXVrK_w7[X[Ѻ/} n_/i bˤrYG)W]5뙺TmmP(dA@?%]<\o_kz6x[neoaht.eB 2tm_ijmMӿR.+8v*}iSSU>2ּw)cdf"(b,+r+,u/765/{ڝx4*]Xm]t̛?7=հdLovLNaՁy1a@x[s>[v%sz卽Y7ֲ-SӸo.XXP[wBiP'⣃#iD4n`tG# +Zi1"oHpo[ßPy90єe{bIg^uKjqMڿ3`<XNFΙx)ȾIØ+^;!Qjl!)om6Ub^$^hͱHyB# +Ӆqks +1Ĥcc>rÖ`sNxyo}imȤKl:xj@Hbl+թ'ۻ{i^sҹc?{TuŲ_xNϏ:Yn> #ǺUOn`wŏv!]W-IUUխغ˲cPM|-uȶonh^وr{Te{acv=T*ոfSsblXa"UcYLk}og{ٰfܚLm2ո|JͮsȮ/WV`3:]y{a,l&UQ}]G' B͜4RF- wBLApnlr/O%X>eX +XwqLMKcqk +!@: +.1"jE^5<(;~rg6T6?vE*?m 19;axe|x^x Rb1FʘC666L@ W|@$pPαۢQS4dM.G+䲾}gqē:<c:"ܕ$\ zɛ +|+h ,!4M̜?^FR.cd5k`,AB'u>IXVeN؟=OPA{zԨsRyRXԂJ# 6#蘶"*$!~;=Lua"RPxUX/)H +bd$b^"nen=TŬa@7OHwu~y_J0 +4d1-`mU701(p&83 +m/3EjbpٜeRxV + PfH&>*+u<bl8&v@xm6`RRn47 +-x'`Ć`Y4t^mCI"8m|?RfE,АiQԘͮ Xl^9q:N,1-'l1͠.yVD&%xcɣI(Sj)kwQNPp!<(Qb*:gR_ah{[ɣPY0A9pa\r+PίդN^3hg'iզG2o>B.(.DE[m(Ε'Lkn883ݰDP=+Zzve'A/Ŗr6h/=Da/$FShxIʜhh,;;v@c sxerLďୂ12oW,S/ޙG"ӎ|Q1þɀ1,0eK RF`WCҾWyth_lnnOV_~z}[=?u㜇zG;WNy.СCtzc_OҢk'"IV+!o%Q=%9rPueV.kU0$`W5k+*+'NXYQ1AV_STEWʊ v<RUTNP;J#9uVw! $m?dFJLep]Z/%4i~fϟORJ"TFQKOo\&O@=eTa^z8a\XK"Fѹlx;0I;F,YÚvgd +"qE +"kÓ|oWSKJ8SWsrAr-T +Heysz%b9RTlbώ{,U +cC{̎T}ߚp'.XQ8``&̔o 5"eKO8bK74f̘xd"3jGː9!!閪7̈́TdMF܆][äRiE~3D6hd^#nEj4!_ڥEXɪt˗m3v;D^@Ӥ!;vn@D-TAƬx(e;<,HxeCOZ)2?;ط|UUgyt.x!3gNSSS;k>Dٟ<mvgL㩐rBjM"ìnkpi,cr8!_ԚUSɠ] gye3oY$g &ɦM)%C<g=;kܭbiF4KSfǺm("gs}25$PxH$( +2{}uy5!!HNO9'#5eEw٣DKkLq[ańޡTz7zNtK$GO$|C䤊Zkg؛POиJ[ +4W)ZIhCY&"oW.{UU\yXTp+=>&XX[kݢUƪZ1&Ŋ084\ˣHf1Ȧ3003̝빷w-&r]νw$6nܨ;yQ`ӷjގnE&+=D+LndXsWǓ˕OyQ<VoV-Dn-d<u/9%4<-0,]ovVRSS^aEU%GLSF4[y$J?!\08 +^mpn#ܪ*Xa8mD2"eW'܅n=?ړ +]+CzN +mMDzѐm0c4ͬLa8^d}FrPƀJn;LUR +"ARkD|`z?qQPdU)(^RD9j1efzh(₇VCE.cPY0~>Pc=+ZU!gDݥ9Wx2KK:.11{IOO_][fSdrxE鿏b,C'ϫq'@p^bSzxjt8[啘V4={.66pu *P +;rsފkۚ7-ѻGE٭{6p;D%s_jwƫyV +_|]Z3 ,1\Yѯ{w>Gݯg_?ӯg^,pRS87U.\6ӫpcىhE/лx%3yT@(x90.w$p'xUpqّ-%gwc>2PIo]=ueN|Rk% P$I=EMV-EZs)k~dzH5T枃YGA9RdUĪ1}|G` +BEFFy{ADxEy.[~Y +^YmS;,$ŅIj|~~V~:#קOVnEqBkc ~/mJs\?o2 +L>F^)<9Eع^=oƹK}i?6JxŎ}Et.E)i]{HBS\ޜL۰&,hsQ90Y|/ ISUKыU$ȹ'~ND5:?A:3ok!KHQ"M5dg ȑ#S(| +Y%2,\?,]D3{#G +YYZQm2jjjk\\9Xg7.&ŧ¶7Z#pgXY0lа]-pm''{es5?*4'+`@Aٿ03$]5I3t>Œܢcw6҇ăAv1KקFn"n8rQ}Xܹ.]~kp F_QӶT*( +(,,(.,HK^~aQ¢ZVAzk?ndhGW 5ю@ (=ko+ ݽsG[OTVB0k91<O+EutR01+Ik+gJ(X6o~)-ra$wiתm] +ژ6 zqKl))Q5,! J."F)\pU@Q" 30˛Xr?3w~~tZAx 8 +kjJ+!( DQRXt!.:^t#xUOr]T +5+k]\J+jo +Ӛ-3eŹQ&$=ͼqÖq([>s[V"oZJXæf(B !k,=8wG:t6]OKH Eߦi4_*I9LCe2LIS()H=r!I٬lr6c*}}K+Hp!YYhl +)qҥ( +Ę:gMܲsՊ7+h(+A"!q{ /"I5M)3B5*@ɤKXYd^ +%MC9:ٽ0QSB%e_ddh +9%Ԛ6%o/xf +m6QPD{I6=7#}|A'X"Kd_zQm)@]Q Xeݹ<)05 ^}Gx,!ɤ +93chy+ӘX˸7H3`"Ƶ֧ MBAЌVmZyFד\Ț8յNi a xdZz"QHV(*$7wtC؎ +Srp̞z7.IgE_FG#W^>v1{]:VM@X}֔z1/ׯJ:.E%%{>ቂeXl]mmWW29X]]]eeecc#-i][~ZT UR +ue}c +fp<%?(CSv"dd%ߟ>G85Xǥںa~xrd8Mceጐ$;::6l(3tnZVў7?9h%q)+OfuB3.3kT!_4}jCEHw?YyXd)"u^ñ2iF*ǂ +YԲ\߷v5yLk +^&+Bj.S3$T܉]_E=xl&^B)ݱ5wGFb7j֭9{O.rlj NC+8QcvnY3(C\A9_9U^<T +Cd_ww"^Ń/PHIHҞ設y +endstream +endobj +107 0 obj +[/ICCBased 88 0 R] +endobj +114 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:34+05:30" + xmp:ModifyDate="2016-03-19T14:02:23+05:30" + xmp:MetadataDate="2016-03-19T14:02:23+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:B5AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:B5AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:B5AF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:B5AF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T14:02:23+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +190 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +191 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +207 0 obj +<</A 208 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +208 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +184 0 obj +[209 0 R] +endobj +185 0 obj +<</Filter/FlateDecode/Length 2460>>stream +HWkۺ_+_ZWe6MEr5Mq!KFRgH,eΜ9sf2\/"ldo]>8As{r쀝uoʢYW˭-]U:_,&9!Q *ɭ;Xm,+rޚ|me:W7/ѲHE4,d#wfВ)g14Ekq~&)8[o%?L[fMnh;<>ӡY8zJAn;X·ެߞ}?4> .ݰE.칳_"xsa7E\ʱ)V sl/ 1DGzpF9IvgL,-byQm8/9g N*.9;(WVCQx^tî1^8)E>g[sg3vlSTy]\?DH+lY\>=L +")2AnJg,RE&d:UL|7y!%fBuAj7H(jF_rZ"ND~,#M]b#L6Vȇ&;~1-% ,C=eDy^QZH c,xq:^ +97Uj=LWFGS➶]W$6Ҫ[hB}F:A +W2,HSCr.q`ȉF=5G56:FA%qGe-OR"0DPa_}G7q~x#ai516 Q-JA1MvX}p5/kX5 +" +ߚQ )0eZ2úD[M0]J)=zH`REB@뫑Lg#<o.s,yӱU豝`ѫ}O$LRG4os,8]ܸJ nzkIiqZn; +~zlWEco"~DŜc[>3نk.8H9SoP/8@)K`4QhCK)$)䬶Kx5D'-aKӨ遣9š~(TZ8]o{rޢc\[sɚ=TK2cs~\_2p9 +?:CZnLd)-^Z5ΘJSL ğQJjGQm'H~tO*uqzGOu~`~^]hB4 +ij8f'0PkNC+ЬhUl:{#r1!EM.7Sz8YinB2a/B)h@+one}_?l,mDD +endstream +endobj +79 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/Filter/DCTDecode/Height 507/Intent/RelativeColorimetric/Length 39403/Metadata 113 0 R/Name/X/Subtype/Image/Type/XObject/Width 788>>stream + + + + + + + + + + + + +EFVU(eufv7GWgw8HXhx)9IYiy*:JZjz +&6E'dtU7()euFVfvGWgw8HXhx9IYiy*:JZjz +yKn6*flثbQ/i>gbbjf͊6*flǦ*|e/xbjf͊6*Ei] +"pr +g'9,j_4ˍ*©9I$e'f%,5Rnۘn,,~L&y+ȺED,S1g[xb͛6*bA6*l`pcA6*bA6*iюƟb<3Pf͊5lث3Pf͊ |V#Ad|WPf͛ujٱWPf͛Z +iV ed|'sCR1radbOOq\ZZUHvww:IqDNTueRUV`>y-9Dz 9S@(>|~s'ԑq"=A:aeל;KI,Zq!G`~::aU +ג~$`f͛cW1UvlٱV6*<q?01ySV|a嫿Kni%Äf;g5 uMZɅs,N$j*_7s[}e}sܵ[7,'ioY4V_.clVz2ORwA8V4n[~6^DTnT Cڛ]^u7]"OME / +"TT3{!KO\b=|1gȥ4uk:0Omndy 5v +4-VrT +tAZ,@o/j _Oǀ!\|Aq"F@ȣZ/'8pUF4!BZzYsI,L( +Ԅr#,/ǘvN`~UԿ2c.ZI{%hde! +VR +Q( +e#dYnZ$%!SÒH"+Co~ψB0zTv6O>cqݛ*/vl ]N +TR%O/z6w$RH"2gX>nfLKW? +7tw!UZ.O8E%4i5C7<*OZu8헝&\HcB + PhEEf=0Rh"-J8VOB)ˠƒ$G^|ж %"g+6lj#eٳf͛6*㱿?6lثf͊6lثMO,to~Yc*ٳb͛6*ٳbƯc}ٳbw͛lUkZg}bqoinR + E!]_ɺ5,~a7nIU'k +dMz96H,P +' +bֿ\(O<k9?L_# +͍QB?j?*66횏튮zchُ?lU#/:fbch٨ت?j?*66횏튻?:튷Sꞎ +1AQ֣bAc2Iw;h,v1I*qi4IN\2R> +{*aPE9g_c(AG(PQiS9#\Y=fqMviۡ%W빮2Q<dofwV^N^RrM-͛vlٱWf͛v5| +*x^ث|m͚pռ{f]$4K+4ڤWУǭ%l"tuHWf͛vlٱWf͛v6?1Wf͛vlٱWf͛v4?oWf͛vlٱWf͛v6_J~=UG +kgQpS +.`êE%1 + "n}zeFrkleC=x{TFw=\Mz|ZI݃; + +:4$du4xOFSoCF]皵Y%RV4!6~[y>KZrOvx%^Y(1zsY +wŭo/n哊1^5l"8[ {ѕ<$HJ|JRz$2#R1\H ~#~%#Ò68?&:\Ր'뼃]n`Sļc)h̎(1m@;]X }ZͮA,FXいHǮQCk,\7(hJy#ծ5KiUut@j)$8ܠ-}2gb_Cזrf8AeZtxi)b %3} +^C +cc"xP*ƴ"?W +_8ۨ.~y#[VYe8pDt +vZ䶊YcbiXg9S{'>)~ + + +$a\DzCS"=ѱ$$PoP*0KBzQ.XkSyG +RF Z .#$֛C-R7VE''|m6:H +(; o}8K.4tf~EO1ojPIS^<eۉ*Ĝ:xcdsmd}F2ŦJBf*j~q,7"dR*Ҍ*h0ycFʌɥ4->[(V$s$k$vшmXtU +qi|~+b5QҒZA?㾽*pW!1hgQ,m"UR?a}場i#d.|'2yڃ(ǬIWSB>\B79Uŷ{姗.%4J Zd~Yb*#A嫊[5[vd_? + +PzrC0,~4)fxe"T8n?,T`'][o%x ̱38#Œnhi:T6=zvP%)Ho 5bT1:N}(,D#7Gx8K~+'H FQd{@d +-3IG)RkO'%н<#G%!+49쓄dȋ]̲)mc Ijzk&0)ǖ/[(ֵ6:GRJ+uO_.# f?ͮymPsܒFq¹B?CLjv!n@3Ӽh&L,f-APBL}ŋɫvs_Q Lcr.cIϘyIzbl`0nT^MU$_Ijj;w:7͛" +amoȱ8R^$x(>Gbըc4,T9(Ue#bYYdw<r +tU]|-c1ȮU2 l%W1Z)սsF05J[6(O%mbFc+1+-&KTUbT)ޙhkmu42ɗ3$=4VD +녺">QGBpޟ +*ˀe~FD7GRᛂaclH"c_\ݷ/cdEvy_>YxE6|1Vep_o6W|1Vep_i~cTQ|1Vep_o6W|1Vep_jN1@w+fy|2튮͍6C|1VE3P+L.Dbu 0'y]|<\UGl))o5V'bHy2h^6 쫜56x5}3Lǫp)NBHk<_h3)PFwl?~+izjD"8$F=9&뺀Ϝ&4%}@_ז|j0&#n>6'}aaqƜ?i,xageOh] H"wy3%Vɦ% +As(*:WF@fI"PNU1l^/OW +;>ӱ8k|2\xtǗlᛂdep_o(7(O[TolUR*F_I&01y/nၓy/n+f_?ྦྷO8+fy/n+f쟖XeP/b/*lᛂb/*1o|1ͶU3f͊6nWg?5q`^tm6c^coWQ)XYxo;c}yu43GIQdOHoPPWgW-2̓yE%RMH6~(zgKM"PxMBQ觮ˑF=]6lUٳf]6lUcc]6lUٳf&K JZG ;tPIN7rTVAY#MCyG(ZyO@rJ;b=G|[iW_V%ryB(NVk}Bd/;UR +xْ6lUٳf]c +߆L<Z)%V(GE +{&3FԡՒ +LV +H *?$u__Q.RkkK]MsO~mH E8TDU@ + F$҃ +5ke{v +"CnB_2*qtPey/l6^(D_S~d)/RW5hxkQ{x$`"9)SY-JS 9m8qn/}6s CD{\>p,V^ +?*έhn}%*`ķJbo<y 4)NS%i#s}Y? +?2mIVUY7 + +zΣp:> + +6aGrw$,XDxpv +،uX,7'Ğ30qח8? Z\>x^u(Ep;QM+rB9ba!` +h +)bzOwVOwVOwVYm1N+1تٳbw͛lUݎpo7~@Լ}tNtuh-j_FX-b0 +MO<ƀ*ܓ#~KXk{yu%$_(^&Fu(WM^R+`oG+wf49:ȗ埗4,yl.n9+zsS7AUW53f]6lUٳf]v6?1U_t;XH8aWW0j^\79F\-24,JIMiiA.hZTtt%_(ZOv}.E, +exr9O]_c<G\63f͗:cO1UvlGR/n ^g8㉔/0NiPљ=k +}8<ziT G|^@`$UPmoL>8hs?ɓ!_ɗTb$XavHLӤqOdN4#R? +wSˏ̗PflL)R\ +!c}sF###"bȝbU:OxϠU +c_{GqL,kY' t#\S +Xe(0NJ;<sc5FNS\h#!LqK1;N)o%#uuBSZ_꒷b?vjҙq;hp1㜰F7I + h +%rͯ<1N@DZ֮fN#Կ"zߚ-tء!)H]] +7]Н$/%9(Ηzz_C jXW`kSs7ǧYyv!/gUd(p9@F@[5; +rY6.Ģew72{}mkc1%1L:D~kx%g>6sw{?FFMZ3ͫՊ[]I% +͛6v6N1ثf͊6lثf͊)z}9yK[͛6*ٳb͛6*k} +BOFNI%[@D@i#Ξr8/uy8 +0i]kFN*6Dbd@a,0Y2HF1I +ͯ9}(wf?ʣeq}_yԐl!8ۑEkzư)`;Qn>yMӴH +c\Ô/WŃX" +7o/,]Wߚ,%}X@-@ +(,ʸiO7;v|}@p37| +z4!E-v +iԖ!ʫ'SxCz"5{O.S0@}08CMXՓ̾cr=kP.&y=oRAAV;1[D(HP(FFp|Q?i1̞6`c̡iElcL7'~ )]p,Ĉ[v~zebGKe֛Ɵc!vlٱWf͛vlٱWceXlݷm~e/,Uٳf]6lUٳfZ_yK/vlٱWf͛vlٱUt1|;vlٱWf͛vlٱWe/O/)z}8yf]6lUٳf]o?ƷOWf͛vlٱWf͛vc6ci:2Wf͛vlٱWf͛[ +6 +ׁ**xG\U$O$yI#ՙN#~6 ~_h0ԭv$W:}gn$w-Op ͊'7)?}تR(d>0N +q}\ݲneVa}}JwU'~{mJ]˾]f~qJ'Z?mB,62xܞǫ7 +}{>w8gkj +(Pv +$GjWdfZ7|ثc6avlٱWf͛vlٱWf͘mNٯ44!ZxdI~[yfɾFKu,WL@=GuL|3zXbGK$T3>si<䴓P2CsnQUA͛6*ٳb͛6*ٳb͛6*ٳb͛)V2)K<Z,PPjjD +OԞS;#6ڟ Ӓ_TIɽFrDN:-?Nچ&kX.`Lii|R'^P0_pOsiVXUJ_?:zlw?3|vo}:M/͓+deӧy0If͊6lثf͊6lثf͊5FQ49=3ZTz<^# +E$0#v +SljCcjVP +ڼ ѿ;x{7W}oIsk:"EdjbW ǹ&Pk/1kR]Cp9MƑ#!y&:K20r=oG76lUٳf]6lUٳf]6lUٳf^ay墍c'*Ab0[~[m^bIkUq_6%bhPJ3E:ЀF<Fo)N +*v͐ +G!MxHJCYV^ͪŬy\Z<6n&fOv;eysߖ.`-zҫmR. +4+;6*?Kk_Nь06ӼEػ7Ψ5liWNFt+{kv`#ǖf^{71LKG@G@v#H1_wWXVG(xUxP +l3X(u{@^}Ye5 +Ov1Z8Sa \XW <k_XE-f$+IRUμ +ܡ_]Ui9&{gC͊Y-bˤ2-$3Ia{OAJWS-uu7<uO%b<zLl~.铌ث/꺏(nb? ^{,:#J[o6VlUYVef[͕o6VlUYVef[͕o6VlUYVef[͕o6VlUYVef[͕o6VlUf͊ +endstream +endobj +113 0 obj +<</Length 1747/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T14:25:23+05:30" + xmp:ModifyDate="2016-03-19T14:28:42+05:30" + xmp:MetadataDate="2016-03-19T14:28:42+05:30" + xmp:CreatorTool="Adobe Photoshop CS5.1 Windows" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:5EF24705AEEDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:5FF24705AEEDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:5EF24705AEEDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:5EF24705AEEDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T14:27+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:5FF24705AEEDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T14:28:42+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +186 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +187 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +209 0 obj +<</A 210 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +210 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +180 0 obj +[211 0 R] +endobj +181 0 obj +<</Filter/FlateDecode/Length 2549>>stream +HWێk@ +,yx=z7%qM2/3|iSM43";XHv:ui)\I%"?nrv +xa:xeLnd1f臥ʚR/i^bL؝-q9º$rE'Eɸ}Zᄏz]Z,VLW}oPAI<T*XO⒝*7JszݝxNɃD +c*?[N_YC209RC}3BH@N@#%"G @A]G)Z#|!a)xF?ƲH#>#apYwQlDJ, i1.xG!YV$Mh[,o3,ˮY->(ϿNL^x2Y"q2HܾúqgT@VV;|k̲#be<=D|G +I'Z 6G(~OUAtk]fZTkiوeՊ֫ЯCnE:?{".TtWVϧ˻8)ws$:([]. bԩQ<ɽ?$x}#u*bVPHsnwNc" +>/4M˕hZܧEYѭ +v9c0@v^UC{%\FH[QV VwX:qV+6C9=v +6m::u`k8-3wރN[X{]T{b#u=q̏of}Dž}U5\Uݦ(֧Ԛ8b*WgnW-;]oR:oK^hu'2D=ՄY5YFfx9l8pVNj>MUᡪ?UwirDžV#0p<`6ݡRk0D2-F)> +B:ןP(%'@2>1) +mqxȹgqusuuj.[Wa"wg(S-,T:l`"Q*nCmu&B[Ŀ$,]eT}A澰1k̬ʖd,gi݈>]B̕Kۗ\*Lj.5gjMFȣn3lڴq?~yԳ Sm]0/m/D[Ɓ`$?q7MP&E$b#UR)C" +HiD~ܘ8ɘJ`#qU]{FO<8'bUZZ_H^h>sʳ"*t8O뎧< +{3 .Gv.e~hb#XoxT0L9p + )""bT=Ma$9k;EfH,QJϘv8M̖z(f(kp_ +endstream +endobj +75 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 467>>/Filter/FlateDecode/Height 403/Intent/RelativeColorimetric/Length 62327/Metadata 108 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream +H{PǑJe'HkHS4v)(8atu\FrT>: !*VkJҽVbhH4>>g} VzG(tAC˗/_= APZJVVV^^~ԧ`Ν;= APקACF + + +l6ǂ.BPzx峲aN1@gKeL/F1`05jԻww;::.^啜8),,,88"<<߿bzz:v?~СCW^G̐o߾/_FEEՅ\.곳Q{ٖ8p{LGz{{q877 <,$$ȽA 0╗OHH([0ֲe`ZѣGzzzplccTUUwmll<qq^rE2fff8b}}7BFFFeeeЯԩS]]]333Ǐ&(A7oʩqqqÆֶWWWAr/A?+`*pr&L̙sgϞ^BCʅHaN99"Р +T\*}QZZڪUɓyyy111#Fr,ކ={@{}<aQLڊh!===ܹsnjC|(}Νد_vqqa] `;|pY2ܶm455###E N>]WW!ɓ'p4s<<<\QQQ,^ȑ#\.B@E~9723xu>}즤蘘XF +꽼ccc/ + + +nсy"! GDD0 +CNMMwGUEpK IɍxLĸyǎ?nrYpÆH"㠲x߿//r5bG_vfx`nxKKKgΜ))CL}}Yfedd# +*((X շoZZZY̙3З'-#^nl618<<|نYYY}bbbF$&&'T-''כxSmllϰ0<WWWϘ1 ̜4icqqq[[۵k%ŋYuWI7x<+##cooSokHu/`WH7::xaNAWWwܸqL +d] ~=PRR?3JD=ܛBk555?{[胰KUTT֭[WUUU[[pP y7B\$|>fijjVDbbA#^.ۗ7n"ºiiinnnǎq0xIA1>ׯ_?cɾԧڪO0ACCCMMMKKӳx-ZD%brʚCoҥxu}0~ڴiNNN$^ Box8RPPPRRRWW&>XKKK~~~YYhNAAAAAA_p0~?N%G%APVFع7k{wcГ@x~7tI+%00sf +;5A7"~r|1V`W6Х]ްЙ /b?Iu}H]|^aAz?w +$nwGyzf#uEY9y9ٟtvv!/A?o bW=s~m;rDa84tߋDѓXt6<f3wߣ<ܾJJʊ.>AWnvuJ:ziJ![7q8,] +YeI,?iTSw#PPvBHqEJ("(ZhEС"""QKYU +"X7B K撀""3fs7oɏGi@(wkoyXaT_S +=~P Kx;j='aL.J*S8,4F8J)ֳW1(qOah$UP<yVƆP4P;nG@|ΗdEoZ1QR +R~iDv֣@[g"ⶡ''6(bw/h + +%]Ob7W&@~foW`CKC3s#|9HOɣ&(a坲_8*^P86M+2#R%,ZF㝯쏨aD1XN_`wl%H%}/ 쯊܀Q\fHX@m1G@Bi,^i;.KfZ=מnw!a=dC*nC +ZCƞ#xtuHG5и"nM)v1$HPy;tK&͗rŪscs~ -Q$T%] +Q|bCXYS_hzaKxd&N%@$m=\UǼPx,zZxa``5+ JaSĖ+d\kk.:$Gy$keg[ɱttJ8RYm\Ot%`]#(((!!2dJs,]}52")VWd9ֽ'? {Nz|tDܜyb#Q!9,ApZ[/Z#-᧙R2hUz֜4JӷFyc5ީ⅁x1L@E,#iJV%z>%l[Q% |hٖݛHn}ҟo;.ށKU5j +f?s_HDʽ%,b5WmUv07q[C)/Y>NJBض ssͿ+.MmL#oky}vf#:*x_IÃ?RpOev$g0wf?n283/q65<a~R>R?jRMt\u_Oj=3/[$xt+A/_H$ϟ?oiiͳgϸ\ngg'(*aB@D"3PH(7mmJ0nL: $l$ICChsv߾) %^(D(q^(RrW*:<nxP*$B2.h˻:ѕ+I)<W'%77vRuോݠ"O?/h*TR6$6PQХO$x7n(XvZOOjU9;fccohh`jj啝F}09{<z(8gΜI&͘1Q `<a+++l}v--+UVa]300:ׯ_okk;uԈ7nPŵMj%E,DHΜ9$+ܹ355prr%}𡫫oYYك444Doo5k +uzzz~~~[lß>}UMݻwsr˖-C9::F@Cl0!ӻ7/[@211 233@{{K.jn۶q8UT@ +EEE4ԩSüVx)}6"/azA-2^266fw +Jx9##cp֝4DKSee%@y.feeYYYorJDܹ*8E"211}Diii 5HBMMMd2cRgggE!uX]\\05ӞRRQ. 5k,Ь9!!N"YTX"//.$%%qA"ً:th ab+)--Bh.\n +E!@ +(lakG%(>2w:qݡg 90/͆/Ell,ǃ/EZZB_ jh(V&G4|rygggAA/&pphåKB˚gpQ\)Xp +{WFfaLo!0xB#(2/B=^ (Jw!E3% + +?ERBb":ܨEWk{켒횾Q)jVitnW{+K +Ett6o윞nLKĞ={\.tу[wѢEnnnoY[b''e˖%$$B755%&&N:ӳnqFp3P+ԄFG_UAR$(HakTQSTqSTɳ_..m.,%ҖaE#%M]P]_yMjQ$=" Pt3iӦ ӧO{xxdddPTj}}}CBB]sϞ=;۶m.7999sfCoڴI,ΩSCCCB!\ɓ'Νۻw###sssu:eUuvvڵV5aڵW^к߿W\:pŰ[A&VxΝ;%).\ذaCaa!dz2JJ=Ko~,L-B*)h/W?7]NJbɡDׅ˝,s*roel>_2~Y_ϗȬlaBLYɎ@GNtUg|%{GBB%~6r>73ȍHEwwZ[[{+WZZZX,.;w7n&CجZ +Fŝ7oH$ڲe9Vg^f3g͛7džl>}:A[[+V@<_qqq3f̀l<WWWP ?7j(]̚5{<p9D +cU.ZKm)JZXK(*TV.Ю^VlKIm+jBf\ʵˠ%]|x:tӶ{|_c^y>KDZZLLձL cEwϏ>Rzz:{էQr2nYPPHO8Y}3em,+FzR7h) +LfbDwE3# +.YXZ؆X-v?)9 0cK_ZS6_e{sW~9[RИr2x.mkC~ @ N! +F +^K>CQ[[[111Ž{BTIIID߆h +`h4Ojjj)))H0jjjIcQh߾} +f"s;iҤÇ#Cp +dZXEaaa + 3p777D'@^TT422O%W+>9EBf́S#!kd,^g2^<OZ<f* +{{0k4/yo=ݻ~LVӐQvM=-bP,cGIa|Xݏ<dED}sm!gVaF_>9~Nj<xy؉&swwh[Ο?S;}t?Bo9m4l3[ +ʟ|K>]kɋޠ<E[w_ph]˧jc5u77n>YSk)zݝ[Iw^Fώ۵y5CL~ް:sq6 %<y ytNjyuF$+V=]355ˋWYYU[[^WWW" +gWUULiiiDvaܖϧpƙb +a?-77/Ӵu#[;wcym Qe]1M[ݦl#q!_2f腟uLBi1GGx +\͖֚B%ݴUdE'P2> +fv-I.BM/^^qPzŋ<x)++t=c@(v획BK./sӧOE;wNEEYYYXbrss13@{X\<~xRRVWWcڵk x!61V|\N?/Zc0i3DEu%c[>*Lۢ/?/n%;J KQYj Ra7:cF]-Y\zFe6gn-/r̨+ޱ{ں:{1x)tI|܊jK.o˫7yzzn۶j2pKsrrc( +".|Fɓ'ܿddt/4|2TGhf]\%Bŋedd?Bx/777QQQ +t%))igg#G𫡡!/V]]]!!!65bU!9''|dÕ᱉}G]t|}h.?%8(̢烄oQp/ѶR$ӭhmێVnF6N ,`_bx(4+yxd82PF(zH$c[VSSz1EY5"yD9V<89Nvf^_F&_xnYbc~^M,Nfo,=|G6)Buێċŋ6`p]TTToo/>䓑%`N$X.//jiiAJ/[Br622)*** ^III0X +aIH]@WCCapuww&.^1tᒚb6g55ysYp B +HZ;],=I饯x: {_\Б[r~A??q,9CmbI;;rd?)LRzWВ:MRWJ Nqr5RZwěT+;j\-7|NCċD +111vvvzzzqqqæ{UTT4e8؛=v3g,t{%ϜR/a"A+قs5KEJ6G<j)Q^+pߦg$*3/蛅um'o_772;QFN4v<|)-=CmǓ_DE|:t/?4pL&ϟAN{\ %OÙ!Bt)V<z̴Hȩ_T5Z6KzJx|϶XWGM-q5!Ա^>`4v8Bo*e է&BBFNMWo ^_ؠ1g-^#"릵;sJ+goc7ws"Pa6eX`ckcsoR]p%-1:n3TN͐#7;Y/Zk*d%}uoyriOPcr_*FՉk+Y-VڌzޠƦv&O0!I]ֻ,g!"6'5ԉPX+kPfCa aa{Cp~xwn9t@T!YhYBdRIõ^$^_ x}^6wp I +}O\=ڜѕibq`g+EcdF^v&Fc16"ͽ?AahȈ:`vrSnH<yȍh4}N^Hop6\AW{MlJ]7IMgik)84hvŐ~8QQ"ANf4@v{u"{SNP'Sddv_s?},w g]RQ+&REEXA^Q:.>{(h 7{ߣ,YK/ȼb".L.C.)?i +=Wศctdp0PV|u2L.3*㡷6c M[$-$J}rNzaIoENt䲒s:]#M$Qћ.zR))#= ڢ7[N4Ћ@ RolOLq`kU$|@z|/&, +X4WzmN#WܖNS&O4Y)7Zj,uO(iguҚ[eL^@qhj!\^f3RNi~MG_5ҿ"_U-3␙M@3;\"U{X[v +Y~ɛ:G*_v0"6v"$=+Ɠ SHbi@ڦ(lڹwcoO#05ECswٳ%[b!,]x!qr{3VԴ|Z H+zÜxEA/}N^ *7NGV3-͇-yb)9oF6K: +.Z)"#>-AnK{e0G^mrS=C]3C"W +~))t?ſ|By<kVxqq?_ #;MVVA꧇d^9ϋO?_ػXS;"J U$|̿ v%r:a} +-E|.KDZXcB!<r~2ȥr9tȑw;|$^iŜutvbNAzZ=hj/VEdJX9Px),b?#SxawTŝ@X:ߺTG6pXԺrFe4>lStqTβCO&NqOى1ܑZ&n().=[$PcĖ*.X +/+afoq{?8B*:C +*KyWRR%Y ]b%e\ +_4g&fϛhX>K56%H=0]eǝB:k0e^7G"P(}]]m-F@6IH}$j>r(h5UROCEK+:G#߉,ބRJD@ ^nCn?yOq0A2zwFg!B}Yo#f8!a4_iu!<L>cFl=# GJU⦝J$B U77Jo`1<r^^CQ\?vw/+J/=ur#9H:[,wm#U3)ĢjJȅKd*@cw,-5<(*Z{'v +JUe2H"deqozC_3=U9$y>c^>1;d,BZV~jdia0b%!b_QPjGSRyf;[4mBa2ϱ;N"ZWyEFvr^`[V4v|#mp >QTWG/ ^mg`oHWsR*;'-7@uZuR?5Lo.xU@0i6~#CzĽ!CΏYB9^ڠ:yg$9LfEb[9o,0z*xbW%V1>q8 *]1lD֒Xr\LBR)"UGxJ)K/;]ZBBN,fAbnVw%7-^u5s6@oՍ_ϘmXUteue%խCL +蝒pƞ;~B3Z*+[(1s`Wx\2 +4tWL$Re+ +ڙH9%x<9m/hb/#aEĕ^\3Ox~E4,A](bOd[cyX>cD5q=UPrBVj={2pKL̸̋뚐i<0*`ㄾCfl_->i͓հvK-qo;VhΓo搀rKiݾRR3O]]7$RQIHJI/uatIzr2R\z6\-9_^u +Q]硸bUGUg̔CsF 8[F!JkLiaZc7eYI. +7[Ri~>W_k.q~3*wJ F; +'y +L%yB!tW\Z;S\t}BU{Q2kSMkxf%BRBZd! `p<'/c!k7]av7r#常Qri7"Pa(*"1S/ +sY1^,y> +{DEg9tᰙLd2ޡV5E5.B,;Yڧ/WF7WLA0LhΡڄ\@gdU|ˇR`\4v?'=:UytkLq1tfWe`MV;yP;);^@"vMwچuԖ,. 8֒"qʹv?H@mJ\t=58rXO//o<=jiqxyi0I+WwrG{tK}92 2CtI/=F,<ݐ? +Q+EeaLQkD-A4w5FR^ݎN5> +q?H+uᚾ1I|vdNzme-40u@vyLrOY;gtQycK+Apǃp;\lm;[a:ovv!*R\(x];&|jzbf}㞊aFg$:ɬD^m2CG~ +jwj LvW`O +(Ptr# J\/^ZE?s3/'7oO,]__Stkc\7N-<kIxv٭sl߳-o'O;~Ybձ)̷7+qD? /^WWY?j:ԾԌE]\/f~SċdFHj9e~(6i?s܂]gAy|ƍ`Ă%8|T /\5\:zJgfT 벮P<XafߢzpLl5@ U/_Ƞ_wQvWѩIJ3;<fKtq2e +ia6ӖbC}0vؘ..NxΓZ`Aqvv@qo?rבo +UB˹?>0p%d-RPaQuҐp R)N5jDūl+4eQkzejwN4jDdNͪdžlTXѶO"NOfG89z^mU?sw[$LA<SޛBJ{[@|]u3c+A?Նb):]Phߧ rYǘ{T(a9N{N F +lwv2>uް`љHtv:ˠfhvfwOuqrr{3ۼW64) +}LDo& +I됀}F)p2Ne\NrHI o|W[FxT~cTuJ"B2^&]nBr70ucf0@fCf]x hκx䨽r*y&J{6p:7װ?%? +^$%%mذaܹΝ1lYrr2`;v숈ΪRx}}}qXt)76;7i4|cTj@@ +eeeǶ +|cA]\\7bJKKj5`MMMزV6{,Ģ@B kUZUW!;O(4XK+^:O^ʑ]E☂k"7=iy0YP5'OS ?MJa1(^S.. +c56"7)tМA3AEGIc1ת@U*K珑g2h\53$=> +`o!Z3NQ^?B>w%0wPC$#n(N<u1Pv'\prL]5[J&JCǷ5ּ+ԇBVD)dMT6jQyvzL(Q'|.xVv-5}u7fّGlB"n۸w?G+4I/d_kI~W^v0LgQmCA?si_nwlbj^_D2j*x|jjfl`M:]52ҢD@, +ApEEdbBXM *B}3$,$$$//IT욞//U=W_ue5<~״b#m(lW9`DlwsHʢμpKݫdr!%TwY">;g3;R ?oI +p;oӉۄ&ljm\ЂlBzeؔ_~*y}`O4ٶ^5.\/x]nmOOcIK%N&_뺦M*T(͝y( +E$pB`SfC +NGĊUCHݥMII5h4K TBs&"rٴٚ#J+1Uw}cXmz)_3x9%]rBAvPK7' %HMV )`;rrcYj-&(x~cWN8x~# ".cPr`XHC9ph.:qB6_=1A/#xLl*2,I'*Q~2Ɓ;l߹3z +W1HL"\as woX;*hۢz(vp+Z4WxNn1t7;g~x/|un|o߇X-gÎF&U*& +A)&Rޅ Ȧc"J%L/45{ݥhchd@^ 5=u{\)y\2\h`<oH]LFyޯ.r/ih\8&J.?߁wI6&% I&f+^\V+rXH6Tzk\K{E=s ![9p]M +`ekURP{\9~$b=BZpűCW͒lv^gCY!o"ey=,Rt\+jzN-sh-xȖjx:B'_[:ZGx"zW-d8<ѡlߛ_X>HaA +'$5|)B)a.y~jQgLj;f}ҹuUF!/o*̚dKWt!}dUIDo<՛*GG¢8Si\ǿm)ÜT, qֿxDl(rapy9c& 5PJsky5:,{~=ere/>R(]0H$/t$^O%̿:8'̜9s?xtZvl70ȮU6eA$d +D$$;IBv ˽7wa.hUdz%'$Os?pMf&4W)pŷWoI4P䰤6).ղUyܬt(=~/ ӈYÌFAMXd<viKllT!U&1_v0l]dۏhLN=ϧm=c`PQX/ӰU@TTMp-֭LG3VU`9Og\WalI/(wuprqr<K:yuw;fxj 7'9D˃Ļ@^eZŴR=C\ֈ|+SIfAj?_/K<&Fn3\]v-Lim5oU8\Kz##V;ꆳ2&٣0n:1?4rK}W=+ +&j:OiѮeAm#\]X:I^MЫՀS1#1+i+(}Γ9_ne{4.4&֑8U] QF;vjA(jwOn.,8q((Ox8ݑ[#֚~,n/O?SBLqûZ|n+z2.!?M|0ē[փPQ˺nG?s\rk6Sݜ{ϼ"/os#-WٟN>Te%Rg0?\Rjs~VL[ϲ9!QUgg[4oT8ay,{}lwHYTںaַctDtcpJ5]dEj{]Pz;I_xƛ!iK3ضVʨ0ލfaWy/˚ӶKk7<6ˀM^:,C-m-C0'KH<bvrZa%C#)N>(u?Sj +]DX/ֈ;ҼIMeaTkB8c=ʯ@c!^ +u]%I2 MaġLG<ŠZi;3Lbk>CaTbkqh^xA;͉6.gY'YyOI|=YDoKnP(u(9ԔB,Wӊ˧gF9vӯ]S<˿,]o%Õ̸9 +WxtPv;0ByyM0o2Wq?'~l)j9/*ݹ# F +IG+8ϻ]6']2h +|N+|%#l*a=8!ǽBX/4n;_FxN5WJq +3<<<2æԥ%5.qф*@x?o|'"]"$e +^#1f@{PJ jC4փ +ݚ%uN0ޖz$e!pQjS>^/r*bzcaqV;f% +* X{ +((yAHx!!$ls?Ibj3I6/~?Ya5cQ!9R;8y^3cqF~X9Nbv3W{a24g-8ӐjFvܶ!mUDYFv]'{ÆKFJL7*Ҙ2+ޕPv:>bmܨB|iuwT|gyǎMO=:yZu-Oϸ̆8'R*W#YYLo9331Ktjvk J /itku\V /2iOVCNWJI>4;3& +`nL#.hCx +Y,\Lu-C'm ޱڒ{h)%N{8`&L$o9&s +]+ᄕt/p6XsW6!Hdдs}.*MQKwrmt|p^{q4 |oFڲj%.Գ8x 01*<D0]I#[$VpkoZ[L#Z\r)&*pu*=A?HH=gDM +]H6YxoE&\X2HLǪn-=qYr>;|;Y$BT=//1Yt dG;n]}$3w{^-}bi97v$.ܿQ|G04R +oq;&`Ʊﲴ3mDBxo.d͎|δCffUM +9^=8Y{/6bȁVHȒr^V̿>np ;{t>|y5Wx_̦ /`o!d_,8\j_i4Ԥ +XLڮ[-3&yCA??X$hU}{[K¯>P8'>YC|;$e/*ݘQ0.`q,"&EKvnٳ˘kFd4bvi2ܴ=#b8[R+p;I% +Z)gǣ7.{v.cM@F;ꦜ/9q[.O*t|.^$;Տ]XeHz\!L4}9HZ6Uto SOҠ+6ݨJefʁke=^f! +/AʎNe7 +Dgw!AtU/_V[eHTMb8,UVt!AtU/AKͨxAHTMV@$hhi]vAA+B \eHTM|!3rhNT"ADGP5"N8e=ћT"PUT*5$^ ~&^ QNmaK/AT>Vu$G'IAJSY?x%R)_ĢuE B]%7|S<>_{KEa+ [R_T/|Y3 |QN2A<x녘Sw@(>O;d yT\A !At3*.^D^~Rn B/_UߠC&G+{FUsVD+ X"N-JzT\]C&:T*r_Nn۷|>KʂZDXXXX))))6l011҆GBB@Щ]]]}9jiiQBRRߙet'''---KKM6ZXXX,7##3ǎ;qF*@Æ#KdRiYY֭[!۷r?~lhh/...:::>>>555 +p84iRSSbHx%RI,(S! +#/_<jԨy敖%I~~ێ;JJJ-[_O>DxU__sNx{{]Өf͚>}4.&&oǏ_paƍL#ʸ"""\..o:5;::dff:88`6!~3:s̶m֭[<y"ۅ;v!;'O.]9`:ΞSDDN20BAw~~~?i-uȑ{իZdInn.^UWW#ϟ?V]]}ܸqǏ344TkzԄMMMBBBЈYlmmibbroqU[[wPWWo߾Ϟ=:g͚` +R7oެ'ŢEPӧOfffS q###̂f4VZ+v z$^(uj1;dBaˡWB5_ CP""_@@%f'O=k.kO:B/^F)Cׯ툚'N6FG#F #ж#^Gmaax<x}fOHHɣ`{yya.ȑ#\3g"2q+Wc/]TXX8a{Μ9 + +Zx1 V߿Wҧ!:W$~y9̅SQ!+fӭqŊӦMlhh.\<$\SSBJ0-<vθDDᦦ&A>xhH)KX*KMMEeԇf1Ç&^aQ[\˭[`Zy"wfLrƍ:s;WII7ŋ%*--ە߃PC$ʞV/Á෯%Zh+{{{'m,Fx܈Wcmmֆe!ξ}o8`F,"vΞ=ݘ?ˋfby涶>.xy1_m4yay\<9\h&H'=P,,'k^6 O'''yСC߽{Ljwհ1I_rlCXŋlbbyI߿%ʴеx=<<G-M>je{0EBf!^ZR:imhhh +H}}}Fsssrkmp/{S"={C733SWWbde2jJ0## HZDt\F F<- (u֊:$ +"bĤAkB% [e/B¼$@{=~˝={ٶo@p1):>>ZжT *^8Ǐ-[`/8fDDθzjhrݺu +=@pA] +wITVmMnunl |>|9@hSHyyy[ݰB@> u nLOO+-]ZZrW%---Ϟ=KJJR :e) +W"F[c\;\.I_I:e2Gŀx(1];l4qDCG&^FbfULWd4GSF/BsՊH%acgHvx'[$2+&pQN3GR@JÃ*nP/Bh~#,H775]VʭϮ^)x%dZKH!;[K&G zX +RPtRQË-ԘPy"$Û1L,> X\L%^qPRd$YeQ.urB~}\!:t@̗-qX:n ̄1{HaS!UXܱsr77]?fCJ܉[GuL[%!"5kŜ!9Yy>,"QŖV%6ʖ`̵u]zVQem7c DҞ[X,՞h0{\<|dSGi36)Z}z&϶-vO1~BaEtxByw1G +Yوxzש~l&RS\jD` ^/Cf-^+e?^ZS5i3AKv0L,ll՝lckJCFҫ^?4xˉVX\.[.]=!K;rÿ'Mo3ґWhU?mBY8A쯞kDN"OfI^le[W|e&f.l-j^i8O+nttJ"@xcꊷ2'wT>Yڀx<VYlb]{ZQ]mTWҶGuvIxo6j:5|lb```/[v1n*fp+9kMs@Bh(}؉=SLْū3V:Oѷݝ.`ȟm\b 7'9x՞x~8Qbe4yBi2f0%Eh'pai:adAɪ5tp_+G{.bxO>9%~gJwsDG_tČή/2/\ RkNͫ.ӫCa +ig-IC} XȮ0?v}x UKt{m#3CΤnE>"V>/6X !-ӊ4jsFt +8c%*!V?̬TTx7TLkm !߆?35S5wuڣ]Dr7s[QZǎ>G~VAIظeDo/g0G7@#WYlYuc$`% }' p1Ԫ>.H]ƻ|B3jxt{kS(TZ-G0f18Lofȇt]9e,@xx +ₗ͘)VG|f-+@Z2Rgdϡ$d"jJdq@$Ї +#mA6BJ]-b-j"n +l0~lhSAjux<mS_|hglyBhkVbzԄOkb`! '$WCy+H#Nb|'sKkAjY;F!МX$Ku28#PkVU +;]z⛺ʩ(J_ۥs<b;iZ8%UdiBb +n)ȃkߤ W +U + +;'ffG[YJW2(A֪bs}@4[(-+/c䖛5C3Ub a.xxM=+D?5^y֑gf!_9 ܁%ИZ8a(밼1"JSU3&>uoK/*[ǔP߱^+ۆ]WHS^5韜۪>>o<OdtM.60K?isEFQlX:ԃPղCdU)IE`b0MhrC'7٥ur7Kv>G.5毨e +Mj稙vG +Kpڗ?L~JGK:O8H_6 +$#'-7nٸɕ~/TZq颀xӛJMub}gk807q%xDb.9VJwKqWP<H)*gDFG<%OB +uunrg)jk#jwr7 +ED{*-\AX@j3FdʭnzO +JrLNVsK! -xv3%b턊,5ixXCrN(8*K<wa +]Tj`b|DJiU{lz9B\nK>NI4W]{ ueaw-VI]U +mY:YL|;1>6YTW72&D},e<M_oZ_EZ5M3E, BevQrsB?;mPMÃ^wy<U=|"8RJ!1~Lbk & +%5"cx'64i@Kaٝ\D$ձ;?<[0 +#B=VEOhzD\fS[yIo2(6)2HmOKa5XS@$d&k3s9%R'ߖ'hI +x꿺0Bb'[|"7-i:>aEZ^R9셿K{;j Y\VU|RjD|.#</($l./H$pR\0=iP@bK/̓)L.-b + +_HGfsߏ}C|GJ< lYP,N;,/Pzt1b>D"H=t4I +{!\s9!UԑoV5dg1:)Hw) 9ۖ9h뙻,tuw_hgiiTd#)5͂.v()PwԌHLonuD9~}@ k({3 +pj2O.ؔVR$IMFs/+gwY#4N(%Vw?[(ɚ/GBnlN~_|o˾`=yKcr(zRHn!:wc*qwjEJm.P(䒫p;{ėpRrolDH+cpx|Y~%ZUx;J)h4/ƽ&`VHm@Ys_@`,6$=c5[[U>s\hJɲIR(u8)',f!:> Squ %UV1GBo`d1w|y1!R<$ 0Hbs]a\,TV`Gp/7EnwT#s +[[NWejUH[ޟ|d|A>OLxCIyGƭ&:=WCCF)\ݢaZg5>YM}y.QARFVw?w'˅P+ +Tuxݨ@r +`1$5ś,oxt&7H"?Mk-`̼+fӃ]+2p\,JJ/vS,:2ND6NH_=<P:Kg8c0\y?7*CU&Ӎ-9r;+57sEޢ.^DnL|q30Pͯz/ƇU>&^J.#?Cv|ygFaiƒi\p\/.S$>y< +ݯRPuv>{}+\-_0D2N +\Kᢧx;nwPR5MsG+n=MH/%Z7[ЊKB/ˋR^iq!ޡ+E9u\{-4% '6(myKB>$r+\sՁxud|!1!!#HocF;zf3\Wp}=]{,v:`W!p[ߛq# orC%уθU칃 4^ +«)#mfjO!,eX4o=]r!Ƿ 0{jxᷫë%_RF,!+ ^[y&ЈH_9llw"U$|_aߚiXWM-z*0bq'TE8̠wށ\_+@ad`do4.Ơ[ݸelE-saKYk8>X@}3&*q.muS9OHxWOq8%yRTLuWɒHoRKK.UCnfFHzJ2%@3zZ+|x1>OH(^eTF [f[ΒM$e9mW;22H7ϖLS!bٍ3UBөFKsvߪKVpw% +x)-y5EdGtf=GY.v72B1t7pT.Ph-uaZ+alcH +z*C/jhX=Q^va_ +t->P0s!vĩIxvhLDMꡉ**^#2ЦI)Gm7q!2JP}x!Gg-j/k4<xITgh>{cYN-">yY9ÜafmA71x%ɧ\=K>+ި"oxIxoJm9cہ/5PC6Xrxfx0BN)-,HPOHwB\?lxVGb +}N^AMtū680uV#H?b.F%U[Hhn#h!ݢ_%Uz2B?h&H.T{ߵqh]L'x('cv9\gz&+f;WUM1xCHR?t {#h('x9 Pۡk)$>/^x)x+nxYD^:G.'f4|Pfc`BO9I09^}(ZՕI+(\UMݯ)Sjt%1u8(I"+rUj\BeMv" +)hlefaɦ|dEB!TSAdwAqbv4cr._]JʊUi'@B7)VeO<ɸ`A͑9рkr)?ɸOYWQ$x¬em*= c<)t/n5phϐHDh."1BW懂b;H:H?ɉ ;JpDpnsm0r*\g_Dh@OH_Cǿ0/e?l*ۏ5G=A>Ea@Rkq'ښ</pQa]d̡ji0{6+2[xwoQunvs)wFXW +Qb=<Ԝ8q$;v*sCМXa +-/,^ex1f~M'Bmgī ͎ +atp\AEԈ777#MYh:҂4tzş^(*{xeʥPOH{<Wx< iiiEƮ]-Zb +Q;wnڴi ;vO/^Å.D^nݒ%KvJ ʲgϞK\ьoذ&}(l۶mgϞzNcNMLLdYi-[\ri +՚4E(7Tyy9,:|fQ(]C^~UUUH7XĻj*afٸqŋJNNF+7oެjѥ +3.*PjMx# yb{|.eQԽkW({'gya?y" 4A>L`0)]9 A~-IƷ8`P;K]LDDEEEH/n}bxE# ,+u?0)ݮ)ok_g<zr2X9I*ZƗ;>MsmtkSb%;OK4D p(d#Y}%''/|v431*l5Ȑx! +*R5>:^&) +y^RgFpuYecMPHX=)8뼴cڮKh_4""p_xެC͙ ++*{%IZzE{caỤĴ<hE^)ڿMk$_2Kf2!B@@|'ݏ]ϳj}7 +:V4EbPԚ#$Ÿpqqs )XM;$ȾKe<0خz^7US;U8i )rv7WI'C(q)<WIg!B@@|L<JtZ*^\Oh#uc&wO3(rs-Tҗ7Q +wz1McMd0z^{#kYuwj2C&B0IQPO!B@@|{}]rad.-(PM l#J?BZk+h+}}Z`(AdYnqy'Oi7Hr*~$3ikxky-(¼x-^dOj)'"LxCLa"ڿFvEZjZAYe^|ɍR\iЦ\-z< +Z# i aI0ֵ٨n헵"H{xWC%^jjJFY]},rtkCSuf}LGsܤ1x'^ԃ$=~<N?DX +A:1:GO[9,_*x#~аk::2ku<܊'8II]EF0yxUU +}㷘6Hxg>/^s/UqNhwo#qma0I~G5uqgƙNT=cJDA"ATTH ,`ʾ(" +"Ų$B@B/C+3G^o{w~ + +儤ppBKE-W.-{4㗴ag2,(X⧔fV|,çVYlOA ^9%`=1cIl +=x|Vg4bjY5W]M#T8ΠR/{t?wQ + ~6E?#ѕ|h{Nzk,drĖh+Io[K~אW>H-d6:xy+z=Vp+E#r%= +͋ަb!ZNK%r]-mAW +^,2hI^P<ȓ;W)/0ݲF>.Rw]*Ծu|L9]X@lȄEU]ޱVs_LW 3/42fȪVj^CvZiv<~Wp +w&W5hu_go%6[g7sY1_>BU/YxC/jX`WkX- + +;8WO*~.9M\i[ܣnPHţ&@j=jyE&iÒMqOGr`zOf&C1XlCy*rp]\)+`2< oQyFB%LyW^z FXH!UiB>tof!W~nW=rk+NE"P()ovB5@{%'zzly$P#Q<^!hQ4ucgP0[MǂmFE]f4mbـn~JmAgQtYn{'77ȧSKԖJ=<;f+GGt +N_Ar laNvMhG+<JJ 9 +Dή߿@jQeZ8y=Z0oRAa)5eEaԆ~Vv{$ +s%o{q~)f\8YJrF0qEhJ +I zвJ%AVOeMYx1|ĵ݆B_ rւHu}'a?V͑hEʸԊ𠜑d_2#By+KZ5"q}{mj$-GȒ(~k +lozF&\ OϤ1Z +l[#2}A%n_:s#%?f9iJ(mFffDՇC?rpk1'Co]<z2ƖkcR>?A&R!/§9lZՑIة,`O(ɄC&F$a;+~#p"#A`h + +Sp<aA?M.)3} x!f[qJ5 žW+G/q?}JIVI"VZ884{<)(j*6o7s{5P)7|\Yg2qĎBoU=z!>I%G HW顫gʚ/;\ UYqn{b(KMSS ((0-!]R=*^KA:U9y!$6h+iXlWԢ$l>l d."Kh'uY',id]vB϶Yg9Oٻ\q8yad7lZe֙2JR()*^kyzF_ZVYUN:J|VRU,;CJw/H\6@h%B{_h__ۻLes2VC@@-uV^r>Kgg +j\"z[{>Y + +کȩ/ 6,^ʩ[73x6j> ʫ!^83Lbg!o{!ga +·~pq?/Nȍ#^Wry,=:@\V-k%f{/O6Y=#yr=kPY4F!=`#>?8M#^C}u3Z({4Мێ'|Y~|cUYQ[]S&a*m1kKJ+=r]~_SbmZ5B1utm?JZuFKM7,jm63k~xʪ<:ә6>|I v)FCK,;^9Z~s.Wkƴ6a(h~F%/ ko)*^XCM?=Q^: +VG2A[eB '-nȡqȄǦ(,zoXsr2gi02IDo$-!JzY*7cC%dpW!^SCkM8^z^1 ⭢D#kh&5^QJG8i{X5TW=/3miefH& +zG\dE@@@K)rd6bڪozZ@i:x݉;h}h 69c,3ō8^|6⍬D#ji*%ްx .i91x䜯ݱ +Ҡw!A?؊%v!/4];bA+jZQ:TDhH@(.UZ|:- +: ) KL&AdɾI%tsϹ=9pԟt$icS{ Sm]m(vQ"fR +Zfa`dakg``3z9.W +R݉\).KWH?>\o[5%W;x dzjI37(`jI#4%~7/!Dr` ۖX0 +cPzBX*=Hࠠ3Ur%c &RVH{ˬ;#=̕\"kUj'DS#Pj#O#uGwz2*KXHQ_9(d00:5&s-XU'de!Jְ`吠I0ZBk ++pR#Jf5rı^yB.r!MnU~' +cXjv[_%`ZC! +b]JL<x ʒsx4cw\ڥz6wgU" +F]K#- %WSv^nA`NhOll̎H"'=aGLoMwSn?byv+O'(t"ѓ8u>eUkP0?]B5K]^F|I @aC-#x2X<%!JBlN{loRSZ3\?CmK]+ +S-N^Iρ{jWkhrWBG]RXxSB_|ºP*~nݱzs)g[iZ&# +QyGU +KA:؝Ryߦ18\P(WgsL]~@>Э9YʟeM 0DgkW3z}'⪺UN j&&n6Fr`h!M-azz&Oa}V"NT2tm$=P---T[plA=OTN˭ĵV+CcY_m؍%YIv`U_%\Um7x͖Ⱥzӧ1B,D\<{K,s5?7>$uZY4Dӯ0{7 pgO_.675Zx~ +UyZ[;,+S +$`͍R`$<'ߜ$7T5xMEA<,M"}]DRMq`sĘ7孷C24p}'O[Xt[oo*ubOpXp9CCs9y 2alLN X~{F +eDbpsuP 뢸`']F/(;tB\gUy;N"\Qx7;ƛ,:T)RO:>l'.?>%$=sWCU!"!*Qu7{VRWW`hm:kmk=| +b(Dw(=ce=IeV:p;Cϑ+XfO^uY߁+3Ύ _Պm.I^ˆư-p8 +Uxx8_QFYmtX2YJ$X* U`o{WM***PeV#WF9,H,r]I{;P?oX1(2zA 0(zt2Rig|OU}W] VK[AQGաm<J3Kxo2Qx̞N3)DWX́fs 7ͭyަ +qְ88*6///$$*''G[hhhnB^v}G_Y`g7=]a[@[?##C 52x1PߓiٚƩ3-}yr^!;SMaZ68n.ac}i +C+yv#OMuJ'L&S<O]RĄqKBPXx)HEx%!6C/]+Z\<*Gv;x5m=c7+2_L +#el=D"}_E%mQԦm<"Xuγ +d$ۘ}GM-5I&W;۾})ff.aUdebk=MփZjTϸ[!x){~y wm)f>`/zJE%xJRw4~Yi:N{1l'ڏv4uʮhܞ7d~DO'8/_sQD~1os=9;L₤m8xU)n>3̨4[w$OBa=/ϷRN[R(F&$*zO-9^z͝5AؔJ3X)eNXyxkG|MT76=jd`h</I/(?C9yNGw/7ɩ~sV&/X-VF˘k!=JJťhݗ&zOL\E7^bЄD;B`ՉY-݀s`obn?nMo+S.1 +Iꊒc60t=")CvS;;zG<W7toI*{O퍌ɮm#CtJ%UBѽG/ ;ApߋǒdLH8Vmm)u99P9Q<9,*%81"rr@$KHBA:~.%[fUݿ~ViZ7%.:w6]9G4<+%R:GكLx9(^5}-8l, +{ +@%zA2t}4-iic+ +2 +NYYP%/)"h>Dw#}(ԣM +n7r7~Bx=^c3sESb(x^]4^ΰ7 *ΉW/t^cW];CE:^e'&UrwD<jīMpkU&='(^0 +·I}]^=7?Y]iVL2%U뛹/&/xFZ?RxMoeb:J*I[mYu#Pqp6$mr;W~Uei[;FB<H"--e*2]%&hF7r /(r<6\x +DO%^d.ɀFa0t8;'nƻ7}v9/.k#)&gV* nK 4s8ɗB9^W电h73hn|\ZU#㍉tjLQde?+;ϤJ4$I!6&[</MO`ݓ!" +Sg.03ΉK2$¢ӲfM9&c%9Gc|(<EXxxDxry;l9Ŋ0s;&L-xcUôcnbn|HF:ٟ$IwMل +K/j5/ +Mt!ob"fF;'JEi\ƍ:L&~G +8v{Emh8Me\#~bFon8mc +[,nLR{X$s4 +W[^uE$q +endstream +endobj +77 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 467>>/Filter/FlateDecode/Height 435/Intent/RelativeColorimetric/Length 66353/Metadata 109 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream +H{PǩD.RS*[\24#C00d{C)I!b.wSKVuvn};Qy|<z d2 >SN bHܼuV55044r=#AĐeǎ˗/}ϕ+W`H1P7>>^iL&J=VkE>Q\tvvJ(Na\ح{bb6Tڽ bQƍJ|y춶6/&&_>00ѣwF%j0H$B:TPP#6mr陜̜VWWݚpJpp{W֮]J<RTTfq hܺuٳga?6 ~x/\Obk֬YnnnX)))qppЫcll<~xiӦ?~+=;:u]K,B{~~~ss366lj,--1^uuq2===_}`c89%%-˖- +)Xx"###1$6Ћ̙{Aī +AMsK@'O8q{+**N8ammx#F}>nF322:۷8&@rv>a̜9΄W#""rss\ի(3ѵg###'''w+VP_\t `C---|;nm#GmAtu/9{444rrrP9::ZXX@VU`WMMMSSs߾}X<UƐ&&&PDgjjC8i֭<kDf<[lAHDPxyg\Ҩ9 +777lEܵuttxa.x~1ԩSq.3̌M.88Xs8g«Ν +p`CCO7)) 555E1GDD͛P~~~ӦMC^ 1Ƅ->FFqzyyL}u033uϟ??nܸkuŋL+++zj쏮zA@\rQYY ;}Z$1 -UWWf<ÇX$8~L]]]aRl^[[ݻ8gp33sb<jUWW?x F^*AD?Ɉ1[X,֎;|>4ndd܋`؟ b a***.xccc}}}{{{GGGsss8))?1bDHH !@nnP(X0w)S888x{{gdduA\\MDD !@GG@ d "H"ߐ 455⺺ AS<y=V۶mJ=#AĐ"99YUUUKK{9B%@***EEEdHsR*$OOSSRKJRn7Kۅ%fUkw*kILvVƶNDt}gCC.ݻfE,2jx"-@$@@$@ˮEvA<7ڇ2qPD,UpZEP"}XYdy@E KBBwDL& w.9|Iee%D<x +ٞ5Jc+E|No;1R\IO΄TC +?pK?BB>"[s2I&?444A###wwBT7o466fRT/nYUU@ xxx}k@XȩwH,G}6[nVSS@^^^ +v(.K,<~8\I.BS¸rf_yc}J +FClUںq5F)1Vhg?t/`^`9[Kuq2$WNN!+++wnܸheeee $8m6@xN]n /[sŀMWhJ" +GGG`2HɁ)x[RRTl_ +H>`tE?~ĉ.ZikVBFV6oN&%&f=DbΝJL^{p>vlbRrrRJjf~}_,z^$Ueg&%%]q3+bwVx$J'w1%I77iB@}NEkeȭ&\I7XM骨Zlb>Vy6odf%:W&رc4ܹ0q+W +ڇ/xjOx96]xc1xE;pǾF<t!xda=4/n hxbNwA?<%?XCk+ӤMqigff"^[ZZ +o)`0--=;wn,0> +͒I^~tAAH J +R*XUaFZEĿuoaHl3bQgWAˏTW) ^^<<<XO{{d:::ׯ_K0 +eÆccuuuA77^$Bӣ7==}EEQW|2 L&A!9`0ZZZ_.Pkri\Qr'iMl:"%ŠPښ""FB"Q2R.]MN)4.3v3Ԯ֩:{[}}3@ + +-<"nzaQFjowz*+Bgat0^r}Nȉ +dBx>2 ;qdz3=}L].;{9$8\ҁO{aBwYjI^Ŗ\5kU7eiJ3^9 +[xǚ&lj02'悗+ +ՅHCEϟG{xxL/ +]P8u^QkSӏy8qu@UxTb!rɴ03me5+.IQILj$=Nmoky3$ëxw<; +jZ=,ƒwkB7N59㙔'wVh{V +`\pq||<Bd0^7rrr`>Ν)Y"""JJJ---sdqq1WSSCP0^wtto6N_V +EBdcP+DFkR.b/CYIM`c!AWyy<*8jQϦ]Q[)#b]ٿBP{*N;RE +Ȯ @ I IHr{o(RmDj9s's̽899ؘJ:;;T*rnɎWWUVx+HnC%aBkċ%jjw݂k~,-,,}^RmbF9?z^dm$^?x$)k~ߗf6eO7W/uaIup?|'.m'4-?,_JĠ3t_;Tttv-yT[EOcCa-/DϟfM|)w[O. XН⬬,D`АQTTRd1P.kbЙ7KEӕrdBK?JLٺFSR1&rh1Yr#/>f睊h>͊PDUWSbb~SsQ,xW}wJZߎҐA}FqLƭ˸we(KvEdu`rF2 +m6Ft0$~ٜ1{+^\ZzB/ +WMyBv;3(c+-16Th$ BZ)txo.P!TCMTkD\Cxܝr|$f$F:iMLhqLj}Q1(yG*{I\.Ɋ_jJvT?$ܢs'%GZ"qIg齸o/g4#s1?b ^ +1\P%2 ^ +eͮ+-}>qWkMޝv0 >Nq_V ^`BĕI!&TG3ەj1L(Fӝ\]^HxQuVt4LuyW~;f[myf[SMhT#}TRhvM` ϫ/pRILHi{ѱ-CSYQlS?g]E97oߊ=9ӄfNSV*T>0(^F1;'RՓwqMN3!"FR!\8qi+M9]J|;㥼MM&$[-QFS=bIjUgEW+mL,]V/(1S/[}{wx'<D +cfX 7֯Mn +4T[[;w\==H4$*uuuwss3lmmNFvt &`WD"Aѵ( +U^^.Dtͮ?eӻkJHHD&c͖uh,$3Mc_`0%$՛%d;I_Rܫn/ѹμv;gys|o,c~~>Ic2`(i +L.y]sd>yDl +6+v%$ aᛲ){ਅv%@5111۶m\ơC122jy߾}8ٸoެY3iӦnp̘1NKSL8SWW#Ւ0¡C]vGLPL0Ąth"$)Q͍ME3g_x +MMM'OLSNMIIOԩj߾ٳ1ܹc``0zhɴtc.yP__cΝM6q9g'^9 + +j2^Ϟ=۴i(<*5,((@x[nsqrrBٙlɳ(qƸͮ^z#lg(Rx{դI3Ҿ|raa!l]&\x1kڴ)&$4óPnGvvvy$⭬5ݻ7GN̘-/Y'(z%1۷utt&ߟc˖-\<yzǎKUL{nB:%m/={& {ܺukPĐgϞKDVOHH@4+++Cw8իhx"LOO߾}KmժGR.vt҈#U,y7oސ0EX⮋eMPvqq{H¼0ωC%:v숽ٌj 4 +s ^n۶mŏ{qEMNNqffqxxɺw7%WsNFۣG(9`N=d`'bo&`,g=$2$e}GzĪ/99##7]loooojjR3_H !^A#55ޤ$I2X=ys$dOsҸrJYd?I4=ZYY)JY$cN1::1Jx}}}ׯ0)Xz|yܹғ<d/5aU/9+lU5ftT +s<~xƌ̙3hJ\bÇ{E2$)u3,qժUx'(ޡCIvvvKnD}xgԈ%8Ouv҅t*w)h-7>zE_7$$D[A9@kY>+m&M$aÆCIA@&֫W/'yyy]v4iRVV^i}}}///&* +$BGUɱfJ5<xp~n7n044\fxY5cYxwڅċ)UV 5EWP3$@kkkBk\\\i5D\ӭ[sΑ]6h MhffFGx$}SX۩SM6effH %""BIbw~Aݱc-?/\|9ZtiJJ +< DXR1Ǝ۠Au=:<<,rOcʏUxuէO===KKٳgۏ9FC$[U455>}:}P}$(^e9nܸAKDƏQ}ӦM_|$^$~ؘ̙I ^ܹcnnn``ǣFba'Φ5.*L8LNWovncc3e/Çlz1y%ѹ%G=IWP 9rֶcǎYaWLB#vʚ_A86lx!`(f<5n8g۶m$$?zZXX_]`ذaC:7kݼyS+=~S@B^p!OfA.]HI8 +<U*4+ +֭[CBB ///((9 ӧvW^]jULL?00pٲe7nnjjׯ_{;v4N$++ĉrzLNN^bKKK4 +&Yvuj 3,5/=<<\N$-\kqssիWXg'&&+!Y@T+Eʕ~X}oˈdx5NTTԢEȴZT8!CIR#4R{>'%*#5W& 뛘٭[n={ӓ5?$_sx/HOO'u>--R38q;vL~@GL7o) +|+4 +A-#+@ 2B@P +A-W)+UjUT~Ǐ~E⒲ʪ>T7#>gݬO{ _{jgs{tc#)Z+(wҲ_./p?f_/3d.)A$WT*n%5d~R/6-I,~*mf0vf3Uϯ<|csgΜyhj@@@@8q![<<<==m {rX V{X5OOmJW4xR㎰x%8 ۷y64Nc(ۭqP>*^Tu:pgԎ8KjؤWcZ_B]ݽ&uuB0P&|YtnEs$̚'' KmSHNBH.buP_ǝ_bddjWjÙ,ܨ-IM0mxċ/C(*yn$c?8߶?QRd,BF75k%ج,If:Oq4Uۚ_) \N +ZtMYɡh{-=ѧI,Ψz/~ӳʩQFנkjp|GI,9cͷkcCՠrce]J[hbLᅢb&ī佹}*;Hhs| +(mdf)HKYeAخK+ݖəZwCb%ԡ6)'+: k*ؘ\L 0 uڙ(AWF/WF@w^d,T%s + +dFPG!ʄ>V2W7,b}nuɒn.~>WoE5K=n&tc81CDHUOV; +njMy9)"W^2kZ'9$lCH8r&m{fu=/ۉwmX\μ~n_֛K{ؓ.G}g7@Yf<9-}e]ؤRWHhkYx(3ig,P +D!NcJHo%?c125BE"UYk/\6L]mo^X0WJ2"^:4II]/Pu א3:՞'lBW{Z!USw2nH*3GWsk1O!|d̜D")i5 ҃3A|=Di`i,.LG [,͒WJs}ۦwne6O( I8ɃWD#S41O&oCMcŹʚ:&ff&w eTv[L;)*w];]dlUx0+vor]ƨؚ6CrfM&ۋvַLꭄG^젷"n%A,yj٨(;z\Jґ҉%MU>/ׄ=l6A$V +;7va? +p[b9^vƥN1GnvOlwr+о#ٴ +6 E;Twj8qFl'&$q=O2&;LOߥos +VwsuoI{v+ehM(ZMrE*)yojO+O IL_>!:KxO:0/26-2ygBݞʘ*dU;йor1jRs Cy"mK"ihpA z)pج>&m R|POO/Ɲ6lN Jʓ`Ú0Ȓ$YE* +w+"VFEA!RTmE#@HE + +M ^ܢ7;*3$*<TTn+Q^8(98Zz77B)D/93;mQ(Ը k$}"؎bAf+/P1[CYFaHy&о9L e>ɆyѮhK}fm1?zXwWilM+Ng9^Sv,mt{Ie{ۮ9鎔LnIhNҘ +QUyCv^, +l+.4qkhD 9:6ܑd?_ł䈜48l$ksn+˓~M`+elsś%5[GK^LJ>wP/GTY_]ί>ˉwDc0h3ˬ]QJ,چT<-Xp!^G,8MZ^zzClFxIS:+eEyYy`m,m$]$뗧eFz^@ukZp aIP(=H2cឿ_M\hh\&x5Jԥc]Cօ/;'_|nPfzу +esk]{)eeF'S#_Xrʮ%,$YLg*GIvb}9/=N2=LDFzyCT2klNSL/H+]ְ̚?(vމ}JLFO1ZkGBgN5j<?:0x[FJ%i-<O5H Ə14xK\JDK"k6#Cmjp@Zm{ɕ=!FFf<c6~, +5untA-wVu7/kDO0`fI/HYK&[gmb8ok*2WI2aOQ;:)pٙ^!㉠ggb]P" +#4<BsKGâ33H7S*F7 +IḚ :&!&x˛Yhu٥Ճq?+}2{>n%yӵqXDys?9:,`lOE-*@9sl{u6~g҃eB6gǹ'ʲ_N=CZb3yZ L'͗t]r2&dfpA)Yb>iDO ^mݍc&xG$쪟`:Ƅ/hNF] +&UYQFƹOe5"2|HK(!L)÷T85Ս\ +5;BL)hXܪع;=m?lj˲3՝a={bg'F.7ha|ktZBĺ=N4?,ュU:S~RTvg݂kE?!`'mQSJW4lN4}ɝ4%m,~~d\FL־.P|e>MR'er6<S# *ݭWpOp'gi艶3v\ 䭷21ܸfRaJ0+zSr18=xRNUFl{-իu9T$nF|NN~XiYbz%)Lq_ fIP[,7]'vg[/UB]6'y +Z'HѨ>a X`w4CbSt! \#y`RC'}J_K +_Vy+a"8Qj:x@," + +#"X2 +3Y8*vE XX +˞L9їw.T/eK\ς4. SGMUQH(.=R9@2*gY3~U/L~ +Z&?$,WT)$k21xv8TmK@qJ(I!b؝`.Yz\^::SKU'1R(ď-mk:,VvKJm]/edV =%2BZFxON-?h}MOu!hokhAD'ﴁky].d);YAM|_UHNI\u۵*ItWxw8}Sm"/9;W(x{]GmU@|$ J*W[emw-zUю9:̑ WZ.X@oTb2G/|YǧCtU=O/./---+/+9B~6E +p&͌͟uMt^zPh2RW1nQMH|_ +Ar<@wvB_G +a5g5:~|!Uvߥch +h=pU8",'M0½,O?BA-uɬתhKCM_9 3SұXqMn+b;&:<٭qn496,X +-I#?ÂRrb\ +#Q+;j RAIWs)I=ZLibV0`)<oe!śsld^9* ^h ;EMu*#k(|\Zdy#m6W4^:GKst6>hCUk*O3BRIK \f*L[ceMMSd1}1L8TL {YǣNE(/3 %n2HhwKKv3i],h#]M55hPiD-;]Wl +{mm1L~/?S!_x,zezP)6W06;Α Ep4{2#oN'{G;{T27;8q%UvAïY%]vsQWgGGG7'Snw`GoI_Y;DxGѮ^8Eqw9t&ŇFlR!J(Oߋ=@~kQFl8ػx:1F;gZlzǁ3oxjC JվuػY0u@<fy\ixЊv7'lis!l/h%FrJzrn^,I@Z{BeթܺN?;0zDE&}xs(d +C30b\E}u`@l6 +b1<t`8L00e3`q V(=aa ?} +xeQ@ +wDŽNP@yk3{?; 1q3^'xh.yw\e9pNWZVf ^yw~:^P\ote?_/w eQǭMr+ke9~!F덕ioxxrIT^}@<N9kE9:>Jm}viv22ZHpH0 HbFqVB,yxI +-O/mR_8w_wp-*_jxetzE"A/e+ݹh +#.s0*?cݚQ[! +3"6/LEMLa0l9a1V X_ѐ`uZJ.HFVYlPBħkaQC{Z N +lF(]v:-5D_5T$UF.& S>"HkIJ:U9f٠1>^-mk+K;y +~~~D]̴dħ,7rK.l_<Zyu7omjмQěAUR&Ij˭G(Ϻ}?K^`s]?c[+ +)a/]nE})@Um(HWcEsUr,/ct>r!_ BN`ZjJa0cnOrW]prRvzRll +'B{8Luy1~Wp9[U;%Orb"mBa}s8U0z[N*Q}%2sR\^֡F!*`J2c?~Z[X]{;v۫./3C%l8bo&~={ް /tJB|ՖW瘙Otv=Qza$7{.?dvA*^,gzSGUJ?nҚO/RE + |p~fSgzz¼ۧm7sLŷ`Cw$rV;ih +p"O}Rw0&CR2t4~rm?g[zua9#75ƛ;oa]Acfyۭvp*V*(DT(ފg[ewC +|[Yq(QJ8yV\cHu1))MNH8f$|[~cbTYdڸI}lM@0xG8BRr!l1dN>ߜvt2lI<Q*ЕE%ϖΚڵ;D$/}l&U1#[xUj"~g u˲yUFt/obdwO`̩=}zcSV^*CnHk|Θ6/R_ĺ-vK]6@@ +cxG<TZXXP((((-nhۙwo4u +5P\ēW.@P<S +m϶noXX3t}Gl C@@,!$Pפm){Jd/PN0$yж6M7Cԛx5&fBclذᱴ>^NNJ[[|h!cӦM-e`6- +8 +P&KB0՝,I! +(K{TOrzJ2kxqVtFoZsg%YS9de9i/aE!"qTI +ݓpoݺd=a0t9T*ՀYjUFFFaӂJOO(a8::`(ٜu1cGۻ[CNQ +L 5VG>혻1wڈ%sіnࡊoZNتVQB`J<$8ʳ[Nkl +:7Vtqn멭CY˓ +1r"+;*v 6p&8?jܛ^z#el9p*x;"5ŤԬٷ +D{M +S.BHHHPPara:j +z0UX<ޘ|;:ǖ8JfEzO +% +оHbMq(}EœfH9\Q[wRFע;I8:ܞE8U>|w |.Z$u%e>? +zPqCe1Q'N;JC/MFJ-ri56>F~X:v:n3:en-uE? ,xuCRvp2t_rUM^wH`Xb(<z7l}+"/pl`bZẔoRLkƚZ?L; +K,4Y#hG;yo`x=<<H$m蠠 ۖcsx?ϟmY8mmm~~~6ѱֶe @xڳ 7ApkIm-Q.'L+)ձ1$bS^B!&>a^vnxY`⛫venD0x]*8"y\ +kSËe<|H0tZxt%BvE3SϬY7*8`GԞRyQ[&B(C +rsh1 +=n-oY/TuwK8b+ų wPn"^Z/&45;3N-3\">CAT0B$ +- B&p!!v;cz$dT"|N?Ձ] +s&>9PLLm.X|DPYdkg[y7w@0{.]Ddf4OO=QN&htqjDdٻ6]y!^8JG^ͭRJB-IeB`;-9)ZXHuYT*-*W(b[S \]V"VǶrV& aypXEQ{6&z91;iZՄmū%ԧIU!Rыr8jJ?ss@_AӧҺ9B|tȦg8%/95ȷܞtU*,v,GmIʢ1K.G` kv[ިV6v82#@?ѣG. )R +.*Eo$ +rVF+[Z'9 +UE01j#}lK_sPil,iV/*P./ONO)QNn9OWe]gxi'w`{gf@4)AH3Y$GBf׀~`ѣ@eQ]# qԚ%9LLj؆&_ +2}Z3~ĩѣG2 +0.)q>xѣgyxWh\/ +I$Rb[Q])E]Du6KB_2. +!r^1Hb@BkZE~Z$9::8Vc +7Ʌ'L.KЛ{E'6cSsy :dVrqVwͪ~YQ!' +"=qV;\l=2$J2[Bds/`T$xXrq>%ӆ\|E~e"J;D!:ZXlذq'BeKU4Ṭi;kx#/w>iLB+Gċݤ<>#[<L:EՉcrM"0d0CѸĄ@IzN_h/zfkW<!m.:54i^S/|ͬǙY?oӅJ. +&li?<Ckך;WrM@0xYpf?/VxQX]fv;lH6xs#>]3EwwKg=Cvv[W!KGXopgċH:/{XC.詊=fL~W%?]rzS͌ޘ ^AKxczDZcmQ>5{2K-K߳tv3Og-/}zukO^X{EGS?wi#j.Ru'C#k8 +HhG=jRyRN8X-{6oyÊ~gAm9aƦ9\j U.T:G{s^&;By٧Ǫī +Hvt@cy1WwlyFuՄZɶvECs/k0aa?'^TM?nZ+GeJld*+9.ZC 9LeeM@ +F)w^c;#QlNvhhx㥗-2x\˧@YA/ֽ/־%KݨTxv9}A?wŋZ#^W7%qZt=oc7b8z\Fe6c,ڄ&c bdd`yyqG+Kx!o02p'ީp/kf@ 3?1Q|8uh"2oit1ھh4F1%t +"\7ڂTR EJ@r#7rd߀^̶U y>fy_y#K^>sT*B+]b[ҽIbmxᅲƚ5&vC#|<_?1:ua$z5}p"蝕`%_!BLsLo4 +!\ᝦaiYYY/3=Vt>1]2vx;Jהּ1UblEײMnp4Yj 4$Dg7$sד$g6/11(*Y?hae,i|xJ_rlop~p=H2 +bOnuiM}o;+4K8eޑ;!+N3p<lwu~;*«n}XXdOdYtx(ƀlIl֕#zjeWאȈpJXDxؙP3*b?[*&|Εa}32Ȳ2zg +HCuI:SINvf3R%lXۥM|||<;3[|iH*%cﲻ +i =/ +L>SnT6;T^A׆ +/w"<K@L!ʄm>CAJRA})1' +xE>x?ؖnʉ!IR}@b%ߊ>:-9 Y~kosg::嚏{Ue)VMKgwuCݡݥ~\< `yXFc"%)PoB%q9ǜ+7P"E:Hz+mLlb~W>/P$0[9'uNQk0_w[kwcyt4&=Qx;QBcC2Gvl+篼6ҫbwp~y6!wwkXL}b'bס"X^M>V/pZ>Na"zp :< +F'D¾j!3 !Xmuz?/jQxBxup'Y$ci+vBʁʜ`{|Id]Nk,Cߺi{+oyf{^Z +/1 ore;NDa"xQARrT +x͟[ T^dt#pZ.Mk&? +ɘw8.kRܬw+W!<C/ +%)WM@_!4iOOI:T"Q"*Wz_!s"Я-Vw(`@ +4!z!HtNR$iKΌjxBT-_*/k#-jk-E!DOUS~Fn2"#h +T4B=Z!4 ËBE!$)S^_J/>B0I\ϻA5!zOx]*ΫBC +S ,妦ӧO~iGG4yp8AAAKGGsA4ˍ).z*<<|ɒ%SN]v]o[l133?~@@ +¬N\qwijj+E=Aaz7P,(i z'yk9r666lHP(***ݍ,--a;988̘1q8`xUp=H\̗$r˷Sr8y>&#$]*avp2rkcZeԳVkZSԋ|JoQk@wtSIk۾S=}L?Wt?}jXlUf+g|ҳ\NŰ~$ሶ?ZvuW\M~X,Hy<χݹsonnĚwBƻ<yO<9222%%E(vtt떖bR p&99933j^6ѣG02xL&III:++n˃x#E<o'·͛7a)R]]yf_xA jkTEW*3}C>ޗU,/SI|֘q`g1ԇ0qHB b?ڮr N(ᅰ;wn1o-g|A~JvM8xaU3+L,\Rz{𦖥 ^sE۟I$؋¶6&&F,~ pbcc!Jݻ-,,Ɯ9s\\\ꪷ7nܸi&*z Ν_lرcǨ\մi&Nebbbll#!K.uttf͚mA?;w LMM-O譕wٳgS;|(3<?L ,JaX& o_nΜ9#w<_~Ϟ=&M|`{Jf:a)[mbsqƖ?n8^ʦ27\wߝmvls_=msYvXXcEZ`gҷ&K5 [UP]G'bNoBxK?/S|`}ke%o[l27s/ɶ7vm+±676Ę7KDr ):f~?֪ë^_Eg+V*-w J5k|fn8z(EA~,X +333My ݨw>o.H V*݈=ԓR1]p8qn1[(.kf7;U]<qj^fKeљFQ!f?bn +60M +f7>+i?c<qQoXOdjkk Xf@UUUHȊ@{/X[hQBBB{{{bb"E@FVV$A/b+FF#دwwwGD:u + FI=?pskkkmm-Kdr,#Ea˾|2ñwRnKKK]]7>۷oONMxt0uO$aek}af"52;h{Zʢ2:~5616Z9pwf!4mNkjD$f.a_rtZ.obKf?~UwdtVn0MdO; _455WZx?Itp{0-@7++k/D +du]@B\Cw%F#|QPP@Fb^$Rpzzz"B;;;s8h0|g{&0>x'Oɂ%$$N>>2Y_Huw*en|]NȎJ۸LomD+*eS+,U&X[?r@$M 6r/<xUEfʐjtpPW[w-`.8t2韩9VE&?ǿ_/>} ȺtRX>GD$@xK|QQѠ +ȖҥKC<x`?NaGķ=##tC/ AڵkDŽ +W\@bȢʰ*F}Ϝ9.o=^Fٳg&&&hM +.K肽c&^)BgBٻטg7_;,P;ˊ(vٵE$'u2m%ߏ?t'$$@[[QqqqhWͭR??iӦeggM7nܐWRR\J>|DŽwR(DKee(VWW#c%ׯ_'8xv(DG%"lhh,8&x&kz:Yq 9@ju/gz"˻"ʹm]I:n;]agTդ$4(>y0ˮk*[':u?rLVG:j.sU9%}5tޚw\Cڟ*Y$^ I_Ξ좀tNdxb$|:-Ydƌ + ysQQ~g2<^tᅔ،iccC?M5/C_[sm_X--ճ|-7:95ߞ-hT:Id ۳eDF#{g]=Vq_V%]z@Dٟ+Mmdee7*(:-$7jþ *睖$710u'~oLayJD*cϧ^eN82+.<PRAZ.âD ,+Vz@EA ,Ã$D%AtVa˛/BZ899,\ٳJHaFC" 7TP +"oB ܽ^LC7XPv*@oinn@ZX9b,x{///֭{Mee%К o%777h40hxዲhjj + +xKcV>;q?rl5m5˘f.!aڂےSߗ[{`uBU%oTR^={BK6Dyo*|MMMoKJJ|_0ҥK ep +666Hk__իW4<b ))N*}༼SNw geeeee͛<yr~~>t||<JF_4NIIⶵ&|2͆W +tNh$ +=7|ꃕЙFz˽HtQns<9SwM q3+" + +BL-GKӺ?hcw9۶FͰXRovz:,7^TC7l3<IKLv}:%djSyx #U%%|T;vʕ+fϞu<U9\ .㜋T[ggtjLOf*0ϊ77ѝ$AF7+p$w諭Lԍ7?Q/G/p<hsr=FD*)2g +WB.co^0}#UC/=_^)ml8ϟƕ<^ +[#>et酉~>|xp8յpv<r544;ūoWCCxET3Ppof)L2Y$",GhδZfU[wms50rZxFLJG,\XmEd2Db1l[{/Y|89}R=636?|^a?l5>;W1՞4eݑf +-{FEzH/-|H6]Xn5][F!t.2;:,xjam37&(-|.+pU'-$)`A(`鉻>xg5Oؼt2Kuc8וZR{-^H>}/Vi;*XLWB!a>袐zO8w0([11_o +[N'*ZWaL9U5pĻ\Pnu<^:腾mLDB^T4kwI˩{2"Aށa䖞6ag-/ro>:{L^L0 W%fQo +c +ƠS ai #/bO\mpl~JT /~KIXR\@)+#^W=OLUT? TSWǃ &D ZFAA2jzJ-jQ;.@UŭE\V9A$@xYcc)c!~th}J^>C<q>_OWȏX +^1<iR*Iɇ +[vCd:LST}m/qx>>G'ZYt1 +YIX`f{{ +0w+x<~lhJf@+7UT4%PTW_/Qd]6wYBQP[w}}w㈞KE6YY>H&^?|`ЃHvkvb$W"07mq3'w:?zsX~Eg +]q}ZyMS/XӉ=lH·g{]9%#y| :3Cμ`Xدx(=F.adf0u +#R^k4E%ٵ:(eۖvYlDVM)be0+fƘ}fHSs:q_g~<o@Š?ٟ۸b~#ubkr03QUJީx\Er,?#ʦ˛bRYBBCÕHD]UIBBօoOxO{Zn]( qǪQbٕÔ;1I9Wkk%8l'xUs6-qSpH(0TnilT$S +APʠMAp9 V/?udZOank,2P +PN&FśϘ#LP0egj"jtіن0`sŪ8UȆ{oO "ẃ;W2phi ,zҕۏ59/Vݩ@婗<aw)Ė'8"^)7ڙNpǷ%l*@GvoY@o6[izO+\0reGO؇Sl\W?+;[Ftn!%fhE/j26=y`nkxGeR4|t(2}a:]]a_`LvU=rIŖNYDqҔ +$B\IrbZD|6XM2s쬦ů +yL& +O)zw%{U*R72FwY-M$\76!=h&2xnu`[/[^|ئJxw /ZL)Ų2Zkm[ZpMeH##cU"[M{˯/w6GUX;whiNB!rB`c$RHyS{)i{R(Cځ6OS*$C&b\LRO{[݂H7JffWzfǠDb!(a$G:G(W74wU\?;PO7m(\b69滲wNrGi/s#c9&0>ЄaINua>Y+y@;u2n]dcsz{hҳEvxKO}}tЩJxqzfFhs&:ktt6{xK~u+C.yU1>H+㊨Azx_,qqCX&EBEe]ཝ'3 +(09HC'ַ I.{>Vtf@8qkQ F/R'F0S33M`/都<$ +"BQ9 @@T, ⠌3@p-4ł貎;a&"6PBH!&ң @¼ѝ9s8=s~r0G1 +;\+,-,cz8Ě.2=̈0*÷KiBNv2^m/f09ɢzzKW*38,GBW5]G-8c>N%EO6*(썮onAmJp&"$}cZ*j ++{.ֈ bN[N04,S5Rޜr_)92Xs4 ^;u3x<mw(\yg~0*m.Ik<~xǻ_}? ^.6(D +L"+7٠**UP5`Uf +| +y=kP[2?/yR-9G][Z> =;喊,ߟ''&˻~O>>7HNP}͊?^ +nSQ#7K\ +^o>80M:"YZwG)kd=tƻ~sܱ4gݡoh9w= x q&x/w^ʒ$ydOzMħf:"w|;=o}Hטּ!7 +_ܞH`\+GXU1sTLK/{XCܴ祎+EMgJ>}\IUB}eV)^ԚBO!Q٧U!ʖg)NQߒYv +H$x*{z%ʮ뢟}l4̓ 3)ʩNcb*i:YyxVcGZJ/:(y_)kdM.uK$uFzj*qYC +F~P%]̓ﳖ1 +2R 8:,YOmAUW.)YRZ" 5i$(TUi{lP۹G}dMlLo +yP*c- '9̮<?UZ1/[&?mgԖ9&ygʩxT*|8e7^8kS\!Ix%%FO*}歵BXڕHO&g*HR*"3gWQ?q |PK TC>* 4Ρb3+˘lD"Tu1;<lr2IB̶o4/GE6w'R´t40qL +Be&ANX,l;^AO&͝X3e0o@Ġ2 +NI/p1ۯlDݍ۩&& +*V@a0"~%OdsIK + PYP͛{@KVnrHCM`G7_vW- [H$x̱(Ws}_SݓT+cOSl`"+y|5FRLBJL +\U;u3suOڨ0l_/&; +NqyےNƲ%Y$ޏtw:I`l"o~s[vſڐ._vvw7KC0~̷fM'7^|炉}>}Sy{~wh7o¬Դ +8\\*##E.۸,jUպuW_'ЄI{sa,̵rdV_V\HYZrUX缂kh +Xnv]5cnb}^Z|DNeDnF%X|Mu4uFn*V:T.PJ@S:@lGN]n0NJ.ak%ыNmg`<x'1L9s]7bM_I7z,dZ5xňՋ6o_J죊X\XV%\^-Yy{.ޒ@ɒ%\J.?T +VWFNR~17R[%~rI+n㊖4.s9JNBPP_y[R^tUl +#xV +d<S)]Nq"#cTy`˱IbKi] F^Z#τtIda UD*MKKҒ}ѴxÞcKV5&Ph4yyyk cڵ#$/$fh0$I{ /|;/a8@ O~7y2C6dLօ@ ҎzT$5[(Da?2{.OP@rxRiӦLnnnNNN={|>_D +yiXyTTӓBkm4ѸkLMTZEk0P0 0 +A6YDEEP,Hd``v٘"[&2;0=@ + + +i[I7p?y}ŞwY͍6YQU^#0_ +,dTY*k/,k-NpwʐlǴ֮i8($nύewlUvY3[: vrpe3šd] ^ +r|ӱ Jy.S>-T ^ +.J@}oѪJNh9'%(CC0|v:;B2?kAu148դ('֍NPD-Iw<@jTp\L>h"Dxp`@i=eq1E-J({n%]|k"ŸK䲞Wǐ+NiPŐ`i>Iw(ޡ>ۢ3;T7Ok.=.t}Iv'} +;T$8\*WYqXIP5]Wk u'_+'+귒;7j[FcN +-mW{z:<ru݆}UZ5{;sޛGmKHxKӪE,xQշs+8~1Ms"KtCK[xhq%額[J[: +=R!ƵƂk]($ +u +aGSx7PD^ݖLs>){ɯ@:ِȔWSFuɑg.6t>px2}69^)nh킹K79?0olʺܐ|vޜufs\v=T00 +oDj}jpAތ\?cƻpPwiu~)>XpC!>2Eб=z+gvHWrx~lG@UEwlh%4AP)U@]bT嵽[VLggmbEDڛ/wkRPT] +֙d]\EP?:_؛# gFX#O{"*gJ=nC6,c2ȖJRD!::uN=ڔPED%:fC(眛?||g<s=4ҿ5 +fF핹:bKU3{f@og,s*8m=rYVڒ<Q/; +/GEnpm`mќF:RZ'#MQb03A"(9Tz`8^-)3,.(9z<@<vۢ*R +yAgt ^) Ps+., `ႅ_:ĤW~Nx[ f^ +IRPq19.%5d)o@Jyu/ˇy&^)yBac_[')HB&[ .cC̾BE\9ebG% sC+kea߱I!=<odhM(xPm-o85֯K}O +fR0IiV|p5E\I6SZ^"~gR@^qu/e?"{,_x +U!ߟwshMuE,Uo\]UJn_f{!:'yX˯=`Y%Rtb6^)68*}ᗒo岙mWClWj'@y尘 4' +U#O3o58K}f)B$n|m/sƐ0cSrDyG$9h_KǜE"|sI]WqW'^ebDy;< +;+ +qߎfwT^HpRSE^x7=Co%TJr'^W^DDB1QjN}*/Gzx<7nRPԅs%vt"[cY#'T:XQ +й5k9^!Q}+|ИmU Bf˵C3iEf + +uTxJCmux8T +K?l=BqcLz)n6*8^~~묧/*w^Qi̾aҞrjJx,UD + +**"J[V]A(AE! G2$d2OvAR=;on{~[oo#HVjɦ3rt7Ne}{K;uZWkE5E{J;tȹ-f[FĽ-{JlL>rZAܹSR +L/hF;[b=Z(>}A+-t)((( +2`(G*j{cZ(((KMǣ}ϟ(dCBvT#I_GTPvF +ѽ3_ +?TG%/zdE&I78R~5 +y9(dpXJ(@D,aL*10D!I4J+J-bhb +T37ђaryVHďW@H[,^u7?+n"or«BmMLl,Ai?_~EY#CWl6g3N#=Ǯvw<>ezcPܾNcvoC!L\0pNs<# -|=a88=Wy&Az2AuV jOҳ{1(vv3sQo iGN#)E? +h;`DkVx*is+]9i<Y\~LsqcӴ5Lm7ۅBЧs'MzB=yakoz,룵!Aȱ e?c??Vt ;(<q&v1gsKr_-m<^ 1+8 +C~h4y_PBWz;5pIM(ړ1A,Vč&>o +旧=ꑉWt.i66VpI16`h8bR@nId5pъf(z6c}2Nqr3_k`d<lXmVt<Hԑz]{&JB?{Ϋʻ֛77P"b)Bobh\VGӈ#ɋ,l=v=- X0.}]K QiZ@Ä9tQlM(MY0}_A]sJkɭSCgZ~``Gw^F,jsh\#np\]Cv 8C(˻؈a@̉5Fho[^PZY)ڻQzMǚ,WpaEk3?YF4{N^.*{I]L=R4e:}o6eL +m^eGsˋ~`Lv]KZxr[HbӪfN= N[*KۃYfӦFg$G.r3ӟys@Qvq9KR +{J-m:Ɍbr>sJ֢=gM53p$އo)^,hqy'Cۛ\a`eͮgNwpSL6ֳټ%|# ^NK +ձ_8l6G ./EǺċE&snHGA{G[x^o=8(pt&sFF.jy]jebMk\iFN~ YeOZvޥ?YӌgʯjoC+'7KܜO^2 '5ʇ6+wLt/:}-V2|g˵M"-pXŴa0,l3Bt*NN_~*g +Os}A/*Y'_JlBu7Be9B{7f<K܌hoCxxe8B+ݝl4Ɔ +Xf#&坋]h`W\AEnmn}>b(+c+k+|N~QdOh?b;}ю tsCt[M_'PM]i +;7q+ޔpcCٛ/ԉǬgoU _C z^G]*jHa$.ږͨok遉䬷2BrAapm}π7*K?:}+H (-g}C +Bj"1ށW=ݝI\g +1vݻ/Ho&L<jƕC)xYm8T7+ .mH ~4n(<H8`l~Kt@uK +uw"c/M=Gu D57X4Z%\x+wV/~$Mt#ˑteCg#-] +DI +FPV<7;iiB%Uu|xN+wg5MGLT{cOޡ5<K_;` moxl'RL(8--5'#+~DG* +fHw^a*`j@ D,W!7c⊛&/14cș>kcR3L^@Vps +Z7KO+*WY:: +AMs:U6 +jΆY*ԵqyU,6٭%f5lõ_WRh",$<fdCpߙɬdVza"*R#zSw'H.7c7Ub?z!łЀXNW̹GG%>TV1,vUswXGcwqe*u⦎~2K٬Ʀ7Y9CЎ+ŪvIu> +O}ᣯBYK$솋-(Y듛%2Q"APkz^3+Btܾao +7Z2PgXuj'i{$4!Xh^uL;!x@";T2IGao)ڟ[%n*xp,D +86{y!g.JH6JƭyBӂhFa< egX/L*y/Nv2L*nc=9~,1Judɑe)jF!W4Z(aCFO:V-lJEQ;Wgsb?dڢ䭎&d{$t3LށRW_[bլѩx4#Bw21Q]FddcRu%n7XV<MmWqCǸ!7&c)/W7w0ҧvTy'0Z@xΉzfWWsi=@( +ze!L;!W&y|b?$gGS&Dshy^}˄ U ;:@hh(m +[%QW]74C +g<8>020H#D)EMD """ k"+iXP(bAY*MR2`7tx"9g};w!JUjxp*چFXBy燎u>VQXR!άE~VvFbfm Z/-\rQ3rǽsփzbIflU2 +-&os9_$BmYeNzIzwʉUn5ZQZCYhXI)Ұ]Jb2 ?oF%j{(6^79(4^K˥f8cRR~ONQx}r bͩ + 8惗yaBly@{LJcn +mYG9}ٿ2ޙ.(D:n^v"x? +%$$0 +B {V?-W?j\%<!%#춎zpNPH +)Zb8ҁ&aX5b%ޏwIJjE'3k# +?5UIMokHhNV(@N'gR( + iOBV0Z^asj}xD_DK?wUޜ8ϭ2B +K|W8_YYfzY/6}!tmFɎwVYNfK٨ĤX\l:zKNK7]O8xi}W ʖGBߔtHWSSICCM-c}&9rFWE^>mB\TJ-%{wOp H=,rma/7p5 0B,8"xgW}MLǟf/;VKm967Tۢ\fp`0ZKi6C ~ԭuԅ/!$%kUP]57} ֶV&YyO&;v?(AjE%w3+GŃ9,Q濫`R6^M'{ZlX^2=,ѵ=q62.VV",F Hjm^(7%gA^#X4jJ%0xo㽭5<ͶL}G\7k;SNF*vUӱ,ѰyhlkI;ctH:{pW#zZR·r-NF=&o_#*FউXn{R[!uV,B=?A"P_Mg~hW +HfC I a50F' Tژ"3ngdp-(6lq{]ݭ"^zNN@@#zV^wu^xC[AiJ"t +pvG27z> +o\o2Áɥl;s.5}>-OqYO;ϭʋjy<"Cc1U-DpM%?xrL4if86ID,`P( jMFPA#*oN+jEvM}!`@!P;8^wp0}vvv}4ԖpXtMAN#;81ϫB͏4m6-&`EԴKzvܣ.%JճВ[7{7HԆ[-?)k:u_lB>^Ce4yE6v Tcr\mQ"XongsFɯX]/!V*gORh{)0IdȲ:-Ih )!_$(-Ͱ,CG9$JZKRYI>^@k&.:A6 +Iwu74O,'>łæwo( +W%!+_GːlO>.zfޕ-|67Ǜeaݞx0.iby + 5/z-TE7Y-%U4c; +EᯡϮ.Mnr<aKxx_`\΄byN|`L]ߡ-R)/ +N>={GDD&#"##GRXXhxxAVLP Ԉ[0}=ś@ATTTssJ + +(..^~=[[[;cƌ7n +fujE7RZa0<ːj-/ +-C*:bLE199VV*レPȍ#AJUQce(4[anC2%./ +?9:}8DzIiќ䷌T1%_|j/Z,KfynG/E,zY1*wq#m9v_~"gF_[ؑe+6VzIjmsuwi{:Sm©k?{w:xH+.uՒ:k.wï'[RJrg93$uxYY}}SnN +gGф_Gyq)(kZH?W{~_1Qi +ۋo6 +"/)n.p/\3?)O;1ܼ@BoIsBI?AׁMNsu-*՛EhjbninsXm|/1UIATswn3{ËO(3},ON;kEC +Oeᰳ,w5 +$)4|ݎ1/)1[*fL[ztձ^Rpqsk<-檼^!?@V^}gba_&h={@w& $jk_ζD=1Ex]'</"~vr=O_ Ïӏ1 +IEJJ>4tqbk$_z;/q8_7*)?\ +鯵Rbv +`*"d=Y?ZD# +{_eUP`bM;OP= +. +d"Z$WmpkDmY<,$w+ +endstream +endobj +76 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 467>>/Filter/FlateDecode/Height 396/Intent/RelativeColorimetric/Length 57571/Metadata 110 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream +HwLT{QЋXDȳ!"jPQ"`bRV!n`Q3+XiR8AzΰǍ"[{3vvAAAA?BZ[[qw$111kX,֮]{A 7oHKKAh"^ g͛{ Z[[P(KLLÕҤϟ?WTTp\d + + +SSSp=//0>_Ģ"@͍*))a:744;PAteA }wwDFGG<x𠩩Փ'O`ԞSpREVWWǸKkjjZZZb־}3gÇ">vؤIp<66Vݻ|}})))(ӧO̙3V~AC#l`aaq)Aw533vss<<<Z[[CBBF1:990ܹsǞS8-[Κ5^n#^ oow ܹ2烃!ɓ'cCdC#FpB?~?Q[XmذS-[V\\<O BVȜ_+Wº(vww8q"Tx#3511EYQQњ5k似zN),,Dsr8ZYYx˙iӦ!i'''cV}}=5$@DݿxaZ.[HXw)AD0566n߾ +quv-33rرӧOwc1eٳglmm{NPQQaⴴDіխvvvx_x,_[[鉃7oI0ݼy3W|`cco``x\DWgΜbx_z%8Q1&bOtX~}SS#^___VRRRw"Hl桡222$^"[¨}Քٳ500BZElPzer֭=;"v@߽{=FEE/]4rHf˗/eeem&JΝRnj#RZZϟxRćF#.Θ1cӦMSLg~~>#^III;; +ÊpSz6A:u=¢~~~cǎKoߞ0aΆqݱ{a'Nlii7ҸH;W\a9Fhhh@A|;x.\[7>}rٳgZ*//rCttt ī~˗/m)MMM...VVV/^iԐZ/ACEEE#<yrWFsԟ={k"b:^ +8wvN;rƍAOZZ$&fff{dAA"փ`fwǎFFFrrr241:Ye(ֶVQQQ~&n=NJJu[nnnX_v*pgxѣ3g΄uttӿ$(ȫ{yϟףf#A~[P,xΝ;?NLL~o.bccJJJGLvڍ7 +~߿aYYYϞ=ÞrAșvtt@PWe_U2....<9';{BH׃ؓ GU\\r ȺFFFȢ,>}:X^ERTTĞA?H<H=Dkoooll:t(>>}w1pmK1 TUUsGx<^mmmuuu]]~|>[ ~.RNVaYs`(k쬬p]סOUOۛ?}APMrZj^8aDUAQu=N)nmݦ#:4ZoΞokq#/AM +ϒ]Y:$h}Km-V\1{g3͓%:oj+~ 'a_<nrZ&! $^ CcβoG_w")ou(CEMMMuUet8:Vޯ>r(pBrVeWMT]ֶ*Q]t]"=B/ %C 5%17/::tۥGoymB':rE~IHB%EcȌP%g' /eqm0 㼉ARl֡ݎڜ:K-Rz˫ζ/I&!$K890y}֩r\557),B3Ts9:Saa]#b#F@? &VY{FTNF3ɇ=B +=08 zW":g[ke=xT8EL@|iϤZ"^Y)&KkR;H8H'sQ{va/.M4veIc(a.QL~(ELeQӱ<Oã +8ogRa3W<֝9mۉl"E@@X(pzfuiZTROoVXb$6CDܓXuДQIo~LƜ:89*RmQmì1ZyW\Hg#D~a5PIm,xŷ~;L8HcBֳW<օxrAƯ7 m23Y}L:"^_ ^,Z!f2FޫE遚1Gʊ uLl)ZT|^B؆R!?<r4:GfI~Juܹf.M{|{`Nt9ND|1k2_=N2,8>Bɫz' |V"^EdCtTCӞ$ҰH͎^kDƟH*1n_SG,av\ً^TQ*^ NʣdMx1qPݶ(o^R8h|hrIp@ +/%{orvfΣ""XX\VKy-CCE)VGa s~w<HmkBCxgܓ>`N"^Bo$rWt9ϙbiZ3%+V +U,6<8]ik'n#osz%C( PWqߎVi["@BzejYYy7[v㬵4T탯4DXӋLcbh9ohLTd+XgەcPJU!npLF;Yzs-ShZ]C4t7Dl-<=[Edpi$;riYav14b4.ivi)*{<Q[t?\;iߝg9}~?ۯs^7WAbbʕ+Wy暚Ы2cֺEܦM +I,l(xv[g{UĭL=?\+_dۮesuz\2cjGXlv^-UN-?<Vx W]IjEݣػ3WEJ~4JXU-6Hn_prv|_vٯ|yT^s!W666vtt|bx J.jnHF:[otf.+TuOB"q +|ꢂĚ5kJJJl;_6[R}_vVz@'OnllԟBܭR(T*UD")//ǬL&-qmmRFx]]˗/ѐ^@j>Y\`Eqhihhhmm0<O0ѡoP]Ѝh%#DO2e +?2{iMaÆ'O-\ԩS#GLMM\.q㆗*mll!???++3g3f_aaH$ + +=z4}||b1ZAcǎE34555 v477_|yAAAo=;BFFi#oXMޫN,WQ_܄ +MLL>} +G%/_0aΝ;a{ڵkȽСC=J7GVwuu5jׯ;֯_?}ŊQQQXUK,A W՟~Z?$wkiUCL|ر\q ~ݦ)))Ȩ۶m]/^(h"FGG# +B$q|ؑM6!?~XS'ET*ŋ`Ȑ![lakQ6n(>*^֭[P408z~ΧJT/ܿ!~̺"^Bxu +!F''']H$rvv(^dTzvĉP}ii)nq(tpp{="Ώl24#mx -^0""<s\.o{+^Cmʕ mf>`0:WPгBK + + +跀X, + +u7&&.xG_/z677wРAiFV %x;JJJN1gҼ<hpR>|hkk{n&,{(FvEǏ[YYu%^a1ԩSZrۇqtCG<(s8|Pw=CB{@PkKNND"iii rtgϞAЦI@@@jjs͛birrjΟ?U??#v*^R +eNNN<S2ʵ0` + &-! y$(u";p{}ފAE.6/ ȘEcPx|>dMO}2 "(s>^#:'(o>GLt(=@Hά#p"J(qmIm.)nid..|Eeש'kfM^l-)MLLiM|MZPvt;^~2yUb 3~niT/9-W7jPbؚSԌQ=H9i'2egGiFD#EV^jBixt+DC]l +,4@h;SKAP諸ITMsW&]vVWQStkza/6RA"Yc4iqU?Ghs~N$e8Mx=55U +f7ˠxe3f||"%tśC(į8ッUnϯoǝ(\(^dBm?[eB5M6z]5W}WyA +Jom;azTDHSSO"oS'P(lb\tkM5'iYhF5oL$)74R!f#x#b]/<N-gSLGҧ@wc~z:L^("(ŋ(_p=ʕVȈ?dOuɗ/]!ĘȻhŋ qe~ndz+ 2o45YКP"'P C2 +B"Q(^AWEcPHݝ`0O<YRR"HHM@WWWmmDDDx7 #ys|}}ˡh2lؕ{zzv4 +^^^=vq:e)+i_6gk4KiacGEGق/)?qAvvN/,,rϏJΟ?f2tsv}͜9ree̜ܼBVC峤_\]X +5k<p +{aXYQk[b<Ȫ2 ܽWjYMbWfw;~]ʩ;Ol`0swRI3?_[މ҄"y傃srrGG#Ede2CCC +Y%H;sC ?~ULLLX|>n +(Ԃr)))Hx#݅G ʄ۷WDDE/$ k]btу吇Aހnnn]8HqI#KzVd9c>JIqU451/Luu\od0ꝿ2PP6!iJR1J3Rӹ:IU$67 +}m.3^xC{&S.;AZOO#~:|$RKKK A`NKK>ފ +B-``b999EyVE%crG&6W^%`uEQgg'qY[[wOՆSTW2:yI#Ugee}!/6^]H&ͳ:^ډǬ #7v,Am)Qk^xl]b@A]@u*3qt]?ua<s4ľcҟɐ*N{E*#-<Nx9''._&w4(<lllZZZz +F$&&"FKK9s={k^H8}th4۶m#0ՙa*xuVTd!ihhX^^opq~ʔ)qo߾M\]~~>.ͷ=N[ +^gJYZ +SfЮ<jck:pG}CYxhs+ݥV&M{K~XfifpSоYd)RjiVCF3efϤ)j"/2>S~xod<;qrvvF腐%%%L& PQQ]]]Ⱥ/w܉TRRBD~?zzz+W|;e0cbb` v%Kܼy늃w``ڵkNBIpA:''GSSb<j + +%"-H* +QÎ;bZDev;;;F(-i{q">v:UqWo->Őa^a}&TWM7ّh-q:3믾}M^Ҵ5Ly+w'u__2o_CV'U1"XR`ǹGIms$N*!Uxx8QPP EhccclGBE, +WGok֬I""Ϸ%J85xxO8544zzzC}c<h= +5 xc<jC˖-ï + $?둴499#?w5Ԝ0?S= $ݎ:Faڞ;mF*R"hUoate]qj/cs8ZSsph$ %Cx'T!:PT)j`nn͛[k(N rȋ/zxxƲ2???777QLx1Xf#gBBELqF[?j,*--,8ȃzUP_.`1{_&nS&B!e>ĉ(C:CRN+MK]VSiI52?#{p>=?;ofdnKJJ-ZgA ˗/g0@ Fm|^~{$b@ T"J[Ϝ@g +]_}^C0nyI>]O{7M6n+7l^ĕS&dMCrۨw'^Lh\aVS@> +\5`Uwe-` +Wڇمۉc,fm9S.Qr(^Ȼllhhdyfn݉D#GZ[[Ze!%/1x7bfSSScE%dQ&+"3E,td`65656{U)UmKF=fYh0}%z$ZEݡoxMӘڞ}BL]>D10Hfq/BV$?W76ii(ͽWF>" xX@B% ӲXx +B&<==lч . +ƪ-Yj F2t6"kkj>/ ۟ +rO[A@ [p.㐟ggm+lPy6c]]a{+㿈녿u4;DC7]%j1'EA[%FكsfL2"'h!7w +.q +Za@ oGQyYFg͂Qvն8{9N˺+\&R(]zVq=ᴷӨa#IKw' +:߳x_/ųZxzFKKr5ZeuKr)jQ.7izCm=\R/4]^6?,FzFFzw}?tUxj`(@>YpD^Ղdken2f(anċHIcM\=ީ閨0aSd1R\c|YzlQ}*cf>km +JUیMqb2AMڱVdX#rη'H`r^z)`*pI*MgXЃh$+4$.h^[O]8dqs|/}!Qgap @ɞ~)YDVyT.ŤI=.{97!EjoR͉ +/> ,aWje-߬ͻmWT"dD#ǕtH(Qos}rITP?(|/zMx19_JY"rr9.1q[qfWטDk#skRO?♤?>G4+^ZblWlGޔwf=وh؍*-FI(䢼r%Oyi_aM]iCAABXsM*e@EFUE +⮠a&@*:`qssϗy/_wdL P, +EqkS!m +IxJ0Mש#Daɡst=9='̕}ϗRG"'N:u,%H,SZ[_bqL"\ $IJ"B['C&@!<(GKm#D̢$^1IAu1&ǂ^:XH_6 >I +(KDr-3Ig8(miS'Y{UYOcQe+]-#oyH!Cg+ZxIԴ-gU +9sb_aI.E#^l.5L,+ X+#.m7Eb$SA.,@>gN&u8J[9[y-Ki9<|%V=@/7U> 9(5k]\ e;צG̢l|C$&^GciXw31>R}YP +Bit%esH@*BfSzE0kզk 7bW9`t/W![OMījij9Ho8^y]M3O,WweZu[FqE/9~ͮgg-LJOU,];+,}MFX~+FnI/+`=CS + + + +,;h:z!"B~Vk5K¬|\L˞.{~3pԍ(kIX:Vۺ~Sv8SWG_}%"=^5a8=a'fNa e ;VW?fg[mV +iYGB~t ?/&_PMdk +S +ryP]v鿃 H"Q[o"'7kk]=02#z'H -#VW^гrzK?f \f>)j&)U4iCx;,.#Q`Mv].&'=0,^NSaRYÉFK^R}B8&YzuTTZU+mU^ +*:we\ HsǼn73{eP$%!R&FǤX,1[^6#^!65kÕ/$dgmJB<G5I9+A/~_&Dv^y]T7 +?IViobj=Mܿx=u&M~^Ud<nCϟt}!EJr69LmyvIVwv^ڿFUf}p%E("V`Lp{Umghϥz\O / +˸R8[An_џ>ߏ4IebӶٟVFa#S"7+u%Umߓ%wB +l0 +*ޠ萵n]|V+W\=8s9!<t#[3Tj(x|r˚y2ߘ:J5ҷvMn@^Cv78`K0YC +˩, H43|ë͙_wzE0UbTS6ՔU54S;^MW+psTnU-Ί۸홋vjx/vu7ՠ}@qdC7eH0ujCw?9v}ٽCxu-)>Drٟ ` +zk;O+GXAExϗyw[5QxMfLY|#s>'MX%+̞η7ce"ӈ%ow鼃qWLl$+1ِxJYU/؟P%?S'QR`GwOMy<kSqe.:XbvӜmF"7S<(^oߙn9]o-Pwa+P{OFijKW U#e*aU<KyK}u9<,GkW 9G6DzMuF92HG?ЉD}l`ǃ [xAύ +r/zU[Z`w]C+{_KBbo<9KqTԒV ӵ@CXk~X|9s~w}F#%,,|*x0ltn*=kr +R8)RkqR*ǒZ\֒zfP)KZ5NcC hԠ0BY=SZ0İ7GPH1ari03cA$RUs4;͡`H2Z@gg?Ǻ͚r%> b ^M&"Аvܴi//hش;1af~~~AeW|>~ݝ|EN_oC&88&E$^%==}B%??山c8qexR`aD2w 6ޤqk\xY.Í!֬Y7 +B(**RTpc +¯xnڸq}*:pd{١O=}N(*"˄w[GqkzBL#D_nA8e|Ct0hc;<V8N:wß]>2D(#f_D\҉#A^^ +)a`ҴP_ABiTyl_;ڲ3`!0^5LtecVXj-p)xg=n!8ݽ9n^$IM᭹qn+wKV&>Ha[+`RQj툸A/0ШT:L\Zshqf9Vu&s{lfXCkgkWI}9UW--`ڦzl^~n(oyԠd؉nRFWި)R':GS=GVVNʍ&~He,Ωr:p|$ʍiͻYYH=偐xmNʾW杮wwZ9FKҚ|xIkrۏrNӫ2j*0?MMOL.*b+(! X ؊ 04#l* b/LTb~Rչ{~[?x* ,+ٿR +К;7 %#F`mf +Q2V)Zi.d/s{/4)%̅`+O +=}4l/!FesqOK|:|({'6|T_Mr+RýEE +UYs"o$Q,\oQFdpZ:_)>fg W.rphϩ+s6IOkT͔/lvX3t59z@i>ka!>]wj.emŲem<͂&Jf8]O5/+p}\/QkY5_.u" + +^jy6N0~f[R>Heoڷߴzڞn\UŝHؗߥæ{fKG/+x?K͋';/ijeͧ{soS +^T33ٔs3sɩVrix}+~t>| + e='#Fy >;BbI{FִH0ɼhPT0X>q#*fs"QӉ_!%/ß>xtݨg܌jqeDlA~/ +,K)t8] uüj5 +..(j,ڊl + + nAP@6AdQ@¢ ; +ٓ^e*lQͼ߁s˭{_^8k"UZT +Y<z,t(6NQ)[Y; +?+j[Tگh(x!qH +/<AZ<|>澩DEj$9YrZ 4LEZ 7ϖ~w@g;'J.8<ªlj=d~f~]K-K#|K>Wuҹ)f\UM)OTA>iadh^?raNOk$<J +0G0gqINLmRtDF䐂Ql9]lUzsS|G:dK!MVGG&/0"l0t4@ܶ!Qě:Iۃs3폰:,6rX'kPsS@B,KOy}SRanG$i;lDžK$0 +L*V-9Q}%3dX1$mHDPAB,Vg^aH[4_{t)d\+־r'yUˌ4FN톺GODjL]}C&MS[QWyM[0bx}azt!ՉnTbM( +?&-.De7QPDA7(2FC@\ 1<;J}"\ŧDQQVjޙ_k13QR!շn{.%O))qq߽єU%ş-J%O)X?O*E@L\R_J%ZuAeAaUިC%2$^ +C%2$^ ڂ%M:}D!$RK./eEx h6W]x hJVò:^ ʐx XGr&_JY zU|~Ixse䂺k{AXD*q&1,w/j=S8/*%^%ǭ;<I? РjHM-7^w/KaeHAVKaeHAF+-|"xHATMۋa{<$^ U[DqHAR~_O<<kEL-F Kaݨ=_FQ`V&x :O<RK@|V<KDPiT+^Vz{*$^ ,TgGQa{*$^ ,B"ƺx"/AÞ :^ + ʐx (^ި5H&ke?F߽G攤|_Amk6J*E( +u*|h+)s'2|"T/G5LjҥKo.//7~t:T*m999bX(BtUUϭrf{*$v`4sss݃SRR#jg77vW !\n:oo˗/'%%xqqq2ݕ!ٳgBBBB߾}] k)YYY&Mq0ljj{H$HOO7Ld$XR9*ʜqW^q\jE円9sF؈:L\pŹg:μwŋQeYTQnQ1ih[ r}<nG܃8MBⵜڍ7ݼy2cϟ_v-l> +!Ct !ӎ7.55Xj߽{7qD[[^z5رc(~#G∈<tATpѣG<ykۇ'LpQ\O<nʔ)ӧOpzXzuii)vQTTwީS3F"##hiӦM>>>h8&&&33sƌpϞ=j3jZSk4yNH#A,B0̖/nAg~~><mڴŋC\{r +$!qNmAxd˖-x59s&fb`Hś7oh"__ߞ={b>[Z/Zz䄚X8k4ׯcbɒ%)))555o߾EW(<|L0`q`fCaaaիϝ;wyxˣGwk%ylD '(Y%߽ 2dߘc0:ō?j5ⱻ;-0gnݐfe2n`` |0<Yqu8vYҼ<(wNjjjB:t(ɓŋR8;ùsJ$cTnRǏr9莼!^tDaQPP6l#*pqqAes,'DZs'2|"THRXX8hР;v|c,tR599y>}A xa;wzݻz +jEsuA3ׯCќ]x={uBPX,FYAX/2*l.ƣ;wBhې6D]\\];\)ǯ7**_T!Tt:e9qӑy$qH2$$kHpss{)'^IL-ed_n2/ِ7n܀x9Һx^z=RLLD]]bň#jjj֬Yfrss-^Yhn,.^0卉i + *++xv2CgΜ C5ۥKH.DwN#[H+Wx333A2ѣG[ZJ7lݺkz{{DY/7P( ^;;/_>EG6T*!^'E2 %%%!'b>g̘蘜؈bALd///śr|ELLLĺOni](m^x;/`-[?.Wtt4BWZXXiŜx_t0ydx{c`pW9DQqWAnPV"lJUT]{+raeuXֳr# +#C{{cǎC:uj_шٰ(nHAAAH@@NGF/F_/% +fGDQU"A:}Cׯ{{{îp rYa<I|!!}Ae$ %dBXi@DATd#GD/$fi@ry~uDǏϝ;`NTNIIх=cKhDҘ1FFFx/DYOcc#'|-APdffBD$aEⅢuEBפIp(\w~PϪwNpJŃ!7C(MJJ^\]]e/^ѡ +wuzd7)i)h@T[a5;;s t3v˗ϧtԨQsPCfDž:Ur +?k;w&&&VVVT|nݚ)2f|-?=/PGӥQkg!(^]M'/)Y@ƲГd24tQ\9L)cS=K(x.fo9'ӧx+8'k^9DJ`_n&Gg! {/Cͫo2nf-B%,VZ҄el#]'ޓZ+-a+^!RŭS+9/Oԋ=e(c"e/, +ڥw[9d1rˍ6J9h/ph|Ej5ErZ֢}2gtÉKOR{o!toAH~gbJ[[yBq7"oG,1pbeAuc>;,ū6<ei,Dٱlӕx~䫖2ʾuollbllj>3_4 +^u]nea4kmV.Mxq$U{ko#1v+wE/7jEЯXk22Z?7p%펀`)oL=~f\Q.~e +ibPb@eE>~r5,]\WĔjlV/7\Sȋ+睽{gwjU.ݳ%bAvY\@ 0RUU T)v#:l|N:YߑxU?5g2tiH푑+]N?a̦}>xwhxW"~hj@_Hk7Ѩ6؛LoyT;,o8mbmy<T{uŌelf0ze-R +TrBHlўJܛzrq˚۵u,$Y̙Q}>yq^3|;9GHݽRE`#p~?()Ye>pљ8%/ |7Z,ٔA}!вH},$,Ʃ):ǿRUa7®y|bfKT;x?-jB5JiݶܷmK|kcsތ$k@ ]K_ %xa0,,&80k ƅg +y#3cErb7ƻb|[i +H+MSFm.:~Y'%6yuw4{4U7 +*H!қGYv{[{)h.;?znS9}foasz +R"<`X9:::m:v +ATbcAMΎkltؐNB9{xtfs8Ȋ`\"{>I@+V]R3*yYMd+_?^.wZު*]Y ]kOǧ YaZHU3@;GMdT)8<zQ5=µU@,J2SϨ$r P5 ֬TBo:1t_r9ⱉq5[Vsf`BϲaZMKD9%eLw85-Rbv۵7!DY,<0{- +@**;:omP@NGBs6E_u$b2RJZsKh|T?®BNtS-.20U-;֛Q]Z2"%(MpP䡃|6ubtD9{'|vkrԆibBKkoL;w˻f8soxpj˚n' +?c«8i-ZhOmo4s^ v9ZcOsfdPZKC:EI $bⰵF,!拈*1xO5& +[b(I(I*ܭ$t%PR&!TFp%r : +\w@t 6BN;1o7Jxӥ|7 +ۚFY}&rZNV$6Nh$_jhyvx_aźcsWVPS:tDR<Q\>8&㦃5-Qɪi|&x|'*j}+'h]Ϯ!Ĵ"2ZaNp9*I +쎟:1?6"7 +y1(@i +0#LBr,>mo}Mg$Ÿ}Z>NL5xjSWchfNwE>n/l\_bA?/x(=wʾ!`"d ^QVZD%I!VB[PɕcIuY2àgi1ìϬ3N[:s_ޯg~|}5,<L['XK<Kc(-?k:ylƳzsr:>K~<HI*R'^U +[ +&y\sE!Jj:_T74k/(dSE,9ƆЯ[Ծ`C궸Qf~}PxQ}n' H@x*`sVB^e]P>_RXskX`1){`mH_Wr{} 5$uR,r1(^*w0V&FYDͮu(ONZGRYScƑqNڠxp0R""ƻË/gsw={?knWaiA@g$H,>|=pD~/7I/xJY-n\5$؆1"ERRR+,Գ:scPnҌx0e14*:B}zRy8"s, >okx%<௮⯇! +rs{Gx7=U6E0eѰ.rLxujP ψvҢV1UͤG-~pBKKw19yt0TYCE[W,mnuŻ.kZXؽO"XDN5$#A-55 +Z'ҪqA>{'u!2=ƥJ~ꕫ3{ ;VY6|l+9 pZ8:3`|4+t}F{6SI~iմϿY\ӹA!yL6ӳsH:b + ZOm%6\n ).*"`dKĝ1`q5 g͵5 +[B\T#<dZ_QM]i +eY +"$BؗH%yqn + +:cO#~s{w/[5wbйݏ@(|}_z.rI6co7}.춱[?330'ɟEcϷ [+:ʪkru26;XY-[s-ٛV?y(t%47ȿ˘lYskEbCSTT^zIڻ}r3^(bpYͭgB\=!Pi+*8@f|&n!YٹR\~Ė'VdV +ueADMGl6^@ƏR9D۱'X9]YfS{Ρs]0'(8dDs;]k;Xl6$}<nThdVj1hD7=*+<P8@&иQglM]ßű4!PkEo"rJ/ p@ȝ´lI/yV5 1%f6. +@X-%^Pyֺ7^x6\RY7Wgz)7x[ݠnܯn(af7?G}軯x#Zجx.fCkgF!{==]VGfQ+7VzN[?5H&{ڏx"Lx5Fu ]mǍ]._-A ~ĀiV7OwO5DG&NdqLj(k+hcnA{ZqPKZ`12HgaMm'Ƕst fno3mfRgJFcq\V>?פD&L(x*DGЬ6YL0VEU +W~YƗw +")81M +P +WY-qT8n_\=Pb u ^ +TS^nVk&&\\k0ß~@Na`MhWs:Oܔp[oM^X7dK +)8 +D +EC%M lvliÌA3~j`cWwJsL +Hup]\uu_zFƧ_ٿt q3>"Vhz6J7i<D:{o=Ò\:N?D',4M 7I&VeHz&|x3Ŀ^ojT1KЄ9Q[Sd4u8Gk: +)=^܉SaK՚.:Z*JۭL-C8<P#k/PK^Q|CDPO|_gW'^Cp= 4 +1 +M*!B|x|D3^gRm?)c*HpaJĠy:X0&LkOL.AyrM)W@kj, +%-xQ.!ɔDUBiBr z&`M@R(9?9^ZeZ>ŤJzϑ +r5sveug"дk~w)UP WF;v6 $bQp#@[i-$:#^aV'GG1O^ɡǿО{){6Xkb`.!.ds]k~0uAN0q^'Za:ji͞A`WF\)3/2qȳ;gIWے8$ +\&頎$L<0j7ԐvTgum6]T)84bWw([ +3vKm~UZDDTLLDTbf^7H;Jca8bd~zZ9)SQؑ8/5ÿN]OnM`n5˨ 6tAjw5_.YABM}թLǏ# R+b6"\cT(xtłXbDP=醵M9(䐛V;F`vn_T#iXz6⽷nÔvNj;(7!/3Pƞ\?(,5O[PsUcCG4?).ijet.QtvuI{{0^Z19;-#.PQ"ly(3T5yd8X;><VWCuc+8~jWAY7&kTd}Bjn"I_fs?'x9jɊa{YӇН+utRur R~D~AAiad|{vGma1#xFx4vvx9=j{Rz +&&eOb@جS.U=.?6z{jXbdln4e2rk\ʋ+wܣ 'hh0zm$_XX,x#59iSYkwp~CPA[v;!o%!y[y`XxF.jVWC^gMsn1*'#%v Ex|/2%mSREgj4AB}>dc3Ns +/_s8mFhX$gCQ%--= +==!$9w8'R^db)>\s\bJ2 'NF6~CI$ϔyX!`!\oh:3O&1ZwMjw%AA}I1qt6}uFײ2ϬUR6y6LW*z`Kef]|77[Ƞ)}Yqa +rR6q9fN +#3Xu;bV|%.y?X4f'w_t|^nkS=_:ш5(4SK+R=8^^M:<,FnPi&iM$x՚IL魴Fب. + +f;OsOꬴ:n2h44aBL]z(P`ABnBєeg$hJMIٸq㇞fuul??AWh:odx ^ W4[) ruW#BÛ*Pi\ad`ׂUr)iӦ蕞燄xĴVr`,Np8wf5}PBn@bq'Dlh(oٲqgy4An#k@x`x!wፊl3g=S؞YSr N/al˗/Ʋ=`xax!u^z^ȝ`x]׃B»b +O oaa!İ=k`x!w=`0=SJKK7lؠj){e{ +geee^`/NF/ۃ8fyд$Ifpd2=k:^Ac2(WO={,.bאWC].*{28s}̽^i^](#9[t"V8Ōͤy@fm+X8|AGԨ+0Hmw}ך% qPVU˅qqskZUu]6Cg{Ϟ_ؾfhvh/.zkIm'tWif.V,PyCMrjĘdLYdZpIWw*7-Ē̥ (?q֬]N:1p9NҴ(kϹ~/Mzݠ7/5(ѕeQ?7KP;̎sir"a'㤛X@=vxpffN܅|{{+fʐS&,iަ/#LZ\ځBaH$ /Omub^$&m^_z_1q~ +i{ÃU.hh=9=2tJn8i#+RuwwI^<,>o6t +~G5ufNǩVQ + ƀRERYslBUĢQD7a60 B}yy/ +.Uw3ۈq '3/XIAғh@&㗝PEz&{(lh Zec#@qO]ȫ8^S4 u7LkI +}XAN>`Tgh.я*!P#)/;hW,C(E"r+bP&2_|0^7 +֩W]y00q'mȡ늓,51/bɀHx=ݢo\8Hvuf۸ۭl.=;6E!}U5h-;GKry.X6 _F9g?Mx[njR]jüg1VqG܌؇b)ㅄl͎Mbl/ZJCdGIi#3ws Vӱ0^<W'{I!^xFyk.ijj.]z-_4cJ:) +LO{bQnKK[0-ؒdx+&nR]<m2bZ&ş4ޖ#VWWZ<"ߟ0@`6$3eA*t7̅f n(/+gU}[2}fc IՐxkƦK}Il@ +B[ .|6vovz ;-x{B1~'vB_uXX1<j$}Lp|-/ZM%rINM6/$k\) +~iH$1Q {˫RO#SLf=!$5LÛ +XmqM;TeS g¶}r"x+/l4Uu+C VG AUt%r\£AVq5Br]mn^:n'qNo?7 ^6|q ֜h3_k#t-6E^w2H1nI.'vfYʐ)7*yUf={IM_+!kĵZ +ك?|7'7qWvC$9J@蛘6DRhBP$lBy<mcGtۊrt괓ĩHEBN4E+ʼnv8l7c40ٷgqQn:9gޯg~y?gb$åspVX$.gs^yihUu+Bmm +5Zjς+t2EatIF/u@8x3Ol_cJȌϲrd!^KL\BV>&dڻHZ!3a6v-}wbD1vRCcH}±&J3ΗV2(`V7Ն)^w7I]}`mΦt <#h wG60C!5S"zwxiG=O?$`nWr.sȧ4ޗNQ~+AIF[.?&3_ +JWpiFK;pzSǒ:j(mCC##CC]t3< +SԦhgEaɋ;ViTԕtWY3=-OxA?b9IUGmhT՛oS@Qv$Cb!4T5Lj[<|a2yRPMlVWcSGi-Ad|y%G9f8Uaˑ[ŤFB&| +6X"*Nw-ij$d8QFEwXU7+II5u\敘IꦛqϺi 1]`ҤӬBC{kUZQJ wzG + +~a:Jhֵe&L_[5BMRurc ֔=[[Ir˝BB#XOxy;S +:s\zM0QA}Şy'^E%NYMDRsw;tu*pC9`b֧`V+mIUUm4Nt@ct솴Pg^xJtB42$X]#éA<zQ|'6Rtl\2+*X/$`u}sľc76_s*q'GOiOa?,K +UW,dF'gKw4ЦGjzy~J{&'~ +芡)ܛI(L=!'hڝ 7< 0Vf/%To͙nABi OOvߌtúW(Rc qxM-$^tBCϡAX>Z2(1fHyUlБg<Ί$x/蹤CYO\~57 er t@!2&h(:DMr3x ^"L%><לڈ5Ny±G*;^y^WOo8%n^#JWܱZaeSL'lxg_X/-/A p{>WBsc%y=, ^.}Tdfq/)\B%f=h.48!^.xRb'C4@,+'?M$ķ_aKKropm Ju"xe9u[FhH(J\&&;h]M+usS@kmQr<GF~/mh*5,dkg?|Ed fK<̴|MT=9rokV/3w\^}VF2Em솈+m{! xSFI]`<V|F2NtU^^X +;:`j9oHp~b1Zu)\q +bŏ;_m$&w@Ne_s,a%0ߍ +rw&^#@K1RFms<L.MX1@J#&kSzlE5qDՂxA3~j&AIHe%~?:v1cGJ([ll$ϝK۠i}fw?$b).B7&-Uz2Y+؟=}PGs-̍hI 5. +sv0vU)yZ&/5=i/ + + +gLu>KH + + + +ʇLcg^UJd][EW4S{pj` +rTha Nax赠ߞ x`BA>"ۗ f`%)W8w5 ȭu{U܄~VtxNccD +xal.}d? +:fW"Dm +36Zw*doE.hp,*R|Nl7U rsmwI)k|(>cګzC ZԤEnqDv@My~t;PIJF]SX@x36;J̔\r/\EsN`$LV韒^b)D0;³f1H$ +JHzLh1uRx-Wk*XA$H"WjJ+&oeӱjm]ӈى?n0RP3]nݾ73nFxX)`$M\" +P)?*((((:K"brXϐW"LCLuݶTUYH|FDJ&1SP*(vlߩK϶M"n\(c-AB3OkI|`6cf~BNw;ގ34N"{s=\S~S5x?{,57_>XZZZXXLhdpN9 >QYreRR⅛^&3Z}ӫ3 +"(:E6UZ/"hA۾(`O'uq"qu7:Y" 'bV]WHS֊o+|*CNٲclZM%SeF +n{|aliСpQe;}z~0D_Wnmpmlj.p58ȭ0FHﹺ-X@z>ie)H\\&( ddd1Fjj*@c4x:^zۓYwBeˮ`rs]7_cJ:.,3Lmr_<lA+L0&N-T +;^9-7k4>Օ|Z`_j XyR-~ݜD0~˙R3sJ[h"kxÉu4//4ЕU5DohћlzeVkiv×C&$,-dxc lll֭[;vw +~II $oWWWOOOf$ ^Dd +«ݻwAxo~d.MOt73*emFxmg~2T2-Gwfxg/M%9'sOr}7W뛅E4mk;Jl;nȨȵi&1F%XYqZ +w@x5S*f|5!'fsuGZEux-t4Ҽ *cc +}aЁ;/P=,O.pB$KWU~e"}˹ևF$Wuaa))c/"kfZ:\6cw +Q|s[C\f'Oz4\sĹ jVueBk{C>|rju 7;/4QP`8/Ȏs>y,%\3\dTJP;w |xzH #(}k_ң%-"rByxnhz-»xERW!HPpoof'/"8`K``[ 442}C,l|toH&9p$2zdhsTS[4g-nNΛl1c^S*a(1X@x5cbn7 پڌi1<׳X,fXOϵ79|QѤT^Zਨgf"ǰX^v:vzū4<8~Ѥyz|}VlBmcBYʊwtq]CNq)/ lo! Ðurr<NxO8LԣGV ͍tuui-V~~v:o?+\T<&ӡ'͙3-fx"Oqb4c:eӡ+|75,_""olZnIWѥω8bsT"`4Ŷ:!F7ܑzd<0I\9+ ꘤*_ACV4>ex^j \y3x#!QϹ~f&B?#j$T[<==y<ǎKNNA;2(rjxB JB%Ϲv RJ_q9/;D +!c[.GСeJ&8\VYl +aT" +=D4~.cAj5 +Sv8UTfyAw<Cs閂8zԲ!UIʪ^dzv+%3xP28a^U$B%ițڱ@^ +=MZ}b͗5!M7p;7ܓ]%Qs0YYW~W~\69"LjQ].练kWnUpo+6G3Y +!q$0b~q^-F'ɑ}j: +óAM]kvVb#~;\?4"7 +endstream +endobj +110 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T13:49:29+05:30" + xmp:MetadataDate="2016-03-19T13:49:29+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:B1AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:B1AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:B1AF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:B1AF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:49:29+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +109 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T13:49:03+05:30" + xmp:MetadataDate="2016-03-19T13:49:03+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:B0AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:B0AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:B0AF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:B0AF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:49:03+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +108 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:34+05:30" + xmp:ModifyDate="2016-03-19T13:48:42+05:30" + xmp:MetadataDate="2016-03-19T13:48:42+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:AFAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:AFAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:AFAF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:AFAF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:48:42+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +182 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +183 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +211 0 obj +<</A 212 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +212 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +175 0 obj +[213 0 R] +endobj +176 0 obj +<</Filter/FlateDecode/Length 1249>>stream +HVn6bE+I +~H +Gs=/m< e4GfPh+xtu{^fS~ϟ_X2<BF(( +2hD1$)Zq*]ٓs-7KrGuSwsU>hbyhxM-UqqJ㳢Lo*-Ŷ_ + [uYe1VwPLJ i%ЀD84wu'-5&e0:K$(oժE);qcfvU53@R7آ[rMnNBd2"qlS]T! +endstream +endobj +38 0 obj +<</BaseFont/ONQEFG+AvenirLTStd-Roman/Encoding 92 0 R/FirstChar 31/FontDescriptor 93 0 R/LastChar 150/Subtype/Type1/ToUnicode 91 0 R/Type/Font/Widths[564 278 0 0 0 0 0 722 0 278 278 0 0 278 333 278 370 556 556 556 556 556 556 556 556 556 556 278 0 0 0 0 0 0 704 630 704 741 593 556 778 722 260 482 0 500 907 778 834 593 0 611 556 574 704 611 963 0 0 574 0 0 0 0 0 0 519 611 482 611 556 315 611 556 240 240 500 240 852 556 594 611 0 352 426 352 556 482 741 500 482 444 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 278 0 0 0 500]>> +endobj +54 0 obj +<</BaseFont/ZOYSDK+AvenirLTStd-Oblique/Encoding/WinAnsiEncoding/FirstChar 46/FontDescriptor 95 0 R/LastChar 116/Subtype/Type1/ToUnicode 94 0 R/Type/Font/Widths[278 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 778 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 556 0 0 0 0 0 0 0 0 556 594 0 0 0 0 352]>> +endobj +53 0 obj +<</BaseFont/JLBVNQ+AvenirLTStd-Medium/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 97 0 R/LastChar 119/Subtype/Type1/ToUnicode 96 0 R/Type/Font/Widths[278 0 0 0 0 0 0 0 0 0 0 0 278 316 278 0 0 0 0 0 0 0 0 0 0 0 0 278 0 666 0 0 0 704 0 704 0 611 574 0 0 278 0 0 519 906 796 0 593 0 611 556 574 0 630 0 0 0 0 0 0 0 0 0 0 519 0 482 611 556 333 611 556 240 0 0 240 852 556 594 611 0 370 444 370 556 500 759]>> +endobj +97 0 obj +<</Ascent 924/CapHeight 708/CharSet(/space/comma/hyphen/period/semicolon/equal/A/C/E/F/I/L/M/N/P/R/S/T/V/a/c/d/e/f/g/h/i/l/m/n/o/p/r/s/t/u/v/w)/Descent -282/Flags 32/FontBBox[-166 -282 1036 924]/FontFamily(Avenir LT Std 65 Medium)/FontFile3 152 0 R/FontName/JLBVNQ+AvenirLTStd-Medium/FontStretch/Normal/FontWeight 600/ItalicAngle 0/StemV 92/Type/FontDescriptor/XHeight 474>> +endobj +96 0 obj +<</Filter/FlateDecode/Length 403>>stream +H\j0Fl/R0mB.-pIFq.; +l|0=^gwB2^c!dC7ҿ;S[v1koG?>bq'wgw:Mz0[]G;g;guyJ{?̷}iL7zNcN5kXgo@bao[3ٸ|Jl1cJT6\kH~nϬҙ[nMuA.UV]+0kը%t xAS)̕"B_//d{.w]<<<<<<<<<lC(:}SwZ)o!tçqr/' +endstream +endobj +152 0 obj +<</Filter/FlateDecode/Length 2270/Subtype/Type1C>>stream +HT{Taڵfٵ3Z0D Lʮ>²WCilQPM- J|6.bcj#r=?<g1$F$]lݪؤbXmi2ZlWA֑9n.ݓdv/d0|0uZ +nQh8^j8oybѱ$&KL8[Nd-&YbsM.xlrhq4M6s$0Y&F_wl\fdRDSIe)6YR`LFmv: +bp{pg+D(^St +-Yb6vs2Z +5{N5 ++Ѵ H|?#OQ1 Ib&A +#1?'e:Cdi"8I"L/HrYM6a+v(JTgpc!Hobs>1aJMl#{zU.fxsh >Dte1?nj|SzHTh +T-@f`L +0*td#TPpNp"*nBނ)&[]aVXXgkƠ`%ʧ8eͳ1 +dd\OuDφ~)䀼CͥD@8HAb>G gХ<&6-* ?J5<3D!;:dGhڊR@@P~][#$\ :hhex?밿qRPUWJP"@BB6cW$p>Y+0$rUMhɷѼXF5R?c<j>P }XP}7r] + +9םyd$3B|Ć]n|v<5Hz9˲|9Q(g`LQ_vcva1,y!yn+G0 +ebqrr8UBio۟ W;̣CԲZL[oU\ 'DZC(g4g%iz*F|KϪ~-bQ*sEx5(|"+V0}A5rW1oY;uD81i<¼Sjz"{6xvH,QW`4|ၲՃZu鶪mlEYBZK͛?cnDkחlxrΧϴ{ߜϪKX(m'>>\_lOKtc"^ң%>BҪ |tz_},+֥V^:/p}~e4(Ge +}맹y<4Q;Էƶ<KIJ35OQ$\=AwyRo+} +-th}X[LY*Zpw@oؾ5 Pr#PR7+ +endstream +endobj +95 0 obj +<</Ascent 928/CapHeight 708/CharSet(/period/N/e/n/o/t)/Descent -277/Flags 96/FontBBox[-166 -277 1057 928]/FontFamily(Avenir LT Std 55 Roman)/FontFile3 151 0 R/FontName/ZOYSDK+AvenirLTStd-Oblique/FontStretch/Normal/FontWeight 400/ItalicAngle -8/StemV 80/Type/FontDescriptor/XHeight 468>> +endobj +94 0 obj +<</Filter/FlateDecode/Length 262>>stream +H\PMo +|l44u>l?!-9ρf }jMߣ&3gDh;V`N(zRq"wpj?(9EѺv_n[B ]MzQUM<M8k@r|,ƨ܈L +䕬a̿AdLBc.!cr)_&my3&uDQMOkpzʻmXuXa +endstream +endobj +151 0 obj +<</Filter/FlateDecode/Length 864/Subtype/Type1C>>stream +HLg{!+:5e:6&8f^]C432S@ݘ3d,%ɒŌmYCIThˌKs]yx}O^YQ,+6 n| E4E߾3h/4Tek,VvXJ?r&2%هLx"+Xg|j*!i$1oq=%p@Uqs>ffb=LK%$}FDxIF8hDÁ&]a5i()f=7 b.i58&ņ퐢0MɾI]1d%l*q/لeا3L40]WJv;d}]p[G;rG?Nq'N7E9wYC-=3p<*6W?Q5}O$ &&ʼn>s,*89pv>6Zg+5G0Ex!:c iX?ٻ/nxh^}ހh9щFW{NwݢP)ܿ>zHCy0[)7}ʯrgy%Xk!Q_p5\;7CKmm$ce}#ԣ~؉m%:^8< +endstream +endobj +92 0 obj +<</BaseEncoding/WinAnsiEncoding/Differences[31/greaterequal]/Type/Encoding>> +endobj +93 0 obj +<</Ascent 928/CapHeight 708/CharSet(/greaterequal/space/ampersand/parenleft/parenright/comma/hyphen/period/slash/zero/one/two/three/four/five/six/seven/eight/nine/colon/A/B/C/D/E/F/G/H/I/J/L/M/N/O/P/R/S/T/U/V/W/Z/a/b/c/d/e/f/g/h/i/j/k/l/m/n/o/p/r/s/t/u/v/w/x/y/z/quoteright/endash)/Descent -250/Flags 32/FontBBox[-166 -250 1000 928]/FontFamily(Avenir LT Std 55 Roman)/FontFile3 150 0 R/FontName/ONQEFG+AvenirLTStd-Roman/FontStretch/Normal/FontWeight 400/ItalicAngle 0/StemV 80/Type/FontDescriptor/XHeight 468>> +endobj +91 0 obj +<</Filter/FlateDecode/Length 540>>stream +H\͎@<E-uo[dy +s\A0W+ +s\A0W\v%Jؕ+aW] +*@ + +endstream +endobj +150 0 obj +<</Filter/FlateDecode/Length 4075/Subtype/Type1C>>stream +HdU}PWaLJ([q̎ | x +q* +h\wGX]E>VŔ(WW&)s^=LA1"J3wNOƞʽERSկt߯_w0,ˎ]4gAfִ*aw-ϫMu[~IjcWn}p-x'"nF0d~b]Rvɛ6[9+j]J)>5%5Ԥh)!..AJ9R^R.wKV颞)L\-_Òn"U,6(97Hٲ&]ŲKlXnq[K!gEKrl^%Jevp6\\"-;2Uֻ,Z)|}vdqؤrKD!bO&UvUZZewJᎉIlfe c&0<3a2`ɰ&ӟ_36߲{lw9WO3L 1nd,I#Es=y$%9=N~+fbi?wDԈmaSօ=rȩ#FvtV_t5H8>fԁQGvI\}wS9;%:A'Y}:Uy_D\P[e@$4L>D +3Ϯex4cZ9wBߜ.-fۼPx.M+Q +FבfCRV`ƕPv͚%}W߶^8jXY_q-`6{ b0K0TH +ߪ\3<0Z +N i-X +dx0GM W$`++.% +GVߌbc`r+ɼ_ZGm_R:zN,#j +Ǩ<xCS鞟ާO&cOtz>Ǟã+UdzsɾdNiˋ?=CL~riȤ+W/h|WPT75庨^PX|FVQ4>hDQsAK@iIO +;`DAQ1*.%%[zN{n4r{9ﺼ {`kм}E8Ko!lϡZ`WKv/&i 0j"֚]Q)WkvZ0oI\g^|f$RC nL3C0nHTԗh\sGa/CG)~a?z +vǾ}gٓ|_JeYWas)gYzBw'v= +u*y1XFpPkujA3&7yJNψ&ޕ-.ˡ0OE\f3˺pu3G +5Bn4dO۠|fHQ-` +o#Z0MhaG2)R$ +P= +f2OQC/QƇBmA6v3ЭtlWJ.SIiunɸp"8=oxFuə"%IYkl|3D{)aZ-Jё#,sNJQէ>>Dh>Uhn***-.,[d^O;h7E1'GWﴷ_8p`D5#Eݪ4$2]240-]9T}J{^]rseLk>%E}ͪU]6VFa"USTW^S S<ԩHb=9ZM^%nny4nWu؈@+bvq^g0B=˽ꅡs!:!>=JU7qץƼse?ߝlAX*j_`Qw0UF g3!~4pP/Jl6`[xf<o鼹c[CQݝGM=oz[*~~fb%* Wy:lD$dϗdgiؾfo(.>|hhX V]*YZ [tNZz4Yژ.Heđg_"uݚd;}+ɦ] +gDڮdFN"ztg_'7\9 c +Ħ-fFXBݗFR/X-DUQ#I,iQn +DXF\2|НJ֪E㏜-@[^T}La*.C=Vw7Z<Sx#F7uI߲%6,Q8ow/8@"^|(=i6Few+< t·r0<-Ni"(WG"5]hk_~`IUo5&jC?)Z!3|%RjKƽѐDZt(B PLQT+K:PKL)DoIIlڒvjEcH; +yOC/APyE"Ç1b꽲xgBIXʋG.Ǧ9"aȣ.T3Ui1D<WT~ +,{/yMO^h +endstream +endobj +177 0 obj +<</AIS false/BM/Normal/CA 1.0/OP true/OPM 0/SA false/SMask/None/Type/ExtGState/ca 1.0/op true>> +endobj +178 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +213 0 obj +<</A 214 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +214 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +23 0 obj +<</Annots 215 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 216 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 8 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 217 0 R/GS2 218 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 40 0 R/T1_3 42 0 R/T1_4 43 0 R/T1_5 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +24 0 obj +<</Annots 219 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 220 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 8 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 221 0 R/GS2 222 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 43 0 R/T1_3 40 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 66 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +25 0 obj +<</Annots 223 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 224 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 8 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 225 0 R/GS2 226 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 43 0 R/T1_4 40 0 R/T1_5 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 68 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +26 0 obj +<</Annots 227 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 228 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 8 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 229 0 R/GS2 230 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 43 0 R/T1_3 40 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 70 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +27 0 obj +<</Annots 231 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 232 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 8 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 233 0 R/GS2 234 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 43 0 R/T1_4 40 0 R/T1_5 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 72 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +231 0 obj +[235 0 R] +endobj +232 0 obj +<</Filter/FlateDecode/Length 3026>>stream +HWm۸Wbջdz@I6ݭ|hB$yǷ}fHZ֛XQ3C_xEIxsw pwscqݏ;{D~g<8Y`9^+7X}8wk_4ys|3@I$ֵfomEX':|>F|ݫb8Z~o~{a[ B7>^ilM~Z%V륫t<NhaI_̀_H|`Z}V7WaQbE> 2ّA81O(AP =7hv}U`qBL2x%% +GAF!}qD}8cqJ;xrVV %X0%f1cOS&E!YGہCĠI3r屧fxl秛!/zT3=S#K-KQYZjSb$'syo65jZTEG@B0v(H"#g'{^z1UOec!\/)Ş~K +R4ص!0`Q/!OA(mc0Ti)zI`r]ïgkڤz yP<${؝znKlNSF6mԩx?:Dk|fӱ\ˋz1P@=_)k;@?ek:ʶU~]+}>Ȫ*)>-(벹'}YBá\4z,ygѱ~ml +) +@avjBpO +?X[̞:Cle[巍b#oԳ݉e;c"Iwm'M{s ʡpz}Y+*CY9,RQTgˮ݀KY|'^$fؓzt<|sOz+'`A@ͫs_e=gVF̠y;-wv}a_{urdƣ$d<c?-G}sBm!c!U"u+r䝊RyDѩCiD?gE&G6Pҽ4HBtcBwo~1z(Al_g_mdaؔ{ogLBs8[<揲z^zT_V }dDM_#W) ~9?ʆfہJZ؍oVǎ2O1/Ԓl<"_P?Kw6CٮxWvp̆zLZRϷ[kHxkhĖ:Jŵ/߳D:C'|($ۇm>DY^}+y x_p}l9A +0U;}F'Q/ѳof +NJ+a]QUmV#+o/sXm2/w6Rx# ݈cϕIN1=ψJf(QK)/^8JͥHGF%\irneݱ/w+[Z]Y,Q=eA,>! +շ59!]$)ӽ[nX<[uX }A~O0:l$phײ!b_-eW(T)K$5<%w|#M +?%ABS>#m^:vÊ.ah.(>'&nm֫VK&0Ik.lVe?oz(3f[0biAf!QvQBþ;eof%W|2U\Ml(oPSXWex\RWDrs^P:/(xc=Ͷ=hK&ڵGƝ%rYU*K0Јts}Cpq~ ZLӾE<xӗ\:~ChwҮxED?$$,`6f5/Ţ*:XuQxn=pėV3$TP#N 76śf],RwyUy̺&}z|cN\LW/h>0D+3Lmҡʝ&A_4IÙ?k&Kl:+Nf,tL +x4w(pCیt?ǽƿ\ ODG踞oIVYV^@9(ͦ\oE'X#qZ8=gr@ooݏxhlWYb' ucq"AF.Q$A7qě?ղ +TmF©EJ0i$(QpP =q1wfvP>#ޖ÷Yr!(uK`"x`fon'HSPDNs?^ +endstream +endobj +72 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 467>>/Filter/FlateDecode/Height 797/Intent/RelativeColorimetric/Length 217860/Metadata 156 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream +HWk]U*mC#BTP5!($TcUTD(jmG?a^(-iδLq瞳;3:s{}^o}['$$$$$$$$$$$$$$$$$$$:wsHHHHx1u +nX:i +K 3ǚb0l1X}[Xcf9 ,yEB,AH!f(F!X߃[cP>3 +9pVoAde].$xPQI(ཟ^EN3 +Livh6, +)e +|ʲ\oU0yN.$(M|r;._XbC' Lp+';U5IJFn4)S)[=u*;JU;"؊ܠ!XuwֿW|Daԏ9ձxD0,AK6lYfx3JUj(*$T,FV1t a'n&)KhXw\T)=`u0*N"jvc)ziQ32# !xD">_Wo +J:V;$)tYVdG9+@rNRə";/E0J;\qz8Cm-3Z$¤0\ ,k7GM +/e]=Q2Ek:2^YdcA!c뎊{&;Z/"RUoa}B]q-0*l1݂:b7$hև~ `ŷgqMy$#p>sNnx=M|, c~M0qu3fDc(7{ s@+Vٙ`Z +#BGWkM cb{^6xD%f(>N`B8 9\I8.Vrha] +S5 +$RyB;h_ձzWT +kVIcTr+繩9rH5;a!b-ڝoXޱޟ,P$]+N9c\K+gcGl㋝Ύ+V} ;IȾhт6oNf5c0QNARbBlvnW;ێL朘" &s0aU;TR5\ŶKįryQi ~p,MNc@rGuVAv^t4 u/ȜhEx!Z>ĦS.L,_L8uȰcCAx13տeUsaassK3i5XHE#2C\Eikގٴ?<R}(#$is5g'>8oܪ6XAɦw͵:;56uoyp/pK-MM,zג>C>mX#93OEٜ0jǟ_#NRԒAnj La5x[Xsek3f +oK#Dg;|uAy;pI'|qޞ&2~/nTw'>042Ig{1>\6Ԏ熫7C7ݱ}SUr'w<o=]G~{6M[M{z\CYU͘M#Gvw?7<r\'tu>{-R%?<_<(+oN9zoD/U*¥U0z)^g,EwQ(YKDtfa}GSImf}}v +yek,iFye֨7k +Eeu/`7|A<4:mE_Nv[>'Tp}ZkELvizV2>=3S8vfe9qS +%D%?\qYTdW<DӃ+{LQ0`v +hk7%dlMDSY +k;Id6+01L1Ό+ x?c}4 9@- +mea"mPi;J1`I}aW0.ҠĎos'(mKMxk.o*Z2I6ϟx/-SG%l~Zg~geIqв&/ٛ +@ٿ{ySJFWL߬r$VcnҼ_lQﮝ> >zd1Pw @wej9\ݩ i[ik)]/Jw\%^cZykpŞ8uѤl)ϳO$uV=?M4I_BϢԫȎn-L.(ǯVphXsq1lxN$w*l* M]XkU簴&mIvg;Ge<LE&b&R_IN^8vH<O'e/eXߣ^-h +JEJ.$ +]֨'7,*ɶכFxBY5 y$CE?^W`Zx+{ZqDg<UC&){'Vã8H2Ie$?PE齓4uÞƫ!1C[15:!Og]G*:wvޔOٹJj/WV_.j?J.#~ւNl +FL뀍F\brvm5iJnRL9/r^wA +KcG7 $r7S&@~\o`8y- +[7GgtYΚ5n +e<$\Rh:^ÚoX`=8v<,(hDʊ@+Tؗu\}ĘvFt܅ZWA!ꮩ:-*^yιhҩcťWn]߽uC^acg=H"bՄrڗrm*^T"`{78?SQ'(UloNb@?PrQ(z0lѭY)<#fS[Y,N-=pbB<Sf0p[]lAڨxON9ey@oxpy%6!iEdY7_wԆ5:(n^**):*.}Pցod'/?Ξ"SJacFt'zNP-c-IY|}|[H!NM%81A>ߔu+?N</#'B@#éb4F^5א1HDp^nq7+SEt̙0`&_h..avf/|l^}gm3>|bgѢgO&'\$S]yv0.7h疼3)՞dK͚9Ça,՜)Wf81/{oUW8gڬ6ۀa?Z:76۬i쪼eF0UUMu~+O+*r¨iiOjdP8Հ3l[(-%)sқ*kj j<E4Q+?$ HmK1l=T1A*:Ӎ?X^Ce. TP1D/WyTfZaKA2:ɜ> +Mk\| +\eV$ Py<Wj%(SMPv<D W?X<U6\$Yd^^]375c&\c!D#wzs9ZS~:Bx7|KQ/gcљ~jY4F'fu)ᮑ@⿌vQl +9Սp5*BInaǙY0;f!,9R>fPMҚ6D&SQcI*J(OHHp>DiTv`PШ"R3c&rєYzL{xu# SAf"Q@Y7#pBqL@_%vX ެe*XEHmY.5@MokGJSf|dž=4L|Y7!ΖO#9D)Mᆽ>S#EgqԐύ[c~.u??6˼T2@`l\|!{̤ԧ(({w6Fk1FM1D-b[0@RjB,Z mR"*@ +fzcII^8'ɢA(s _:x!q(y\b̄1JtZb=^{*W~%l87g.uԐۢg +D٪1ttOir-xޑ݃]ͽCruӏ3!E]d +]eߟ;kN+J$%2 4nkU+X77yr!@|6x`z.Zί4}y#gQiM p<>$,Kt n',>Uvxk; +'fٷ/8*NT[m +*$6lXؓ= x}0B}LҺG}OC/Na$ؠ{+~aX:TD*:29xBAQ~gK%EC^n5F +n}ؤ9JSy65Y®n\Exr[,2xPl번0]ڔ{ѱ]3GM]eB.3P40qZm*9֣n"-fl7UF{5?aou@ +]muuyz '.xP?nI3r۵-Sm:/x y +Z7&ьc!c_w(Edd!᧯:J^pт]V! +-ߐ/;>66!)%!11)1>!1yn̼C'Nʊd[4V8D[ydǦE<yjRb^""T~YpH]Ko-R(4T-}b=XW~2Ny]ִiL8e}/yɊz3qrښُGM\n$(Dr8mm.At`hw^Yx,.3Dj4NeҾ +ʿvӎwl2 X\.TlM')^17!oٓw{)rLe{xy/x<'|K. øDdGG^kw%nezSABÄj +O> +2`eK*m?>A*t܉a;U_?56x^ؤ_}='~-fp|+R요YwF~7 +BV-OT0P)Y!Aϟ;L[Y;t,IiW%^ɔeS +PTpbrtLU.q6PB=x]S}kJT/ ą*' 1ClvˉY6f"Y`n>}<A'[el&ݨ!WWY9CIizЫLlZ5fY;peWA-3eV>z~IRϦe7;ݱRx@;/rN3D{R5D,G%Y>PZfvf)Пޟq XH@IGP(eLLKu_s}<Z38bLrOroݦ;~}U2fꩄw^YD dT2SC3ɻ.ėh:G_Uk;g 0AJʪaB;=α&_h\:G=Ѯ; ^!l_}-* 27SEc3;s;z;ӌj~b5`:* <_9hFpyt[~9mm8dNuD\ +s\1 (8]7e-7s|FMhs|~wXW ø&V\%^*5A\r0<-=M͞}pwj;'zPAR˹2ʙ0"<\V +%d +,Dpۿ>ԙ-ç/<*:4`ON?+^.@"<EP(5FcSB풒OlKܥ+o:RWq`UTtpbJΈe| bA5b +B+ӛw{M7rv;m{6JxR(M 3AYp2rb ^8v/;+Gzouc+_t{Ǥx3 JIF(7)kr4/ ȣ2rN8r6m++xfDQYWjh=P}_dׄ 6`Z! + `vqֳ}٘x3yRpJEfJfGADTL^A ,n'3ˏ&+w;;]ш +ʦ|4;EAW +M#:G8Qw-ShlrFcED= +f,WLϬ_xB0|bۺg +:],]<#SzV!Ep"R6=f_a0}]iuӍ^¨cR:{ МAQN(p0{w 7G>Sy·F7,ރx'<C.\ +3:/B_k*WQ + wW^uE]Ǣ%-븥2x>i2,^E +pUQ\!dLu(W>ș:Ubkjؙ4Ϝi%wjaIoY"ГG5^*U{atFE)AA'ޑn evzJ0L3)gm! +єS3d+n}o@6Vk&.5vw}6qt8xN;-e \:Bs +W;lw?]u{~_Fmg \G[*'M3Y0!02XݶW:+_ޗWrlAëjKO_#ZR%a-3FdI7!èHI)*mӁ㚁zݏ+/חo˯9aK7kn`4$I +甫Unk_!JEFc%NI]}7硫̛_=ѢAop*nQ8a^.B= {<Oa2 +]Xi_֚t^-o{7{Τ;o}m{8pta\JB{^nV~ź"^j]oZCݖ܂YI?^^"GEDA~UYߴȥ͗_i_M;jV ln#mBe ËB |?*8ETs3+ۖ.3}:4i 4\edwOzSh}Ctf>^[ۍ_][+m{+;巇#!9=J8Bc&ɜÂpxZGvysp%=Uy}JIovl5 y/JG%Y7<^5O7us6E +>Y(*Ah|muїfUbKpcuB(1sK$3_TlΜ +O=, 4L gsGl./}rBOp.%yHi#,3?_GKdAvytN}iFl./0vJ1!J rMdǀM/E*eb8 +xƉT +MBH<!*B'Ր-m㜨 +HIi"hN:^c{ͮx#xM<8юob};=;|?)Wkˈ\[T]hQi]/+1/WWkӗ_z"+ +BW.V^YxYЮTf.+غJFn&h^5ěuo< Nba߲2[o-M$^9Q^Xd\*eT!Y,j2( h,U]9#NBRǙ_v`\EȏеQ;'lHeH_0hܺH4 +`mQg\3=dNJ&!»j甼Jǽ_C + +&5&+n{(^R/pf:¯?x*KRdR%Bh~(ܕe7d\C <(^fQ&jA(+0Ųo]=<흉<7-Id-PϾߣwb_02 +\lM׆vg5 a/}ڶvܕ:-wPd Z!?B7Gvޱyr}\x)iM#eD;W(} ^ѽͤ6lF +'gjM3UE(g2MP!xrh!WxߵH猖bv[MKF%rt{~hg~l/f3=X;ӹ}o7cY[@yrdv 9<r\c+WU,к`TF?V0Ӊ7[2F1/m[<20Ce>b3I(gPA(/fžctl-8J.O{Wv`˰NU_gy^r[K!0&hl5I.Do:t%/-MD*"6F(>z;<_r&CI{9ū5OX}ŮsxXU.E067LL>9?/g:#=rsPk1k@(msp +ֳ!^_jt+z0]j2e>8/a|+h +j%&dʏd5H,~5F11%'!9>(,̐bA,bPfedͧ.#ޔ*x#s#sngr(Rt}](^&e}˭)%e]ǯ{ɉ;'wtNnڱ~v0eкW/x|n9wz46i +>5ԋW#!jx|&T¡%e͍f(BщNWÕt_z(^2J64`* I>Z^#s"/2P[M9WaJ +*Z-]Z(][Oj!^ UQvG{;;oî~Y+U':gݓiۊ+SJ+S~"FS3!t=>8don!6'%i<}+CZ +UL8+K뽫3_86^>.^r.yi!~,BE$27o|tGwwbʴ/ļ@ـrN(|q&fZZr["Vkdmk%>RWb<If(/[`_4[{ +.0Ohr;LI)]~1m7Yox,s)L29/"jW|]xA`j^gVXrPoii2e8c4 +ZQ}NЩ+;:ɜI_:<Ŋ$5}&nfEśOcmL>Q|aÈKʈ57>8ln)#K=?'g@:V@JJ-YkPS5{0.a뙫+o'I1Wx!wf{mǷl5[jFs'r̫Њ]T4;2m:!n8("ES/=mCWEE[ڦ.ɒWI#u qf#[%ٖ%K\EDI!g!g7fHZiI.0H~0FDǚc0xu88,#xNU0KWnKJ nZL'nSI+n[͎ڀW!s/p?W_t3s>PTnA2;>I'=1p4;:JHn8f@lfذꪒ7Hqt4tVQX.jP}ﯨ*5 +Ơ`.8U3zVkd/+*^̵n6^;6f(}}~?|82_)Nh9R)dw|t{lw@86I`,l<0c5H)XL +9B{Xw8TOt1C*T(1*(+oG%p/QqvmvH<tNߛ9U۪x)*ڶKhxGnvvXXtpưk@ 9XW ̍exDT߽%tW5Wkvp×\#X55C!6byxl`;6;Kr=Nȗ\}Dћ{`jGG>/}a}7HU+oma6CBpS] %}rF|f3!tVCf1ص]H/79V%3(ULEUY_mCbMԾ|?J7sPmߓxÖ=o'PxYc#6[-^F+ukMNwvicj:ϗ`חM\M%kLeeMZr|"3NNGYWYq EYk\7gLGA?I^HHo +%)_sy72 ep/7io aoY!j]OGLQ hEV/fZl._\NϬsh`PL+s L5}|=;zڗ>n<tʴ##Hќx10Ɂt/#.^]N!<cOZ]Ӽ6G(l*QoBVށg?e +B5S뚚3+(ˡ:'.s,g^ 0cCkq6Ly?/]ff P'pNGhwteܲ0s)gLӌʃⵆ5/t|o7V(]elxͳA"*kօaWpk53jLH~bb]hc.tUoo&rbӜ8\tR{/lJ+";_͈=caJ*`fI3d[&|e`r'/=Q(VADQ)R,{uwI?Mx)&ȯ-2 +()ABhhn۱Iԍ;8UۉN"{z;;;1{3ތHRhyc}&+g~7D͙gK)S NzԟG(6D߸xh<sz&tb&}2ݑl{Xkg]TvbOVpJlfܷvD9B V8܆D}iҴ͊_r%kfN^۲k`J_/*u *Ös''o +Jy^W|HLMCaā `!!Kk}:]W?ů +`U묭=762-.8!BP(m7S-o0iqb<9FKb)I.Lf4kR%ҿ~*-%bSiM.{r(嫮`aQ4 +nvfXq.W:Ϯ:/+HeCZ{ ++Sn-N7]ot:,'Kl8/ԏxSY֍Jd9-˜rN+7P04^V[P?Z;"Ҭ)88ŖH9TiWbF{8 x"P> +7O6wAlT"F[\qB,dd9'P^q^c4= ^b_id%STq`GZxƿUm赵79ǧ7LW:؝ˎ6oe|286yu*0tRۦLg+L.s$́7utNMoLX%>)9R6-p.'qyu #c~'5Z9۪v">L5Ɩ#6xY ބBA x_OɲHlߢbe´PGMQB?@s5٬]$n34/%)rJwiW_,b +~Nm/o:vjnxj[d;cU_gr~k`+dlmv>Vw#trw|F:ǖP`H&⡡rGd2u`ן^5u5k,k>vrۿ("~E)OpTz$U4{͎~7qq|eY!mLIvJLӴ3G;-M/4-dJB[)ɒ/ +6洍b|`lid˗liJrH@0yV{O)&b:;l߯pj\Ń}@n"QX +L:=.6}#& Fn͔F#,A0$4*8<|ᖢi2/A)\h6$S2y~EU>{; V;euGOЈI(26m[wTp`Ԯ쮂G~FЅsݘNg<o|@={ӆœlg@RFy%JBǥ}|*DrW3|iy^&V0$]S ,fhzqwƟmPJH4 $A(x + +tHp}w;&1w6 +)y*!j<;&Ğ$ۏ do4Wƙe]2̜P:rڎQ흁_m@ӿҗjUw4O{Ьȸy># +E/봶|Yxt;jE#2M-iU[E=|-XWyvVյkW+ǵ$h --y4 P$CP8dE*Gf95'_晍vw5;P?Z"<E4MBG_28 :|S9K+/+_2Ε+ãe0s#QK6hIPDaΝ*ߕIAQ +$HnʘD>\ҭ+=&Z0p*DT?@:J#s!#!"X *ѬSCYAFx,\GÂH/} HQ1`a8PfW!כ(sDmr_m:Bնk<Im\BUJܒM@u3SG;K,z^!212p[zz4T9)oub|~SզcVڝuݾh׃i鑩c]_34`$/28z:ΰ<$3H;a)T4b%oTN*L# ״|e\H FSJf*J?7X +CE(KjaqZ3LIH6wg{ƛx1s#q;-{ ś`u>A#^U7Zj: +c@ gT}ybݥoo|/2gHjDQMT'RIdHUs"^SgOetB2<|D5a:?bpFS9X[|hiFV.t8Tgr6kN3:9;p_&xso?Ўsaɋ?߮etӰN/Pj0,t|z}8KM, +U]hb!n1O:#ZcViġ +eݔ,c7G=7\=&v[rB-w0c)Uar0t75QXIIC%ύuUjrGlS\c?r~톾c.N]zE??EkF-!ZVjR +0)г +f1ju?Yp!HJ %vשX9 +LBGiDR,y?"U +Øg;yt?o/;' +|dsQ&0c+_f"hđCՄ.@R@`EƲH:y$Z8<v2'ddrߢZv@ #meg5́>:Å*8GԼ5i_O4g'g6|ioà~+ 9v؟(77z&?=pn7 8ݫW{)߂%EX֚WxACo|1et}Θ]+K]QAϘ|t[-3GX}=dRܛ,Gj}&c´f + *"U-UR0kcP$%ᙴBpJx1^^k};3~T|42;{=~$ +M$ypE,E +9cQjM, ]![Oݻ_暻|;o[ІZ}t 7EQycyNQ}.<</P9xVQHAƛ:枈"C$Y +YxGxoo˱EO0g`yQ7u̎Q~pMgOLfO5qs|qt/fH7x~/v&Άsy +2-euo簌ݙ6"2GdaV1f3Ѳ(Z_EU\$'~|Ct0X|;O +HKˉ</0^Iλ/S"E[ll=/app,aR:PWzU24' +3l5XRR@--)*V@H۶MYx+e1bklb[SU0I>(3Q䰢vr>{~;WW:^aC˟ur-t9ihw[Ǩ9ou'&&?﮾\}mNw_|pITDY%UUFUQ:RS +LDNgueC$ch-P!kEs%^Ò'\֮''E.sK&CƯdʑ4G[P`eB-#)( 1A-tLPz}Nz~0Rp:}J*\Q_Qon +bMVZ/U^'xn2VC[\kz=cT|}xyw/BůyX,"$ +)ق"C><qY驪s:骪Ak{6L]BTe-#ձ˗o.[6VQѵ*P:Vq8+4$Wᖇb^a2~bը`pV0Y<a`yߡ+W?u8a* +fptl*>ADΘcqhJϸFoΛժ[yXIBB~)&nΘeˇe-(6PVLjF +9@x͐۬Ax'x$' [S^fM]gdZK3dfRxC2tZ-=a L`ll,0Ɓa1K!WV[%YW9&$}jh9,?um̗n[5~=ΙK/[nsSWamNkP5ڡ(rmAr]\K4";}D.ҡ={?yuOϦ]/콱6!{õ!Q Ln1fȃqGV"1D<+Ήc4)U +K'1om؆X*|B8743>}f-K+UU5y:ύi4d/[6T]Ƽ"J%h20w^Dx06In+JT|I"K$UMfA͵U1i>K`0y:>ӄQml1Ð=ܫF^|~*tHۯKȵ&mPP1>qm_F#d+Yv<XTO}f-||l\]tpܰ%XQtL"1ɤv^Yy30*M,(&͜&\8_apRb^͢4,qӖ*A&ӬXiIvjT76A(Cʲ9($TY\-xV<=x x&h=5Jx4ni +e[$x(r4l)ڪ))~$"hIdC8MKJ둢^^GFuܠ̠6~S]6x~{U?kRW#!,dذ~tl/`+xnĠF@Q(prqz4^ +84c2&OLLW){9Y^rX4 +@@xR +Ι|8G$I*)j(+WUW{&(IӴŜ |@E(IE9W]FLc!AZ|wgf߽?Ѱ㡓-k;hp{!}41L5;h<voa=zB?_20G0{:u^:U! +ߧ*~am*OہY|UWٚo_U5%O' +Ѣ -Ѣ +X2BaV21i.Ib2+_JJ1Ip TsoUZI,R#-?E/v=3۬4xruۨ +@;ɵ2 y!y"[קniMWU'{uŢC +2hю)CfVZ;c-!'8%L,t +1ټIHDEJL-R@ʉxrA"Eh +uPpyc1G!\U=I"d 6! TUg!Z@/Py{ߘO)!g~$s|G5Kbii `E +ߌbyCe_v.⒊J3;k啖t[avqXl +}lw}Az~ƝzCg֞\,Ŏ袟:{l<~i~jJbysLhDԑFU9MN*m⺢HA@$P +TJPq,l,(qXcpZlYalmYHhU#F,}Y[hifgr +qTGnw;ǴP;`uNism7sRstu^j0ql75pUԾ寫YF2 +>s*Bh +Wѷ(,< +w7[jnƻ/"T\PIx{_6DMtLҴj67A J3a"I/AEJ[]nzAZ` +b1DK_Ѝ4I$$ycϡãxʆgqy۲%7S#iJ3\o<N(sm^O5? ֍240'"ܻGct;JBZM.J4NJDLU#1Qt'^9OpQ> + +CX.,}Wo8-Atr8-psF_hAXN3AoV*hSNZ:ϵ^z\c'[r|';w˝_7G-#c#cj71MF;3Ֆa\9yvfnk%k:R3U W~0Q898ȜQ880I%!;^?$TtܦRoM?"'P+)qUSK/:$$^^L?ٚ^J `}Un+} Zql$f;HH.2iP&rZ(ڹoژИ1jydRRm.wu\ L*+C2YP&+R5| +9dRJ-s7r[r}kTjhmuxu[NO +}҆M#- @.}&XL %+Hl3u3Ն~ď}R8lb%DS4bϙR`~n4I$G/O'}> !aЃ}(rjTN!'X L[&''eM% +(Fp,fcHbT/~QXb' +A18 +Fwű},T0k0jN| `,#ߘ05+ kR h=1jvODd.1R9VZذNkqiaZj^aZ[^Fy#TPè5`T4ZȌ}uH8Vt+6R1CCQ4h]vU)iM]fo7ЬZҢ{(Véԉ +1Qp?rG +/ |2 SI>72B\ze)brPm@hu) 4-w'Cź#E#¬un-LSʢ.fzd(F3)+{όdUO5s<%ce>ۨ愳5UKӂ1X5XqN$|uIlܸp&XX&TϻgD6ؑ\LQ({GB7IA'.Z"<AjQ״Ls-]c̀RtPr;acQ`.&| +2Q,F9Ԁi@^BjX1[Fk+vtb_\×_kI-[ׇ=h2:쩏&pTTj0p-$5.[K%kz;^Kדd6Jˀ6$%#^PkOd}]P^W~cYI7LHku\005S?#e$|^۹s?7GAJيdWDJެ#UP._1LŊ1EuB;%auJ.ܞ"0#3|K/`@ꗎ98UT۷Ɖ7 lr +?Ŗ~Cg=|rA22$rPX$#g%NPF}gWV{h܃G?x{fDHObSg3 ++}/07y/2# +FJx"^ϖن*cњ=V +&L9>40xZB^Z4,/18ޛ7o<uadc|U⤣ʀ:W2T.0ϱ<7G+nI~ySbi%uE ++ouuQl(Ӕ\^اg#& +DW_[3:b@]:\(Vg +RtQ_NWf⾯@Ƀq4G+Ój'YW% +MBE0L^BeXI:K>XjkV)B6\k\xR3O0)v̝;J1kv>P`1f|U)[nW;HJMMMĀBK=W%ދGјOQ1C<͟?%ӧeېx[tҨ$Zo.fmnn.//Ea-Y;j t^/_<j,lٲ۷G"CۣFhHuuuQI|#EE"8 +V\Y"?`c9s7KRP $2?(R{/0=`dYs6Pkʐ걜A I+X +lRZ79HRJsͦ4ʄϵTPk*X.R@'C&th̸O6'y63@Hn<@(}Oȸɬr] +cfnD̆13qI6i'AVQCBHvT-l%(%-nb5o<K2mG!8 +`h#p'/qQ0jlbMn<}P: +#:X,pN>a ++!!tOIry21-I 6>%lj:JW:#R2^ۛ2DMlC 骑c\;5 ?TCR}c~3Mj+gΚ1_6q~2Az\'TUTT?~ߣۙ4[9bѳOm"ѲGK!_1tuۿjUκo;tKN~U{wkݽ3+-ZAC}:1K-[ύ]z|fW-||p.^F^S;Etd-t27<`uU>OrHZqi2 +3UFUoi Bݷ+:a00>Ӻmuţ.abF9̀\nim]>w̩^~F)Gn}qzӣ&XZ;4$4i5$2<Rat/R;2M_tm|~ceƹUG!8t#F%ˊ^\xjqg?eNa\2l_H]PFe$sw}]HbDniojzAaդ{L-]e5yᵆ-ovEʜ`7mڲmlj3bt%t!\,^qԚ&X8͆-77f.- +n۴C$9nd .xoa=6_{psul1,Ԭ>_Ne!5H;?ٜ;M#2i4tP =R:OaՒzqCe>=kiHǾꙷ*Қm +C%VV[Z,:8ֺo=*j]}EZ=J] +(QT<!U(s4ay4VDG~aTh +? +3/<md(SQ$ޮ!;(a*yEfҺfdX@B/"Kp6f +'bdna +YaM0+PgM_ĬSL\2wv_|O\7-"2"l@+=ŮV.&,K3eeuO:Om?o¾Zd(wŅJk(FhbB9Vu"5bQ<`YW~ɴ=葑kz%hJG{y\} 5`}`:/7*+e%WۀA{l_ekT<|ꝶ? .;vH_hMZ#a_@L:}]o3ϴ>\0Yۈq~u^<'u[tΫҴcy5Б?-m/GB캲u;{5e"\8{zCv|"٢$#/HuEf1g1*m˻l@6gvOCp%O7y/Z[n}?CvlFB¬I!`NXVGW7d rJj6.1->oMHMYӳgef<I<$A8M4g!2O=[]GbVW#ۜFVdMDeZJBHd*h4G֦ûV,ȒÔh7CYك+~\wئzТ,!.*2˂Fx^-3\ĩa;Dk=A_ہ"R\|UAUceHoȃ^D0BG;xg{Q"",˛;9tfbz4|DX.:!$"FCn9tF,ѧ պ]UO x"oc j/7p7&:U͵!rKtpPv3X'=ePr6swx1+O":泘( +ă@GX +KTԨͅ1!Z-xFa$DG{zaW3wӎrJQȢ2EFWRDj^0-6|F.,iG}PW 9%neVE>D#kؙl ;8hƛYPAYj] 43,aUd;a`xQ>"{o8ߴ:=3R7߰7He'+י˨ᾈ[롽HP֪ý==].oܴ!sg_`n˒)>;4@oX<o\q92<@;Vϙ(>o3Cv" $'lYac\S}W>s9*/@NSCVDk[i;cW}!#A̩=U.ZbR+wU=((E}]"zMfl)_3}NȂͺcfV*)Ƴ_r +9gRS>h2$mvN˼+JUⶼ>Ԧ +ISnjp +=EQb9y>)/bܬ5E +}l>j7lZqWfl+ݴw }J˘e*l;-]nC.Jg.eb`hadLVRZ&6I%nE(˦;Yi~~Nϭ:ڴ֬R|qC/sSO^g +g|nʨGQB_K6hM6k8bIďc4ȶN,f˾e^V۩B- +`{3ݖf"jQj]w-LN4P̐\I̚UF66-Ro&;x0"aϺynT==m\faW >_U'Jo((l ++h0*03Tʼ}?-SvͻWFb) +*Zf襬U@6cUqv:fN)wyB\[ɺ+z7 $Lg=WaL8\7aD{(JWgegӗgdfewXQgK$weE!ޢ# +S2:mIBs)j_J(f6tB̢$?9 x{@{Zn:EIh% +_]s +9C!)G¸ ! +C8p(6"YԕemOk;M""',x*NpZŮᑑnglfݝ=#ֆnu9NSQmm +JԃZ4HL6ZQql蚈uGRIm+[ǔ꼆!LiQbw"ڕQyWD_EEDLn]IAk9Hi;>ux(`:,G䠒f:B`=?!y- ײ@<4$.~dc'5} +3қ۞ߥ*YP>528DD`XA$\sPe("|Z*$+N䥒=AR̼qB wدv;*<Zήm+DFBڐ +',nޤ-.,K<J%0p`pN<>/w%X$cc^{.QݦU<U0뢃_KXRaxBM]Biiv`Êc* [/[F~$^pJOo$Mc2@`;D')PY_㨄HGǬȬvF+8姂{<`kI>Kp\Łc>Xx1-V{G}<2\"IUYͻ *0fy#\Ѕ"ljEXr{HLdt$rO +RI85n4ӯ[p|_iХX$,0{*T&$Ϫc|0cZ1K!@M1N\^eFB.T%Af'_lPUsqҁIk$*TYJETNsT6H\#YլmAcK|)D#$D3.TI30>7a|$pbpW/eB֪cb^9dw1႖9«ap mz +|ԲF{;>q_fkŪ,7=6|xĞ٧yOETDn@>s8j$HdJl6+t4grvPSJj7+kSkӁ7 d0yTQ\e&.=Q哱]c&HHeh@>jisQ@KKiVڔhG-wHv?U;Tg"LLCRwDoFs'VN4ʏfif{ +YPŻ(m'>X.gմX,Ȋ[&yN\$FE5㤕A*ֳ1M -!,`8/9gaZVN8fViC!_̵Q>M :(Ldnd>yKI)+1LվLaHɓQYaŰh2` +o^zZ$NDO*sK$6NȌMGecuH,zH}N=vL3$ն&SCGP:r8'emsϕ7]6Miݷ`+'*_}im*%K`XdiVϴ|-M"K^x&s}p~,gt#@h!h_TK,Mw[ @K?XD+P%apB^D,e̿w}9R}8Zeɲ.HuO_?>] +͘!8 +B +)|2Qy _m 8B{0[4o96*gA5`7Nny{k^1ɭQZ݀zFK{wCwp@Ooٽupx?"W|bFJ%}rV b÷HGƨ4>4wr@ Ŭ&f+4[4R`t:U^zm++;7{0̋woPvb`ow}>Ft@TKEu(Aٌb`Ks뿿٫-b7>_w#vEkį"7qB=l+ 2)a(}}zկ}''}b7^{w X+.84=a1Weҹs|Q/Uf6/?Gz@.(=31ҘgI# ;71aCJE Q/:++h%[GWΗ_xGo єt-.[opI/wޝ$zΡ|R= +֥n(,-sν 3F'{N{Zޡ@#p(-$̸e<c.$Q̺Bifdp(a +Mwq016K:>g!`}y_ߢ?(H0hB%Al?TʜW:[N?8h)y$0URlވFF'C]Φ(u:Ңx +T{nTJ. +NwYwo*媼NdLIZ6t|8K&=WiҤrfl:> +ࡾu:$oW.4rb`sDx^8-MK%32mlfYT*IRao +2}Xٗ7toXo&»rR>/^tPE=NSZ2<j7z0j}݉ppRXg~zV^qf?pq3Κ o5>`{'mYD:<Hꪩx=6I[:`a`]z$kgsa +^+!hA=JX;{(2i-;g/bh +<gbX@b]i}'-f=ԝo|FYm7PΦc|+[+&uG1`#ix +tO"<qJ:sDd{SA{q[.nh-Os/8A|I?R&ooK+B<5T$uMt0;7rgbPTo6Ǝ|oE CU0 +< 쁌Gm?b$C% +RR*} BBBB{o?pg쵒]79$&>[4G]5_ѣ _j!4=$Q( +SC0*mkYH/b+'~H +% EvG/b"}{h r7f+l_ѱz4; +N=ֆR ù٢A6b͍U]/c +x/j+{'gDaAd24ؓlԙq{Ŕ\)zS:}IIJl +ƅz}]щ"|p6nԖc8 +c5v34xNv@;A3ݿJ(ٌ0gҩEKr=;߅zRӛ҃ ȀYyrs!Wg^\)=<Eӵ=`u[ =7pӍԫW6zYJ)JڄES}^)ERvob15AA_8j +Zv8&CM5olhFwB>)h!{1x /F-y[KгGpV;)@lLEUq7OHxD Zj=Gb҂fR +BNQ@Z-kyT +ŃxS BX +(% $3PARps;7|:gZeM+^S^WK1-KWh۷$J&Cgɼ5K +2=<ň]ym}oϾ7^.}+J?1즬gA[F6p>w ,ݿbm~Ьj-{k;_Ϸ?<-߄\??9l$_=;PQv7IMH?tfm9?MOIsנzi١mZ6#uBCETV9uh_uwO_U/,eXFY9|orK ]=#=%mR|m.X<tȢ eIMNM9S. { +[5;G}$_Ek:xS|IPE#sF.KRz7g}vYN}L(І]fRfN;$ң} .) +HH57"̵w|p.Vejv3[6(ZXUwa+7x*/7wkAsX+@ܹYÚ@p˪,2ozt7zor _:|dYK_{7 H(X4I8eݲ5_<Q>0ϵl,-gNhן̙42Δ2rs8]8C7=+@^ᴢsp@9;jOW4Hj̟,}-ap +d +7֖38=%4`/\ +Z NG /!)B$R>4C('σ5Z8tx((y:ZUng±ʭe";SҌRy68|Ƶ_WQHjPϕTN$u[2ܠ$nZ@ztUT#9^r@4לJwǼ,F3QVqp*e[ +%jqTyR,$6ed_͋ÅG`:Jɨ'koX羣tP<6X{!e ЕuE ,}D6.c\zSw x㘭ߘqE\+>6+FԮX.@aE긻<z?vwE0+D4H'f(ꚌHhTMh*j@xR*ϦcTd3l_ϩkƋ#Xs8hmsV%?,&㹚&FgG:thZަ|2000 (ſtP骈_\j4^ߡt.BƬP O.$wP- =wMzڠe[pDz;Il,8s)8ܑ+l\vTbț] u +a#skFS&C5'~%dv`]()..e```pPB*PHTQJuSMēzb(3=ׁ]%L"l L1*Kl2ƒ{q4q@`46+ɹ@ecQϔr E+Kړq5w -$>*֞2tè-%Y$S(uJ9/3#0TQkzT6Xl ۪jz܍9mhjA+C9X5VAm؇fy]1cx߽͛APޑgM1XºrK-BrOS̜W([2XoX9c.Vlo6QF؆eN(ԓaNٷ뭟�*@r}p*q}A_rH/3+})!O5jI$xv)=׆/cOx6h%%<+!Jo)H@)QFSRQ*6)X[ LmjF5=evX#6ح5iD6C +[-1QmeX~QǢx],Dj#n2"jj7(nb2MdՀۘHeE @YؠŢ:K~QFw-@6wBXH8EDM`[/;3qvv@eHv橀cXF1%k[3q۔ztb{6,9*ldd܂%2LٰXa +cN9>kƤs^Z4-gFǝ~ěͦ'^^i-ax?Ր?kaã_\|]xP +}0E_SJXMwr2{m]%j +&T7>R}/x*ߦ>厯[OgziDe_F26+OkLO7vrbR[~\(SX$T'A/-+nc" "V]-IK픉f-Qm9pm+ĸ88~kop Kȃ篵XcH4fZ.DI<Gɬ3g233>;s.~2%&*X<;zRuFN<eS'E <3=xx6/a)F&nS{|lSlayP?!vW4GO +ԥ0U88xm +W~\4?t[rT"Ly;L[s7?J[3p_sKn̞3M0u6c|AWW[WJ3m`Gn2`مaUA HRQ\sj戚Fk$jRw%.HEpIP%.p<AkAq#2HXy3o͌Ԟ;,~b!he`AqեiҾ\WY82oڕc玬Y&!%UB֪_ƌN)v ݼ|+&6_$Chg y%!_qAyv zAd#J +r|{ŊmELPr.y?<$D#\u}*B+OQ2Bb + + y{iB6啶c@TxrM\,@"!(N|.eŎWOuM30a)xĸa&Jxap#VydϺG4(gEw$I#jE*ifXK]qB`/K0umE8ͪ|v5OTR`=?٫KF>f&!ȥ LHēsCu,[/%r';@nClեݒb,U^Ku"Zu'i^"#/Gw +KPZT"X{w``lO- +2IH xrHؙ+:0;z/ӖYa}ڵiߴr+Lmʚ#MBk&xc'%@NDTen\ԴuɔQ{< + +*sW#9tY0#'CGܥG|!ވlC- +V jɠd揻yx%aF;_.C5^8M CZ]W +B + 9b<䁌0qqɑ(.0qBG.#զ*c\ڨeY uii*_Bè5(Z!G,r8yzr8dY&eC]}~nS?_W>ĆEF\*CJ&}W7f{4ڄ0EF@TMBwm%@n-XR_?[ n`Pœzux;.|pC2+7b@{ډ6Ӊ;\0ug8-9)˛L)pi!#Tpq 6Qac3/7/JS-i6`фQ[-f<84/zt=zol%xʛb؉Z UqraLFÑGdDiTS3Z3@+t3U\&+@Ş/)b&PvCzR8;T:q+ +v +æ@ĩ +6d~kc_/ze]ğedU _[T+kݫ}xF +7ipj:Rpì̋~b>|]TBű:XM`_C#6y4#ʒ9=}goΣS\Ԡ +v{g̺ne-%_L!M.@vJ^u;gZhO\*9׃mhqDQtG-'2KDNuTFlLƎ9u}Y,/|w{~hhȅKc.>4`BodjQ-so?y$GnBO"."$ "Q)$* $>ueSӎ6i)x{R3qDB.$`Wz +-ÈDbkNHKK.5t{y٩H_rA&D?\<eo=X `kjӞ8]gp#vǞ)IRTZpzUDz/KǠ~o5J[1/\%'0 +Ch: KQ3lm`rB"XiG̀krfL)&aUM-=tAZ?Q̷GhwxG:,>6^KXzRÑ_))(ރ'k2dJGKK4#G)"O(-QG83C+ODzIY_nY]dDFe&BR(SA, +YEgryҼz&FR&[]olKS0b@)VYI +r[/~ WQ>p{1[wV\.ZbIt]%uI +:"ͨx<k1 +8|&Nȉ9VЙ#_[ܽ*lx+FMaаd^*42NA +NcĐtVkS@7QϘNQ_41/s6o+N)[A>>SU3',Ⱥ[g9>NSeL7``)Y2K5f&W% VK#QV0ݽ{r +sn(df/Զ\{uҐY W d `E<k̢.hLjId!SC_M+ME<344" @NO<,[ZBwB<IqՖEgCHZA9hAEwcw=`f7h?Or|3*=Gc" +=e#p5ާg +H ƓLR@?t- B> +mD.2p1ψ=#}+. +7nXRV.:fOY)VG6%k4m0h(Ax8ABM`YEw +T%;v،6xOYv6O ++k,n[z[uJ6I٤6r@0ogˉ3FU^ +Ql@`nP5T.7 +QQU`G{6kDJw +Z@̚ՆoHUY#[g<8tK *bĢ7*Rn|TTc>ςԬ+h!B`q#J.:.hq[xf=|)*T?|bWKGUJjrV̠UhMT3?NyP\:_ЛtjglAㄿMROMܻn|Җ|ᓓbH-.K -OB/cD\w㋩; +_:,S>˖tiBrhszLl{Ҧp(譀r6Gߜ't(v`\>8a<yc\bMjGlbulHps>OmxE6 ˾sRI/i98E$_(1sQa&L#/PvpNm#v|'eMt8399e +uj=';^K?yy:&iGR2l V.[+$V24-ӂ*&#j!~6~"l:kØD2j~e=]0蕟0H9GSĆ"#^ULf69^Ӣ?iKv9RoYbp>asT2D]1ǵ*;e,Ϛ/^ 3#+qukYIɃ[d@=ÚcoxěgLndpqs@15s_^1֙ +^-|h}6vOSdaд +oݩ]rDfRُbWXRe=Q;Ն<{$gaB˻@'\-g)W23~ln<<&[$Ñ>.e/I)&i`Tf{9"'w>[I]~,)% id"솶(J=}Ԕ83>,vINN\~bTiZlN$3`WnX"P+ҜCMr]g1_2@v[sчoons5xE{nw#L]IOyBͤԾ ҀiG2:x'"MK@xzt7[dĔՉ!WU~Sá,.. +^n}1^'djozjPFӃV]M4)DcpʀnnKb+W) +3P +^ns1DԨ;D[IXI +į?i20 rzGoKQ=iI7t{Fk*Cmx3w`>A<ib`|`_QJ9m=дxJL9!=p)8]tbhb`X7B YHzP𪵻tqk[gcfP~<x]U' Ŀ:0|hbXaxtc5WȝyIS{ +Rx o< +mUwIY7 ++fh6edq!^6^;l_jչLz9f,Lơ(;@x1#G3W\h>#ur9ISz[6R~ +ˮG);z^ .FQ++fW]B[˲G4WiJ/+ρ"#/ׅS南7e'wۙAmH>4cvִd>xa?(瘑55kuh&*\.z_GQFKKxuN//C<H0χKMއ;* +22^o.p}wu-fW#[zZ +Vklu]Bux/fD9}78f +}7,oW +=/Cx1'˙Bʺw</#W>t]|N>s]?x\ R!.wra_ok>6^sM7/Ŋ*m\s`*~t/f4(˖6)74B9ml=ཙ8"LJ=wJ5.$v>֥0wbBLzpu `NQw6ѾKNh4( +dŅ`lc˺JuM&'(^m"(_h{P(K;$ͬWxeןij'*/!BxaZ8sH;w]&]mx)9[1".aR,4&|T%u|xm<0a&n[VPX#Tq//tkXt7#&Wrq,7x*^ʅ?/]aBx-R=&\$d)^"^AɸxWpP66$#@٘%x)c&$l2uhca*^Hdī7?ex^\0enAeƩx)%X,ޜ4.|,WAxG>6Ox)m +D +Pd[0AxFs.Vxqe(^qRo6k&lӶeQFE6-*gwΗ<~r.HBpWb`'N-~BiKxam!4}/^7&}2o2 +`%TѨo xA9Z +vx\-Őj47֘ʰ-ʈ +YxjTFD6+UL!*V>MA|g_<XrŻyx{)_/心J^նNxߊs^] +o3XA[K$.3~Ek}\~Drx)#:li +F}G_&`zC(x_X2xB@їmwV0AKa/l$cJR3JWsGD.SGXlVogu)/ߍ+4nDz?rׂwZ|W+wvFaM:-ګ]g|wm/mog3HeDO!̮x^}+xCS+Ļ-&!^|~i|Gt%"$N)ؕ9SQ{W2la%U +<Ł*=5<˾AM%lPqdrMQs`ptRG?xn`f;9#^4P+^c&$W+/ūx@^2i-&GKD3x{J 292=pJO#OO?ŋۏJ";`D+rGbxCx +;f|R M' +Jʌ':(8 ?,ɌE +ćnkjA~z{5>a1r7"T`6HTx٥te6Ҵ; +Pʬ;1Aq/' +wa|μ̖F=Pu֓JՑ1+kT.U&ܩv@Sd"^ڀ"F6Fu_@ о̪LlS.aˈf<[藻'U*|iq?7[[Ɋ0x+]1Xi_DVX`P+ih]=qS5;"fY+4S5H?AV{p0"EABFjGxkl {.T\NR#P߮.s!eޟ3{Ps_3YƋ8G˓%Ug܉0Fxx#0]I_f1{pI:X9 +5o'XRB#M;(mP?`b`m"jHW~o |佊T͢2NtzJA +x/oEU,®RRWX5n.D9/CEhPu#diY-Y,7e^;owM<G^D,&]dήm)f6y_TjڟJ';T|DsINs==xn_Y#\1;-bl|R +?ybLQW4jJކ6<f6d12c1z9y +Y!BaYTUATB">a4G}lI'߷}6p~&iu89i68`SQ[`_[lߛq_Pbe##{ȟO`zce橬P&.Uv/N}dBZMEu5j5 oT5'jn9vmH-Xms_Zmc< ̵F3f:37<huhU_oO듿y,#Ϲ~z?{ẹ:8L1 "lܷi+QY:jg:RPdQ,,"*A +(!$A¾{r|_=gΙ{{sw}}~[7?hop82chҊ~G"K$kTލ6ǻw"" IdV[we*&N&fBsԱc??mT"me(D98a#1lA"JA|ooppcM~仙\Ά!ΑC5jࣆQ_\P +GCu*DN$\}4%ZN3浮=pVFxSa_Nuoƹhk;C1O0qK7/b{ŝLfkΆ8+<@01s +HSQ"Mޥ$ʼwD*/&>rh<O%ę9E Xm%Qd}4aj؋N=[lǣq]cX +V7Mqs3S#3ˊqr8U + +է +֝ݽܞUmVX"MetHrt#"w*Nu +/&h^(T`#L_{:/mTa2-4Ybs +> GP=L_i7 +O{*s50jm*ZoDG_xZydryLq<]]:K&bk%6&NA$-4%>beEiWEg6)HnL$Py dT5/7/cv=bIHz=47TA2i +ѩE>V>GjQ JaZgB0=tbH 'W֟[HXh衣a +@jh;E:-;mWmk],vDVްS>q>TM+gUXo~,0^Ur8,D/&B91ijL-}~`2(_;ޏ@k +g:G~yx5yq<Ja(-Xq=ԁV*jRK[ZQdBQuA@I$L>OjO_ތ<}?ϓ=i +eo8`KN+: +Fu2h{϶syIK2tU̹Su_پ2bݱ7|w| +z7!5PCI *-y*#e:7<)THymqfمG'{c-cmXgЛŲ_l}xniBKjMcqmPUVzP_9ĞR6DWh*.iQ!J +eXdW"bT xՈQ/0X%π) +_;oye="iӟk/=Fhjx?J5-vcm'ѤX<)|\^wANe7n?+&1ᓔqqIc6IYo68ۮ~HZnh;wv&y~z*AbT2EኮҸ퓲VfDYV ]>u&f;axܹ<D"Fx%BBcj8֍Jp"Z\Hs,LWg +:G%Dn GYټk'k7;~/,yփπC,@Wsk8(Ҕ+g;\]]I.~+Z0oMďC2=T#dIo2ϕp,q3&b%bO2L>Ӽ\#a{3.߹#G}d;ΖR"č<8U$+oeR ?ow +5+2bx]qI55(4`UiĤK68aKjޣ3 + +4 +pޚRKӺdGm|QN;4Kre|9%k64 +d|)+3vgN_$%4A{N_icjYn+j'ɯ)Q"{LݎB" +,;W"PkT6#@ϊ0֎pC +Uj,.jmQP!@HH Ke{/soDO33;/;{>>8';nՑdknȩgVFd^EZT3y'9l*ka4nu1CUGek]fᚖoEΥ˳(m84͐U?x VɋX3^C}.|ZRW+e#Rl4&C^9hc?=-䍉.[Ȇ +ц"@3jݔY4-Vܚ3{vWA)a#0f45%vʼ/SnU'#%r 6>yխo9Y J{"ehP +Cy_ C1Ѭzeb8/:nSKc2Jmۿ/Dd}A6&dfsx?_Fi4WRPؾVvuȏTAYMm[tVLQ|"+UnN6~a$}>e- + fE{;5`;BTzj7UNՕq֫~*;M}-MnBA`Gji6=f~G,=Y=KB]Ҋ?,jFPSjD]J3Vf63% +nm9F=xΧ\>yR@ԁC]q{O}5J dQL%G]67^Rs/"9F?J8x9B_~ReatE#oXWHgy{8{jy& +w6}uS^GAХ/ygҒ=F4!OO蕟M=TeA +u4{(W|oHWwsr@< +Mjw%?ޕv}YOKڇzݕg/>֬ݻs|CoOբ8 +h +HiepP7mR :\WUP^ +H4t#v3v0B >3E'nDV$ۋa_dQJDԕL}\/eO`__fCqHT68vM)' +\Y][)= +6R8 xr+LHRJubF_ΆV:e:).?RP/s)8%wzϗ#ORg lIucQJاC6OF]8/m!&J>O5fGX/b4DLY%}HD=b=˵ܼꡄvN"07mW=\kAC\6ʾJ[Hj~@+0M7k:x/VQw(!(E- +д0f76Ү\)@I +,cIC乢?*iG;u{ۏю[NUU1Dnj[S34$bozh@ s^GFz>zi) +x0+2{f ,"L歮,E&-hѐ0͊]X7>L +:V*+r"xB_mmmC]]]m-րVKpHH"[z2_}W}]mî];kwNqh/%j0 {ҁqL}5/7̰mN-r#|>m9lem_YM]p_rj@nj(Jj"/鶴rC鋜B(-@ +4|t?,ȬEVZ) +HX~5yq<IHj[[ulUY촻^UYE۵czԪ-ZZ*ⅨP)\IHH +bR&GE='r& +^X&{9h` + D`1hłISⓣ'y0toޖ6?8D8#91>Z) +CՔ]6 NsG%:?x͏xG92b];+=.5!5^Qhordܦ[xGcmFk46!mE=#֜Tv O_Vfҍ{IS.`HIvX<A8 +.Iǀ$Q@[\3,)0-,0G,V)n܈ؗqZ 0@13#B_xKqnv[qjLF8wmXok߶\ț r_i4,JLޯkK[-z +M~%f,,/1 +1YY5IP>ؼA!7moyB]ɍ?tBch~xS>ѢK_jDu5u5}Cx1+?bث$ +#kR#'E:M]]}K/^PN=@Ds$3J$R:!d7Zm +kϚ2}wӁKߩ!PvCvQ9)5eI,ώILR˱JuĘ:%smE__{fBBR0M;!przdl9mot, +,tN~Q@lP0{ـeP'}Fb +B^WEwJVy( .T0ZpÐ/1!º>"`&xh)/9č)}22,3uUBF^ό< +Ԃq)u/L.SMBg}ܪKAW*,3Ffpò+>|>?wEᑳgFGH. 4Ch6B$ ᔯ? +_=.[-=7?#*Ҏ!HԸ?eQgMOV]4BP֭Җ$zyUc*u^1I/d{N]{p>?ۿoQNrRGEѫ[tG1>>!%Nv,Iڱ/%/xfؤO!`i,rSE +mw 3Bf1Ĩ=ˍ3O]u*2SIhh2j7;<(2gK'-A+A1+wڜMi@$hM{;wiBaPcBPA]!L,ޟ813LrH yh +SݸwG +Cguea+M[Lʤ&Fl̩p$,j{9/(+b|R{or'L]$h|#n)}f!#H / +ݞvOoclT^KYv*=%~'v ʅݱ6 +f(c?<XKÄ'G!ch*{znM`=*jVd>ӝ/w4bڣҘQWazŁԽlJx&"?ohU?^kg +I7xӅkg7&^i֘צHznMnT)ӫ//|+2hAN;1tUSF}AYwe;'E1Fh{AC|ev +J;`R r&ψ!vс&) /$Yb dter%MwTTJ`YRoװT@@UkmMN)?(3gNgp. *WXW@ +q2/x] *a,ׁ;`qap_\3^{oqaI_˪%'YՓm)R9zfi|KF^mWfto"xտW,x"m϶)EŃEI\ŵ"cVFF@e%+0V!d~8/56,0" +Õ'ZKq3ޜݢgzq|7^槊-:W"ryG|K[Hk8ڜ '3ViA?pXm)gRB&I +Lͽ:+'$e_xmC(Xo1e4HQ0A[8EQ +<<~PsR68$k\cmkLJϪ6z^jTe`s7)2O +MLBe?]0-48lNBAŀ!fǐ$M{F0́5s/4ua,zKU2GN-E9 cшNT&mLo(=)^W{ؔ +uznZe)fߢ6Ko:2[<o3<sMhtb/_N;6I/<tp(֪A)Z*v:XuQӎVQ .E\Zb: $&!}{Y78gze`yy{?ÌԪKwϠPKoN{`y/IIT03هjTGPg:/Hy0m)'nAs3O}xQʫr6C8a&&R|%ʬ4/`ZBFDEMM9ZP^u鳞_ +Xݖ|.S@-)NW^ +͒>PX2EY\uS'4u$:7Kӏ/ŗU'S03_ж[&$е +}ylMm}^k:z Vɴxg4{o/<jKdۅW߸}FotzKpȃQ}Z526 Ke$&'$$&8cTmXfƁ*ɥ"Iq+#UVfUY:RrM QŠ-K^T^em+ +nqBJtMЌخn\NzICĖŐ0Db +`LVo>T*0jJdT`^O^6;gYG,E;JƩu'bG.NG<b+vi)g@iDpbG!Q/+9ٜbn(Їסr!D*5mY5YSC*0V!a5PcJi2͘c +A'0xUƸnpٙ@r:@!>rK3(:̼fc0⋓+:|e7;#<\n9tpL^Q%vT,o7wOӤdRRpKGX-%*`ͺv~|n+B?3 +ljT30NK&Јöxř +8^1~#QudIf-wVN)i ?EnQDaz+J9b+3[E^sE.$ *Z~Dȇ!VFy^ךE<1P=ԥ=6yiU}(9Kwv44C^528Tk˧l7aF8@ߝ<x. +*L\c9|X1D +mV;\eryO7_7$hWq' Z}xÊ>G|UՔѴ6`m+ɟW$pK1CZ-+xRu)v/{)ۋ^ +D;&1nHجœn}NS oE3~8pE +e>W0 +2ph|?:z7Z]}/},?J"m(e{Gin.~w/!cG0!ڐC9<սk1HMG#VmBSOw#>.9MX'cusxaE[`)O ^/ӵ$ۻgڃθtCI?h]vg,ǀuu룈*XQt\ݎe]+1$B^7=c=~;P]O}õ殯gKY][VwnX=uoYk>q˴J#zA2\cwỎ/>].Uu]oб4[Q4vO;ޯ۬_>nWSiv7tU^#ǡ^(Se1X=d\xëɄ+76Z]{O<ISL>H䷦:wg߷;ڎ6{]cÃG*NwmOu'Fn&0ₚyz|/^9VgK{WLCgC\'{~u2ҳISz'M5'=+C2'5]5+U93=3EΜPRgfӳMSTdSY +t<zhPd45<3YJRva+jJ^We*2Sg(XJ5NISLoYٳYzVJ*=3!2S[aVj"0O^,5>s{Ŷc{C絽ߚO>8qBzG^oS3Zi̱Yl9;pyPu{C&Z5)w|ڦ)$-gR"e*siR}Kf[lyO&Λkqxzd!3pBxh%H@okVwEG3nv]l6obeoh^l\o17G?.g76k;wYzkEfH6Կjӛ-&Hz\-_WmUrmOyJV=:ԡ zb @<#0b$:u JȅĖaOdL +%o4QC8ĶG7 #Bp\^(kypH(ͦbjath8˘44ɧg"٥ (D>BڒnI3D}s +Ӑ8ݸq#6 +7OL x^<aކfuzx "i#Q2^7G.@, .,,W<ěH +x2RPSY$V'Bѝf@eeef7!!TwxGFAAAlM#۷744HXdIb`={61o߾WwC$ϋjB8)9ԩSB7DO`6?pҥnwѷjLÇ~^(SaR;| 1 >WUUy<XlلjnjB8HNg6n72'O?Qh}!Z'L̍c;!d`xA$;MZ1NHOG +MQ +g2]Sf)SON- h`V-sôJQhHo.Ⲻz EO-¬F^ ಲZ +Kҁx3TF̴:d"ۖgDBAsk7dں nY4J!$4I_X-%@'uAw>_+W*B`(^2RΗgJIqRh1qe@Q۵u_Sc[A:2 + 3M\Kx6ijTd_iM$45 X@vH0XM!ҩ+;H4rLfʤR%xFCDcd欞QY?Ő ++J%iGH)61rWWFS)k&@Zc1>ѫhGBnWR$^ĞGK歷ڱH#}+j4"-6 Gͬsx + +qϑ2Jbd@ͦ)P!x$5Lil,-VCgj+ڌvR0EEFR*4r_T0?0:.}'kI<|t$SSUt28#m6W)aPi{]֞?ξee+KDAe*Pi 7۳YԵ@2WĢ/69t.3/ݷõ2.SnBѐ/ou-UѧBs'-{@YhTV<&|5/$*^h?mx{WѴ +"W?)\(<K +8L4Wo^=_kАsةj }N[|!q8upT0h-o!ʰ̉ +bv +hT)11X9Rzw]0du/F +oA&p''u7Mżۦ/X[y0$$,S&M)Mϝ%VH3o1LJo jbϫCz}">jm]}b1qn=o VM'yhB#F!\>ͩ֍^xkQ +70OXӡuZ^PĚC6O4Háu+R{\- + 4ZN^tbvww}f}ԴpcotCd:+:;ewofN{[A=Ո@ϚRWPF* +#8g~tڼ< ~֫ߝ>Z4kr} +d}Hz)y0|Enܸf}dzo`& 34hrOZY@V'оuoOO\{G^Z08A%iTH) dK*U8_][+H]S{pڸiVmx?w_"DCĢ{n;4Nó&S0fS?}QZU'J& +ܖU{tf3~r@RD>ۇA4|LybOt"v j?R4ەqq䕕,[|GRHtِaѺ2+Ë-~0s܆m9PGgSS>y lpPCZUZB19'/pȉ +{ӑ$kkvqe1?i;^h[4Nʍ +S +yVeYm{/hNYU +w{3O%s-犳S|FL*ӉH&ty⥮^a2~C-ocGi d>6Yf{Ndgn@#K`P<3ѭIx+.E@$ߊ[vԂm+]DUL{1V*h\<=ruS>s=`jĢǡ͙:yM_EOx9& +CsZ7,[8wAAgLzzQSҫu앜8O4OgEvK<YQo勝tqr +lK9V1bލ))rKcw_؟S7[xhfAk{?K2gwn.1b6^?>`A=_w-DH,HBDŽs +eADѕE߾sY tQ֣ʞiMDpA<1EÆ,bKZgcVg洢 +/j;gYI]4XZk꿾ؤd]ݽC^=w-gzH9zH Bۓ,*7u3(pʲuVxjD +O~KuD6ƎHB[qQa?Kxid?AYz+(ia*FXͨo<nfQR<adW}l"A^..O3}Q0c-72DxEEQ)E/_=YۂokgLqy>l+|K}gۡ/K")yi/W2C{"j5e͒~50iș={# +bL}eoLjR +vϩvMuf:Vstv#<@l4-@.%l*Nlј+(1X"u/wd$fA-h6lF2y JEiZqU,3 +u +b_sMU5We^߀z7ƈ15ZZsdEXx~Wɫ&a乯8 h)#Vg(TqG6}:gYkU$qmĜkA+#+FNS:epg>PEu+|ǒ+M#uA2^/C%sz5XvS#>vg+aO[u鉸K<8M"/;weMөWyݕuhmaؽLfmwO\\i<? +)FEU@HuI?3!8gj+Nkb"s%%ˊ?Gj[$da|ȜQMu˛"1%A%B{jbZ7cL7\uh㊽S<:Ζ;y5BALYdVRIds +<JԜՉq{#G3n0c? X]im.1ޤnB9%ðVu\gƳH<j6>`0 _e`j)R?s;C)0y)ϸqbY}[EE*6V`1hu->j6~;(ӼvP<D^'%ΔT<7kÌ; +_ Ӌ?Fwƥ !La7qEAy]VcK5ж, )Z'i7O2 Ryv=L5d|*nׯY%YCiXp,7'_'6d"bf+ȑmW2{p͞|-vBݜy4F{ƈUP,Ay!@\dmI7F "d``4) +%=wȓϥ +=%Ҋrؠ, + 'Q֪ B2j6ypU +OwbMΝBCk1w}mrS}GFߗ7'WoݮAt[4M?BёiqF:}[n";^mu;[m<^7m{5-; +xzg{7]Eow}>lBDloV-\P(:4z-rxG^G?XhmQuX"/q-1hi 8%^EGXhk7g^ +H"GRѾibFÝ6OӤN +E`\LLÐ^)3_pk?|LIeII79̰\Zly͎͡R"'Y?u]#z pO=* +A8jpo~%h5 W5?쯹~,,\M٤5sx9"ŋ])a48v(e.(B9 ^)ޢK3?֥x}&dCU)C4q~ t?_2tP'/,CuҼZW׀<&7PhOb\~&e,ح̏אQ+x/+84`6+*"0x3RGi+3 +0*Ț8/V{^n|IOh)W, +%SazĔkQiCzƏ5\ +6Sm)ܶq{~ỿNQ+qKxn]Տt()8P|,"WǷZx}yLOԸ;]pS[5%e1;|h}[li/p$Dh0)6\RCG^ٳb +To8'|q˓!TOD`{afbٵk||lNw=?{V +Lo*x8<Q(%3\sdU;2mUGU$9PZB +XS|BOFl3TU[AAl-6UxZ9@9᭚,,ԠZ\/Dj:kG<'78QXjݥ[QpazA0wUsgpk|$"C.5R%/֒z%xzTUKi4m!YDi!.eox_u^ +֢W[\RINe]|ӽ^PK<8EWUG.ɴ{_R`T#Dlŵ}@EXUUUe-T:a*BI:kUUUUUMKvXk7ΪM:3=G;v{gv8zOi8hBgUUUUsT.)(dvdЋr-:[GE9V|JΆcYA2Q ?f;sSoﳪjY +dj2xOC- mA3U513轚tVr(lQC̦ \UUUuet+\(;IŬ^vQqLLc`xcvGl0ď2=&Z=?kZ} +r_ SA[#4gJM̔+LKB( +<غr)s$?W!fhrtu^u˥YI*ӹNEmsC"70\uhNmoldz_7g)"xHym}-7IXGFi[`>0{Bt֒iBV٬F_>4Ԇ6Df ]!dϾ1t1pvhxR>Hy2鐠#r^xG]'By +7f%KQ2-mdґ벚1K`TJ*^,C__pvfb-fAdS.f96QD`1>En\t睗)x ewzS'×LS1 NHWwF~J-;Y눶:h78+ܡ]f6HKt ݼIfތ"]%hwE٫Ύ0O/IGnN-Y7j%s @u}m^ v$l#*!ffڂS)Tll;-hZW17VB6^0BNFm,'Jx22*r $QEJH&\mݱ<dIh,CAd֙&#~Ov]!ʃu͉</MTT^dI=CO 69o28f[JHKKWQ!ݼWQ=xzW,یcYRҐ {lDɀs;7Miۃ @=U Z eT"vk9GE + $j5oA?>::ntttI;G{̱]atlo{7OxmBsBo7 0#/fG֍lذ~}rW?PN?~}.=M^5?,fw{:zKb5/-MZ k)r}$MB7nQX҇/Sef0afx6йn9Şryw[s)BjC1ceF.'vfv;V<sEQSo\{L2\ `fŮ ʼnnah.[wxn߹Ƿ+EnKah)-r2xxD.Ӵ4aؑg}v +MOB땝[nuzG;˯^oO&f藮]84ٵ?˿x"u'{8(KVDZ6UgEnXۆ3eP`4 +X&'esd^5G,B.*ER9o60Yy-?/_luE-M';VMd"_`1<;y%P^tϏtE)s~^n8Cۣ|k-X˖^ʥ+?2[x"ّHT4ƺZ!DTKh؈AS&bڌcǨqiFIP+AR1QQd{so{I;fxN6/bꭻN/7<ʓt)\P'9AAD%-R!*S(80-~<-uḼȰJ|_46[q#G2rwW&.~R$fB52%7 ީX8&{S"=A(#Mu?ɵ*vJSqt#^@+H<ռpmWop ğUX|G]^V3ǿ(*|k]Q?}@q*BLL)FLEj:H$BY+-.ﴶUEVt3'q~Z4mJnߗai]bVU\WEMual۵4$(:bR].>-5NZrsL?F +#J +!<KOsykxIx9Nx +2!3h8ޔ?3KwYA@X(KsIO(J29{d5XVUaXQ@M}i>ː%YAt^>? t p98 +?)uPIʿn˲n˖ڛ{{0_tav>Q7T=7ɭݽ>A&L?DB3GӥH%jKq-Z|DEЍT_CYS*{>h&=ltu-oB"5eҽllVW=>gU}[~q2:t@d~0}'Ȋ8rcQ>ǣH<#OD]+:xe5Zj~ݟQBr>!L܊(^ОWLEX/OiH>ܼdʸT?) h]囶0L~3;dxY#'kBǂūaCC8Ԏ5/e;\k!7b3,knpje`_e}ڹ#HI:gvv*=r8Np@ <3+yM*o}e!|zEk%`\H9"19!1!111&"a*?Faק%oyob<qnnթs.5;.g7˯:qG"1![0"!D0X^j0|\Z8bx#☠FY\I*t։P$nK-5|gUrI,"X68nlUQ>SqLǑgo0(h<w$E̡Aod? +Q ++lݸmР?_~@h 9y/5᷂hveOH1d)S|oornǢ Y!K)JkٌءVbԵHBCe3N JHJ506eҧ5e~9?A4deRUdor0~gwz8G`~ٺl/83:fS$Fȋ)DQVXi%cm$g`f8l4 +,MH90H!SNC4oJb2p0NUENe:9De.(`}lf`0;5Ҳ̊暸aFı9z:U;5#mYу}lALE Bx%$BXǒ^B!HU䇂iTd_VE.zuw[N"R:x%OWPFn;vrN~ ar^$7.n5HvAr7]^qD'm]/Z3s~ +JSASrF%w}`2ْ?7fso+g%A筻:.NOMN}|>;!upX>$uOlAQfoE2{!̉i)I)#/ZqZ?ٯҰ4|B!ʈ,! D(hAVm\ZǭugTwqKQi**[ Mro|'u~>ϴO{=e +`U5Wf f?S̽ b<>bfVǭ8v{!/P{ҕE3 +r( zt!zFd}ߘ7Q0ߠYӅ\uMx6ܤypg//l쐛mܒu{"^%+ {LP7/p ,UЃze/|?aL)Ns_HB6'=0$ӹq\8R*iɤh.sfm]X֡ft`tAW%oCG772%uDcqK!`NC +ij?'mgz$w<UN*͍Űl@q`ݾ +}X|Mo$~29:Iz,wMX64L(D"5LWaiސlaA)NxWk}z K-_N=?QʽlאHMaUAޠ֒?9BMj姊,-,,(x٫0ZCx:V0ǍFzbr+uZmwxoe㕵JeTDfR(E8Z2l=lg_ +Tw\ƧAV4fJ%eFq\^Q+%kZc껶t7F+mȤh?ao{O"ܨ:ÖmCcJx7wl +Q~:F_XYmaW](`jDZ]VK!5ɛp +>UO:F$9Vw-j6ay~z8FybwǣY:Y$cP5?>c@VJ/dkem&G>OFntN*8I"Bil:mуꚚR9kPٽ7Qw's.?X~ZD-#QeYQ&nl^=6}6I +nLLHRAV,6 *'Jq}zvSӈXY:&]wj=&AǤ9উaGC{N(K-LӬ%X)1~)}|v7cS +Nh|'TJ2Bf1ਛŵoшpʎUZSNpL+igyJ5>h@IN{H7 +nx +n4 +oXm(?svT-x{K#u9SiL:0`>4&Γ c3%H%)WW)Zlu)yRJ&``\aCi<y{xz_ +7WPJ!A21^ԌKoC6w )5%'33%9+'W?` 7ӅE}iH#+NaHtIJ"'TJB-]gMgYnr`fVzz9hBL eL1"@L{_p42&g3*CkD=UV6Qiכ몾d32Řp<W&v/$ܟ)8k[016.>%56+xξ*/YzS{Rj&??FxMAq- +T ÉM3Я֟tάuH{/'m;7<s@47Ў1a bZwZhAF1mex)t:ٺw_:$;+hop\"Z` + +IVBUx]6x1xlĻzY(npl6Ji,Z$H@˿xdb9jIv:k_ȫɶ* ˾oTs;CHi/Vye%#6:Osg8PrÊUܿyʊ~v!0dABljzqT?\a 3>Gٸ@`6$ rw^{Od_O2[o\bJ[X{0ؒn:nTy[zʪ1eSg->Xs#C\ts9ƃw}z%+n`>9s;v>c;$~ +twW@۳J7S56Pߜ&Y:N궻p2ݧ~紒IO}mV/ȒE˾}}&0֟=:X9feWC̚UVWgtϿ#p 3x6u_>:g~ȌfܶeC۫s+_.m#tyܬQO!^HqynF8 ȗG] 4JiE!x +8b^.K臨7b}e%ӥ=`|@&8QX76x=/9b7() J%f.-peN5C9=}o3kKՇ>mi8r$lSiĤ9]gӜ%[O^n/Y9N=</b[mi'A?}'uզ類x{~٢9҆+vp +Ä鋏QHَyȾy_gy'@lWORI?|2v5\2oG1PM(K=>jB`Ǟ=+&+N4lY6tԍ(뵞9cZgu`:xZ'|8~m\lx/>ҮV5}K7bǩ/y쫢CuS|82CR|A]3G>A?uq"$%aLd"3G{<#2p?e>f?+rR_4wsAhJ5 (m&9kp^Sn#yDjb̧}B}ز;.ژ]Ǿop8yS66x, Y6Ȣ6R\](ZיJ߀7"-p0AE^N(lhH`U *Xk?:S*TFfVS%ƒ.yΊjCVt]SsXԡZ$"s'lHls]&W'2@f7'NBkjN=gvS<hˊZ籑"eXZњP?p6T[=ߖN:? +ZuIۡs]wl+'jmH̊FYNHZqz1ᖋ6r45aVuIٺ~F.+j|&?T>C]'f3kQ2BB'+r3}VPI\Bvkq/5V璬g[;vr{cƟ:)kԟ@(X ڨ].yԹ1\בS`'=~̺\G| +Lԧ̙$\QR.>LW&QF](|LLos fMGlI`eMnjd4Su!:kxʤJDՆִi;kȐK0cPT82,D̵YQ}x$ϴ60*H+j5W^f e$+$5 z^^Rо\Q¾rfjVWf+5nt1YGOt06siysFi՜d(uI&\Вk?\6_y5i,OsX~ /?6LYlWPhcA]Է`!\[VHez6['S'ߪ{~V1يN/UmC\%]LnBP +{ +@ @ @ @ @ @ @ @ @ @ @ e>z.>wSvy]:"?\p>zE_W!G4e:;Zx}"Jo=F< +K"m4!bmPJ)4VJ415$&5VEJ4?C4Qmh5V;-(.KmMW`{ua!1dqtܙ{9{}~W~ڢswFEKSV-X.,sz6[<udWs_|xk8)vgc(qqC烜 r=KObKԡq<rcRQsՈ'Nے]J4%^9ŕ{(Ws<aW˸kq4/і梯/M>ǧ^ w +mYx9ufF+9^E |O`%ąxez=?'&L.3꼫ϸq5qYN>=dEZ+0rVy@vlMK Y roU>~Rxhze/+E"xߝw9/lAʊ V)I")夢&:tSI9lC{YuK@}_`hP51}kIe >Ԉ_-߫57QP M|[,gmvV[-]ohlW[l-rU!=0QaH5QB$Acgs$QD1|X<!y<ʄq ㍤#3^(fdHɲu[4HK)g +f3<cƛvB9*.l<pg2hZE&`7$N$I'<T3ĭ +'Sy|;XHi-j|1NJکB73Ko +DttM4Nnrj ^y&˿ǦM0E.ODtg\|؉qUL*ASȔ9ߚѦU4\kToJ9W_;b#'r$$6`!5\%4.oM@NߌKa%A" YSճZ1NGܠ}ёٓj76Xсs;J:ls@RuscxU0(8^;T~$Rt+)@xLB&Rҹ3c|E)@\r8y1SJl,& +T;/vH".h@xiAlc GIɼ'v( +wpo}{}R?:+AU]+]1fsϮRRԾcǎO݇=iJ%JxMT,:WM0`3u>ukqNIԯb]qP_ +ހ +n%6uhTrMNcM iZ7 +Adܾ???x%ao6K+cm臂 cQqQ<:Fcq`c_ˆfNpO}4i!hΫ{|?+_ž@1{:\6=cccP[6m-pt`<3^x-ڶbP(m*7b=WXwq+֭+{Л,;D#O1WhC'phcCZ=PRXdM, "GI +ox87.`@Ύ9[kv:3@#v&2p[_̔i>Ծg/+~y'_.FC4.*'TsYa4͜ +;;z;J~ysoa>ٵ{_wwOWv.[857|M`c;>qӂ{_~}[87ﹽ^IZB?h&wIVbՓ}~Euq|(03ʪ",)Š +\M*&JSSSkbF+.(,EEYaw2﹃_Чy|re9;~\!W)Aً:I<iTvg8Jb7*.d4/;7ǖNX((¢:.ٔòIWz56-f=$ٹßPgIeAwjW~c{%,!e<qFq-cϿNN}P$ iE0 WoWtj/>1 +i6F{o&3fRer``w~Rid%UWB\RqVA],i"`m. +LEmDxLԝ2@YjQ1d 3H/4#7( +*i`)nHut$oݢ%`N{l[,OP(8NN8Ad%hxy;i0ͬbiOi@ԃwppEWA,f,Q=K;x4bIG";SȍB&Elٙ'K<yPFZQjv&,mQ7ͷSFEDD: onWAaQb1TUp7|0O/vBxku$ޟ-48{$#F$sOn1+J͝23a5}w2%.r~D삡131.Ң߅ϝ >5ȚZ笄a'1sE,}8U߶/tQRGQL3R6FTd^U3L8 +RTw5?}e4n$$L||Nu{îW#ھɊ<$4`j:3.X<^/!~ +PO?MvCd;s-vuvtjQQ+zdV`]-n+vuw^?'z876+ej-IOzrB/wIo͈BiLC[k>L3fhUi/Vvg=U3nii7<ر.Z:@a8L"lY<cky) )I ~~9ŇL`f_e"̊ុʈ"~s;AM]Vvn|%p8 3nHdEfЈ%3|5ŕe۳bb\^Ē7%XtC<ľ!kvT,0Eϻ1"xvbWQjuMuOMHLHJ zDb/m6LPF;*kekWL,iîʌ<*Kܢ0ph=9;N-K?io{sqju`225y~GlFԗMXj) +N\+OiUq᳭d_Ɋ҉ĵ:0G, mi"_{JHc<<2;ETNf0~=}C,"B#abɫ)# Ơ +2Q#t.Uo]U+]ZDcX!!fSUm'rLcynQC1f +(Eԍ蒍e@PZZ2,]qUT@QE`Ta>};=wݜ_]gzy<XU +8(𐴷\p뜇5wUw~ i| U)Q4VZeTk:ufF `+5k8#z^Y[YJ=\pքIU7$& <-`3FD#u6U-Hc2"LTxpQqoؔ&FolBBlm#\lW70HVNTzR!5Yں +|fݗ덌<gGF +jw}3C + ++nHx2_;idRqE_أᑴrBߗ8ٕr 9ڊqE]v+xa*C?/D>`a%xhJ *IJ('3&$|j|YSYMʫEȦ +H]sZ|̅ur[(Ly}Cc]}M.qяO[& 1loyyd\ݍӯOrF=7IHHV1p{Yϴ-/ V'>{o2d&V86ZuOVqgGW{ӊs|>2COsloJRAb-(BbmIBwWZ!$kf~M_@Ăٵy~`Tzq$MM{&eAFO[SET\J{_lVшКtti鿞Յ\T@n@6fvIFt#|=<=u^tan:]ys@۪bbctc쵉IEO|;K&Hxmks;97Uê)[&(]%i2G$H۰vȆxnX-Bf+"`9{>h;OzH,'{=ƙLd=(hZחED%59@HKt;Jkaft' +߰:CX2- +B%_n7l>!5LoSԥ/deo4i'}*fҍ>X2#zenf.|Gy`׳'8dGO`SAKmVh.M<4J +.fUs)u[hFlHm`4 tu]/7auZ"h606 +>]%uoq_(O+#E6Af5Q)l-(`GHRd -ĖEKE1A###(0+/w;sw} _:q}b`dnEQcGD-N8JGJgfTYe(&̨{SW_1A I7~:]]\BASj9%:S䛿? UPљukyOη0c*oKSQYLt% o:x@h܄qU-:c{KX +X-97vf$9b_RICaMI8<q+ +svg~=&%{u=sU>S$v?pm.#>9Z<ENb:wbZkk^ۑ01$ +y@a'_e{LͻxGӨTJJJ5Ҙ0wbͬ +JD#+ބ!%"A.Zqп9AxQ3Yv+n!/29džLw87%ߗAZp%חXKS +$NZ>K +M$8V kB6q4fS4=ZUFqu#:5W8FHS۵{_F'~;@gJ,ߙWo.:cIyeɇ +sNN\eh1-λg+Al4m7͌M=k!@8}^;+p_-@(1Op9G@XMӧ&-1M0Jɺj9jgF0ˋ>PTBF +YY,TԓHx_m?W.ݨ*ό ~Dn#&MUE᳧q|?g_VVzM3(^Mm?FD-(*}\.6*>v.tʆqPrZ&9.GD5Dv'6@uW \&\n0凜D㩣iAi&V! I8 N@X["+RPT8{"5?Mhh>l #@$ޱ$u(hIZ1gn1_i!\ÐҸoBm^ŚYOa[3\=jfxKoJț{G0/N2nشŚ0cp<}i_0Ȉ֡1iFz,Ħ +SsWjW;GG*e!ti +Ifqce0t$Q.ߩ/{?@$v9PxŸEyJ+i8y!0#sx/ۍƼ(XГANC^QucRM5"* +Ȑ#ǘ_ %72x;th_uy}Zc&+wN!:U<PIrCѐm4F#^?c~ɍ{$:߹sOϪB +7w/B*IO; ynL&Fro8z/z<G{Pę +ԪƂ=S"n3C'/vh +0 + L^hh8v/CmڎT> + +.`fsMu]H)8%qu(mʚچ[ditn<%D +1ӆ4<e\-춛k +zY!+h4zX$FbkdbQ%)XY<2QUXjxSsʃ#&/!+kZ}cNf+I%2<;RnD{|#Ze书r8"Ŏp#[T + Tr!4M74sj +!@ix6P10xx=]h]@P]#=SPtFӳs#Xn6t=QFŻY6&@ǤN#kv9rZ7\jջFEjj'#/Iٲe"}:)<gJyģ堵)sz@2SYPMXK)"{xxMHގy#9cN`8 q_fƙ| +8>oY+FN|8rGc&x36═x^4(q2r0[2}ҽN|NKe!*WU/cU&⍘,xdSm;@ +E{ww#2J)d-_qS}CPr3"LI{bؽL{,A$bgt[f@&1'5-bu2**Gؒ,l%t[VN4k#aR@˞ "a j:ǣFMbT$IVUyx-cZ:g"kp$I;|9gvuyإ@-X(Nuʀ5x+4``H`8NS(fc8.@i&Ʀn6:SWUccTVҕNlN c +M'_$N8~+~{;^'Ⱦs +Xm)ިi#,2!A1*$68c.c_ +$TŋK-$"ŋDa2u^c, +W:([Wc֘dF\$.`%dQ~[cD^D{q;KdȈ +^"xٿږqWu:n脛xmfꌼ/(wU@p2ࢍ(xK-d0Ig4Nn_wj$֙V|}&05 }ʭ} {Kܦx)I:ctwxK`R! +x쒮۸[>$ş*^!;, +p}Z\jSX7ֱ(o*@Y#Z.z+!!l2Ug9Ѫթ:F+mn-Ms&xlkZؘ-AXJ]+uFP7r_-e}hE!9zQ<1w>EIw'Mp{|&}r$"PCdeb-KRӝ''8%I"6""UɢhEJp9ABƻ̃L}K5-S;+TgUY^7FO-s/kt48(=fO\߆k\5/VNr6&)#)Q@0{fafF4aaЬ4WU߁Qiw? V:eJtLBGa排M^u~;*"p0np4{jc`yX(x;-F<xSȇIQ#c79ߖ;xuHRNDr[(.0L!pń{xՈqH㍈4%GEmFҀ06L&xcHRK@Oπx[[c[kFwyqCkl]Lv54d-k;@5uU̴`TÄQX es.z:X&3IѺSH;d[ʎ䃎wFxp.?gML8 pw +BRExSZ˔(i{WxJ#(hyaw+5WJra-><1]"c'5f{|0V%pr_gl|z>Q 7[VKX(CGCZ[ʬβ2V.ê"(mYLrfWW0zY<R!q`UI}x̜X3BT}KjR7K9jȾK<)?ޝJXC*x(pRLԲy<aC%c^oᵽ&<Q'%$$kHc齝cN +;nՆ{xRct_&&SDցr{tG:>Z&_;U^mXk +5u|ẎT=~}FG;73kڋ_̃~缞m:OBYCx"|V2TJA|O_1k7uc틿Ʒ5mgqm}/_Vo=]ʩh:P#R_uëlB˦1,D1:Ĺls?kXՕSä^qdMWL],$a +0E&t%|ѯ,p2qLxv6QSYV6HUFocjQOR8*5DEQ@DC"(072s3Wtt_O*@TQu,'OM{jCԙcW˖XyaUN9屿{[FmIjlW'6v?EkHmhBuJ-K2P5e"R֛U4~~>yڑh4Q\oϜ"-7Is'|29-?CFi~VV,<4mp̏ۧ~aZtfW!7bM>!9!QOiCp4mі1*0% +c]$`*L:wVAnn`bS!Xhܚf=1&}Cщ||`>>Z7Jj|5dXSN~@XcԎ +[k7ʞ6Ws +@+C#I:WwTߍj('jpQ)gwAU'Ƭl;*CǾqr3evAЩ!咜jOҤ檥'%n/"jZr|ϺdP{w#) }τ1&}7c_]\;t+jx6KQ1 +qjo-W +$¸Z;~%o.;53O_}hL=/^(LbiJ7gV \>(2%HT?kE-Sox@х݊}UciӚ{WX`M$)0 +K5R]GHzhDMGI6Hjóy&-I٩#p:B<o7V| 3N=LwSQ(SN}j9X˺e}1 +Db+G'z?u`j3]ʦ9<@hZ=gRNQtycm}cW.D4=0=.Þot\lWhk 2sXҮRĆzdK(N9Mz$(#_F +ոT꽰##lYAoƉ.|S0a:*bGzm2BsrCk&.ɍbppOPg+E_!(K+<ivц-v,)V*\.%6p +b +B8%!ZE[)) $@ L%3w $></|&vW:JAWCW礙!g:ӡP;}ZLӜ4d.R?4_~S[}EB4 +WmwБt}/7v\'NǮeom58W(=$]s$$7-{=pI0ê0d$aIWK7b$VcH4Kazm!ҿ>|Tn88\=#5Fd<E@s(F<$_/p2-xPqĆά= GoTe;m=q\,xd`\mŶ.s=#{sF"U/I^B=2hَ%O(KƗox/>AȲ{.~<{Qo+"ΐ/V?2._/UToן&nacO,.I}YQҖ~vDif1~b-~Y8D4o~\:}2M䪕gΉt5,eCqD<^{}/E7k[1{gSp?k@sA-=4Bghxw#mi% +9 +Mpn+}Nm_Lq{tm?5 ~c#=..*hVTPܢ=זr1ʣIl8ԑnw/YA`?d?.P +/I=a'iChVmp0$hX<X(R!э![.q(n5/XiBVzQF ;_uE*OWNY1㰹mnbHSp2-yI_u$ +7Xͳ +_yEo1^ފ00JZ5H'n_|\*Y4|G3n[dY#a*>_/T.7;PU0Bѵx0A +C4B/'b͠fqFWu 'n26&37=j#)D +U-|+*cQx +ձL`On} +E~G5qgqmϮUwnQ|"."b+ծ.Z8bhP*."RjŊ +* * +@ !< +-84F`V94asjmN@i0MC}:Ph.ߘq!6wJ.F`Zv{ +FfHɧnyX6Q$K~rLӦ|/hõa3smMC U!mvWBhD$1/pV +[u3fW~7Ґ@ku!HEUHD33bb>J>Xd*VTまo&zE(&<R[{g2DQG7El~-Tt>7) +s운u<Vڏv4&>Ղ~~R*Ңج4Q~Ρy$0;_Fµk!lEQ@ += L}^$15x4/Wڧfi5!_;o,EV!w=wKjTVNw5+&yNi6.K^:ILPM164X'0dRWs< +$\V<n[Za=:̈<hd[wdwqi=t(=YBJ*\܂j,&QU(6+S(~obrttl>)2]bi۸]TM͟'=wѢ5 W% qv2[̵7Zm((*0˱Sy!|(8q{汧"KesBoqF;O nAiBo5X(ObᒶElc^>!hB؝2XX!Bwag gyEuPΉd`3 +4[ipvVmQ;DS-] +ܗfJی 3Wx~QgnI`|[;/#f 6kD߉ +cӭk,\`Ryb64M9k3e$͑X<!_=%kWU8fMBߘ3x0#!1[EnjBYoAm,eCڊe|kPe# şa_!lOtS|EiXbB7K,F?g2X!p"iD%IeLĝ3s=讻CTSI[__mo y{z;BkXkò_ +@йSWp?yulaG +v̩c~^ " elh%F>K{oavݮzOR璲ΐ/1ImnLrf}%I*v>|,yL`@~Xvxe]`얪>pX2 '`C]z^TsWe/iOmզ5 +ɼ|T*^t`,z̛5Zi_˦Bj& E- +H!!A"Ԑ*%U!;vIJ8INܐ];^yw:P*50wg̼y}߫:=HCX;U{zݱW]m@ec3}zmW.{[ Oޚp>r 3s_iyÖ- +}3$zn_1g ~o~ݢ [iB#F,\SL+?"Hp/ Cz#!wH><k/?OyvCkVRLJR9vȑݑ +ti%~/VU^=,+^%^/WW[xKWW_+2ÆvKozZslk_m}鹿vՙ|À5Z)qv8H:mw :Ty=~f#,'K#zמ^[UE?<X3bCHTJ^i `3O.-53yv~j/wε|gŒZ^_3=R!깜o7]S_=Sz͢{NβҖBf+ -8+ַ_>f7RA]bæ-b?@6̌oL9rosY@LOB3fAG<YEBuCxA`C'jͽS6tpv4(&v_N&Mm| +wށ +2m)B^M|β` S¡fFÒ gU~ Ln~h<ǸOD'ϸx2Y`SK`BCOpynx?ݛ4M5DqLPA5v[d8&\]R2mMe˱woߏCcB \Y H0"q5 =KDJRi:%G(w=`J/1dO~4OghRʟE|D|<stcJH8tZwC 3t c<bjI[E֕;1E4tUw>>̡ဵ53T0W>0[/j [wVu}xsj=({S%ڥTgRit])0 +P8DC7\ υi*O +Δ㉮%s +QqLve.ݧO;L"uaO94q+htguzZ7#a,G80ٙ؈ᑄ}@{aW +MPa?xʽ{J%&!1BS%Nnwq#^[ji:QYj$ + +x}0ޛ|Yf3IV{Ph_)Iw +}ߋǂikA,)UQI7D\ٶJ!J)ac){+G(BSRFzؘ_w^{W +6TqEq53ny6^9Kl+w9[|so?Y3:x.Y2{ckǹϼiUo" iw;jTs-i.N?,h{"F2)&o,uD79H#ƒM<2";4kܔ0 AH~vO2NOLopApk1Yhj8*תp).+ҕ!~mG'tJji0 +RHmSCg5~P+O.:Q҅+w#"O`hhgH]uegd^)Y26QSUXGo˕4_KDt+04s.Y؛gRO5T{jpv9=h,鍥@Fb k]wL>IB1Wʑk!=9PQ 8vpVu`*4\xGKᜃ.sj:sR7_vY8265ؚIPBΐds)\gL22je$u|t8<BwR(mG;̲7[F4߭MV,oLtt1^x~E.K0u\f +&Cx6;Mi0xӒo|I_n'I.AI-BA* +,TC!F|B<.v>vGW + ~e1(_Nv{.O +\m3nx>ZoJ +hTũR fo :0Xa.L(C^歲DqHYEl18kB_x/60HCڿi+Zr?KoECu"Th;\(PvwvjK7t$nsK +%,_JUN^ gȥI>%06OIfiUM'+?FB)(3ɼm<w|PֻJR$j5WCnJFږ@NǕS6fW*oJ`S]ιdFN;*Kzm0[oͥJ+»t}y2~qsu˻ZsM"hdW8%2\v,]1 +PYA/pV2VaU|b="fS +N.Hfj9AoK[XanTlW*Fk1<'iX)-tەr6!{-IRʮf*jc*|VZj%Sn庽C5KJj-R`d/T3o7(!@](d!E뇤KG -6O'+<X>hO%6gۙC/oVO୶䬊MDA|F~BFRZTeiK^k6"L8$M;EP'[1&JE:bVD"]ֈY + +* Ĉ/o-w{wwEc'3Nys9<%ƓO<PW}(zmKyM٘寺$sK;wSDJpC⡷b+ËF(RFJ-E]H:YЬ*UԌZG3[4sJ*f:ߧ}-tG&OvH?`lWk͉Mh!QfהGow8ˠ[+hG)E"scҬ8ځt@ʛWvPؤ +|uu|e~}fVgPoƑUoGL=:=wIeBXT,ȢWi{]]B=RvE&mb6nc\I;)nW!>2/$'DmU!i1_ FhBIڸFe+ +bK?oW{[8xMv<E>^˧#zCa.l 0cY=/xbN`d]!/[VCʿ{_ؽ++t70<r{dk_vֹ/rʒL1mʲ5VUfh9#?*B- +Ͼ:O+6M!3*eR6B"8%~]P]-rnrLR8 hCaaH"TJ}GR.(o1sLW_&*A@7b)m|:F9v.i[ <Xu%PuOz@xZQw~ÂMMr8ʰxOtjemٔJ!8459pu_Hݕ~0e9i3y;Xprc,&"/̂ЫuҲI+.D燎=l#uo,z!o)]\\=bH͠!v$/Vڲ]bFtWo_(Ł^I:C#=9^A%aI6AKf<|y4Qȩ84'I"C88r8WڸxGhާx$0fyACh +ԃ{nRÙRzX?Z,@|V6\~2M߮x"*D"qNeBodϝL憜/$6ٵny"Oh/˔5\s;֨Uђ2#'S#s:uFy=.aW; Ko|6P6_kXZE4Ұ& #ANsΚhu +*I/R+vR,pCiӽ?vhd"W8jbši<"Sf<}smy/Ҩm3(#6 +>>kH]3&Gr, aemF!,Dz~Қg윍'gDyꍤ93-?KAzF'yXc3_UveVĠ?lP fG3R2{]ꯗ-+<ZvLU[EkQLֶ3kѩVt) +**r/ AA V@ pS%BH 9$$>>/n9g8/?^U'7]%?>B8) ȼ,:YYXӘI30$X=|`y.3kc$妨^soS&wƼ@c+n7aϧ{A}5|;)Qhޅ\˕6BA(pi>z|DtfΎ˵G-iIPҨR=4u)ƈ7PblO<uVD{pAmRgYItH`(G#UX'ͤwY7#mNS;ǫDwOW!J<n9qɇqi!O|D<#%8)Hk|Wu>K=fGB"29`w]L]ب" +M+p;ϽM++)jSc6~e@s^#/@_'lavL+GXh4kgrm}mR洞dJ}x;~/^lƼ/aHP}gQaP{H{ :K7Kk%2`Gm\s''ƬM*Ȝak)MKb~,'"lBiHzIȵK.Uj#P7I}CrR2#~3$+^/pJևvg\Պgj)S67Sh, <ݬgf(6u +!0!*0 T:/PA;16)N=κ*%tVB0#Zx4sNgI + {*җ/I&]^ +.̧/?uUAEՒBG['mYV0Uר`YTo'ſP?;vDq ;Ϲ%Č^h$rD~?iYK+OAg+NuT6N*G#/%|1uʯLV08|\)lsR1a0F<Dt;b=x,7Ɠ?k1E텖HTVHfr4@<R<ҭ*.qaL[/deYƺ\ +~x^P츉SNX>2W,",>k1lfЉ.<Z6`{aPLa@T\QD-Oj<n +]r|ǃ +x\n}AW%]ٯTF +Ԙ?~dAv:yM-v"~yr-N +$hý=n06TF3Cݺ]m[E)hsUZCF5e#2=yWJ#DHJdIJm8@F<uuM㓬}Ve=Egue8h +'ȗ ^1R} xm.Z7Hh:%"նB݈r.78(P +C1<!0cy+ -B=R9T5k2ܯl"T._]~hHTۛqͦ:;1e 6Z=[|>$w+Y("2diyG,*rN$H!Nv`oP) +ȓhIt8n`JtVyrO?\mri]lp|Z5w*vɆ܄cz#r[<nNOWg]9GҞ9uȅz,h$[II #Dty(i/M ĬV(,*4 'wܜ%+7n^kv[TZU1kJ8*9uy4=ZΘ\ZĠxGtkO]˺&9B`Cbio&-}gE4eZb5wW|Ԓ[ۙdm-SqSgeApgdpF/a_pܼ٤bEz4sy?oUԑ\aߘnNt>jpXd-K +;eG#x#E[?*ͪq3,W|*8&*S_6Z#9_&wExmF\6d^+^;SZיft^(x50fKʴ奬׳sMYb9vE4JU "c=,A\XX܆--Y:J]K^~ +xbޚ(H&,|qaܩBgt3?~ڑ./噱 +0{MGg +0iuкc".<5V-;;(@pPdPA"6S"?~x`;VJ~MT`йUF*ԄiR{{߽+ݍF֒#)fx/>lu#x=f(,pAUxhrn}>un^AK;$ bǓ;]1H T0Avǁ㽬1Ժ{'c@+*/L?~~/r=bˎG&'tY_UTVP ͢mȊy&zG +[$ZBGpYHIpvr{*ェ&:L`i鮮{hB)&f=^Fs\ztRµ,e*M+lCTaT8pWE[}QrJhOn,PBv,Sꖉ8bڦa$`́Zu/:RᏑD;k&^$ȈhZhFb^2FF`Y*%[jҨcz;*.9kΤ&MAӨWRfx[,EǯDq]GOE؆Yq&<Wُ1l \dfXNPدc:̂O@+D<mxߞoP[;99'ZzqkMҺqKfsio$@A6FƸ@ ++9&b&4%G{uvW60:ܙO}m_;#FWQd+`@\?Tdz/f^_"e~>mz&7u?=:SpI:B*,sҮҥ|eC+yTVd)ܐ\UY`CJEU C +*Ghm@Vǵ9 u:96oJpҚ#)9qLɑUb@I%얼{9 WN +#~{ߝx]0BuJZa1F2ǧjpuxKzͮVOLzg=Geb_p1|^O5cC;S\hgI[;]Iȶ}Ըi&qg +ҧ&jI7%-kfFOUAPp1d[/Ji 9 +vD"NbfA[SAmrhG$<JSGU +/N6m[=_Jp!.(e p@=up;u^}o MWW78(1}Jed/p5aGHr3Uijźm(Uхe ÓJYJ&^{]@$rݰZ)>$clfϦ ߚ>x}ͮdHlt%3|.MD{|siK䮄c垉Xe8 +ǧrM -H$[Lwxo +̒q\Hf喗JG+=D?KJ$vxx曊{^߶]L`5/:öSTխzլ @ Qۡx3 +F1&oGZ(KRp[zm߶D* +4Go&m&_IgO=t*%F ~yUJ2mD`.%ibx}_7BobO}̏,gk^APЀuСJ3nٸx-;p>9 +K2~[s(zֹ)^ +O&eӗ RtcR|oqXZ2$ +kˉı9IFADsUEB jSV<`6^_A>{w#54әM/Grzx:hҳm3ԫiÛcߣu+5Ϋ +()\%P@~~MvL\8NJ/sTR(ֻTĎ%'d՟xxv UQn2,W9'%DalF,VYU11 +Qs7ȱ AĹw#52^fr*lv֡%H/ƱUaJKږ,x%-G_Ǯ ~yYw\HB[Hm_Hlfٚ%Zz~V,F|rMoL;'#6+%TȚWR^@ +S@6$Hĭ-[(}Wy%V`8vn-9$}\lb&UD=^G[]]kw!=(#xIplŵ!Z=pS\WS~ +#7#i_&X 98dw?]AEmL-mXHx;nx^' fo~x{+}z6=wh?.s4W$F0/GRi_({v6v'U =W,xm`>?[ӮG3`s0Wjvy%W^Must[r/JSHe_;^{Smn82< YA +94^x}b'w{S]U苅dz> +&%MsW +cׄl%{CE6mGxZgke7Vx_gw)#v<V#Qܶu,2dɮ]Ӧ%R|[lV<Y=d[L3[V$ ć H +1^ +=[oTw m-2q6&䗁=Gwۏ|<LfO6L|Ѩwev>XM9vN^b %Jgg[^+^Z}i +:mw_}pa=tb08F~u[І"/)c̳UdBgQ1<w/_C˹Ӳo&bL5GWx/*'2rּ͜oB4Nks +^ԌLߏE.r9MZA6΄8Mڙ#Kƻ] bKi.ԃR֯Qbo,KdO?6R0wY>LIV +i]KBgcם +r^ܐпqܑ>3C2m>wn8I,Xq9}<ߋ݃[}Ⱥ`p(k}L[6SDG0=hSq~"'#0^ +7[ȀHR츋owjxQq]n|.f:|aQH&\'<L3$jJ)kBi-w>QĸnVNoMMTؖ楝NhT +b)u kZ3<oZ˴[eZmٸ@zxED[;+ZxOnț sy$!ߛ߹7w8%=Gހ7 ч驣iS~PDLxZ6l[ԯĊt}2.;ݻ*S^?CJAz)達4KU^"yQ_+t)xZ^8g +2No/tyqXEtJ>6R}9VAO)ན"*|p\7s1x%0]ɔ +` +L4vľN,I:$midm4M/8q/KiS@1%'_szιDAhS2FfB JR] t7ͤ~;6i>Õ#M^B(#jp +Ls!<ahl& xkx*}tx%ƫ2kg(,)%Nؼ^0^X^lSKL7:M~9 +=ܐLA:B\E^KnHFW/,r)P:2>MJbC</k{i2xiy@|$[zu +؎'Q:"2xYgXMD+B2LO퓻諾^KӅ <DZ[_XZ=3tvézx9kN|n],"A'֜##V'ѸY6::sK%Ջ,œ]O'>&tS AzDSՇ^Z*mɼMn?5Q*'LU&]%DVd#/W +,Ƃ(\]~F NQViuEGI5wd;a4f[R1_;GxhaaƒsD#Хw-W$7PC5dΜWĴZ" ^f9C쮓(fC^hpD^}cd.rlXCyƟټ0b'aEr^N^y4ѱrEXq,<$fDO]XY_xY7CB98L|1nՖ̐ȉx욃{T)rӖ)29dM +`GӸαdX6:|#c*<kN`;T0Lcx9A15"X5\n̯TJK2nדdhEn,%yqInu! +bfR!K7ʧ&9y%Z1' gS'H|%t}<. ko~%3 7FAgD}ݯ4(h͡2=y˻=H $4ՓeԺVĝ/7|e):z&@-Z.^31$Y#uv+}}}}חQ$2vs3w?GJ(-PP*x.oDh-g3hh`)MoW_~Դ;qc#VW`Lʲ +@*(} + +0~bg&$x^GAZPeпH&2@5n"߯l-mOV4}!ph$g$>܋הS<ܖm)bIO)$~mkɔ?e}r;Ihj|IKÐ居UCd(xaG[-O͂$ћI,w<ʏ +TiBczv<Xr<UO| +5 C5n6jykZ)=*ȕqg,icB_1_چ캎7\n&a;b~Şe˱WcB(Ud4]dYR@F k=iCu9Me8{.pr,)2d.;yӯo"<@<}:h&"Ee{/Yퟁףc7&FQ1WbQUQ+`3^Dypdzb.k6aue<f/ǝX3<=tvGpW.]=_`+S#=0cg6Uⷥ=g:Z!:d2k7WBIk;Q6 SC峁*#+mGÏ]Vu=9R`ʩ|m6zIJ}<N%{.^)Jk-X<WRQ1P1^ +&r8*iΛCTj4`+?by];ٙ@%v]ⳳcAqX_W>oD/THQG<yV.낃9Xr+;>tDQJ&V8}.҄0&.B1,%6HY,+A¯ -.P)]Z$oe9UΞv\ +1riXtahEU3։ћ1x l@*{tP +R5WmwYLphR>H4:G'Dd#N2XX^%e4scʑMu6>e|05sS435HxjHbA{Ș4~W"d#3_f3XE@"Gث)MmgYj%I$j3(b'.<:C9](-$91u{H k#"8jvvT^n[N--ms5ܸspI/݇wL-?CP<B Qd@:O$!ށ!C>D-xS#}»ϼtmȥ6 &o52$}2u +F$?^ I3 0a b}U8lWeoT*8v6jtvOlZz.Hф̼kbОs;[]\ +R{ӮbJqUx-CtHlN6ȺnIQGޡWd*/;Y@$ф)"`M#'EtƩ} +W.3q>+@J&+rb0Z枇_s_|+ߎ!hM4]`}ucA"~0^z_zf#eΖx}|=k]\vRoJgQd8x٧C4-7lZieFKg)آ&:Kτ#yͽ +4jxaX}SIhl&'x^@j +QP +T߃kKMu.4:x1&s$.H'r}Vۮl~*MADtn\E껓e/N35uq~O;{)T »EK/G-ͫ$uLS;f wL.g>/Sp|2V{<N )ja)IQ2幧J+S ד!ՀR2"6k 0% +ЄrZJJIXE;5٥R LZ:nu>;RFʾ=_71s8T9:^TOc +WC⼖2ў*$tD*m<rtḨVpǒ$虮^?Pglbd5(2zK*˱űKt'Ho>V"CQs79upo#Q1F~5uoqA( P˦-uZ>QZ.sk)UD,/ PDYD)$lB$$7!@ry3$7=|7M--|ûUtg9v6&[Ei$n +%M4#T2*|_j>rɿF;tjhtFl8i +#"Y8$:d:"eHu8K=j{/͝2( }F/2v%>E3^ + ދ(in$Tj`{B@ +%:==QUF.4,땿LVpew!rm]V2D7ݲ63X҈ +|৵ȀZ緺Bz_< PPI +<}OINNnJ]1@iƋu:VXW E4<d+G{fyyth"݃-pf{odKp2i9ƜV,^}UIi[N|<<Rfddf{Tw*NӜ$&1T\/kZ# q.&v*)UW?D5dwQ'MuMեN]x}zco +av +*D݅]v߽8o}>d?:͏}}އy~m?g1uA- s)q+el/]ޮ-x՝Z<he$?VQeR7zYX^ԡWԎm,=i +,]8pGs~%-sԵA{?OfG +5T0 +BXPx+WcwۚtJ=WdBܕ"3h&Bf@Pd7+!B/8'CCFc Jo=#lǙ@PtVC +'\nkkI_pB +芁#P@#CCz#JNN:&/,0G +&Bj Cqy +t ;|K==xj\ětR3O`ȑ +;8Gę:(kY2v_뷱~JfD UA72>xI4a2X&ɡqbvMԱ1X-AXDbG *j'"*r{/{n2jgt^}>#^v1(zŨDq`t|[wxeeƯo| +~1QzO6+]ERIUY>RXDz;67`D_6hA̵*fcRkV#𞟲,JgsTϗxQ立7^wvvPxM0t֗wꪾ1/WקxRY. 괱359:2 +[2%N#nBqPl`"֎d6PffJBMؙKuX1{h%HY +((vHW~.7] y+ +l.jz\w\t\wwE"3*эk7-k0(iP: +C~8OwmT +$rxwz^=c/NeD"ABǑͰ8^ /sdprHQD\aWxHLhHM=eQH>'HMl V_n_zEQ,W!A_UeG$QQl?{n-iCEX?ZFǫ?ر"3%m.g#mtgd,ͫG[֦?w_iO:/4U>8텍o;vv>Ŋ)L]2l)R86ޱ$Z +ͮVǓ;xC_ūp'0\omeo4^U$8^xOmC2bbϿ%kuuy%El>qr4AaP)6g{%/zkǮƖG>/LXq +j"*@U-MM-MMM-G7濷4=M`w|1ZcѰb$*t߲Ғ8T#ә +Mg*6_/GůI`ub:l&_!U2V9x~pp_g3,'[d/RUO ɀW*frtAgw},3#,- +}N|w3XgĄpJ""?}id;{EuA*iS"HbS +vbzYw(&lhTŹM^XkqwPN )& +=k\Ȓ<hvjUmSgg<ӏ5("f).k_3?SĖ:tuƎ1:fw@vZ}ҝfO$OK2?[yZ9:C^K8!yu):(43v +^etjNIQUԑaS&L=p5\K1i3lFNcK~N?%pn4hHLEQj;Fd60N7IDbYm̀UtNJ-[+YgWo[9;8bMr +>߸OvI!%.%ILl{~qL^ueo|32nQ Ӻ[GV`WPЃ41@ä[jfVr)J6j.w9lh}#}/+23GْvUǏ֠U7$LLZ{~Qŕ68(^WбO`-<)}b|k87W+"Mq6bwrա6{cfi 7xhq3,W-ҸiTAn:?9jZ'IBt]谡#E8/神DSmGRAD}}>:WGP /IUT}6"p_8̸Ӟb 'Nhy@ +3qSž;lmyܠq&ͪѡľsѫ>V/Zp0˒.*5uf>~QK益b[SR)YVՏwyj\fqm&IА_ޥm.^{_ߠ 65}C.Y} +uh53[Ç V,l]/Wѕ6eL:6f7ap +9|u)ǎil^|~aÆ:c~q +py₥52jTMe<UΰeCUrp||rjǏF.dfv?v]nAg?QELQ& +9| +%.ټ3W?hXQNgʫ5u/ɴ]_P'51dsu7|?+L +$a$HҒ +8 @XPo\MH3RL=XQDf9 /9/|[lݦ7WxiSJW$aD|?wW2xʻ5%a7xYb^EDH(?˔=( +RxVy +^͐ Ȍd;CR8߸ Q|1/w︴lvYYc=@J~`Ť_}Yz=t9t/K?L/k{x۔w;GMֳ,Q6K~WfI]~ilEDX(;Ôf|R n}*}%e)9a;Y2/xzl/1Tŏ_EʭwY/B]ڊ [ؙAPl6E[BEk`E{a=4zՏwċCYQUo_6aEa<9:3DD9NRVtx;tւfߖ3E&w>K\I1NNؓgJK1hޡ8Mw,Vd&α\I?s,Hr-@2ߘҦ}3`PŘDjS4[T5y"Req2'X/vʴ=y[v#;iMbkb@G{sܩZ +v_HՕIx_ynAw^w3bBpo,Ci4:)KwpZ +ՉzXvhV!56XvE6'nqxF`zFlsR{9|Z25)U]t*}fH36a]8Y-.b[,KQ81˨^+0έ +wl;?;?|'/ ;qEy%/r;hx)AV F< E`>?+{釄ZyI!siOc-35w} +2n[6ǯB*9 +}hJڴ5j}&2^g^0^m_Wsur5 +u6G0EѷK8cY`~}O|Ll8?fO_'6);ny?)0`Sy QeٖnS^tQ|M`5wGr5^\zzq +3ai5{6szĊYuq{愯Ņs8Fla,ɽlRVK=DڎuE^/4^י؛<hVu +^M_0ʏ*+L&W`P??/\^o>Iƫ.8oפGBW8E$i"}IewMV2D@K).~!I4z&u١Q~/;#@ZPfqn31;jq3n1wAiiGczg$F('aGYg"1[71sX>OْDcƐ{ bMZORC|N@O8o+]?|SyzB[ҥOox{k+ueZa"%lי-#/[7Z!֤U$NU,k1kq\O'Y@Qo[{ʗpNV +'|@81 ǽ3GBncwe^"9 +Gy{^#EuNԑ37hlYrwPxQ$M$nAWd"U;Hd,)|[H;k(mzy3=ɧT*AMѳA$@H6PGGR3`!)mLmv+=_pA6`(ҼA^cCcneWJ+ +R*}"O<ߠ#+÷:7[E/:Lgܦzޚݽ}we&մ'UH?{y1g+W5m/Zsk:Ԗk¶ڲ7|NEOGK֕7a +v< ;6y^u1fL@ha^(f`j8m !S#bWV}uΘq!Kd!ӽpKì +5I2yQGH")zj_oEJbey1ێAiմQ,[st <ZTE3#9AN;b +MzI_ +W7vЊI0 + +b|Tx^ +_`2˖˽]̍nۘ! KS>qaq\raLŭ-xDQ6&#xxa;.3 + Ǚ8ArshOy=r0L<"T/,$C/II(ZtpE?$1xp۬QGai?0I:zO,y0{ x^X#P';Ne3bp|c#٬5߶j͏ffdUYңj{c+ӦXwPK@`+GkH'dG +I1kwwonw0+*G@~ywFf,5JA|lYifI +L1;5c1>~o\n\N=PtM2ĪDN,Dv+[XW#jsL!.}8/Ģ\iPG+rk~5okE' p*y$ԏ*ڻg߽u:_asMMy+nX='t&BtV?@e"2%D(؛4-SYJI<]OLvpY\Nf܌l|Gn&(DI:ly7_8`UNO{jNgrs9YY,*wO+ :eԦ%JsZWIqeݫ+2rfg.;o^W`^~9j҆b"F:^6F_O1$x.xOϚ3kKou +' +Rwǟ7H_ +-`N/[Z4/>Jڬ 'v{7ffp_xbozajDj2V<n#cb4r*Zzg -#Џt?CU]7f5#cT:i6]rUY1"@*m?0Wʈ[:gT/|BDqA7qTkcd],p1R7FepŃqJ^+"ﺆ3N|\],fqS 3҉k<<"dO ?}ol˥BQ;Z[;{P}S~Ků~ncilysI_:zcEDiL>c95U_qS@kŚ.6^jDlF6 +!\+ +p +߉Ad{D'%F/Y +f=٤0T,VNCl:JK< Ra!L`I6&b,odAa"k->|a^(1aoPVVJme2G܆O\5`dBaH9^` QZH\4 +/ڤj%JLJYl~0W3L`Dc7Ur/#[Sk}Kem7e֜Fv.7Inr5UEBCn*52J2Sh$2hیx7e$۲@M^ Av*3̩S}&z/ +7d)ˏ,=CNIio&VZ}P</./Zz3g: + m"K[ aRr|p]m\HAOt +|1>@T#BpZC^%.$AXy[RGP·J[~CIݶ:t(sAꨪ+CBW3JeQ +(iz$bG;[ +IGZ;jԒq(N3l}ȏ;H~5B>`$7sPMAYrn(P@kV-ލ +e8]rgU/zS6C=sʽq'J$;=4 +ҸbSPr֦(%zWe}]GA-ݎ^';i~{7?yh}^x(lnߔk/J2 ғ4PQt*̌"꼘.]Hqm4xwc(7w,9&"! at}(f*!j2RRs!Di)etEz)lY=D"}g*#,B#xr7Qzhaf<RQ/]0;aR9>XJCX"ӯ5AJ@x~m.z9AX +Wy/1~vv'`̼xVŜ vP|t]= ]n@D-EpOnU+)19ZqSuvśԻ2`dtHV VPqBG)` ,b#6x +SոrTj. +]۱0_x)U ()\);GrmUV*RV]Iy/w"U`D<yc@ +e +ė%ISOF0q]aNb F V32A'n +Ƴ /"6DJt#X/lFFF>"/p"#f+$MtI1N?zh<YpH +͙T:gM҈ثfHPU$+KooذaӦM9B~c-QK&#UزeK8#֛c l$xˍfMֺut9Bjo7l +0ٳg8!^.Ϩ*7aP +Ϝ9+UKT)yY`iiݻ?cAZ%GԪOZ".]<))8_C+Y~aQ~~A^yػwobb]:l>_d +meOgE'v+:(((XvSbuzRPJf}13QО'01nn`ǎ.+<RT1E'ж^GZ +pxeƽ`,*9̃2sլɜ XDoWVE6VUYߒNhBqp#G>V兡hB@ـxj*dgqnn.(I3! +*s9]D5IX *̈ω7ҸDxL@po9$HM$^xE5)nokq5SxCĸkl,Rl.\()7g`dd*L&P*^Y/ o + ޣGb +@6J&!Vk*x#RƜSfM%TDxÆHqx# y5(@nۄTxU[RRR^^Dٳ'p&v̤dLE"E[[۬YEAƍ:aPho^^ӧ:Ǐc$VB&p&lz@A7X;wל]~}ppМnܸo5!$I{ϣ=O}[]^_xN3ֳС];ydgaab9LR.v@z<XBx3TOO,,X`,X`,X`k,_&c4B:)h`l#X[)a%+4,LL@j!Ff(/'Gn >qC>bS,Kd8X8D*V3WxR*Ѧ5XImSd2V'P1 WpT>Ejh(:* +"L -*jA8"8(L EJA +B8J +BuMI}Ϲww'Np0g2zwwϹ/2{_x̿k<)8GW$~s5!p@BF %qb\7$<VPyj57$4i|3L9.<xw*<\k7y8X=OP*@ag;Z/%|1kf<*yd1Rqk%Jg}Wyէ{V|+<uߤ6"3d%OY"0jZ"^QB]?e60u&wLIBUq.$:m"~Kݡa_Z+=KАZ +, +ϝCvKS+qjhy,QaePՙq3(p@ceFx+c^iA4DIc$_\ + z_S⾁g6=C6l$D>#cڰiDVKpGFE42YWys2 x4Mz|"p$iz,'<NBe?ǐ`T+l-7+-UjG,y!V +%,əV\;CPc +44uA +`pxWt~@)wX ,=Ҟfe/W +(wNfŤ+{6.Y)͊(aBcf=4u_6/p@.C4䢏q +O=cI<6wߑOkk%=ƟHK,IYϪF[TG&:anJ91N&ӓyD].OZG?=q㿝xKC,kJ,SVz"HF[- A{UĹpi431sч)j]Q.c*g)8 ;< +V>v\ЂK|`a]SL2[67z{#ܐV2CEPE/yꊑwUWޯ{pIa3mCD8=0Do{}pw}-YΉFy:_[C0|Z3vÆUw):^lj&v +?#䞥wӯKqxiL-@l@BHK68Ҍ^:_`vC$"uOWqama! +ڵ/ѩcE/ٺmi +R>\/ȵo/ +ǔl()76Fef*8'uËGukغ}'^tsbG%ɘe٘LeV۰ccq +;|柶 ,zN,/)gXNshLunNKao}o@עmuMp'ovwV'(b' +]ZP|͐k1*Gp +xh50`0:o>];kxdb["袤Ɩ5]`{7o?luGѵ6juciJ%} '1*=4@c?>;o^ئ~})uÓbzl04.Dm9I?5x,"^\ +C4n2iq^^_>w/مJXMٷjц+PmЅ>hN!{T}Wop䣎t☬RgYF + iL,QALDvݽ{=&S){&Xv{/pZBƮclt[nA wz̟.xvC#^P^[2\.d;|@kS`_a65p{yfƦ82b/Th|"<paC|ʠ!Q&'V{ِ^>H +H̶ +ȑ;g(CDDdn~0OfN͚Mx̯a0 $)N(^5l!y! +6v8(ؠf6V7|e^q+p_MB^ @M1kvSh܄u9"K5tSs[2o4L7:=*찄t:S.!mUMN2" t/ +o$EHNàza)S8iLy4CR>װ8bf-bXeRD4k<+ZѹkU՚_2|PWLL* +ѶI}W \AT@8Όg:UzWf~~1?_ݻҮ[a!p/sLb%v)6?5鼂+pSH-+R?4 +LQZeKR|buGXVNL!Hh)X)TƕZmj\ޓ#R&]< G.|e4.ȫn<Nr45glsss<ݣW +i%d. +KT:ř?|NcMխۚGG9͈nH'p7 bykCcJ=vh_^e'dAke7J3"S7_lūCxSZC1҅+`#1c f,6Hc}A*wψͅ!!,݂]!簥3_bJ;S0r/8O>%+#,WB gʝi"hM,JJ@Pu;<ol}.+ws%oe 1KavTڹr`ʄ0A[okqV5?uIu2±3'GȒ(huF,Uu" 'Ȯ.w93GO{2Ʃs3!0M $t#3 +9 + Aj +6_<[.զ#!S$pwqپcU^!L<ijޢwTcNROܑeG.$ZigFĎ0p9nJRVࡧ8=M6 `̤̞O0]t`XބZ9m=A7]6~8kҸ~1qqbG{m M߸ZEw|LM + +Q̀'b*W6AcSzAgn#IhjC"A+T#ty|إ"ʏ0ACaQ2ԽD%HD>~PI՚D&,l͒F_yC(^puxH"MeĸƆF1*Mg'tKXux(ovp2tLfP7xBv<ͭrGF?P8)j\̲/5_ii̽ԫ쬢vs[q}אK:]R\uqcqZB +NjִXL* HLX҇&F3 +-B0Ԃ2p9{Zk}ν3s^0gq9s9{-Y^55`=%XTƿ(2ꂚЅuRc9wyj֓f|r Z + + 癥ٵ/i<(\[*6'27YE͠C[#d8u +<c3)gRo0j +K[*;izx6ؖxXJ;4R`Ç߇Cb:ozg{388ؚc(l] +liq]}כ`\ +DxIM@b&;wֿ?WX1<<"ck<<XXj#Op=Jk_ HK*17N>syZH(2bGBM6a[E+5Z +q+ccױCU:H;Ʈm{F*@ȈP0~ƝZ1!7Gou@_~Ye +e4Fm#ܖý $TYކox?guvȊ4{Vi%hvaiAhCQ@y?|ex5n +y~7!Trҵ,GT5=;I +Y%RT/ƙc=ԉHR&^FewKIN?s."ȀZ%~xɒ%cccgGWe!']^>)Mw!y{K#~z8:g# +{-mW\i]*51'~pIEY= +tTZ;z7KW< P)f\|cѢCq~Iw?wρaM7qkId&FZ5$ޟ']tJ*]#80uo~UuqIKI&nTpmkI5.UXDjX$Nc,Z DVd9;=b&N_?q9}oWMEX)%fp4~zK~wuy +Z]+a㟋#2MYi_l~\x5Fu(a2==D[2V8g@LSĖ6&0(쪔r{nJL5<ȾX2ssBJPTEF9z8G³4Ʈ]UU5z'L{ڵS\.')Hx';QsstscEETO⧹k; &531Ü+pX<= +:bFʦ;p/j+zݦtZ(¢[otKc'!ӂyrC<rRf|yAqGm}TD'u;j%%w^$eDI,3bU9dI!%=7lX0QNH̵H(@uaxMqv8?F|((K%x~z'h6>+ԘIMC፬4D8v抄A|F+Űו̜j +RIL!%P*ZԸؿ $RQ@!b=)3j1Hn +6ȸrq0 rMB +MVG2$¬;|R<ē1iҤb;%yԩC,"RWz߄4[]ҮH TQRo6F3.k^@='=0ã|C8UP_ *ybkxh f`1ʰ64 +w[:'}cLm7ˊ3G:}Q'LPN^}`y +NpPF4Nm(SȼHʲCV# YvsעGbђ*iWqxs$8MqNᎸʩ+" +a_l=%6(m愛uw)[:uȩWQ^0=)(0yBXVrgtǷh%Eѳhn5m1x&0̿qMoD8vL8.H;?0͢S +0+w?3S$LuSxyO=}q. lfړ;118?pH*>O4*Dii.\W~2E.X<,pεnT Ypˊw.#X +2!~4-{6(8deKB_}+×Ev[{cccC}}]CCtvi8Ϯ +33 +9q5{hm3k'(#Li3:;]RRiS:Ua} +ĺf^^{zx~0:dNR^P|vD<dGID!af+ET4RC0 +nZ0L|9= MhEW9q +D۱k֔4D)F#)Kf\2ft*V\XUB{`Ҩ:[o$Km$ )`''M(+?QM,,Evc(۸bX3U6s]F;md6GFFn`rDŔfY-OnK̼)?gr녠ck#՚y!q &xq8$LIsGx@TQ(n=+1-V7d8ˋ,}Se^àC"XΆ'D|h>oFhrȠ>As[w=<kRtPiM6nZ](_?HN$]5S!JGYuE*wa-h?UٵO]'_'/NWyghfiFB*3ٹo,짍۷oeddt?k;v,7"O$I0+ + FZJQxyiDd)hDj;[+̏IL@lxwE]0V\)ȏhYSlhhSnsUɝ4ܙnwff͙+vw5W^]\[kKlb2|h*Ol¸%kuZBc$RxlENH/XͶOUD8N&EI\PYEgP&?mRyfqnye}_@'>+8&i4dF+Is%KIԡ3x +% B ) PC*Ԏk<@$@fwz{!:)f{:;ߣ?ؤ%(=9z2C3p8ߗޛSR>|R$} +B0u۶mh9R좣^~-o3,aRS#w){eq*|dَ\ +Π< +ۿ2yBJZKpme-TxQ?N+ŚY{(!@rV"Z_Wr S&NVBLڜ5ZlJ.mªu3Q +Sqb117vk͠Z`4S')S{q=X[| +#t*R=D-F$4pGA"Pm#I=i;δJ"EB9X_;#żBD-<蕋GU[F#募s[3Xw7cUWG}L_$|eΖS"܄bA^=>.;o'N,m!~~F Ν;c3 +MMW,i~@׆ YƵ+6CHE^μ3`L& {d7§cj KesRkt+| "S'&&<x5t:K]=c? d'.L5tڪ?}9luBAUm[=9yy+kWFFƺMۛ@ES6ReБNDEk'}W{}wˑVj'i +>y9cƫֆa}g#hmuwN1g~zon +ۼ{?W0`҈_C Y.~ +"he2b~6}iS/mx<rL{Xaچ,"%oϭ[nڸaѓQޓԣqg]njq9Ԝ|ggA+gL?uaauu7`ɒ%l1hgs@k6{mxxUy,\xCّ+rï!'k +jMI[CZZCT\viKLjd˱S.בE1۟8&v9jN"i:aT:~g@((84/FahĚ5k.\ +0~4Gi +K-T6I*FAܺ 4-dU>_eb3$}'FYfmyNYԟ=EɠK""fYaDj%=嘶%urDyj_ɽZ:2v%qJL ać㥚uGjmgfnlnN}&.Hqim$ݰxxi <[k]T^]8qqz&h.y9P8[?:7BFr>C.C +endstream +endobj +156 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T13:49:53+05:30" + xmp:MetadataDate="2016-03-19T13:49:53+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:B2AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:B2AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:B2AF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:B2AF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:49:53+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +233 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +234 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +235 0 obj +<</A 236 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +236 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +227 0 obj +[237 0 R] +endobj +228 0 obj +<</Filter/FlateDecode/Length 2385>>stream +HWێF?K +TJܮt77ikMv\OHUl#UuymE6@v'nnmJʷR&{%3h7۞Cja[s?df:vU"{W1BK>L`%@->'4wP͗EGkSSI=},f6I!XVx9T] +aXtեP+{:C7qz*KϠ) +D7DV;yQχ+ضuu7Lnp[ͶRJV_w5f2PhvۢQg;ʁK9 | D嶪\?]#+_9{WVFB]]<4k2Z#K^8Y!O +endstream +endobj +70 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 788>>/Filter/FlateDecode/Height 532/Intent/RelativeColorimetric/Length 98390/Metadata 155 0 R/Name/X/Subtype/Image/Type/XObject/Width 788>>stream +HkLkd7q9/}o|%1sL1ѓ n̾Q$d1%Y^T("5PJ--\Ǵ붤U~`3t:1}V +< H +MP\~=+,~tP2I)_%HP2YVҵM.,l|ddӷoߖ啕ǎ ϝ;VC۩4v CD?W@d˪}_~k2٭ga!?cߕ366vԩ"qrؘ]ZݫVڳgѣG[ZZ + + +) +wEW+'''u +h'h`tB 矩l+W4LըvYRRr̙[d2ʔ*͛7={r֭[tBffӧOVkkk+]ɓ'`.J)Ny= r:LlO랿~ +;P־|RՊfyٲebv-ȸvmӻ( +rˍF#ֶf͚777ys˖-l@''Nh4h'PN``h'<G/O?O'gǏϼzӦMJR!ccclÇUUU֭իW~z߾}촜4vzl}WN +ON9v`UUUц_ZZG!?z㦋mYYPII˗u:]{{{SSSrrr(4驯_ 8ZN v>5SNA +A|>Je@$>XLyh)f4,Qpo8MN nkkvU@h:?=gs~RqJ7 +:Npq֠@h4l6 ZĒYoj5. N +~|wB*rgi'oaϟ?o4}VTVltzccy5E'`E"ZֵH;Jh'o|sh4J;kf</Jh' +Z__zI;~ +"x +3h' +">HRl~,E; +;)vRd +N0Qen_ + +qe3$h4j}ikBQQQ d|1 +WթGJhH_x͛HRTmO>-**J"ٳ=( +=v-2My x'&&T%[ +:XdV5BUϊ$!#Ds=fwC<3mhR5}ˠwV$0Mۙ_rܵܺuk߾}Ν[jUMMx2dNB;"BD"OMF;Ʉ)8paFWCWFqU˞L;?RvZxvR +'qaKr%K"99Gdxެcң%uݣv +(e':YRʤaD~i\ieblrLr94::o߾^pgΜٶm[RTCP);LTNMMnNH +M(}#hqu2 +)zJ679bIM*.<CdvuqMK|K^7|6nc4aFJ<soΒ +;w}@H.43o=љ;ᇉh|194pRiLooDQ9Ls88[ +?Xg +L\fMUUJRDK+OVvZx<;IfI2ZyC)DʈẎAq}]Z!Hg8 55^ٲَDp +yTvWNn%!2Y$ +nЊ+ +<sĄ^{Aׄ2x4y2imeN0$-#͗ʶ:vt)\;=3NBhrxrʕ+W*++7lذk.Moo/mb>ojjǵfoUe'JzE5 +wSaDc7N7yXF!qԻfzh[z/b,MӐHK˴0')~`NYsBׯ_oMw +ʂqL>9 &\NUdc;sgϞFJ<w\Nn[0^)Ǔک4sWd3Yc;(2K&'>thONVz4zo˖>w']2*4W#k'shwiډ]7$)w3gu&9uԃd"NaE;aO-JAa\v5f +D8Op?i9PL(⫩;;aeѣGHPWWFaĉ +1rQfd@88GzfZ 8#8þjt(]z;AgϞ\pammm" 0,_7Te2pu:.Em'fLp7'\f䇳$$E7`(!d{;ؔ0Tf=x`߾}Najpp0}XmaM$wͻN<D*&oUVrD4[,yh);cKDgNPCCx);vfǏNjg +rcVvvZ^ ,äɭ|5+r;.(؆s*1f)$Q#Y^Z8`uB$i4~Ѷ(NǎɎUhGu1^9N4hd2ݝwWcHB9AX0߯pPIݼ %,$;`&L;*BƊNn[;nC?n*ð)Hv*YmvQYw]%Ԍ64m/MnhH*?KVWoQ1 +Tv*En'tn߿?tήY3:pjpAoJ Y;;Nv5Sjd7>>^YYm۶۷oy֭%o'n0AH|2=7#ǐMTX3 {Uh'>Mj{./^8$ꔼ?v? S_xӂaGjj䛝 ! ˥`k^~^mkkomm-m;#}("1Wa]dH$2;;[i%ImW +0;{֍#VbvF,n[m'?0HZtػʒ|{~Iɟ1[_&gPUUӰTU;)ėN ኊ +=::t:aȑ#7n(u; I2KKy!g=BKaO4WN+=S**Ek'kʈ0EoڥkNHʼn&NHw}600#80E" +UP9fI,&&&6lذnݺl(E;oa +>0yًΞevoм^Ө4n"_&1Qa"B-Xyyysss]]$I;wlllQq솞Evߊ`Ee2gm'3=-Yzw>g0؉QF3dPjjiX6Sɿ^9~-7/VtG"EQ +yfsE0͓̗ӌ#}pS~:28}e7n{ϟKz<\ +2F?mf1P`'aP ^РXyĂlB't*LL0ךvR V(іp{,N`ov& tSƔmÔrv:sZ"ة-i9 ͷv}PT%$M54!&D 4:ΪN&I$'*BNb{mڴ ASS͛w8;)L'JIߎΛ7o`I_ +`Fц.4 "b +]z*Q1;_e:((;ъ#X7.(n~+]?Y/q줤DZLidr=~XzK/D/nw݁6NXӒ'${ǯ~>5M?UVAMʹ֫NY.|Oz7j5$)0e Hb|֭Ybիs<P +7xPǜv:-G)u?'NXpaGG,~=g'SPu]?}rCYgdvf] +J`̭J轵+Vg-[w>6%2塦D7(dD a`;o +]70hOo/@7j@MLS"a' +Kz<x.]:p@'@jhLfɕ=inb?@48ϋ&M]0LS.Nzk;0ŏLdDG1)x +h&$ uM'tA+?{k:xASf&UUN\7we't#dÒF0ָ1 >N*gN߿ؑ^tn|CG$';qwI3\-[ +QӏɐJ%BGxW;kKoInΊʲȟ +GTNڂNP&IV~kL1j6? +G?q,䋰e+; qd>bA,nNj;NvbWx(.ۼ60bB"R8 +ERYWWdoEM4>ݲo Xv)G-:ىkW\fL-nTit62ӰI5Nwnajŵs?%'>IOwHEp$H@=ፍ˗/O6-22իO<!t̑ #WLaTn$$0=0gΜ/=dȐ}-YUjDhI'6s9.UQQUrUՊIH8t$I,@$%xr?.U<8Ȅf21ν;i`h ωoQ\D=iَ[uh9ulkqh<wp1j>gjڵ{ 7tۜXPPbukjA>}\{R;Y%%c5}IDz0Uꕛc'T`+ +VkuuTCt_m3~m2-jkY,ӏ;yx8;Q + +ѱ_]}_Ibcn ,]); UU5---%%eIaŧo>}%-z28#!@k;v,11٢#**K"n笱2#d5{߿VV&{W1B|xGJ4$mJmnnڼy[mMMرcX;t5jL33ۺYQQp̉j8pz%IĊ oT7Ee(q}.vЊOeEq,?wܖ-[pΟǩ]7LN &O>KqQ@-=˃~aQ`;;ةͨ*VQQ9uV4H}]vҵvvbkWnHVkMuFŊ?W&úZKX:gL).D7eI!~EffMG%AΙv5coќZt,^fv͝MKkx+(C@'t:uHupi"1Fc}[w@凇KԃQEi$z<mk6lC3:nGDDv{:/7Q'B9qJx=%%<"bۆDBg̫['2#FZ,YrMG$'R*`'OرWٳ6mÊe8ѡӲ###q[-xX:#=!E{;Z-OTzn,469;")//75+':bg'?NWs9;q t>BΤ3d2m'qi4Mi3*IB48igLb3S+DmF&6S ~ T>0}_{?zνoDy|<T0os=47/UkfRִxSrŕ;FسQw^!Z)JyYJL*A-Vpd'Dpihh0׳SRN4Fb.Cd~x@`&w. *cpRFGh^۾ECUvzQL`\Aup[UVbۻn?wK_rm]]s:t4M~Ŭbb)&-(x<x|]\\;yk#5Mt*,cd&cjsLkJcr{̂{~ߺu/8x#G~4 CbNP****O8~K/vqZ"3bcv@Ϟ=p8b:IuOYO_ea&'l"ccNΐ{1b'Dv2M.d'ie HE[Qڬ; vnN(ىi>T^PQJd;eDN4ggg;0}b(ܙ:'S7nܹ la92=!;];81=ms$+lxkINkNs衬Uę|7 +%#ÃįXuĚ,a4iZˋGQZ,v*DN+Yhܮ(v2(B씙;\Zf'sۧSrvbav҅fN( <C5qqN' ;:#-섫0(jcMM~3ucdjZO(a}tɒ%DR6G}^`'vS6OI$O\ܱ^|O#DBNZjjV&'.)3y٘&&^;x +0)\{DEa*c/_n" N&ӏҢe'1( Oav⒝NѰrsavr:- V<$;Ie!n d5kW/ +xzCp^ST\g + +aJ"!v8^YԿ</͛J{4 a0j X+UU`B9i)6[WY)Z^ci0ũ\=VP1yr/]v4۾uֵk1!->oqB(H@|ni%;q+ոLn $\cD$Ɨ)+qK)>ğ0l8W4JC[kk1E0;n@kqN&!T&8 +FGhfJge~z؉EXAm䂇C4 |uj>``@%"ħz.30|t8<$)3D"U/;`OAvb{Jx'jCqvM iXTU7d^N!i *oh.d'iUUu/@u?dx?;˂Z;Mv*Evdvd'y"CU`'GvI$;effd_qv0; H9#؉;vFSXTt3SIN>q#i.zb98Ѭ,AGNL}0'۫zޱ3J4MOG1Y?|t|y/<:o^K@lKLӀD+;t(oij\\۶ڽB0,b[`?${i\Q :֚䬨CuF|^WWgΜχիkjjt'*Îx'! ===%NѾJ4>OoON8Ǟa3ߜ)mwi֍ecc +=$FMr.4np8-1q Qip+B +@ےq5⇮8Μe3n=b +/qEG갇,ݥ>3GL +!`'b$\$NNBk,IBZ+L*`'`ʚW$wN3iNǁĨ)8db'%t bI;])Ԍ1a'``'.v2$<z5]@I]%G$Ֆ"t/$iI<s˰Aƅctv˓gF4GLRK BH;A{=n6OAu@TE Yқ߇tz` `.xnϦp')W_je7/VUV*z%QYkw'p0'bZХKs~bLjLV%%>PQ#ۭ_{1ill>a. o7gEyƶl=D'啚mvJ881u:kf任pP(zwMVI +q(ݬ EQ˖-z*"+7wt;yY.k +l~Zc^(t8pµ{ӑw$A?>M!$l,Yj|8x0;vCR.( +I!}rjݿqq1(ŜInRn ,Ope +<07NOe8 =8~ClE#6RٜxvF,&!q!ȲPiN%./`,~7ex1Q4FH(<ʫkէ,v҈;q|ԆF&(yC=テN`M&zʔ܄ǥ;@ݭ-?'&MjiBzE)'၍2Yu=gK{{j[`8|>m;1poVygs9%tD8 +vOxO+oټjj>?uBUٳgXBܰ+^V"Hh$ + +B|nN_SS8oܸIɁ9/C( +e993NG +zzzzp8:;;y$I0GvC~S|s<-9%%%9xIq^/N/"yp :kƲpq(Ųeqxb~ |\ݤP>Haie+8Xn +II߽@/M6#Q&YZ7r8QWyغ'5=h^R;wzX%%(`[UF7aNK-/ +muISSz@m$MfaR2콤9فD>++l1wOa Yex3v0*zvɦq URerɟ*?i;Iuq'm/jE?x*IN!Qn,KPz <F,hVU1mX/U;+xT&{'ΝT1&j<ex&+;rVeya܃8$㌃08?qFB T)RPXCT3PjʀP@B +ajX!H ݽ{_Y @6{% s߹}#46TLŋNM/3CoμyWylRTTd])N7\J}];x`q<sx#bvѢEٲejjjkWvP=đ0J"KXmvv5kS뙢ΰ/ƭo]hTTT3Ѳ^O)"b2ڇ糥eE\c{ .VW@ܞXn+%\(:~9PPt~>I.)4/-- XABYqC˩LYn:U_ +B}(#=%vny'1 +Z W@2zYbՄp ''++<Fjс 6ɟYiHӸUUU5p#|PV)R`8?ݧ*h{X@,WMʼnNphg~~QE~=k]>=*dihcE_J)0DZbN_\ә ;p呒Mƍ}39Nn~Ѣ!v; e;qDvzU.I_B$;pzd? `A [)=B0AɁ5p1t.A1=ZuQӐL a[ gHIQ'Mb +A;B477ha4l6L{vka E}K$[kwl5744D_|CQQ=W^eoo['T2{vl^|S Ϝqj攣"ojr;%xXzB6v=d'|UXpb'1;HqpaT[[e!v7;h]?2vxJW*IfѭјOd+9}N6.;=Hv8y} v_m,uyqQFz:2TAd"0e@EG1:x#i?1t8JƎ-+b!"0Q`kצ̜yc99SD^ +Jhg ?; mpH6{EAJ녔Vx~?q\(qV4w7>yʌ./}9+oqL}>6U +ҋ( ,83 xFh({IQof' 7BvwY?-N!vnKg;$;!.Pnk꒡beƤg-vlAuttJ/n㆖j3Ao#++8ڬI_2E!̊~Z e2gEŒfRM>)4|W](I|Tޒ%KP2\&؎;fTU҆EH{Z[[mpnS$v ㆷ^n^*7_KN4zWF'9ksRcG'Oj$\ 7ׇ9#ĔTU:2!\4A$a=Ӄ& /? vBiJةD"g_Cma2q\KK}|I.v +ZdeB>;mLgcOˋ7F5ΜNY!vw] L0;[Vo6MLp}g]%:gQz0jd0kȑ#{r#*yq'DD"IobV3F+A^UWW7-FBfFTMT +e'UUO>_E2xT7<b)ܜj>c$&I҈;Fg/y3|$~qnnn䱱X'_oKI;DNwkH$֢)N2]Ni;$ Y#B>??Nղ:j뻺씝vʐ%+cON钝NhC~&;3I|R35mrJߵ~ktWSt>(LS+EaGٰ;wz۶gZ8nieMcĐnNvWGMLH%r8N8E!ɴ\!FS2,b\lx4ĪJR͒'CԏUVVŋQu-DN)qqVP3C>9`vYF~:/\8Nqe'sܹ>v +Ý`Ew?*v +X4!|D +{6Da߁؝B$X41u.&aYIQ>|gIMκpW)`G+zի.G8B"#lO]:X_F|}Ԩ}IIS#ZO_B+!~C(4ax +)n;㠞T~J"IFEv-ԅ CC.LPpf+Ⱥ,bQ_.d[, +I]tSi;;şE)..bX٩1|Ic'DgI1 giJKSpKӼG,]w{p"&qCC'9;~;n/ب+M0&QZU}}.&i*PJAHmU Ɛ !R6"&yh@mhM.-P.`ǘz|x9}Z{s63!Y/gֿ=X[kn$@uKL!Mi+t3:t 1,eSVj]M" +FK{3՚Y5ىbRlWwޝ/Fw^!/Lȹ&sFp=4/ܕD+hxyx8Be%b'RNmRZv}!{vJRoi+;lFvD0d$W܉3:/4%M(u-xh؉h0*$I 8qZEU +B_ؿ8U9!T"GZ$θ2-kgy/'M$v?yԮ18>s*>M%L`wG3ae`'X,~Xf[X;%Z}}wxKf :{N}v6<<<77kJNlZvx%ԑWgp:c8a:C1"VYHBsƍ[LUU-"QY9|$,*%&$+~ɜosu9k7L2\ +YdW{>; +SSS97!;sYwG>x.'))uESaɒ~ +.66wo9:t +O(c'TH +ʘijR* +vba`c08j#}ԉ8x<xЏo.1fJ +[EqC<gBuc);0Skks볓~b٩D5==-$ɘKnO,|')lUYs|ϐkӅh#G;aFNP89k*NjP}ݻmUǪXeElNo=.tA"BTwSg_q +I4Q@qr~-\cXW3<0 +ӄyŖk/AfP3}G8W\4M"=qT4%&ڢjpN__D+688ة:p F>8a3J/#;=zg5$f'NI +6~`b,UiR4$q3Y{ؘ5z31;.%F{;g=\Jn0#΅WCR"!yuRSI1,7섮vZ,;ri )<48)hӼ:=Bw\<;;ϧֽ<;epOOOgT9<<,uvD2f%!EUʗXw=W^m9pJmlxӱh4xGs{J%Oݝ*{Ҳ5gc,UX>bArN^7/ʂNSG'NN^OaVNp +n7g5ev|ga]]])e,3}zϊyf~vɸb,t.$ rH@vc橩)s1mP)ЛH0¹KiZDC +Nu*v&vw7BfuM"$v:4rbFQǵF%}JةdL_l)&qp2-* +>`97NRY#ÂtҶ+OB9fͦp(Hn+1|T[.M.cքѶi-g}GP>jE%Hvy9;ar($8>/b54Nb`;_4;NL=O+bןl?Nx=*vio˖- 촩`|1;d)IN<y͘[4Pӈb={mv27͌ى|jvf[[`r.hm!S$-vJPf\RjS}^6;HS0ڵk"vqvz >9IdLN\Z;i +MGJpSh` +c 'Ǝ{ּة(]ß,Eoݺ5 + +Hd'YY j<6;N潪=;RʑI8Sf$cDGO),v ;gkaOwC;MkvbS37;utt~NVTqv*,ܘ-v"Kb'$CTOYa N0\(N_=vlv +%ebth\bgMƔhN v +H zQU{<oƏKinnn8[_?ضmLU;L]Z~%z|sQQp5"gGAȤ79b}/e*hj7:/=U^YtxtO(dGiNY//<#CCCC##;/ +SOukE!3I\iJC2;6ߠ-_wU/^^VoFN...*<lAȝ;ӷ'_,NX,a崠*DEaF#~<}] }&C ?SyyJm="gsaH*4d&SL(4L`x$DbK +E5*^QQQQffj+a4B*EÉڱ`6{l7%=p6T樃Cnr͛*a>%!?D +U +o1.;1/"⟏-O`~_ċx2IFR5,[?@,^US3EE"12MJW:xECM:6c8^Cdc@yޢ`44S*[;7mN[PYQ;ÔeexWo XpL!Ĺe*tdM|UhQL[$$P4rQ3,UtPL&hؽ0O=e}}=˲|\j/DݻbJpq/Ml6_0),,d.^lȳyR"W9M<Wq;nΰ,i(q(mly#)Qգ9/egg:}Zd%j<cecj/yg[Y* +ڵk0\kDgx 8CNB +|7n܈lS#z8сMǂP[/vUWu0<KuڵkfBcae<`9aP-]:>fcXmܹ|s]$f˓Io7=AaX$}BJYYYFF&=Q]]̟\r-ͭOKKTota9G=cȒ2X1u<w}~.h\c #9p͚5ZcN $1Ŧ(gD1 +&OrÇ668Ϝ鬸jVQh;`'_>N'!LK`Y_p8Yi#7q: :2igF,.~+%%Gԕz?}JgTccJN4R+dFƹ=Yq_i~ MD=u4'@ +Z N?+W³jթݡHpVCS'ͨFAF2$hv:{fH-V+3Q"ye,Isdu?k^|6 x<2Oe[_^.^*|kb+QyaB +>\w7JPS?cC +0)D2`l={^6dr3;g=tb1)lc adipyv#m3HhDS5!Lo\l%KZ~~ͺsB1]SfyxB{zzROc)nAUh$:Nt8 aؔ/hl E ,J]7-{D8"y0L;1DItƍNOZS6V)ڶ`'ێC/Z9z\@1^;7Nw6v9٩ᴢ#y=d;SvD?z;0l7:l)>~<#βqo +Ȝ11+i IJm2{_AT =-;|V_ھChUto_j;e)0(v1YxJ䁝F6VUfMb8sh;u\/6JlBfkgTT@æ&ϼ|'"TGvW7:R[ 1ɱ[,'KvC~>+-VI˖( ^`SIc@@.PvfGyu߶lM}L8U6cNnTYT;)c@=#2hK}82xIOlOxauFhtD}w_,IPٔ0P1Y͙^/)]?(kEݦeȸ.o&2?ð+߇Yt-DnwNhDwA꼼am%S]6;)t}68WV$'巕nebRN>_UN:6";᠙clSVi^R,QyvQݻĄ\S=%`')Iv^e̖3ncW6& ,S[ݕL%}c0vW^1|F0{N;;cѩV^误7vҹgq;]uYbŃi!Ԏh$LfN֭C'O`1ǎ7hȎ89??t +\۩v~"r#;aN;)y@@)S:;MMyV$;~\ +Bj_ +|˜qb`MEm eݹz2,vҥ_N#}eXoD22y\rfNC4 GB۵NEhoSH)]u떚c5yyCN?#;Nb|CƂBs67)ÎL`@'Ae@Ghma +9ͥ/)Z^hmNAi{ý[i; >^`lBƦ(Zw씁 +쎈/ȌiTAk'#C<pHișE\TKRp`?0FfNȋwܹ//~V]YUytL3cH o,Edq;ap;C!M}g0d];55uCr4L9.rL-(Xw]Bvo8lp+cqhPTV^,)J&{|xհ$=bNpQ/"F1pJnoU(gY{NccciUf'$\(,PLQ;=m]Od6;!<p SZZZNe>;|IiEp;# n;WvFRiM68}1:+xP<ZNSU+:;8YȊfltjN5hɕ[<=س>jx0/3Dtulaz%9Ұ=,WZ9044et47SIsD+1 51z7A*H[i,k݉"t;K{bɶͮݻwuI[()O+^;EbO}UuqmLf::mgڴδI$3b&&j)"X +ئצvvD!l6Rj%DX'&<r{x< +vrbYIә iNi8n99ϭ\v`lgFҢ ++-<Ntz32)he'֣Ǔa'INȡ92"jO7-lڈ'iۑw5~#`ؘUљ};͟[hvj\-N?; i!P>p +2LTaXoFE+A;<98;Q]_%Pavx(J,7!^Ih/)؉pSCQIeB(o00;-^lT,ĠQ;N`Ù~vև/*oujYrŵ^ͭKNþ΄HNL zYqݻe]G2>)-M: +cQ +g.*3z\I3zpA +X։iT^Rqvx.$3B,) +w±hm,XgLbr'(tRAޕuυ9j{/mw{}>Vb/CNWV!iZzաb +H`կn~T[lXSkk줕]x=f +S&bp@zu&&ވI9ӑ&M`'W9? +؉;|J#*:}ObN'QdY6y9·TA3cm8ڵoYdIɌ]Loӝځ+/g_~vLU_f]FtkZd+fY99okkMIB2Ns_<ysqiB\SZ:1<شROE"##j={EHwqѠd0LcpuiiiooD/s;QN4NN +F5TU5W!!POB<9qvܧ1ͣ#LG/_lgj|ld'7 Hk>^o/YxHlm +]{@;[J֎W>w@վnwʥ7n +ii!!LHClS2<BCm4fJcpC-`䷑evޕ!Ē{9s~W`2Y̶vic4՛0$A0aʕxtf =X?yjhiưf3Mf !fNsׯ7їj4t: 4-uVkz٬G={vڴi.1uV֪ՙL&+SߠX]cy̹sf?ıDo2];6 L.MRz]kD=7yj˖-]]]89ם7tb^ѡoFmp]еjMfSbCL7F}cCKfmu)r"@c8,~Qg۪c}Wꪞ{Zj +("%AJH uќLN~. +%O:ERMԱXe0HҧHP5pZ?Pu<PaGYHRͦ)*6~*(^Ƭdu8+F_9^}9㏗=ZqQQ1 + +ؓ%97Ej%uqOֲӝKPMQW~;?I˴#UN"{OX*Sۍz@v;ݺv*)++;"R%1>S_7mF82ڠ<I`ʑ# +Wy!s&ܜ%gߡ&*N3v*+)At; *$~$0;4െD|9"2i섌s}iQ b(UA.<PP8s-dE굟Μf7m3ss*>:(\ߛUZ=a6~xdԤF!0/&ԅLQj;yO}SivJ:;l;IIdF#U4;%]]]OÈ^,r@ O ?%A!ϟ.*<kK7$,X34<n|RQҊgo?P|fŲvϨHӌA㮣qԁGZ?9lPaQQQdQ, +YfynCmII1;YVyivJ|>ߕ+WtG&C=~(W<>g3uJa3zuֳ4Iʨ\_/\jÎOo=$^\Z/hHTJI +jTŧS#jVAMHL;!<Nf'өUvJS* e=^(;aE.]f$Ed4icUFVU +`@|Y<t-C,D)Kd!,@& *#j5/8nv e&;Ѩ< +{e%2J^kg6O;VwwwnTI,v<t=ڎN')vR備;ivJPf4;%,8yj'60PI*2 +._6n +h: +z.z65* +lK_l T|HPR*EIdDRgdvW_5w[qu?i`t:f[/5d9Ncv8n`,gN;d}K[.\OI-N~;Q:agS ;d2)ub';$%;MPCM`ciQ1XVDd32ŌXܿ+"W&A +Yl0j _o};wt >@_\L\LUb܈lyix0tNRJ\F[vD"%*vFFFNQZDivrDGyL:j.6U#[~&?R +ƓT=HН٘&MV:TW<;F&)&N 70+vz^~{ttTNbT9hȢxk56v3vj;ʻf'<ŠjNsQ`tA?? +aGӧ\yۘ7>qv)ld Q۞b'W411hxbճTe(vrt:L|ⲜI>&!_EjnW;`FI\gTF/$ jN`+h |y";銝ܲS&۞b'vr+v"%wbf头R)#s$YnFױtȉ려@NBb2>-Vb;5g'q>|IN7vB䶧I)vZN~ڵb';9:N׳6Bp(G)Z"rWvB 7!~,6;A +vh3Paڲ +<L.|;iNj"U$/444={fe/C#ڛp3Looϝ;w X,V.#Pefӧ:P'o_u$&Xop&o,Yk|e'4=`<NaR!|2E;BÈ4::da'D#G*vJ;QIvBONRt;+Ka&{xҥC{Ϟ={miiٶm+x%~FW(GtУ%,5?;~G/1;+sɣ#? +Ǣf)UvBbM(vg'<ֳS+v +;P$4Fd{{;!+!M:ﶶx[ٹ2b2),G- +qG%[g'D]]؉NHlN%NMv'NaRvrw +Mڔ"&(AT)кuB@:!$N0)}3gD}:%}yeZ`2c!Fn)b'p&koŲF@*ӮpEdDTDơe(t֭ǏkƯ8;iVS___CCuEi,vz&Di)av0Ħɔ P(Z;lzeg̘QPPr3`.,))AL+6BO`ݸfoA0f!S+P`yJI +SCWaiQvz6k^4,(`T:k"5#Rv")DQ1҅pNo|/qvҬfF늈X+Tv#svJn[ZZ8N$|zanNeGGiӦmٲ˖-?HGN77H7*:|8ٝ-HBAJnL$O>zZw/`'(dFH#&vB +ypIdᆂe1FDg);Nfةw`` 9;%Nq8{Gg'S0lX3y&:84,)LW\I$hN'o~w=sAO?B^Fh+8J +MMMw%)Iv +vgϞg*k=(Kf ?ٲ}ﶂ[7۶mΟm/~Dڤy( +2L@ȸؓI> +UWW˲8i!D #<P5i;iid'၁/rvJ0`vQO)nv1#e'npdJ===>#C-`؇F؉!]U50(Lc|r/={̙3l/_#B9dLdڜݒ;oG`B{>IKaC)WcqE1YD'Bd;{"pGm%bzO٩xfAWrvJ$,NqBT_0;A\ɔ@zx@''_LsHԽulL +C#ި!ndSXf +z.wߝ9`.]{$_9kh"(BaDiXRfhA-JA@5Cçns$hzIj:;9;qvDitYNn;ipv2&g04h)ʺ@W^",zB{,eFu;j9@J+V8v{9s_!DkMKKOWWh;WwYzxg`g*MREe +vjnnj4JIldH4 +@gxb'j Զ5?o禜km,~L{[ykΚVfP7*^!{DBgjiiYhQFFԩS<`Yf]x2-BLk ڡ.?@֬[*[i=|J_ +|LƏL~=>'^YvvfNI씤d'frvJ$ٱ9;ů7nx^Asq(H#;r5q5?\/[C͕?ξɇ҃k7~n[teQ镰|ӁE"NS֯_|YzD6I$B#wӲe:}rTqM=r~Z94(+M0rĖDf\4N9IJӘgN4,a'EG%0N6!B(|{ˮhﻳaZQ+{Em=^Zڪ,oٷ-{k^Y Sod!$F(naB \?Nw__Tm]OEg|CoAa5YK5tx5x(7'_ьaVqj{GCgc8!&FAc? +Q((ڴ-Vށ!`%0* #$m!-)ĉqpBJbBv];8$v@vdq~{~|=xD;;;߿?ƛ;2I/`RS;9;DH/qw +ǢN^:bS%Lv/reeӧXZ1e5r`2%׃{&3a#1L˩QBD/%}7P`=8yi~_e64$E)u'i;ŹGճmXvڿUBHe Op&[N5<wiēG>460eNE1H{+2g3 +;ef9!J»(&Qѩ;!|;C'*T)eDS2On7HP9ik\|uo?p_8.?'Tt{\?{{PyujD y/[VR' %1==}(b8.---..v:>yxE1/qycZvD&5%NheD@aD8D=}vPզ/GC;f|F.M&^gf8:rb鴣&>.81cvJ'.Z7U3SRҚMvVk6k-N33ZVj[˻NbA1qhxj*T1zXFFFuu5b1?k}d066X[UJ&wk[~u֡FC|TY,.MSvazuݮZ͆p0K.M6My<:zFxT*X Oz-d۠~WZd2UfͺxyTMLzʬbe6?t:l5z.1UQQc8"?CSoTr69vlmɥ6 E cZ˅d6_m5[v@TA69kn7Ͽfo75%(Kl<Fw;7WC*gsެ`ujPm: r/ZشtV9Nj0v5͈+ƉVV + +Νhڤ(A;a@>*zpcyى[¢k7>[zE gN<Z|eD wrdfIGLRRR/.\8{l%KX,gODa +DyMkf}mWj,˵;XŸ^gXE]vSWWW=#WȰYyZ.\h./f/QVb + +K*iEfqSgViu1vΎH!A +4%r{$BubHR0J0#>SR8+;p(1¡x4N0@I/bU_O}~4aN+DIM{;1$+XIhj؉щkty90lni$iΝ!NT>wNw|$k9TMj-+1v#i(`o5z]]]T &_ $4* >)7>`Zd1!Ģ)`s^B +lCID&[9;IDYB<3vuH"H()BҠ"o$J!TEHU"R$E*M"JnPEN@iT4*8)E{mk/̜3}93e/s9kX8ev<so{O8TvW Ci;QrgZ;1֩;M|u+ tF% ŃE5Vrv c BQvNtQ9fOw>[n4m{ۏ{b~w3.l7Ǻ_}+[~s +-`/>xfnVgFN"L\Kӛāyuv3t ?N}qvIN|*`yb'ًskNAرXdPQӘ!d +\"؉,g_NN?g'Llʳ<aJ.;O0vG)I#V+ +;Zb'R[3LБKɠFnq9̜u`kɓͪ;ݹYNTvJWy`'Hdv2olH:;!ኦiEMAx]7E:'M[.5<*/NNNxkk+&A;ɒ1E&dyW惜1#,1faebea +x<Nt:r +ة;]%T*+v +Naݣ;X{a2}QL$Ƙ_'쬝v0##='a@P];|0Hgs>S7o777^lH.;?Ɛ?l5,[bYvwuu#NA ')v#xmEݏB@$^e_G| +f"f2*=UaB>r٩{)Cՠ^%drF}όEӔN(v*N&''.P|@Oc'7ѧɏ:::A" L^bj?+FQE Dvf(CզDr¬JHRd2]#;M{؉[TPQvZXXt9R䃝;Tve'qrbu0eH3bi&!A&LfDZUJu4755;vŋs"twL= =,v[K$*8+72Avz4a'!SWcy=711t-E;uuu)vdC>566fEhB(Ib'f݈֬y;7b&c{$^.\{g}vӦM/cǎ~ƍ8k]r%NecT%їIj\T&f(ƈԸ̬KζkwNfPyzn&I{qQv;I +Ni~~~``@Of'cА0PTQsssx|"{Ĝ/ސDgSQSa߾}NB2w䅅N<K/8q",A.&2-kNDqKɪ4ƍl6]y!Ġ7YrmqF?tݱk)"NةۛՁ|IS vӍpةڦ#T"eJp-L!@`KM?L|N MVu4$6)u**da8#*4͛~^6@ q4pN{ pwoodеbJP{ZSyEa'!Z~QTJɍ-QRӐOO?bŊ{]*H'A%LxI\U9Seӽ{:::P%yDTeF5qe߇@ӈɌ܀հ4"["+NDuyWDՁ;f'w'dNA 6brQ)v*%1NQn& +ݿ?|~ժU[l~+HzȒJS{s@-Td'>ՙ3˹ҲRS(Y422WZ!l6,I=aMx! %RhE.N!&mZ`UbbD${zz;b'섻4HU4;i +NApPKS v`(?Օƀ5q5t%?ưҴh-!1ZDmR7M46dP@AXG)32{gF^2#=ܹp9}c'd*++v&`4ZZZF㔩ݛ?~sssqq1.Rߡ͛7J +Gy-sӸ +Ƈ6pV!qH8K)= +UWW/X +N8666Z,=3vND\gg'r[a0vG.`08N-Fl999ϟE^ºEvs?s̚9PN|2!49-N$?GSݥY/i7ⲻ(x8<Ɍ8N&Iy;[r4rsK(;Ax=%j0v +NH`v"t 3;#4oiibD",44A$:3g,p3%%g+]Qvk[~}Imv0v|q0˼o786&@/0JrwԄ%i%SNk>P9؉_}(f볩Nhcڷ%Ncw8i6440vR$$M>}i|iN6-F2ͧONHHHLL<va'@b/^ɉǴ_|>]~ᠤ3="Pv[۷yw[Jr[>؞sd b6amFRL$W_+;uuu`z`)x`0V*]xğ . ^)c^ى[;!mFc'NAeV-FtҴi/_KT)<xQD!hơhp\e%rukWRKi$ +@ svn"NM$SbvvvlO^":I%،>aϣ*v5k ~rb( +AEEE˖-[ref&v#>:t!7ڡûijv + +Ê+V+fΝ;Ǐӄ4aQ;dXo;{{;^[{}y9aFTUUg~#>c9 +UiYBNO<={;a'YWWS S{{{Nٹjժ{j3~1PcnZ,Q:x9^MFcl4>\Ch#''fh"Nz1s=!I+**v;y// ++f4;z,WBNMMM4cS8MS1v +$lI\W!G>qdأc_AQ]wOa댯N&a416CI":5Qk6> +E3T EAD ++`w_w}w]Vr/ܽsw~7m"^ ++ vZI:$N hT}zC}2 GHىGr$)66$(;z鄴<ep ~E٩Oy<Jȏ3<B+JCg^=맫$ lɃY/H+6<i0a}>": ycQJChN@o!{|u|Ν|(SF`I +9$N} +rx{(6y5}`2LpL͟n|¥I_斂[og*yEŃWMZoQ}i+*/+[l*y +n{IqAQqiݻE|WNR^xM=ҨBLjlc=u2u6@$ + +:{/<9v͛ݒI2\]W؉A$"vtNh +=/N7mLSM<bo/Je's\t_ %KaAlB2;QWQ*DRZyH K;MNNz o1mGӖ-7Ϟ[̉ywo\krqE{wZrKQo3.{{&D${thYX;e'L2~qM:5>>>!!֭[B> +f-cH2(F`WZhѢ`3EJ!CZoa,M_/:vѣ;U-,:pL^ފ8PhtQ466錼z͓US`0C{v28O$m?*bwA@RbX(!2&ICh@-n{b<g{x{<[}f3R}<3~s罻9cBXpp˗/p"h:L&|6ZcUpkk*>Xmni8t-//3f&i6=;>|uV#n8Vo\~S J?X+Y,ej1lV;a,I۷oVŖj4kxLxf.KkKߏ|iL_Z̦:8l2dcs&yq'osY͖=K +oG·߮ۻY3[/lvj0b&=V%/¡CKgkˍ}Kc-|qPYVnkO6ZZ9Flnf,f7rY\\ZWW5<yrƍ9E`0eL<؉ + + +;Xiܸq8_aIR7N0]CsHȓLSKܮB NH8nyFR;i ]ܥ2X>Ҕ(?S*īTxGUg2kq성ⴴVMy?$`ْ1Sv:v",!H !vJUɷg7(. +XaIyP H乼%N===f +%N;ɡ%cb +;CS"755;;Qzsu FygD=1v*PI~:Sb*'Ne*ٟDYdQx?}N{YmڮoqS\NFe+n'ppw32~2뭳+% +h*\ +J~&9h4kI&k#G7o j֭ϟ?wڗ/_Pj>j*\^ZeֱcVWWGe1 Ifv5x<* +'xB#❆-e'4~x͆bgSUUUOOORzf>66N)ñϰ\ +@DyŠouvv +~]ò_.i5Emn6ۦ5/&dL2friiI2ss=eeDȑ#J~y:::L:'QF!PDA')5)gB D{\m,SowR2lI6SR$0eǃةeqv*pvulCr{)' +%E"H#ȢZᄟZJy?6NNTA@E8p`ƍ;wpٳٙ#i#Dsv/%m5d[\,)ln^4\K4?e`'h0;DةBNEEEn;dgpe22g3<LF +b<ALJ'S(yPVSvߖ%g,RWWwرM6[[pP(Z)Q9'Ǿ\ fWR-Զ+1|.Us$~v\'Oe;rgb22gQ)H M՜Usv2Ǫ{OJ0d+AP#[)%/'@6ŚqeNx0ۧ5`|e); ;%DOPTT"ۑ48;g'=88jdN MMM̚ɤPDȌ(~Jߖ)N]ya3&N#ü5AXa4jL($LHHaڊTEԻ<rLj +Rg'y8;K9;IǍvvI()Fu#0b16;m۶zE35vbQelIئ|Ϣ@ETvB B_PJcN c9sf8g'2S{{NLNH,;~v'ٳǏoڻw([+[EEʕ+WZf͚iӦΝ;,ةѦ)qݝYbb2I+ +hL&ȱ+U2-mHxuݫW̨g';d52g'3;%L,fg-_|ҤI?yanT +T6>}>۷o_pEV4Rm@(1ŕ$5G"JѱP˗l6g';qS9;I섪0cd,N&L~)Euƍ{+BÇ]vmٲsؽLjYfa1Y`'DԵBxMU8puOO̽mA$4FJTrR%tdF}8; M%.9;)!Duvjmm22kg' Qc 2۷=+++M;6.Ւ}:[;a_FD]Vs^o{{-^d%((*FR Nv\^Džpvʵh*vBb'&#sv2@ى9SVʅXL!2= ;vtuu.?|Μ9߿k@JgΜݻw/YI)eY;AV,x851Ł)#\njj˴<"(7N(LG씁V>~)+Yc'8!.;|ݻwNZ^^H +#ǿUvzIE2!D\FfSȿGΞ={Ŋ[n---{QoݺU]]}zDPc4+WUZXN|>f%W\*ŤNb8r)ىL6ة!hg$JҧO +b3yJhiO^WW7&QBNU^tU])C o()ZzEjՕH0 OJSOO)zlBּGbP"kb$R8z'Pv*YSjk³S{{;g8;YԷNر~?Uvq0b"kH&&IL,`!d&>p6>ieZE@ZJ%u<08cf`fs;̌s.+{9{|NƍvOjanz{{#"Bq({ATA"` +Uq^A$Rꂡ buFNHw+&uuu&zB[8E(!DDәVazvR"966:;N[-V,jiiyO+vl6CnذѣCCCTEX +_4UIIIǎxH+EX2}Ơ x=p_@q$ApQ^N2Dg')i&w?h6=K@b^QxVQVLavz_~:;$A +'d%zA"؉?S<S|Dsok5?!0 Q}T-^h4ݻW +S8;(wtdmVeXvPBZPuuuyyÇlْVXXp8jnnnmm(۷"W:R;aؑ(++'+k̏z,RY +jʛ̪ +邷WTT\ /[)I?(CV28}0&??N"Eў{u溸nw}}=x-ddY2!2 +r ;줹tv>fVNG4cI!g#VON\6-999)%RS8~,\tY(iAr6dZ4wxq$l3ZvjoohbdUMLL<~*Ft߅C gk +&''zj~̙Msv!q%oWf߸o{W.?)x< ^HX6IvV`(wtE#Ğ8$z!BMMMg'28]w;= |&#Yd%ARuvNlMAPtv^Ѳ Q!!?8N;h kweIU]]V[[k4fݻnݺr;>Cx7b58+X>˃_r"ĪHc' +0eas+oll.u$&ɤi 'DBU\w`\V X2B1vSIj2vT:;)dΞ&JD4#%JߓJG4.J?jpLN.))پ};wܦMn7@Ԏ;Vk,F">xr1^]:WRɧW\|Pi^\X8;A8C_kTРbAmooO*TUS\ erv0*D(Hj$Eg'Z8;uwwGk1{/(!i!X?=/Eis=BX=qDNN<{nQ=zFFF R LBaLA"llrڵ]~_ܸŔb3(o|ŋA3|S|ۛUAwtt$zj8+,LN- cj2NS b[_OU6tvy$D9lGi12/R|?C3H>ÂJFGG+**֮]~(((X|9B^Z~~>74MMMMQHL."Q<>Z |mOz"uLTu `e %x}Lϟ? & @ Ph"$]1bxU,춶DBU'n< (gY,Mc'cGJ'ObfB eNӝz oQ^8Փu4vO$۟W>}ev[gJN28kJϏZ$DpfffJJʚ5kDm [4arrW fB(pCOIEI- -|YFH_˗/n:0(CD]o'If=O2/',՚U*Q0٬*1>~0@ [dw\*Na'a~R%SsIg'PWWSV ""[~QI~5]qܩ3cqөXǖZFTp +U+."*B"U(kmW]D* + !@!!B\d#q +)! _旛{=s>7'~,jnΌ22eIf)=#sKKKe2'i@h4zv%7'7Fƒ=[7DInTŋg[.RO$E}D18g7;} >RTK5dAv;bFۑ7ER3k+@&Hs|תͿQ8;;Ǐ@g'~t "?DM:cUiu֊T^w+τkW>!^tbx#Fn݁,CC\b0dۼy@ |yԩތq?,<zR%}y:"a;l؎zpW/7;qvAh;cyK\$xrssN79v*`'g `L,>b'$Wz#T_-y*{b'γ^؉(jMHMȳL + +Q *>l6kD*XVݩSV=s̉jGkCFSnjQ654hkk[MCNh.dF[֬֨UZ.V+! +\QΜC7//oѢEUUU'~8d2o!477MRqm4+wg2dK.H(G\۠ӂzIBG]Gx؉~/~hgvt`ٳgyNgSS\v|yP,͘1# g&OЧ)Sرjz3+ Q~/D7pŁ3<r +jXoq{c͛c[xΰ^[3q뺘ؑs +6.#w?A>N4b[fmYm\gPHH+aP^%(iҬZEWi(pJ}wN@.q IȽLD˗wtyPp#'CCq3F" +'HG1U5o]vK +T2ӵcvEvMN{B N;rS8U +W0Ht%'<ۢϷB!@@ى@7hwv +d'ljN>XQi`0O;P)ze^1)ŌWڸ?6<tM|1EN:aCرO/~3^\.=gΜӧrib8Рj|n|ĐpMh#fkpɚlp&qF+qu׀Pa*oTʣ@<3=3e,0LM)9;gb%''>}Z;NN(桡!ʛ&O\>v֞mn_Y[{]sJ3t0dC/Mc:V&;l66IhR#o?ehR@Z,$T"N<=*MPSe'<.nJkav";yk);q";1`'n; IR[[[cc6`;<`'z;|sБowot7G>xg)3N.FA1,((@8p`Æ)))JXDHÇZ#%^z2'|Wogkyy`Jx+g?w<uQ'CHX>NpϧJHj@xZ人:7M!Q kvWvIaGnoo]iiCaJD'1CÆ aa<w^xdb (qD",+55d2ɟ) +g`111~.1 \omI ):C*`bU&;ٖkR(V+%ҶDp$˲B*swww ;NvGA]YGSPNf'^p:8`09y#~dPY7KY߱ +L?~I^ؔ, +FqXO# z= ߰WGD)\jId'A;Eڐة-ѣ?ى~'=͢9IfI䳓lnjjRi"jcf&E"-<2G!{=eHz,X0cƌ;v +!kjj4v +?Qjد^N{n,15vR,]v%4"~qB+Qav^t,HŎJ0~ƍvLMM=qREA +Vy<իW333͛&s?w k/D4%4$$K$VkGG|5)bt:#mbUY4)aG+$tNd'N!Z=Pc'GAZEWkj\7IdZ|mm$&~x֏oP@_hNK.vP$Ud0L iӦ͜9sϞ=6mH)Ї@?oPq5N>ekPfCʒZ'߾}k6#mQTO"f' +$GwҾ;[Z;SNi5 +4&JIxa#b2 +N2٩VMvO>&\[[pR~֭[E&\۷'%%6md6o@4)y @)8Cc`06K A珔rEyyMb'gwyVNI&;F)p.\0k,$;vG|V`2pZ24vg'M!<HBH΄KÃuPSoq'#rB4v +Br _577,Ƃn߽{e,4XYY9wܽ{~ [ÑVUUlH2Z̶Za* +#p:eF755EڐPKKJtW({f>16PvbN +a' S5N3pUvZ nZ^o>&033X]]]^^o߾X,&iY +1~eH@$<gxxNpv#BtyOj+!i0U(1 +GXF!u1j +U<&;MwUBͪ씛2t,+Jh +I+s#|81(1 mʲ2HzP'TUʫ硡!H3ڣD"P&&&98ɾ +#dR>&爡պo$ ]?RIvicEQ;wlkk +j$Pbt*[2W`dJ 8!i:`'|* ]8SN(p`o4::ZSSh<*))~V&D>,P\<z읲oؤ_>F)ydkJJ&Kvip+0d*p/QbN"(twwå6DTQguAݿōr$C{sC !bUU5a2N*3;QeۅJd}}}ee%}?ydGNMNNnݺQRA!}0f!Xcu#c#####tB%crlN&N(l8z]f`'8555U%JH<0.px__Ķ2 DaD:WHφ3Iv2չu8ODžONwnV&)SnN)vwu/=x𠦦fÆxﵶܻwOjKHH254"/x˿}xZ;I:0F((CQ + a(; ?x(eʕj.RۢÝNE(L&C$;A֤պov"Ua?_a' Cw%YxM씵2ى&9sxǎ>ix?:Çk4A$`, +bo~ד~o~^uv(C+͐rZ`9;-6+6d,!xpx<Q GF(4R"h T}SnJ/eYUE ;qUvZ)ʔfff@ŋEEEH)Y?!~D}?`9?(ܺm[Uw?>"N\c.X:`e'AKaP ԝNEe+N?lP 4)=53GS0{ii6씻2АcqR@zn]Л"{Mͭ}mk[[HF ܁+-$bYV*[4M[,yG|4>>`UjC!j>ocOpqЍ/ G$vDZZ!慝{*;A)U"Aooo4]f,xnH,7o6,6~-$KI7@Ch*]>vcN?q?~xK?3'PgzBv +NgaW,3b+$JE ύ3O:ZpC1;%dd?XVIvhMN(}02W`,@OO;ͷz}SsӶG&pfYD@O};MOO%F;L& +b( O~8}sة)-wQ٩$(RZmy I?9Qu :\vB)©~a)8X+:?7B0(̢c00/~NUEd0Ԇ(BGlqD4*Ԇ'~I'=R<7N;wsS?.06%%'`6阤IӔB&&,I 0@@㙚N&x߱%Y͒eIoK}ϲR۲b{=|?4v`' S||xM7Xس0"dOP)E_ +J}$e81lY⋈J`0e)[T A\!SVp?=vީ&1`4dK4l2&7CMNx%tq]m6);!$LvR5:: +(6 +PX-BQQ]CJ%'2dO)XVV}֒m%otyIeUDE/Q)Ԁ~5v +zsn"Y쑥9$ +$@q +-LFcFʸDfl#!(L$xA\2)=M}2#Uj2@JF`.`Qc9 $k4vtXKxeٲPPoWVlR(|-7wDaNM<^Wwy䛲2 +<iN =]E(J+}`1tI@Z٩Ӗr$6X<a@9;jU# )[J6Z)`<;O,<`2LD$#p#`c,ܺ[ ;ˋnRLýgK6UzrW$l۰niElðKdW柍mA!^Tv_ƴ?xG-v"NpP Y:9N('Z\GG<3iJ>|;(s555f:`hkkt\/V^+**K^Xz,gN?4dƒs'OuGz.š74d1ÞVkҥ]f,ʠ7-V#0?db;0SM{%tҥvuuOn0hiiL`y 7̋ cL|g&tŅUwp3˿XK9#`$ZJ|m>`,ƐIPPk +j0x?Q|c7&K%:\.Xx~ޞ "I,b^d&@bNth4>\LjooV(B8tJ߾n]Xl֭~{&vO +&D"c'4D +@DyԤU-DSH]vV* +A3EHk=78(湈ջ:;d)kkNA,btuuu.njXQ +SX`#!EY3ꂂ`p,ITDM544Tǂ©N1Dž!CU_]i%[~TYkzw^qј[Qv VDFOTt)2 +;Q"l +M/yfݪ<4~Ft:VL,NcR٩uGE(pg9MMA'OBѧ? v*b9UIgd?o[W$JaE0V!@IC@cHV> Mb֩4k4M[q7$$/q_{9uI{V?wXSNj% qnw,8^D[lٛC9T(FS5/=t`nԱ't#NN>_3&X? &w.f\żţ?ڰDw&[<岙BнV^/ʠLWm(k8d +BKp8b#h4jX֭'N2aJ>}xD;QbN^4M3TՇbm +#_~uc>O:ءO|s&pܙ_9xc?9zCG>zO| +:upˋ9CP/&3KT|gΞ}[P&X,C+=M[?w,hfJ~ǡЈbsLN$bO4wNfJ@$IT499PDos)"k\~i)Y\]jPn@]\Tk5[m-ke!B,k|3D[_!uu&?|䳇g +6r7F~Kᙥ:<n`l7A!Qk<T,N><)At8NPpI9 nt:J3Q«ksK^3;=,ih!;;y\4ޅI6E/tu +>{rcu5K)6!yf{f~@mv'RT|y@wFT/(wX,f(`cc#HVHN@ +Os67X[m fNO}#R ߞw۴&S^<U9%:Au&p'dpw)6NCN-rv$ +r'_4]tP\fgg-˓"wh4p"X^^v.;{NbqχM4߈K[߶ߩ +6gL&Ŕhe-}syؑ?,J.g4qVb lWxuNݥR)Hvܩrܩti2cx"BnB +Awq}{{'"E50n6k{?;~pR7q喅,;k)IsVPp'(.N}~6Er,: +YâCp\_|^t8RPT&&& ;%RE>eBlؙ= mPD !M!-W ]qoQ$t:7"dAo;1(wR|h` +m&K6m^F;Ғ-R+])Lm)w`0(:)RFWWWE"BajjJlԮR&%Oܟe" &vL'%;^tH6jaX%LFt R + ʥ}+|pub1(&Hpul$OQם}Fʝaee%JB + Ǖ;r'x 0w¬A S(| 9/"Oώ;AmN*Ir'Pc@hAQt!UmwYPĺiP+[^7AVc帓P\\_l^XX):)Vӆad333j\.W,EGA\rwȽS>C!p' t'8þEߊAݝܹfEG$Rƍ*W@4.: +)W2,Tv 4eF;E"=Gr]Gh\M;|>(\.OMMS?hB +(dq'BTm_#L[HdUXw#rGoI;B!NO+wpX,&:ٱ`'K;;(>(wц>*wR۷s舤T*MNNZ'\H4MQHL&#: +)Qt:IF*+d>XzBHt R`EG!c'I-IMNaJENJuE$kP,P(dAӴL&#: +YPhDG!jNN[}[;yMU/:V;-q$YbwD"BfEG!ʝ|Ýdغ%ʝG(wN +)j>>>&$>F5MgIfʁd`DvA:g\wJRT͠/ܻw\.B"j(R\~]wzQ}xNu'jHbEہݲ +|) +N);yr,W +aEж<#R܇Y5u%ݹѿ9#k^*ѶIFf9 +ܩ'N7 +<wP;5J][H$BAt a2k;$ Ô:猬zĔdž^y7w]k!ztڷpx^˳06'wGeJJMjlL+&!Jkmd;]p!J5\µkw4H$*\Majj +DW!;\;A~W5;*dժXwᅴqߩD4vpI_.#Y +ib0;1k;r?;r2QRtLl +4;P?d2xr"}%Ʉact]]+(J㢫p@.D +X6diUW$QE|5MӢѨ*WF4p7NLL{XY,wA\ +Ϸnr3 wKgÆ###d +LXW "*e +5&j.(,sK|_>s9{AʔɀKҝVkć=6*Ӊ}7Ӌep*Jg/1"̚圓~j7Jtdsvpz>nCEW$oI.O>x8Je5inhLE +dNm{{rS_yE|T,w +LAdiUXCCC.@Ѩ!MwxVBv> ū:LxVHs}m-GƢ:ߺ,DLŤb8,Mu6Bn͏]~ xD v%bOTu$XE/q%Zp1H>Nccc]gaa!J-k& +WĄ*J5Kֵ4I/n#&Kv̢@cyG29V +oUR,5nJzŒ zn2ۍwCA#߹'<lM#d:q-wXַz'NXd2mm:~/$d">BC"H$uDSshKA5A +D>Ͳ&Vh;Wv>匯!f?cw~XuUa1WӘ)Z(Pf.o(PC Q&TTJUljZch)JmRfs^k{r9ws9w+͛[hs{w"pv{E9{~9x7{\XYL&30@$xOgEwg~E + +^/khhllhb@m0p% J-EwߏW竌+0<z8`kxxR` +9eeP:|}ͭ:V]Igî*fqc\4[ fWͮ_ϨW#yRjQx#xAt>$]9Q÷|v껧[[7g^z૯1Bq +Ѝ.-Yk=]dkΣ #'|&'ŕ-/JD:;J`գd(&DCx6&OxP1ۍZNlcۯ]^%`rG5|Әr9U#r*C=h9.#R+UB8>/<Dq0L5q]yK&.Xc&ׅ_uX2lΆs +MX<JĜ\B)64M7t#ܱmՊuum+7pcḅD !)[{o99Q;5#:%~nؼJb=Fux,%O%TCl{0` +s$6 +Eng ¤f?\yD(Ȣ`-58(k娔@"3ϵnν+fOl[^~aKfmZ"TvV_&U(6 +E>b(;ю\!@*RyG +L5ssQ5zJ^a_ATFR`,%P4764rӖ'|ҒGIkp2m\,[$KZKLQ(GI@::DkO?d=g}V}[01/ +7QG&fmjy>DHڰm-S\ґxt;c`Y;RJJ7sLf% +ft,V/{ݘΦIZhm/hҞ< +]$;AZM3ZbOe˪GX#&ɸek_S +XO4_lGE=}P4F|j6t"4L8T`1>;M^~'I):@<aR,SȺ!-V/XC4k}̶8&8&^`d +\8m!vT#n1,xfD7Ag{sMMƦX⯘cd#A)db0@P ;[k4Xq.wur'ihGTt56kLJ6mw>,*6$ٲU;S+5g#} +y +Qz:͒]] VQOmMMuMm{Wb؋dZ'F7\|&joi%jkkjO7uevP)k +TV̙yQBYߑ>ձd$& +6mQ濕w͟Q^Y2o4vh{fϙ;belNp4ͭ85St52qʖ=/4E=x'X~<YVr +z\>7.ۢALg6qNV/sL&S`WnzlDD[ub'I})IBVD@C!9TAͅ.F@B3&0~l[so|w,2(7I?`*J:o>3}_vk:lfq2lǻ2*>;0aq[Y:㟺onJcI^?VG60&9Kţ(jt@?ЎRdy&diܸ߸k[O|l +N.6a>wNo} +zUkn<jNVt^ !&O781..$|Tvf^~=:j$yj匄+@`;0쏀+UD mOƳ|||333Ϧ6@<gɅxΛ:i[% tˤ9 +0t{0ىk`DAH͌UƬ_lA_6^Hh|]UZuf{KoxNv$@mkÅ2,ba9B +{5x?(-'d( ¼ oA'WW]?6bEkD +,wM ^P.糱v8OeBU7ޕ+vqGR-:;QA$soւ2 +* +47߮3?6}Z&^ˠAƚvR# +Y "ޯ,S4Oͨ =Atv9ُ +NHm)Z=YBwpvWRT%Udwz +̔cG'Y{z7;V4nX=w^^ +gY}GexMjWywOy LI+ +yL㯇Etۣ=rGV]"DD,Ew 5'ĤWX;8U .{!U*qI<gekEjfzڰeQ;%yaڞPaX}קOO]#̊>wDG8YHay%VVI +Sw8ߖܡJ,=&)r(A. b~/A<?ssX]ozj,4/4>Zły@mYA1o_:0{\o@Nff,(4۽'BU WynptxLU0 9ef,`kJ~ӊJG;;u7c|XYBd:hLȝjj uF2)t9QU~c|NemE:4^-Wq`ttGmV\IسZ$b?|s8V#EvT%}{-_m4rﵶt^m!+uHQ1hɑ8 ;x$uU\PNu\FʙDQC7)2tdzS~eӺ~OI4}t<sEd`AF%P1y*ZK|R`0qҜoL24FKP` Why&*YB5oQnv>FxMzx29'W+EF-:uxhc6}lPAHAp$h$2#W+"m,In1~_@}CtiυwnqTB'%3*$ +Zr!RGg +xjMddXXdhHHXHU?ެ'lmY`2wHD$R_˼ٌX^xn՜~heȲe!a'ҍ2"IBӱK#6D_뉨r5 冤TKIe%`쌥(ga@ҐǓh +RYqB-8"Ta"DI;8pTOm*[C4aez:x-u%ٿٯؚ0JB"u !qKT\F$q*BB q A<x"iDxDqD㮴u֭=g|3sv{T[c3g|[ȳNî~I6}8*QnTWTy Z,\$K+qwt[HHKI/HLEtYVsZI])gN:WKu=&UPRI[Gz(x6wIijՇ3$L#m4+ T3$۪ZOO0LLt*i_QxwE=SIIX9AF2 +SCF֠ + +uq*=ݢ$yFma)MR4%R_nG2T'g̔5a/&77KC-1C)Nz.^HQ?^fV 5!W:RtDkʩF0@5Eg^41h4ZrԿZ +@`[&aÝig"Y%(Ua,M҉2nBu9j"D/RҒcL}: #U)}읒j:ۯE5.6>,4qHSX)Q-p"씦Ĉ;(KҀa1v +puDC lk4<SO[&Ղ3,4^MbH༗4މ?PA0ICcUOTVEa擀Ʉ1R[yE$IӑԲ{%p2ñ*ϷzQ坄nRS)q"tVt_Fx+|}BDz&CĦ +Z}dmt Hj}2B=P8$`6W2آzO`)R<pK.;5CRW{@_]Qj[*B:nep>z'E/Y7)*>б-I|ȉw*H7WX36e'ӝ c#$mCp%K5dB:n +ħ +aUNz[j_`0$pԩݻѷo߹s;wuضmۼy):R:Nˀ'@[0wÆ;|pp/PׯO4)33s.\HpڣG?D2)((Z͛7(deeVM%oٲkEEE@ +A/3Zȓ ! +g#J)i9dnja؉*QOeGM*Dfffjٲeܑ"DFF*ҋ9}4_1Ҡ)d{ql&+)> +W-sM6;:::tx]t}0.üf EBc2((TIғa|qd߾}|f˿aBU +a4L3d'DtֆB!G(ѝ'O""yN{DG<NPDrrنeb qGP(d?߾}C;سyfLhpPY]DyCJ?;v@tu8z(HʣtUUU?%gn߾ݿ4ٳgSNEe)#s1x۷v PjPp\C^+@?~ +gɒ%C233$5jݺuH̙h<q +$oDDD@@z_?dj{{Ǐ0!ifL~a'~tYBB]WW' AcccjooG82 4G>蟰Q@III7olmm}ĉ9@$ ̤ivvvd!@9bx3lsNNAV+=z$G&wbb9sȖUT0 PnCud%WA[0K.ݛiii^/̔㸕رcwub'|9r-[h'MTSSR^^9oݺ"(>Q ( yL0*AB +l߾T@)IA}v2\$ܮT*v"؉..._iPP !sʸk. a$;]( +O+XX"Z[ | X( *i%&3N+9.{dAz[-YP%7f8ZZZD +61|_m__=Aǧ?^]]E:kkktLV%c{{{ddJᗟKЪztt)^]2$ +./.hCCC +vqqњ@C!В''''`-A~gg&N:hȍM5[9==EnnnneeuY( +G5fSPivb +_ + ˈ"jJȑg{{{.nM4!멩R4>>΅,| OBrd♑i-(,aE* +U:pvvp4!zA0Ctuu +aOUYʂb٨ujc\jZ:UFvKmb(ozt:kL~Y +\.[4b1,//ONNv~OOzg}i*_uq}}]*,S1ƘwX;Vwc1_c1c1c(? +endstream +endobj +155 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T13:50:29+05:30" + xmp:MetadataDate="2016-03-19T13:50:29+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:B3AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:B3AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:B3AF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:B3AF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:50:29+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +229 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +230 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +237 0 obj +<</A 238 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +238 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +223 0 obj +[239 0 R] +endobj +224 0 obj +<</Filter/FlateDecode/Length 2970>>stream +HWێk|Yj%ug7I PK͌,yt㓜*RvO#hEYdԩâ#l9ۈ0 +,<͝-'[7]V .bq~\Ng[8փ[m+;[uZ,nοhvpxc8 +W/m_x/ȵE%DvNI!~UڴI_?~Fwq=+Ba `7Gž5?Ml&{'O<>J;<&?Ȱ:#Xg\yXvca7@x78[h +0ж\oZޜ,1<CLCmGcLnx>Ep8<wdv9+f)/0?hAh><<̿nYfyl6/;ӊ z=hȌGYV6[Ƌi9?#bưj{@£1!MHϰ- +Ձ[\Bש'<!=(Xν2@ +]PˆRZɕ;љϒ>Ҫ<y*G.BA3Vk=sL沅]v<bWUC:S)O(u3eJw/Fm<ʺNrlnyX|ؒo;EZRCR$u|k\\=pU7ǫoĽz]LY$7'3LSӢπ^3(k"|gD3D\߈\}-'?6=z"N$5$uP05t*!:&ؑkͼݥ[p%%zBV+B s,O:Po.#dÉs[!]TaQTAU9ܬu`^dj]"L6W%I ̳qN|wYrPXgmZUe~r؛*}vmf +Èf֤8d܀Tܮ{BC_7hz^AȔD1M*=u4Eo:?tP2ɴӦӽc]CK]еGT +jɻvu|ȭ]iqݵ}~7Vk:'Z#9W +>\4K (@}~/O32w[ 3V#.BXtUV=hg;'+8ͶÝO|x|Vɻ>R-'cp7} S;Ni]ӵncMa5ҩ3]M6/H\&A|xk/j 5 +)=zu0`nM`+eړ.Lw:k^:4<g8C;-Iq\)g]"ޓKf'gE + +JpiV !14 Rթz9LYh^h;mqb E=f/kȐ:ɝzuUL-(?U %ɣQ;7LhJ_0$)5&y=9@Ἠ ɰ],I_+ܼn#ѥNYBMP5Ej犉+\3WA" +]/>ΝM~3=\wq[]CO㡝sJ +endstream +endobj +68 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 467>>/Filter/FlateDecode/Height 723/Intent/RelativeColorimetric/Length 197452/Metadata 154 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream +HW pUI`@YdK {ld:KFB[2PZ$aBC "-H^,^%j)vzOwͿ|;B8c9c9c9c.s4 +g) +@RG]05Z8pܷ3h[cZrjTRAS +6lB2ɒs pDT$M +F^ +y F`} +̶6s[L9HS@ +0:+ԋp`Dc6p쒃' +8Ph|bԧ*OF$0HP+2H3.>cBrV,+AزP3 +qqpKN:gf+S f uWDҰ<E}uő|x%EgtM{ח,{k鲷/\jΆ!oeY39t>r<f֕%*c4ژĺ,aRoٻE=͆ky'a|dKUvQ1b{peK,^4wH8WṯX&"LAKW.Ku60h_~[$i'[1Oj2}u`]vjw#VS( +vX#W7$^z\^l&@(ꅪ$Xa)v7g;2r}FQTwܧ$@N PQw@ OHB@^U-).s;>+kLխWw1@K5,xExSTEA?'M{&A ߬*PTPXTvݧjܻqwJV]i@{ւ5kޯ8jl2J`ՑxeZH뇳>b!T+/3JN\MnSfݦU)YUva" +,ۗ0\rȔ=Xf)"RlpS$s[6^oY(̲9]QPXWE6\k6_Xa$L='8}t˶#G/*_]x&`BOִwo +6=dR͂]W +kw,yWƍлg2)j\;60\w$W,*+ç PdQA@EEEtjPh:5mqtDem ŎAEDdRJ +;+O>^Z.:瞽 ɟtr(7S+e!na1p'w*ٺEGELlaE?)<gGD+3URB-gg~˶qpOyZy]qsDLd]:J+ܱ:T)ǻM@40I?ʟ;Za3Xe o4[ꏋ"dL[!%T1}vG{DB$er)vP)QəURsfRJF_5"ߜEN).eAFUn"H,$cpҚLv+N....*.=wIb[6S)^SUӤӷ_kײʥI~"<P1@4cxIc1.o7Kro.o$hAٱ6P-)zpQB<\wO=?sf +f!/?Xi=^;BgϹ/5VmuvJ4쯭 56'ڞ(T2cA +=B}>_f@>%ʚZ"qL)Qєʆ;m|T ]DžщZ`S.3:&h4pdD&LiԦ)AG`dvi.VflC6 +MX&i=*ٺ!>bߵNߙ6Vrgta;;,pkic`^|g)02U[yA(yp%rK٠>).K-a2dtKU'#%'Ѻhض2=O~^e%5q:Z̓Ld&fmUXx)\n0dpm ^ +@jLtEpN;CnP3!qܚFpKoQm3PGh(8jDSg$v@^z<. (ڳ!IHvM7^(U^CknUN<\|bd%ʍ +4kh5Wy'4$w_xSZU SG0\j<mx{6:`ZUeϭ۪J*3Qb->3u_ΐ%lۘ<!I pg>lK?tl/I x}bxqCfxCՠUkgXOT6Y05 KzZ'&1L܈iB#?\H8v-ŰΤ#&rѢ1M=U: +IZ_la> +g!ñ^>y 0?O]13YʊNZ Y.WԴ.v&&7Cl0Qm1+p0UwY/=i+0Se-4blvg$J/t0K7?Pz] +Pܟf(m8M$Mw[~^S$Ea$NRFo +1eNk- +I?+?xOB7orZZDNDkr@kzw9UpSٗ~s2`Nw^DgO9B/4zŹc+֟,:VUw/ss B[3qK+NQmZwިj#Ibԑ/>A;NMձcBԲ7d2s\.a]eok㿮Kݵ9>8Q^blhX?O9dGbkaqLڞ~/p&iW0Q#KkͬqxlK.n`f#e4G bGr$mT+.,`[<.Oq[[},y^xIC{"S7jNɖb,ػ7ղ{[>J=-UPzh .pfYLyvy#w=GE/e.""5٤kڽuT +~X*s|~9 o!v=T{WLD̎*`&a:ydD*D=Sz(N*Hc⛚~='\UVt +yhFO[m~lqICs͋hVC&FFäQ'ͮaν{A]%1ځDzhDT&ql"]#%)D ^4M*ܺ QgJQwɷBRq&Ss'£KtRoDńv%rC pxhwC|,L_Fk.DڠH+JRT))jT:h#zd̂b^Iy*=X0SHנkL#%nJC#2͚ NA=UY0$IH(FUHIKS=UͲMFգl<Q +߇BqeDVB]m+, +m_jq#22Itkh]J5E]3]),^]FMAfm1p^El0(-Y/lF +A$2hGl79.\vQ}?WGgG=wXN4`r*%+pn +&ߒgqWuD9 UObl@i +]B(-F,N;oU+3cccקو+60+UGA0> df3oX[&kR6HnyFV\z4>bhu4G5^-QS0wv '}A6ݽZ/fQ^*`0`0`0`0`0`0`0`0`0`0`04D\8%.zi0+G˶7ʟ}/t ˁ.X)ߘ_ߦt5)AxW8v{#)A<yC{Dw:}5/kC:OmQi<nNp7y!Ym!VSs1ϣBFD'Hu"BcE? +HjQI(/^)m"m!ٓ8\7@toD`MPEoe8ޥb2գSb@%ۉR3Ə\yñS~ow'^p||[fŅ +e3 )_zJ$IUzyYv9j^184B:E\g1 +UlMNn齾ىu@oLvF_,̕pRɆ8X4EQa: +jb55A$ג,.TX{!%;PII*:.,D齼D;gr[$/F ^zױMb:LN|,;+67V +o$Dx|2=qĩWf;tRN"猈xdXh);KU~dP?>:~odZ':"ioB{ai(eΓenuo}%'^}nuHf&)cÐ +7R9G=uw|aRciBčo</̓ṉ_Tij{_>UM@]߱gG] =bGZwO~nK=7.S$S:Sc*& +|bXO]ټѵo}џxots6~/+_x賟[w3FLoK^ +%[c@Qa׃U&kmYj~13}۴TR@(&DKV5}\_Q:Qٝ4iS)պ:xbԟҟD畱";:ѧTKx$4['c#`7i2YxR#ie23hS}7_4!; +$Xg*l&"`nzPH(<=} +DB@Cx3+0Rs|49k'x/ܢAJuM1vn +X,hYi<E{2䏭^p&VE&6yY|=YiHhO2$U+t:x#2ֆIF%dd^>wj4zV[[1Dc 6!@}!toW~|pVB+g''05yCb5+d2бS!bV®45xr3 n I$'`"q4;7hE}ÿ5q莨_` WTDMQA!!+B +P5["T!0eiS<_s +=CPh:Lڠ ҌC$;5-*k䡮TcWh#4oi)>qc>EIuƊˀ贜n飩Sʚ\3_u +EB(';\!p<3[?ev6< aO#Bߜ^Kgc28 + DEY181ݞ1%w_Q~+bl<gh,1,(+ARE3Ro`!fDqcX륒Nv.) +^CѠk +此ʽܕσpI4ūz +}מZmrLRsGe-w%>WҌq%tU"+چr/~Rr"pۀ)ɣ>fs-Po{^+@JF]榦fxjƥR6U<149ybtjML\\u*J@XpQ^];`Z,;A&Ώw܅!IxpӽT]~ϯhiBv[gt83 +MhON1@}[caߥ\A\]\\F:?`*m!~DNT7 +uƴJΟwn.hsC@<F{,m&/ėxϚ@KХ2WI9ӱԕxIm:Ǭ3'b#j +3;CdDxxdTDDdddx5ݬG^ќm#\"~}Qڶ>+"֛LolhAr +M&>:K#/P@ȑH40-E_emF]GiE]URӥ%~˖x@m{J?K4Ig2%Ge~+nޝ7/s;f\$sDF9k}!&Yi+W+4VƯ&l^_^jN})byRȈtGw^95#>qy'5F2 +3&&lY-%b,$'N5i! rk'g5N9M>[%+Ç +]krm:x`~iI[mƀi&M&ME#ȍHҤ2 +,ZƥFBĎc'$!$;{~/=9k;THdKR^;ǯ~=}n;.WӰJd"dK SJzr/yHaY/HarG)]!XgTD곶5?[aW=7𦊆ux奵k6~2Q!L5TVOS㡙foӝ1l.BVG=T;N v(.RSIx}МpaVz͏J#x2鼭99@ǡ#x7_ܯ`;=u/W +2^gMQt6"*6 rzrQÓ&/Yz3't~0%T[U?mO(*^XN2:Bd<$:@I0Mn/*,g*, ++HWNx5MD\ + 1/pЄ. ȴ[ʗv=xtnxg*IL(ՈhVH~<uUPxE,/t&FYN[fɇ;j)X}9NLnx)g3ůCNsDY1*fNH2&\Sv<&&$e)M=ar=>N%揥g /l<)E/L P'4_z+M-ac&VDɬmVfg&E|H +?`ɤK1H~cAIGAk +iplSx}wcHM 58bc~f}ۋ23s5*$ڛ44G;ҿ!=]J + ++`=4KMtSh}3DYd~xͮ*iCB@ͮN]BH,^g`UV +U-e`rp+Wq|T;ktl|q1%JxmD# +T=OwA7zANFs'.XL`'M{{/ܛfNӞ⥨LJ= +l +D%rkz_Ry3[gM.ei"S*R# +; +ǭ#DҾ3+)SηB+V̺tKv)T9 ^`a]JGQ/Lm)< )SfgW9o<[H6ZlIW;*|/U)Lc詙Аy(%t^Н-Nɷ;5_XƒBDu+zx/3Fi33:hZďz+Wxt\Rǭ ݝ~gA7;g]Q1ےDzATa⭉P%"/KwCsmk1V\J-!^W=ew$&LRWA@uɋ^߀e*¼)Nj3;iGpмkM._būIUumS,))^`/P|x/5)!b6KRF[Y{`T8ZH^]נC08.{`Yyc;1ʲ. +(ETm4"6MM0piۄ0p-x/6ڬ{}gvΥ5hSOf5F,}߇(N?x <R /]e5w{(^c&?ݧnJiIT%.3HopBvc,0<a/^"n/ 57WֲלSj +#A'K-?:+@n*iNJRNuQe.9S}j/S +зZ.H?pxE0^ kjB+NR{ts\j)vQh)ix՟mąT12?lm~ͯo"CeN&L<h$js^+<ØUtT3 ݤa)kpxi`/#B_?m +hRgbPLtd4gjn;Lo+3Lp \CA`!De%$ǒiL1Ryth'Mmj|\?СxzvwdV$)QP uuˉ-BIe.!<E}ƛEvK J%]1(GrXN_yk9 +"ӾKqx;.oܝ+TF2YEhKO;xSVʆk@,8>9Y-cӫVf\WQ!wd>W/1!zx7sSБN[P'&G@Ý蟘XH.e2FWeCNm?nEL6yxW6W0ޔ(:zɃ0}ALQU-WHxrGl_˰ A[(Q6zM|D_߬$A,TG(==`m~5i(C!9okt/,n(3^ ObUC( +Gݮ|*+T$3t;i/gq8ea9qP&*ƻe8q<(ވS Q2ݻ7Vkgx#cxw^bVc$f-d;'~WCoW,"kM,|u.7:UӾ7~|8S!>uwz;ꙁO%% >:й +=oZ=k~3uڈRˬ0j26Ր(&]Miƿͳ?{#ea +yu&Q,V/j&}kH|.f\Gr}G~Wþߞ([XG% +(,BwtoKVOb@-Sp,zRZ$Xt\KAwgp2Nk9L_lb6Z̾7N ar8V/8)aNl쮏7|#2hqcɲ &6r3!+mūz=+I#O"gC+w7Xl +1W3_zxueYUF/L +Zt]{\;8p7Y2<֍꺮~||p)kT~ĖKTB(-^[,Ha܊p0|ޱigboS;bEV5$oG<xk>Qk`bR\2垽,X3rs=/ +p2u + +- W,07`m.C >Xz5)hѫ}{Ǵ,\aJO\𘫆mϜ$5ZR6ި*s v3`1bHsFnVDQ91-I$jEf2"zBl;}CDw4͆@a^QjbO0?gSX" +ͧ$)b9J|:Mj\Z@j xʔ{ŪTҊp%ךi4%ϧ,/"|8x1 I7C~NV8u y+ͧfK}wЗaqޘ +hccOzG'bx:|Ųν!ōDQgR$ .\ wZ'6wQGR̴5r4ڤZ-ˎ-X14|lI4'`+k!˦jM>rp͑s`6Hs7~GyeG3κhdMFr'r[+Mz!uU(`anc/ȕގZ+1{hԧ1S`-cMRZ!ϜoZưy?4Ir3l`J*,p@^q1qRkՆߵ.VO?n:sMѹʂNb5XIOkѫ~\*=n&J|CG_ +[x昳]`%ML=]{wӿVY>*"0|yy1;l7Ek̩;Îs_ ^N7M#䓤Қ5~|y+T(Ģd9oRhQuIr݆hrX({CTp$w(wʒ+ x$YR>K.8beP9&R_S2 +&u,6 + +G,>0ȡDc/JR9PccZACBU ƫ=]NRS")J]GއI^-ߠs3^j:/.]tPD$&Ҵrm|ݥp˽"y<gx,|8_4S=+~ǟ!852DR?*B/<f0o_A"$ +\%ziScޣ^]n?j'I^WeM{{ɲ1.nxia8fK\$EAzs*(|%@.٨(D%)5mgV_7t2s[lN@+٦;GH +K^9k2[6Ks*]cYcNUXKMs~m<CS@%r@:8ڜ&kt<l!ޚ`FQ謹[gc$JYL3EgxTNnquH$:V'UjH9~~Cq֒rzѕ3I( + + 0.vh6/ܛ913'.?7\?9_>I^F;iD>LK?mMy3iVh.ug!D(<{f9x:Go#S3m `S$g V*UMC;;9KؘO:/}yb&%㓛?mRP/KrqL#/Խ$'Nrn +Ч6!NL'i MI:MJ3ӡ--%CIdpH$%1`mdb|W ƖlY.ٲeY꾺ZE=\Z|F:wj^%iPø`F&xjߣ+;2,<n2 NarۤoQ`B;O$Z[tNΪ^KX4x+y +5f_{ +DϾOq\G5_5)?t_TW~6ߍWv.I$z#pS pĖFKap5< {0Z2IiPNTd5x LsτCl9rNcN'4eڴ ˢ[00&ƚe-0y-*=%IvZ*SZ-}GtFL$3srEi2XQVOgz¸sQ<%W4G?|Y_]0]h:jupV{wB[k7Vm1@gjm2*4ZYN'C#q^/l,yq-m0I'^'0arL/[EaA` +O+$Le+i +l3E-vDdFHPϻz竢\|+ur<2t+9SyQnSZ*|iTpǕ,vl"]2!ݣt +'z[=A +'m>SbAV>zht +["!Xf/I:/ +OeF2a(V(q<m$6vYWNNŊAx!B2282?aCw/0io;3 +Y1PWỴ3PjlVAQx"36$`"nihG2Tvg]{r9Wv`ҰDRqŋ?6(hoNS>Pa)hXפ5Ew(sp*Ҭu5|$na Faܱe,롦]&/iI]N|tٰa5dz>ݾ7'J_|쮦=&)<IQY60}5ʔKK']g-$rXD#fO un\%/PVnR|b{z//Hwϫ^=:jA|Tdʝbs9/4 iO"P,s1&?:áHl3ÉdLdUVk{.D&!al-_HE +D{ҳqj݀X(^UNirs0kb~r{ۆ{h,A4qi3-roo$rP.Sb +h^N("f>k[ +RM$ɁNy KQ|,S`DIoZ͠ Oc(h4Rz;EE1wҬ?-y[vY隒!sfi^S&N-Č#AgEZ-Txu#,)y:;N(]UzФFgXX@bX8PĮc'7-L5uf~%H\&a*79L-Z6h"#AɳO"J +!p)l6맼ghsAi97b5-iTEe%jO?`X2A$$%C2d7e\mVÍƅCћFaM6P+uR&P`(]h^Umix"2<+nt.p`p7aF,l> ʯ*W<JC_^IDvFk7Y]veNC?m=Uu\ivQ3EkfB8σxefyƝ<E|_ų.?l8VC \>H ǃ 7_ E:'a9Mh|N6ɭ.<75ɹohiNYFC9[].vBbx|ʃGcdtDba"Vw3,5r˭:W:8er)Ufn[ſm%I!J +3_Zs_Y8O/_;Dṡ}|뭾/'/ÿx^z~{vsZCEWV耠эouex:H^4NهT~Evc6& +YWb9h g AnHGX +`ƈfcX'LSyBGTHnMۺ.]?N=ņU߱_r,Cݳ}UW{Mݪg,?555p'{ɵodr{ VQ<AΏ{av"%C/JQwmD%AxAWQ1aެ!Yva +NJ/B z:[^Z|0kJo^ +&jVNw>̕@J8QGz&똚PN6N7~6qq^BLG[ֽ(Ю h(۴iӤIӺILk;-t[y)!ChJ!^ !BN8~?wrs 4u|K.yψ`|zлD$Ll(P"'@ +Zxfx@!Yf!{5kMw{fm:eKDtz_?H& +;8d#Cv#̾A_\VXc**w`cX01V +,tū\%.8CfX&3Q^, +THFU8N;.ő"QZaaEE8^եp(t>R/73_(x;.KlTStS6V̔Cd{% +QpĈ""G<vw{=s + +1u&w=s~&h^^;Y6lQe)Uftx +(s߽q(&^KwV|r#}֒F'Oֻ3ۆMfOLh/WcO^o(*H3vF',/h'b#@<ߜ2XTX7A5) aajٞ8kO|R}'?_7VFW]ŕ\f,:#NcsgOíZHޝuÚlm)q$srF(J(){'3L.:UiJ5ɋs?L>-waHj<jȲ6{<r7,ǠH є[Lx6xdz$-rlWf_7,?ט_?moL]}3s~YN/&I *x^ӹ7$Mef~6kdMsVťջw8u.~{!,_U)i!ÃM$Vz[XT/`]mU*VrO*y鏝gj?1=Xؠ9fN/3=_broWlΓΟА;k6K ƪIv.u{Y݄5^xUU1nh94cISD@b_5INp{:ǎ)Id:NL&MTŒRtIЄERX7Om[]ޱ,P/.qٕ. STgʼkkgW䒹K/d{y^ճ>g]1JO n<*#QbBb]c+,.2 LJmM/UFȸ6$G%94iw=PawwK_MGwe[-,WgK̜34B4ИYaT2S^VR1)P&ڇ0xټ430xbC3=<DU9&Ni]e}wŀd-nXlfa¹zir6+Nut772Z&U'q$xDŽZmEqPq ŨI+&8 M;+HҸ$cp +idz@5+CJ8r1SNEt{fW +Ж +/j[}[O^/~:X[@`px +!@DI$ +,&hX +!Axn#ۊIga/"O +Yzoj7#ݮ^Fo9ҫ0R4sx.kR`>!,F/ՂbFV@,DP8"aF9 +z$9cb#C4K(S+0qC蔪Fa[Wt%EnHwh/0ocZR"gxR>6pzm3pTUWrCޟQB;/.[FaUjp<üM9ok:%n%K].߾V^0DHb9L_R1٨Ėb`CBF8xoxlQşe;εw.g7n;f~|"Kf#q1gmroD~Euq]дN;cjLCIm:6_Mm?әv$&®EP&JE/MFE{cweYvY˹yh*Ztyp\}o9zZg=t;עtp[594)FjaJGϺWӳ5MQߞW(En])[Ե~(QD-&dJKHLDk) #^'4ZwEA +GFwhJ4LoDE*4xix-e*/*k8]uǯޮ{ܵqg_5\'֫Vo3ܢqW<|,WmWB4{T.>Rf\39}#Ûe=?7Ha?v44\xç'CZ"+x +ѥ/b6yDQ(-v¡.O I+YՄ",@j,Vx\J 4O|NXKT4=X~ +m^PZnؽCs4_Ut@ߧtUyuSM~m7^1~k-[AQ&D^qy7qj,+7*S2!˦K⠈36seI.VUM)䦝;UrC,IH^ +m>frJ>]U5P-/ <'l,E^`\ѺYBaT(,U𭉒L;,j`M%yFjnO]6{]vJ=iJxMM7D + +':?}okcc]_ӈREpvOfq++)1ԅk-G^BKr&q8I +("K/MY),5ЖrD}A7`x><boiNƉT}:IVԹ"X.#tYlR 5v&[0?vQ9!xeh.=oM|a]bD:7-=GkNݵ_֯f4T +خgQ?QЈ%):*Z"M$se/9ݟ@,(/̟IKyyi<x<gc%3'TD6/u)^_4C62) Jx' `Y[1N5*\T{S].op*]HxA +(>/Ѓhz5[H73BOI}'|eJ5ۂ^hu st~- R(3E_Nr?NT/LٴQse,7FSv+$ḿ99 H7O[>]ʲ AT=oV:(GtWji +-.@#KH ,jMBK? + +A#/ϩT +Cۋ&--3+c)yǷ-"/RIAaE+'P\$Dos71&'xP R Om,.ϙ[ +2Bx}uߟ&I \ARQD`eq|H@FTN@Ȍpoڶ7v{:.m +S/ZcVXb[9tTihl}2Rˌ!*ZnSBkgZ#m{.h5W-Ϋ+f%C|ɩZkJv~[OҾȈ>Q#{Lv|LacNVt@fjpڝ4^W/d/>s"Rh +HE>/\pR_jl4+ ,,d{k +¨i"$ pr[_^ +@_)7sl}::hP(ǶО=i6p@M9ou]0,m9dN)sE( +eT +־J\Ms!+BTtaȋ2OȜrVdq <I/q{͕|P#<fWi.}(ڜr,6ѷP#}O~9CEr/".tixNXӱG#`!<ໃ//Դ +L~6#|8l!/By=i8MO.,el~g205?L0i]v$]2 )Li"GL8xkOXt8Ɛ3tL9A[Or8.]Lw=pN:A9t>y|ofΈC3y%eL0ØѷNX'Xgׯ۷pQ_F/_w\)kᄵ75BCT +I-/_~\#OGPIvKC-C +ͥBQ-o褠#],#jKr툎p![uH!)؍PzX{h#)~#$_nv^` ikިUq<q#PB%[SzL( +po-L<ہmnfhbViU! +8NFH0ja<GP]De~"%2]<R!zND#sMy]N6b^0@y<0 M~"ylWPƳ$8i,@$[d,h,cPox!%`J'p^40/Y6 +LĖ7?Ar]MLOƘBcMfmȘʷט69̨1]j}OZeY~eNLa2Lۯ2B=_oڅx2q[[&@-b]ZaB!h0-AΥncⷿ_ >}:808t֙Hg<~|dž>z`%/O= +D\lSTU>Q__/oWlLScy-6?m=ܾ}FiMk')>J# '"}>_s#}NkW-+h~5hVM0 +aV( +=zر0:VK2kbZ./~$E*eʋeo_棏 +_.-/7,ў.QYKBy?=fe6y8CWFg]'.$TV߮>|dqqQf;my\FjgO4:S6?ŻwW*R1:ԸuSڭ]2"_!ϟi;O¦O!0gȟٳg'OzD8xb[C+3$bU@j;411 -P#Pt]tIʆuCκ2vUKib(|^ +\cݻݻ[ +k.!Ah +<qȅ-3O]/f3Un55vo~d<uG2`'\Ֆvu߸GvV_H5d'C,xZ7~ P4YpOФ>]JtCg4pt &::( ?sRZʆMyx nj@QqN+ɲe!E2etH&YVqe%E+ЀBTKԼ"ln9 N@u\.y{txFpOIhݜ*w撻Kixǖj>/o#PhcĤv9мm/FnQIHJAHv +. Ƴb +bc>E-o2 +㮪/$%^iJtط[^ g$7G +6cl!ձXG5=¡Cm~RކG+ٍ, +K1 t{S3VcyPBN""5F܃PITWJ;;wJ=}]L19$ˋ^N=YS [W_̨xン-MQB [Au**JJwK;}w4vVvIsAz?)}6y^`Vߗ-5B<8PXʵ2ʫџqrWxޑ[S0ԁ +K +.}s@@@(ap3T_+@+ggd,^ +cZ4砻 +l +Bz7mlr,joQ:?QV^͠٢*1!THbq\VݵimfS3gder '+_>mw P#,PYEMbtzQ~/x<@(%QeqY<pU׃F)B_dX8;OME$AP3Bu֎pJ6Ef,wo;¡P]:9>?P7b ko~/BhR鮧N@(ߺR6wo4bxdI.Lsv̂FXJʃcܗ<F MxUcS=.uF!SBN/^܌{ŏ1Hv_dQ +&UZGNW}2`Sػ>H~W)ȉ-/Rէ4:52'=K{+kx@T7lWt6;OcX@z4/j{U#uvKs̢s4M16.!&1a쌅k(?L=ݩꫫ(v#&>11nolRR$GQ˞I))~ϥʎϊ9hX- >BԝF#lgzzH_^i +N +tI:^Hc!]V(%D$ LA}pdg^k~"cnZo$yN2=RȏлP1~2%-hV;0[$V\>,YV&N"T@7H~'wC{ +*:X+̺nCt_46v4J_Yj@mq7Q<(`U4" +Hd|1UFB^ovD"X\i XUtU'8g".xd!~ɓlVbrv bMU3t/\1^;ʱelV+.9q`x^V?(.Thx+߲gufmhuLb5,CP`JfO";j[t6n?//|i{1J\zu8sC9Pq(hIƣ/ 9P(L{KUo@= +^oⴸW|YfkpWRZaT$纼fo,*@(y E,\ԭ(s^Xfذ +/5Dӧ.A. |Q0#[zヂ;߇Xo{ij%FB~CmaV$^îͅnKĂҺg),SFp!%FHy)Eys濺3'/6ѽ:B(ad "l|lA^͆Ęӝn] +.;XSɉYمv:js4\#^:ꨰxDܱCKȁYufֆrAs4}'羭wxZ XwX4U5.Pws,vɈIya%°O&!*DtzpGނ^:L{ʾzGSI5c"sIpʏSpX_R$v:?.|҄aaaSʿe R(BQU+s$J\X:P;Ϛm[V\g;=B$7>lF݂%WsVWؒQeF:+%pъX.q-sb\1c6<`A8 Pן?"l@ 9YJ,w',_TxKV W]vпGB'G`)kG%H + +,*'"iEGMhq8@d^Z +JnxGXSIa +N==]L4 +J1h +7ɖ#'L_졿;xZo zNDr ?<48ʢ͈(ZR5*qq-l(Fbb4jDE@[AXv{}`ﻵ';ssj,u>ijrz5?87xojLk%Vp/,Kzz +qYcF;zY +*! +w7Zef>uBi)eХ;XޕhW̕C=WgvB:tn1sPB@.Ϟ^o"Ǎ[A5g]i#@2v.nG._!x] +k\rq{ ?ƙCE)dQ4{Bc#3"wx +).?=PQ?I^!*Vl)ѡD 1RqaQzҌ.) +S'Zi{ޣ&<pBPkե<4xyXn˚x>|ұ~?gjCg#d11{EcV +/FQz$"{_Jr_%Q{MPucF5:a6'xy $^斝G ݥ.p`ĕbx; +< +^a?X*w{|7UUu1CŖdjɴnUGD騻v48xnhYV4+6doEJPlpj4!Duz/% ]}VmH[-m EIC5tt1!xa;_@%Z[:rٟ?pԤ,U@!L/m?Aqm zbTplc/k_nJWujDTťtTX} +^:^hrN萤v4LFE?ٓ+kA7:`$H@3;9b]ssn}ۂFlMP,Lӧz YCDTߪ"քָ)<NkQ3\Q".{L}`H啐<~R|ؠN!CA{Fu1+- +:^5z1UbUx0j1, +1ӏ_SV{GܶpTSyb}}WnJ09 +2=^JI+N +JHYtխ'D\>w_HhQִH qN&"ltdP=I%2+a,;u,+ڃ~NJOk@)/>Ad۳quzlt9pslMw3WF-1+Ų=#bz0O"=Cw/1"L?=SNjҪ0~յXvTџaہ!>W|>Mb?DHE$QD> +y$"tj^{Wչdoks>svUZ½|dV|덟|O^ϧlOYXr).ot2?TM;ĭ[O~9ʹ(~]b5''NW_.0`Ͽ_w?\ԺXJ@ݜ:p\r=̝5 iBI +d.h*Fc/6)Ӈ1ɹ/:;%<ݔa̽ d3"Q Rv +li[jH攅bb)#R0M''12߾aK!EN",@0MDtn`ۍ7+d)b +#l +>c6V +6c@`yG%M^{$P4lRVl&kFqŗgZAε#'˥4e7#U$Ueniބ [Ae3*ʹFK\2S; +ObElǺasi&%3Kk(2E>eq +߄ *Fj3ɾ՟]NFMNDN$I +$'&$-WelIm[[PFU[:$cEnþ)i-O]<3Bŵ]I/]ӼAȮ9 '^Mt$hHE" + +35Y_8vx|X50i4Ge'1kKXk[LXI:.hk.*baٴ'Wm/vۆd(To/3eJHA٬JIvK;w*<@va<Y +Z*XEAEG [`L*]+Yn +3$oO42EI\c0یI^AXf +m+ϢB'Ho%=,R'5ǛO#rKIW`l_ MjH? +ܩU(Wz4nVF0WHr*![#]D)8jS%ܔ&b.|%n x7HքRa'¯iWO3ف?}C5k{]x#Uz6ո$kj +B[|1 n7bKJgVԈ^"%`sn$+Hz#]MIiү83\hĞ˞(-߬c,"R܊NrkeQYR|$ +슣y=ȯe;pFJDv8F%_n% o;ы|jGLFAl)'mD=zh.$C2*s%WMᒄ'ݱ4*&$|H2TbUIid Dtŝbqw9}a֪h/dZm6Lg)]G; +zWZG+whU8.Eo!yeR64fE!490]/JshkQ#*xsÓgFӿ`JbI31/YOAІ^+Ot$<ﴦuS?Y'1p/KfՏi+T<&Fq1#8JLC)7*?iʆ(>lɋڵż5sPZ + \yKPq +BS@ÅR8|B;j.V>NuC}iS䫎vcr#3{Wj`ē·@Mswبd6]2Qη3GqؐysB`_rg +RE0P+ݴcaR"S*BS=I=htZIqYT7,ϫUX9$ػfgsyDXCEV@R +?`Rcp- +ul{5Jڃ_" +2HI&Ǣ\,2CB|xӯe*~BH1i("48-" JBcd +F0_}.cHmdS(+7>%"N=< BR-R)CmNAAFbJ;t:ied +KYK_Ă"ўWƞ֛+r>v!RHuJtwaQɁ"I忊bMxer$+25 [wʤK0Wn-xql8Yvrp-<z/G!H zIWH/I}+(!te&2:=}ǥOX%*},c)zM8Ȍ"|Ci8Z9fhc̉M!FƘ~+T#SIsx +dTꏨ:>㱲$CqL`K}30@펰ݶ,7aL߯zڕ+$d$..W=,,?Ġh!%0FD+¿ ~o"<w(|ĥPBuHR> +!r m_>5aI8< ha&.72+L|*ljq&*ZmI&43_p2]cxEɿ-J݇>n*<V6abRJHotvGs{'GT~vqi74\&5^Gi`II?I7>FxUO__4ijmB#4c;Towtvv9a +U=^0#fΛعvv%>.G'B'6Oer6tqJTbe_Nh2^np0sʚYv:hݻL#*`WMye{@C]$w%1'I\k42!Vzx0d@YоAZrUo0?^> az畫glg83{:@04$#//'K*cLxn +Tޅ{w_QǗVt$_ji̭/wvWM#eҞ^|q]l8~#}hHCMNdz-X%ؽj6MRX:*Ngbi%zIKnȸsve1W] +2-0{fV^&p D+7ۃǢB|GMѠڙ0_h<u+֗$%H{Y~D<\hdXv"頸G}dI+%ygfUۛ@7$Gzmo[!O l\˞ 8ߐ T:s,1!:eMfeC<\jMa˂( ^KЉMp^yh'Ҩ|8O0{ޮ"Oa5-ZS QFu5ѾrXm6Pu _]݉KCez)Ø +P~vHE/yOmt#UDe?vGz\8,ln"ýqmPh <Ɣ6uu<o6iSLpn<v`Qxt[CV+rU|d?B+lzYZUʄgC2ޓѾLa&,'1xنgHbS ~v*;LZ#ޚsXlCl8ƚj<r^}`Řﻋ8!S7`I[l8&HYTsF9 t1c)F{+sKzV{<#NР +K3fTkڷRI廊BX̿puR/mbĈ÷vpd}e}܇ڦ5TWr}a2'ІEoX.Vs+["ע6hƚVһS 6hzaM|àgiNN;$3o7^]gس&%6ݴI&Rf,\#}" 40lS۶qwං3bF /kT*+x{>R>.N}ި*9;'Zyֹ11(WoS5_,Dg1P|3T~²Z +9w? <AC̓'1џǽbTI"IN6uy|unR5bB_aQ@%(d7tEԥhn1Ef#iVut1/AY鮅\G+F:1a2~˂ p%FM]8$ptWYԯ9 +]/p>YN\ִw^\d6FgG6H]x]2\̨W;qF8`I8kt,vZXYn<Θ*/@^n^zB.6㐁j/4^~*[*J}E+kx?!z^Cq!1b$=q4OXR趇'3%x:z!+/n6rTlLx"ٖS<XՍ_ֽ+^ ܅ Ă7__ +q-Ӿ,׆+qzú: +yw*:I!1A)4q +, +*a)r}J&˛=?U6Y7sd\T~c_+))^۳Yw<ܮmA.Ve=9ѯᭇ / +_xoӉ[fŸ|IabL'Xܮ-cbtHxCvBn!!Zcv0PZO{hզ=m{Qqe3GiO0@71(쐨cE%{zfyB{;'j>cV8?[vbx_ݓ;w:eTr߮iݾϹʚ +49o"mAzT-<n.p>qw}/--NlB[;Lx9 ScDmPx/t?ظ{ɕSÞV@gvnGvyh8z$O3Fߓ<3jd|l]槜P^o_4Y\#q0nt?&Ԙ_ż&O<Xui&̘Z댼R(rfFʫޮ + +0/y5js^O@t:}d%^w2Yxn?X[[zoJAxWys{_t`<p*-={aŹ(V-}srw}LY'zwu 5/]2Mr '}b%Aa_y˻rsЪy +,_}%+>\e3XQxf; L#jstB1$6QvAP*ESKaLP]lq rd{ *8lͦF0myEb,sA"*-#E]<as$FaA&DxT(8,Lpi1zz =eyFE<rzkbRELy%wrQe?jD,:p D<P +AM*Gbdp8-1`nBPQ$CS!h*$W`4}CbŰmc +ԩ,"6 +,Ė+j .z:2UKp~t8 +OmTv]kb{'@*֜WIkدT*bB܉J +ZG@JȥjJ-%YRV\ +E,A3IWK+PxIHNW3:%WY'[Y2Jm|IV!O7Kiⷙ8|Q!,P;{1_^GNl)+KE)6xcO',"#L!q#fsPC(-'&fr,l5xV]q9)d-Jr䣧ϟpT;I>K(̫kSԡ7aCCi嵴D&ΖPggAޤ::LS ubZ:3C;afuqGu70Ze +.1MO0̝$Fq=zHL|u[M,1~cF֖D:wO'C!:Zj&!B[K!ʉ#:Wvk^D-E[{u +Mupk.EH_C?$bjIo&o"FSMm)Nh}R,w#\z͝A7˧VsP0E-74I#.5 ۳ B]R" +#JrZRDL$uD/QQג3 =ۿEa!0ssP٨ +j%C-zPn{^A(3z|-&#+XFJMq.H,_o͂W @"Ɯ)NFQg,&'G3ӜaOjP!Tp:p!ա5./-%nk0}[ת.>,U)PIt͂R[2">e:t =khQ +2k.9|ju.ވ? pV3XP+E")E퀐%$U!iʠBQq`(ZB@ABBmU#*bKq()Y0"{TA /s}%$/{w?->23@CQx/reZҩN(<$&+iX*:fNf7E2Vv7 +y0 %QŊ!yʽJNHah>%b[J&N- + +?5혿8Қ燾j@t\1OS%ڴ\zim+_וO)W}D!X{3*bK25ύ몀pB`lZ4=xt?]@H(xdhJMĤ92iiV+aݧke?hy^u`)0$9Ti]Î @b0a +i\9E1v{==C8?b&*0N蹖wp/`+@x2{,J "тWkFj +{mWjfw{fٕ`:ΚJotLQzQ+U{r]D`9w?R9.Cv"xDJ=\6Exyӕ/n(*K9_i,TmZ3*O~Sehmz(s[c/rةNn]<:eΜr1LXHK0YpCťm`D_aMue*)+=Rѝ_C7zZ)zzBҮe:6^7=26jу6L3p]$"mPeqp\KF1}Yq1vK61*pҖR&ݞ1}OѰhL5NSq=T6qbjjJZ]8"|͗7''lPEYkHMJS&zݦ(1KweXoa@Wz }X +Qb=d[p\6,{8>vrrSS&_vkrU]ؼI +vՆ"ZB'tvRRRJJ)hd +֬[<e䤴y>)k! X9!) ֞1gޢM69y?RS5Oi,n/eŕ7@FU}k'QD1*FC4EǣGA*5qA"7Pfilzꪮe[͟93Gt~}/r(e^ 94|:Lddd0j_ch&y69f^'GcݴU +q + 3l$M)b%t *H;U(ErvIZ9нG*S9͝;/45aa +?3^a3gQ#˿8<}|Z)kol7^ +G/5~#'PHރЕ +`B0+n UkUK{ǍmCRUCre:Ix*5tM?"~%{SSB?0 +TH߯j(,K0/&9W|Tљn3I6n$!\i]=<U8iֽ +q>a$4|RR_ޢ*sL.4,A"hvGG̘[+88Wkǂgä)/Lok8h +Tkia7bX;I _ a Ɔg[.(:ԀC&pel˦)Va%=juk@{f~0nCofP"(($08808Hʋh9Q`a2 +IU}!|̴qpe<l<fw(pl3/toEo&8ˉ}DL <õ$<s-i<)D&gsO]2D(W +¨kܳ.P:j҇/;8Qƌx/-W`00^M͟?,\1O,ЙXgdJ1Sj)tGͧn<)P:ǒ_!~PoVIRZ2U3"[2.RU))ԋɪ&<\!4x~KwBjq @l`\犚(/ؠqSpšHDkAzMɦ2%mk~Yʞkz +8f[9~hdxg8Sӝl'=V53 %sF&yz" +q3~Z'oWdġ+')()"iiG/=JTbUhj{s +Vyqar su0$/~~aPAf"#?t;XdkAr,@ u6vH3EEx|W4Ò&hU%5[7tj亐F +7 ֕Hf@lꦖ&`@5-bNn!1:LHC[v-ty_<.0FdtgY>;~]Stq귪H| +za>a1=@OUG;A|¨2p.7NJkKz>Fᬢ*]M=ZҲj(.3"3=Z?oYdi%kFHfUuyN3Zqn>7kKVس +4ZAP;ф:cGB~-A5k(N+Ӌ¯Nvy@hr>KT[I_aʓ{j[q bf1朓}eGIDU7®2tQcFA-3+&矨sӨM=H6c@柝l+s~B^&_@xlqN3uv7ƴ{y5uwuvÇSD2д3x,Z'p]9sFifHre{{zEZ`kJs\]ohflʭ$hm}}LWӍ<]⏖,,~cg.'nzJ$^:l)-Fe4'V$^(S|D脏\?Ӗn8yB-%?}?qJbs0ޗًg;9|Gy ߺ:;ݤA8T$.pu\'::xpJ9R8\/5_r8I3ccRSuj453N?FVt3Ц@@-Չ/#IKXA`. {99]Cݟu{{>=>,BW%T(Td=Ћ[0⁽&1%0zVSG>`ݫkR-{z|G**C{*gNu;j555֚bk$X`Y{l!F%z@K>ᄄv`JruTcSPQ+g̘4ui¹s/yDP$ySj+Trʅs,Ysx4jړ))+&'>vF[ÇY4 ~q{dB54JrM{GV(c<Ѫ3q겥)I˝NmNùWk;ԻK~餤)W,K4=DLJ;sw[2k,KIIJbJ{ +F_z ?>U))))-IJ5lkw5ʌ} 4"q"aޗWJHH,`,(i^_/\^p2SЍ'%NP=}c <uM}vɋݩO|%ͭ^]nQVc|#Yo~wp]Mλtٛ:S24t uK?(~}~}pw50\g/ΧMjQh.m~ˇWbn½in'NRG]]6J?+JkOy:ɲWEJw:ܲ!bI*.@ +g?)& +@Lif;;E%]/>qUaU_eP> +}\/kwYF.͵7;DMc:oq^c]muU!rZ2c/=zl<;Q1=lWT?b] +s"gN;XTPTTp#%α +X[X@$3"/ pc 痉*C`Cq@CFlqj1EFAHC) 8Tա$;CQ +8N/6cU*aB8rHQ;3@F91yBNU?|F$̸C^QikB \X\(0_`g×)h!jP0(L yRݹt +O;sncR3:tcԐ:^X]Iq2Ԩ*9UA}eM//ZXU?{PM<˯e8)G._t +?ERKxojj^أz8I",{3pLf5L' }0jGHiC:np9'N /xTL'loM)Ʋ$TW厷UoN1i3.nwF<rr~>#/хu"/M1#%㒜w]w +o-gr҈8Jy1tsfoW«Sx˭|٭KxM{?C7I?(>D~6?IԌeZTƜbYotWә7G;Cx[m;e+Wt/\:NpMպϑ{x )_<ÚxϪ'?fNw+k?.^sRZx1$p +˻u?ZEN=&BHJ.NfrHQ77)$Sx`"+/⥌gr8U^7TqpR9an/0{[X3x'ub?wL/5e&TLR7qq +R&=9 7#x: EˤdƑ/6NobnFxExKz*V8Swś0gGKMޕjŔ&ah:Xr +xZ{x?= Ɣ+L6{Kۤȋjzˍ /cnxPB9+s.yU^xo8a4+umxuGw捷8`F &^9U,V(~[cvrTN9hduX3xq +/FVo7]ޕZk;W|3eHͮxSv9dLl;L8M +/;rX^Hٲśk^y;RAKpR^!&M_K' +N0ߕ,ol,6|nūj oB`rp]LRG;$WZN0'e'^vxȓf>_g2LـLr/;m?;%xy#⽥ˮw7~2/?/hg{/SR4jo0./<WKK.šEb& +!h4WŻ[Rx}/I(ڗCx^p)»Zv$}[^B(#@ +oozeOw݃^7Nm_5 'Rk[`ze曥#31itY/zIpIxǘhO_ ~[ˍnLIB$ovv)H[=x!u6y䔝=ttK٫`~2P9ݴ0^U{;B/ +P}ۥ]pyn.ƴ}Fc۸Ƌཛ)6^Н}(>#1^ʍץƻN 9PaC7[xpřTh9a4n!x,[oejpc_xqR^ +bx"➙J/!}Nȵ 5d5gÅ90^ +yr0ע~Sf:s*`,aHiį +'@6WϋlK;&6[tv4Hr|n7]m2>x_LNo{Ç#v+.)>RºuۀckPe4xwSI[OEKvLKx5ߗxZK-(_R5hd +DW+8_4Tgq?pm۽W#^mPk#-HRүA< +3^%U6I:<Z/;EƧwt}~~G3.1Z^.Kbx|a_US[l͑" +$F=2^wpxidp[2&O`x'X;E3 +jG +5TD,39R<H١|`BsJJSRXԣ8-CSۮSvzH)xH:`G!/K{ʹӂwIV\FhvXlA$;^$/0Kr`Y*:&U]\,_VB +NɇD̡$ 䀥@˖xk|<.%>\Ldhqv+~ aã&D36G9maS攭QQQRtZ2p:+TFO~Ƭ{/Z/vJϖfWls:Лʔs7Njdawŋzd4/|lx>ɏGE1(3"Qw`T4 GӰ +n]kcO{9<!>my-M69zAmxFkyw$C2}D'Jy6;DkOj[q)iKL[be96xnQXkm=NnxP{9o,/l)V8 +$ &<#OT7Rڵ/^$ɑWdu>myuۋGޒڪɔ$VOj0>/i.?YXsl|k]V +^](n +߬pwI=:]a[Vc[٧*+JIx5L|kʅƫ/WAS4Fu_㢧#ɴO;5Ft $pdx݇ +x!&/`Iua`D:Wf8ъfA2Քdưs),(^=v:*=Fs3^aǚ-*,Hvn_JerFa`2qgolmx-= 6gLlN:{%l)p"IJ=GtIqL +ƋzO/C@ՌRϠW1tA`/CW}nDuȨlC+4-3;ZVVjRKJ:pɝ{"ehu"UR)KlݬrD-j˕w_5n=xuXޖ52rBR)rR&SGۊ\W5r\KՁqX! +P\m +#ygBtg +v;|r2vx3+SS2L62)iv0ˇ`vB-R%݈CnLPt +BR) TL2<2BEl3NAZ~nSR>>1א?%=T$P8E?1f絶?`Բ̥Si3CԲ +<k[+J +zZ}=jס}tbtpXfF-)n;gP$u4a-6$pBy|bkG{K3aŴ2TʆB5 MQ维yKxqdF\B"+"MT{4w`0Bh ++VA=";r0^3אO\%ثNԕqlr?KN417GMht[o4=G]Qc\%RHDw(X/yؼ[mC⑯|OpUߪk]oz [X7U [$'sfYz +k[T<fQ؝gK+<0}gu.$FXX)Q +b(.FQ2;0)/srrv=pfw]csʹ0L;-s;$Z|ՏbOkP^>A澻_|in6TQھDv! +NkĹ]o$iCZ <k#!2/MJ`"3%m)LBuFv^+n +=-}|vvؓF +KТPyC,+N\?PcZ^#WgV1Aa.C&8d`1 (U0-[#8;,QZzIGY ѧEUm\E[EW=* WF̜=X@yww&~9By.x 7UI:VLǤVV$a'2d$41Tdad|]˙HwFfԠliZs0\I5M˟3p+ÿQ*@豓:ASn/htm[-kbj}CnlmD;3]W=6qJ|EBp#Ziϱ6BOkKkgwDՅiMV}rS%ɪ~+oՂ2.dv^9ƶ]8dSr;2tV1;k^ZclY-;o';/FW4s]˰1o(~d;|A=T$q1utk;ّYѷ&-'d4=aSgpm7F(UY-+=?0aiWGרO{bE[!QŔ4%pw%|hE[Pɓv !`u)IGl9_=e<.9j5]b!q +гbuUy +xaAUvd}cIַssQd@:ILVJЊ?k@UHЉb!7>Z>WOO@obyY<59f͟=nx=}-=v0>U[ZtHQY_"|eo\uiصff|TL2uW":3ޘeeV֓?=y\ĜI"bRكpvV-Hm>xtok57}%[to Β!SxcOE{1#HuFm~nV@U$MP6+-qR7n~$h (6Bv5O-_~GU_q(@cu +8 +2EdHŎLQ^Y !$`-)!dFHndlޛM}ݞ73:q{w~|d$Ee1]SuՅ^ʻku P +FA;ڵo2~+ϖFB?G`~9K7_jFjչχVd:lu{/fdq0VsۜS JN;Ð" *m/O(ֲj-eȉ )4ơoџ*CH77G"sYBP@yY-.x3 )J,mtg+*YuxBvX.&7nHP#T! Avԧ1QI_DoaW(01VnT8GStqHg,r쨳{s({f|4:hklQ_MMjۢq=sxvۯlܶz>n=*5_s:$eBY-tN+}:1Z`p}fH +;HCU&1YٻRY$HoJ d2-0VaK.&b*GI<̂g4K\Dؼc"1DxJ'WLIznw8bf*И ;Xn+7"˵%<zZ_20:7`,8/[V}S0JArFvL&O|( +P$E_|L{]H ne3rgFw ++}G;(/~of*-N{#a ~/$DO"\Lbx<!PEl\n`HNN)ޓc +JaԽD< Aa*!3ʴ"2oT{7\O9 MmMxv9²@Z Pjq + +Ҙ(cfR^G:DVHq7UXEp`jcADqH"N{JFd)px9 `A7WokTvѕ#-7uPAg=Mt@[(ޣYӨޚ^ nDK +i6;죜4bj67ԌVRФYKoMRSSקRb1"LJs8]JJ>+Q&t7z7kS_oOߜ^p悇\V)iԔ +D_WӖRS[\J7$'G!>hUUfD>}'L, +PvͶg!2RDDY_-5+q?\OV$˰::9h~6Ow쬥F{3TF7P +~wup۫sFy?Z(# ,~??yW2)r +$K.y{N>9#`nҭn +y{NZeWvQ4c]2oԞn15ݨJu}1^{W(H'2O=X8nV8:9io5m0Mv]\Ip +lPf$gY/ob\c"x@K"Xf+/>_# +.lN\23tkUB!xhmg:l=i+h؍[ږ΄E~qO +QD*(UƝE $! J@B;~A{Ϟs<sx'^xE;279VZ/6y<+cFL(<{AsPg"vxjLxy'*wAz(ݎW&@YȗKYBo` + + +%G{I]uxo3N64r/xae(**Ƞ-'t8*U +adn0-%m^j9 s}b%խ/xi7zp`&M㨝u>Zca,[ +F F3N^7٘ +t'5_Ke>OI2Cǔh^@Ԃm7:JeU]šI Sry'0az&0h}&)<^p؉%JhǤבB1bpM.cI4M>[1;n +vӱV'b ,U_+ڤ +ƺU< +w֕%B_cjBr~xK"lQ7\6}RРtjS;ZFG(_ٍ^l`pXzGq7^(ܐp;{b?5ĮZ$4b/,mOrqW[hC!#w@A",jc`3`k-Ѫ+;9$xB\ϖf@@ĺ3NG7覨ƧFp(? z·-bM[y>Q柳x*E'FjƉ7ɲ&onԂ&Gk;vA)$^QoƂlHi Jԏ$w|4f;L8rP~:t]OymGF'.~X({źw#7;1*Gl=j+<Tiͫk0 "5Eν"[#xQo-w,Os]U٘}Ջ0;!Dj%_</l}oa~fpFKk;%<g֓z +s34?8;oEZ@?'LZ +wIS"""SSRfFDF8\AL%(\KR,n 70ͦmӒ##JN3&jɒJ,kˏ2gvR2DJjKS{Eү76;z|̬_Mw +pqEEc}@4C~Eؼ@v?3>:d6o_omoa-* +`EV^%U,XߩgGŶMSڗoX NiQFS-þDQzH)!9gPYYeGFIU3gPUU]]qF8jU~3^Jg^Y~mY{6l#c'֭x+!ɣ.'O}⇻LDӚVp%-UZ~{s}L]S4x(e>><w +;"Z|q@XgΜbU4IB4 +|YTKw(uuSӧƆ/Ta\xT h* +d-9N֚^k].Cff<o/-݂wrm(y[|5=t9FfĮ +İ9V +`k~˛{%oYӛE|ǝVBZ!'+4Eؔ\QJn2yN֙&s^5E]R-f4;AVn<_r:2ur3f +xLu}#_=ٹ~c +"lQ͡A@#D+9\;mөl +n +IVu=Q <Hz*Og:瀢iF +LD˧=CA*zҥӦMǃp+)tbZR/x3ExG^YJrj +wn4y-6;OxtT8Qa8)MGa^>^a,%RMT8x`20V$$CH#Wa-Cn"!C,1vNw^'!H7)2Yk2e8"FP0r98XtK|!.[S)F +(*:qъWO< mlObcٳgUUU_xA+<``/3СC8G}m[ȯXzdزeʕ+%k4e֮]KfNZ֭ +cg͚uirwkaIUVܹ3!>>9 \|y\\bŊGٽ{'{{{M4`7oA7//N䳙/_Bx +ôaN=zDpmJ5)'OK +cl2*lҫWb9sEZRRBFEEl6Zl111zzzG-xz8fvб0ZAp`ﶏa'<p7B +`h40'iyHxǏ3"w,&Nz]Џct~ݐ(,YsZ瓯b9cX=|}q+:D<ǐ`rM%|TB`xVسgBZl#Px^!`OJ_1v -Ϩ/G*K\6Nx1!{9r8E#sP@7Axac]V,ȑ? +oO]W`8>A*@').SGx=N&\n^:]9U3عSW2>e5$E+םrdb-B|kyP7# +dx?DB^P7hP ^ ^ +NkÁAxh,nZ0TI +8-,S9cPM4( +<bq`rH>4Jg|r6OQ9c(;"4)i1h`A߇>I|OBOoz(38c*%0{D) ?Hxoc*7<$`aqc4kAo^:~LO%eǠ^nT}fm2*3,\䦎Bt,q`%#[s sn.{MpL +A1^+HjY&mӁkV0i$1/x;:2#7T"IJBvT{H&H`pBLK.Bp]6sd i.〃īh;./y +x#13KrMZV)0MnMA89q5);J<L/$\p8ͤ=,0s`BaMdLFOD"bBlHSuP; .1(8mvਁ r1Vg ~TZQh̙qZ;t4Zn1Je@g'@02fqvF$3Zh4T4Q +GL/0VUEdz1P2ېz(ILeP`$凝0]V{w6G)4BC'st|1#h +hD$'AP|m|azQ}_\klV5(o5p][PIH3ˡa^Nr64=`: pySem'/?1UYqt) +h<)J;(n*-oJfk9}aK{ͻڢ$FlhLDbc(}uTJDǙ%ݫڢ̈MbKbFđ[B¡P(."k4i9MJ^xtKz9Ĕ,i1G6l7m +C76<a hU[Mt،#N_:h~,:Jɜ6rTKv<+M,]o9H^8犊ʖ능doe,9E,?\~pm]e+_[\c`t'!~/-)WZRZ2çŏ٪,OKNAHӪ%/pYŞkx7-d76.t?iY6gnqK%EeE/*#SgqA.\eOΈdQ/ҫ1i{|g5f&ADi@vFВN:a=W + 8@7Gl㊲dwVthJZ#6;Ki4`F^w~cW~ٶHb+?ڳG_>vU$TU)@/0gmjL%iDvgHgOhFhPxMFzӢ5=T2kÆߛpqGڈ):Qlw\\T/'YK@*osG+(,3h?_Yt#"`Q0҄~Qmۺ~a/߈z +}t&n)Xڒ>3ihebOuCCWoĀxuG.R4V]?wTMC+W_o81>)IpQgl-*jlmXU:VԩӉ$ѤFkDGm5x&H)EW Jde{~-vN?vvc*JP]gg7D0f>ƅ8wT_}gNnsؽ8#t?"i]6{R!=uU@װII2lGccTfYCxRj8s|BƩs.ga/+/ݺKVV3R/jrv@p43(w-FLW^Pr )@jF|i1':vx(\ 5|z2KO?j@G~wHKDjj"J,(ܼqz[c^l/<PkIsxX|=Yq*=$!*kΆIdHڦ_t~gAa/T^QᴀF9dJYa8٢iFn&y1<Ra,^*)@;*w]w&Q&Ŝ[s>SȘXY~U$d +(˸^t¿[7E#bnրm1t5abpb`a@ ..9gE|Xrb{k[L&%UC}Us߱!6yZnhk4K ;fhX;%sSOv+,iA/HgHLxNW099qUII'ȽrAxPx`aộ<&)Ԕqc/|m 8ay;-E +?IJr}y+M +N%`h:*5mNlLTxTv%*PX4N#!j +J`^F>*5eBtԐ1{˰<0;PAlA$p*.hsX4^n){l:1.\-8ЩSr +@x&5TEwɺ$b2'/pX@(G4{n?42щ4f[[$cduA/,TmI_0u][K&SUO^W=N[b5aH!79wB.:IG{V>ҵWnCG*)} +&jjJҸ"*P?S`( +pSybL )S&ńGyv}Ek iHxBsURŌ^as9`-~#`Is6M|Svd< +5mQmaZ+u"S8l>,5]5}¬WԺv{/,<#s߳I7juy՚F@jpUp~SE;.VIA5)ڤ(p|~1y̰:waIPvbf_vV]DGClܗ{H= C(!ʣ@ɕK~?iޚ,=}%v`#C6Ht>+OEd]wL7z;pzR=b3eu$qa>zof +'` ݮQ,>o_:o`d¥&SĚ&n㤦 +/XACK"5eTTPa1G?xK7h/LZ^&ҭ~oΑvlv4$}@HK"[yiSW8×A)t8f~!KApEQ5/( +"iRNA qU?M0}M=:y^az +ږt;u) +ql^a 6"Cg`8%p08LBu!:>/Y2sR\.R=z/fXKCPz<^n4\90.FVb0EDM"Agr ym4W"%+;KбW/ +kwio_I98 s2qf/+MWrtvw^kt +F貤68=xqon@m8a ;B,&*f/5Vϙ<>ؖxۡDj##1ve~ٽdA|Ec3^ +T~ѥp;$Quha%sgVW}z{kkΐF!LDQ +<_6fCΚv4>c-gǜEJ^v59pa/oЈWNi&5xܑ'z??sSC~~U:Y`ƞ3I3qv9Cʖ0ia X!7rb ;"4*[V(z?6)7zL#홴 +i;Xpfc6֏|[ 67l&'I'B?[Yz_/_XgxŤ|mQV$۟TZΚ5_ϑ2'h]U.Y +vwH;mKGN6]U+pQ"eN{Dm/;#3##3s2|>)KFa9Vt8-#wNcjHHk]]*4I[DDx2+{jVZXI$TF پ`ZzF%ek!%OkB^̶tssk'NξmMrTˡ#wPel~igM@Ǐ +@ʉ_n<ཅbwq㘬e" ӑt` Ʒw0%B>_ߗ~T8%N?vnޒ|n=m/ OƵe~A)B:y_zBjR +#Qp#re>yaMiir*eފŖC~~ݾ9KZ鹏y~f.}*KXU㌚$`0B!gya_I +3I$,Lòt*,iUD礱Q+0;#+(*gbUB$vkc={ÒF_%iuI +KS!za:.`\!g$-aĔQ~WiQشYRM4EՂuǘrI# >!H,/ ^D܍\.ltx&`"pq>rt&ϣ6*b!!{OWve$iTW#p6ӱ + d^$Q29)jϗt!RJnq{W)=qY{2pڷ +ؤ%r&ʖv3Ǩ8!EWy$ɚ>U&Cݣe S"!%I5!l Ufpr ?ip4NT7o5ƪꌎ0 0w&&mGTiB B,B-R> it+iH1#3{=g8;ν3\ҽ9}ceBbީZxRܨ +(F|A$WXR5LHwƥ3:M0"N%(*K!&L']Fmn:̱~Yڥ@\3f Θ +Q2.Ƙ`o_Xu-*ceV=A] +*cTF!y6M/]Lt@G!_4u2&n;Fveѿbc`W()t%]sz98rqCZ\zjĄȈscybSUI:Wx3gօ˟%y}îs|WG9I`J&.% +[MFceci`kIq<c'0Iq_3Шmʐ''d?6^bZuUDw!i; `uڛn1猹ulݗ"`YFFԀ,ͬ6ģsk/K}|hT,`Д5.d/Zy6شa00٣n04$(wTW`B]]%!J +JguA3tk8!d +~)uFS&NjFKId%'[*=i-7-h߉Lyr,V~i3ցd,G@%O/`קA"v!^xY\/' +jPT;nBaݟ\a^"/*fsa +}=y+KVw#'KWV::OV= +w7RP +9])qğw\Oꔻo{=&$HN-l^^huaRex{^OEwPD߰w};4zяN,B,mQ'dwAQK<Ѿ{-Ixe5` +zVtʌ:>x'4xUT2 +Mm$)_&6|_oURSIk-S>4;+_%?nk5羹W GR\~9M=n\ Uz !9"u Www*se[<0nv(BYr敗9eʴqQI8@)u"zC]v7/omj}}GDwH1OD[YMKg?xWIN{/=n{d Vr @hT)YH»$yE{vy9 +^9V=S^u89Km[WӫuvDHش;))$(unwX;B +!i]u DAohkjY!klH_z|o4퇊A`"FJ!6:М[lâɔpJN,=nTHI%P +禾mk<e抍fxV}cN̖9t]:{- JZSgqQ|Hx,x~Qq*A)%h !6ACZ1,hYj%V +j)H +BTR, +(؆RZ;<y9KػMoΝ9sQxM#* +sŵ3YO}Ϟݯ\1sg㺗z<}<\h]gxIA,-@"{wi:Z% +L=_cǎ?ӿ1q9s/]vͫ/0/y]Ks{p a.7{T/B,'^yL#-r PCu'M)ԏe=6Θvq'Lyɂ}{Eȵn볿qǟ~O=l$ +flӡ4 +-sg3{f +IyES<?vp"xȓa5uBl<i fzO)>M_,^bgic5mgڶ[){(ji2xE'RÞ/;?}uZ c<FdS"4w;*ݰŚ<x ̚LKyO<bʘ1[9>nl?am⍗7}I'^j%i;\j߷p GaLlC0S&}E}R +3/)bNOjA#0lCgĠ)J?Pa 8t?^r+;WmRmbE6|W2d<!<u;ŰnS͕颶-!WEѡ9H$:D+t:&[dXzYT1grY$P|W"^A.K[kĺ11#1W]jB +k{BA-S:Gl:jFu-x#)k*^rni14x><c8iS~1N|knaƄ<kR|JX^FYNTp>+T]-U8Aa4c8#e(TM $2uDS,Bɓћ/ެd8~%e^X,eTP7IE+\z(muihP0@Po<L,+sX R`0Mj6|v!s^ ']ZaeLlvɤUf)йӋG/_t!:}J !2tȳGVH7U<Dx;0.) <#.8$K/Z9 f +Ԑz *R-ZyT 9'TQy^3HX-d:nN=NJq"du/ VJ r݉!6N̙ie +<*3H%`LAi rb*PgbXHwFe(Du +]{qZ$bq="[jq` +N iL)6C'l'X4d2,WIV!JuruB!sMC;i5[49<i|Ee7~~E=,^o"bG=tvv/+_ݹw/oڅo|AXqr9)c*UcׅH2GB.WRA;"A^Z_AQ\i +PrE"{eCZ7ǻ_~h44p2u荂N\.)Ԥ$h2O۵{vlרӳ~idx< J#A +`Oc"ҐM1Qt> +7y<.P2AfKMb<CAFdyN!,/(-Pz<JF4~Ww&3&Vu$GM)#ZH8yk +'Ÿ-B>`^Qt8Dӊ~F.oV +t}Fsr_m+_O|$I8w?NAէ|ÿ<B*ޜ*ƪUK +*HT6N81 +2h=0 +i^uL>rL۩>Lz)Ӓ{zM"puJCh(ȳákyNs UҾ +RҒD'Wx>K*5JlOJVd6a*9_փ]gx4щZ+=oy7O3&?G.]4uQ +R{ +dF}Obibq#?n{KQYіTl._СPYBcP]='RԕJav!ScILLw/&,~xNY)&>S*k$x>wJx!uU>7cG4H@NKwEk:%Yw3ލ +b,/eZ{wP(8zTbiw^ת>06@/i0vev5[4;E~EyÌʘMEF3PHT +.}J +͎?%p(&۳`Hk˕*㸒 +!>i yci9yn'Hn(WcY;BZLqyH~ͻG,]GRiIQa@ ުuE3(~CPV,Hե +;֪NdHex'"QF}cu. C·vHW#"\XiIa=k?a:q¤ + ^ &ޕ@00wM֙Xϴ%#8Nח_@Iv\vp<#xCy[[ĎL +#j\SC+ +/xu:!e_]|28yi-kjG/HHGǠQcC=.JFQbLϬc^-Lw[u{PV/_wy+ +\&I2*il +ZXxx_v˧Y=/۶2)%VmhCUggE/xVE ohaQ |LN!c鼻rB&9k˱eW{#+(YjE>ԧ&j0#ueg17vp|dڄcn9莋A|[\8o'B(1AoMy7\(L1_:2>OhT: hÉBItT,v0F`OItk|d'>+"E0r6y,eEN62 +<T+p? +%y~np3튜Ig)I,!r z&QȪBǹszv,t`ݑN]L_Lֈ<?cqFb$:cB>bT\g#S;}l&R*;,yX))t~#]zwOWG މQu4Al^yQqX,S0^ǩ[KNke6.hz5mE=FҊ#^44ŨB5)PkWswdB +&ר5٩fo<Elqs Ty9MӠikznFA E%ׂxGƯW9^\_wT%quIg +pP.b!]HW8 /'~RGfm'vRRJ\;bD:ɓ8qL]P9f*`Vz:~+9 uaNX0 \!ȑv̏fGAIP_tF,59\A7lf +g7As7iޕA,ȘLJ5}#A͚TX$ B̘4r1xm-{9;*0^lᡫ$eS[^3b1w=jGQIS<)B;$:Uѥ#9(TN˚} DҢl\2ńr:-%a&oc9oa"6>Н+9Uv\*w"LFv-Ҝ}sy Ac<V먁TnL"JFEҨ1J +:MX,mW&qH%km*0qHL,Ca 9UF"iknMF Mmm-b`) +|}Xgאdʐ)%3HK 1U<g$"8쮮^z/Ov6RWryvMnRB`v?Ӕ;_E6~4o +ŶL`rvyVth]b3~c{=#9[O|ovQ4Փ짭>uow2lsifݣ|1??xCI$ԟأlwvtrZ_o6ދhxwt>R;;yINi6.QJ!s@v7*{]lwAYqr5egӻ-bMճ| <ߙ˷GωÓg/uK=xtc(N&/;)_ȯw79Y$|gX7qcs%Ѿ0|l~$[adB"MLL0rU + "WAZfgYeJV@at蕑pD"1p<n^շ$Jh[t_@2tFM6f: G#fPCMrm5 +KH eu`Mԭ׃/M1 @G^$S:B{PPkd;HmfC+IVc+$<obN-FȪ榌Ёâ3~IXD8UW&G.sF!XFLJ*'y24 <Sk2-夁trH˸y]S2ԤHA<u[a8"klhW=sj+$tN֡}P]vٝ`*>z%w~^0sN(y+U3CdTc[T P쒧s4pW#NDeN{PP^/Je%LULȻARC087~5H8]3,nZ 7o_yFlc_Ѡ͞nLQJZGdaFmYf+)pU?}:iR!ha3bݮaS4R|cU3ݽmP4l\ƶJ6 +vϏ-\+&z"YZ`eVg:,pJIսVy^jshkD!-w~bIq +V4[ھT8lm͔S>:}M8M/bu);75k."pe_>i^nvG8Q%`maSLD`LʕhCo,/P==pdxǔhMo&#Nnb"7nOd C @ @ @ @ @ @ @ @ @ @ @@{Qc9#!>nO>[> +q :;j _F '\uI!_UXXs)S +G鯸Z9ܭTߦT| Qq'stgOC_: +LRŃqŨ`U+@PJ^c3f铛 +|:Xu +`Inε?X`e4yfѥu^2,5'uN&(#W@_i+a)cPϻ*nknC:6Y=['gX9Enp'b6=U!j(MulD"XcE1"x7Xp!P~$ΡX+3&)\Tb^V9~}@3F}].mgVKhi\IP._ !z0[uK"皣Ho}=:OtzffF*P0g[WNIH}j#k,!N: +Ktor~^PMH*u{E5r80V-h̖"(ډR7J2i^7X_+쪟pWyX04~Č*+.v8܋fVw2(UX-W/%@Z'q۵-s0}ϳYe|K^}jN܋h;e*̣z4V:Janm7 $!O {dP)>(h +]ćo<c\ %f LYj.lNȅͭ.;Pow~we5Yٛ'ß$.\|o~ {;O;7̼r2ܹ[]x jAɿ_QM]yBY¢E$֍bm֭Vٱ.= +9q@ +i0gYҚeRPAA4fwBe;x%UY7⢧Nޱkώm^aVOX>L$i~7oݴ8*'%ޤD<o<H/--=5]?o|ᆊ=*ᡵz1S5Ux|&+rZ{-<8v'x ]!A7[Y];@y]U$?:l*A@]C|xg4>M/kNF +x0u"7nw!}AD>tGbW1Ww` +TL1cHA,?H`ܰt9b!%!-Ln,wO/nbyOP0t!vz;ok{wW1vZ'T<o;UwwjK9>ψsxrS +EJeE}PτzL ;l|XT**RVb5!5bzhwUS0K)aXKqYe{7ƼOB1rc{j?]P& <e95]E˛9Aanhf~Hs` c]_HZgOQ҈L4f)ћ%Hݯe!fց[E*n%j8cA "TaV-Q5C'Gj$[U(?x,OANc+KUEŅ7t'6s39ǩ:;+U9Ӿ_UuwYhG2VV:F9?B`8ز loLji'rud|nFU|v9<b +64]`]4<-wqV;w/{5+=`NHOc jxጷS?ɜ5u\%dO=.yy,KɬGq23\8),\. ٰDkG!.V~N>1$\&H]0!YgAcI4B.MIn2NCHm]ަWwgQҸ`t$cۿr>{2(O[/(\3P;W;S|yI\+hFUWd8r|d.I؏7<]G/|YQ.=?{bypiXݪ1/˥HDoΛ(V@eƍ'=":g&\Qa&$AbϖsŏD^StaՒ`YyW +˳q{U +@Vyρ{9% +n/(47Fc4W/1DD* +1jV2 +DTp) *! +L'l=|nш0[l9pS_+¼UCP|fwwg[}bO3{m$gν/IYNq.}%',\]yܮ%f?mS8_5OtVd[utFwg$?Ka)0Ozd A;|)1wF+ѝnquq40n_mx5=dNND&/>n3s7.ӓ@s9N|6uʔΞ*X4<pvKBcV{XyeUhi][yܘ[C +xD`jQti%f<''Iv&cyYmiptnxɎO-|e.sM2XKTϑ0?Tȓl*`fչ',-"SH``ecW;~djC-}6H!tBęi%zN]ge;dNNQJq:vI _iiRFI[Ο9Nm;p,:>/<ۈؓg/B_A#!3Kqj,#> ̎^/bei 3^͋41wpd;iʷJYz0im5"9Xmi7z,-[m'7sY +)UKq +w5D*SJ%ˈ_-dԪA&'ژ8uX+:NG#Э;YKg`MOL-6D!|z'%%O<)).*)dBm"\{\qxvA̒+///VWIĆ 諑]$6/-Y1r.rzlaĨ@t[뢀BGKW^66|[DRnFi;?`e|<TA^hCC.hȭ:ǖg#f"9zmn( +Mvwwv엉WWEe}S`A<D\qL!D#q3@ƍh2Ad4U`s9P]Uޯݞl:yTpiFTR:uiTf.t qccCw>p=]0IBA慟qJʃV3vX60*]gSasQW;Q\Zؼ8[ +xIFxy\ƻ*$Shhy]B+#3h{Dv-V:ͳa;|!)f e-jpKZ,灃DCaSU}}zk{-Du @oƷN*,uLR;ۉKy>u0IDRү9i' ThNCː!0lFbQ3chTY<<:xs +~2@v("$9xLŜx%>r|\rz +2PSoa㌚fiuwxHmɌC+,>萳,1pAmʹFxVk +iuэ3*Y^v~=c9Q(<AvrFTG'&;s铣1A/<h7WOUTLh +ʮMӛ3N:j*M1U`V0=VN +yko~Ƕm%fdr9 ]-03y^ SǤ{#XsB-9p\ϸ_aJ7e~yfYuʨW|]Pv*%55jj64i(ZW0^ ;*W-i9-2?:~ܖ9}ccM2-_Ui)㿍HytGSs;aJA瘉]onR +Qe05!"! cnlv(;eN7𫋍=C,Z59370#5n>ŕ$!9vty_"+cyWv(E~B%o@h^}dqað7*.t:<_jSj.(bU} +\lb#36ucV1y#@MvV:8ȑc/}\:]P"ӬEVgnh_F^kl`pZT}XZ)ܦ?I˨,9^vlCK@+ uCѝ*̄ՁHSO:C6}flQ<8FV/SBKUÞe.֎s<Rz/6qW/Mcn47nf3"SHxQ6jĔig>a|)M=$W꒟r}ӦKh57]hJ j5q$K ǔ?tyfI凂`PLP 9|G+?e0.\M#mۻlܟfb5739+ku0- +S<0|Bs#͏ʺ@'5l] += +(V^;eJ!NcKbJNLs}j~!/h{̬ܫY710.{ÄW_~rt\,NnIh"ȜϔQMcHy?youֵ8OW'QrҐ^peiY]RԚ./da^.%Ur.3궐D9xWgL4(HzsV7f6)5#5-=*tiF|?8 M*#VGie#Y?T +-b6m֚Zjh@)rw@0F"HZSjh&/}wGvwfvgggnwggy[iB>Ț_ykdlݻ?uD(bTL?W;|<wOP7o:-u,kkggEI]68ѱGcuM3ccGծK¾5T9TIcU$wY.ȀXR#N*xX0@irO~~ʖf [s/gd]hBF1?gӲ/4}_W@CH0yR5<vA5[g]sݟݵ|ٺK:܉_wtu|~Ѣgg?#R=7;:/˿zovfs\-s1E<I{8wr/$jJƆ^_eGھDW*g%P(e>O|_k|;yϽ_rc!V̏X߬@( פzOPҿ|=a빱\ĥ?XuVc;ve +<M<m/Lm|N-aCo(YIVT.?W>+)jQ7x$ZRDJ2/)IH-UB2dREQ$QɅzsW2GW2G)?1-%T=DAu.AcH1Bڪ)rP27ת,TbNNPCUor͒6Z8,%/USOS +*Լ,jf\RCYfZ݀!P1 +9 Zct(f|a +VMyOTY*\hPZMm-OT_孃H惚v >pq)~+Ebu[SbVf7J s#ZU8szZc + V-/eڮQ҂5:mZ>v Y'-]g8fbAvA]8 1!k'MPb(B:<5 h +Qv9?-_Nd_L0XŭCu4q)xcCaVB&]0Fb0sBtpy +vR zx%j[~_r"_o3J;v1,D,b}hY)@GT__ +`NCVĈG! +qV2<~Ɠ3v+Ña \;^" +4E|(%z\-#e/1a R<L A,'F0 .v`K<S i{0WFW.эk4`Q#|:Mk}PY:F]E@B|L&Lxb!d68ѧ@D; /7,&Ѹ$7%탔 +\,#QphX^ΰ\;x4A#i9QHC0L*/#l14x:J+IX(!\_Ap +!Rj"y@ϰd5xH2|8 +@#ayIvrbΜ96N30d,8R8ogME}]6Wzoֻ_= +G1t]4>a`Tm'gWg/QDodQɢ8NdYT8>$<CX/!]܄ϥhO!d̒ܤY {pn>|gDO)_=11{m.p|+[J.ԬbxFvS`S,/`S+k>E[OMlBfrƹZE*D1`qL5oO+65jzu{ukC2H#}!ڬ.˰,Bk_סrʕ6aC)"mNiո%j?JFru~?3cs/=wWTu@<'T5ˊwӒs%Cqn]=gv|PhcLjAgWz㴓y(Lao752H_tEe'HQekrd +=3#chMӷ^?|Vyؕ'6XzIJsՋK"Aũz{j硔?tD3[߂18x6W3zˏSQ4pr"CxuyYU/2R* Cᑞ!y.DƩ("/D,֜W=UٔV`Zf⑁~ƝO}sMS ϮG^}ҾNzm[Ӷ|wV;͘jfmV9ج,sSr.= +j,[Yc.Z[W2ֲc~iz*ZֿnK>5؋LbXۀCV(n+G՚`uP;x7Bg<?+.rk'6 +Hfy +%O]%")];҄cVoÙ~A3uD1jWȓUϴϨRYhr@tVZ~x\co tz|d"ZM?u$t42AOhrOފsL@|&u9.K.e[28].*$&i4U0^1=,/{!r>.&5{8!gZlҪF- +D(4j,g0H|+W4S\ɵ ,j".%"j~%0XhSJ>sL*#vW3cpe%U=Km(K3=bXS2JMvָ?f&r[ bUxIJP?i76|Z\އ4 +$oT$f8& +5y\dAxQӺA +GJ8fhބMӣ.>N6ߕ1GPmt{pЊ'}Sxx_G$,6Mإz9&5.~dV(/2NUrJ(`}kS + c`G0B6!jA#;pesI TѱV;Ux57J)tPBb]t,j7SZI]<B dMԝ1y$!e{2eD;/q>) Ncqx7:(`JS +H4&Qrs\}[&SiA}ʈ[VؔLa}!Tveqd>Pqop(B~TIu!{~Y_PGU<Pןٔ6(j!1MxkUo/ ldh4 + sp1q<4NZ +=Ň958)רg);k/=h*{lgqr +OۥH~6^8a{6?kPguj[zj+^PQEYҭBeV@\jE@ +].PrV$TB!(w 75DwC3n;d&3}rΓ7bNvP6-D }˗KT\RdFkO=2+0%Z! +tp4HbdUF B-!CF;k{[[V5:~c';m-{'xYd;pBW>˵:bUo|~2АfD+f?qXMm7+6`a=z-+O{fz2&I& +6NV7ՕjT|x'zXҭQרH"60fK/DNiNi +)'qGyePcG2e.+!# +u±r-3g]esXYĈ1ց;-ޗ4N&Zd-PVW<4}o$#i\J'/T/7bw +X=IUU{GIȲõ(|lh um + +# +IF-lN5]Y|(vre'*ƞ4 +QञbJgk9M@jgT=M~ +`9=ITxma"SrhNpQ=<ːM*k->r[26^ih@0PPOnG?H*跮z[Aa9p]Ț: +4Me{gkJ{G +,nk)a]ÚX`2/֍ʺ{wKvtjԣ7V)lavD=|y(jTiEN3zzD-b@i;Y"'3n)4bEaSSYd~VEz^I0PҴk_egPdNdTpI>a\qZЮIxR$ϴlaa^C̄\eQK7ȁrGxg=YB'2a/m[Z#.iwܾ]YmFB7T_˪P/I`[չ!rG:,̊oXuy$踒Uft+b9C'J\lmF@FJAl"&DB d6A+fD(H1'e=?m>bG1)tJA!Ե-zӷ DENy֊!N4,.qVQE32 +OWV3F(}-?wݥcT5M_:9K6@j +Ek]`5t()H +w$: t9e_QwSmiSZey/BgCi˃jȅ +rCȅ/R(1$@"+#a{vvwf~33Ky>=off~>/Yi*|WU.oa t~ed/ +<Œ{XA_z~\r9x?N^Sg[&]iT}XUSili7AmΝW~ݐXd8pM5Ӟ3,^=eLHeؽlC~{J8WǞmdؒMIVV[Ljx!gBAB#Z%.@-%(2)Ʈ~wt^A:( +mH{ 4)\cJ0.z +t z-D%`fo=-* o"MAm]]Y"1 + +zx&AQwYlf{P$b]^AUB&-hd%e1=HaHOB)f +&fY1` eR!i:(</_Ku|kV85/T+uLz!XvXPN?UvպB?_dP)sc.'M p̓mL"D 1^_E{^&W@8i>Z 2acF yl${pR%ƪI@Vn")OK!V aK|/WLqAd +U]xo7|mPƑ-)Do})^W +{_)8Jf*8DS[T[D$}J#ˎ76Vb*&,>,B21bd<PVZɈZ6]幄 +Zj|8^,VJl]/͖Kٽ5UW_t0)VUwAlF`Ȧ: <XŌTU~XR㎏cC>.hd*%:آ$aK$C'HFNW霠Frz-(a?7+'}DYЖQM=j/ifl(kU;[wʷUw|P\);'u8a?'yrkLhֈcqGxb^(gq64* +4k)o?Dș0.ᇓg+@8'84Lgnd]fcI=:dL0P @@77 +Nh3{Ƌ̍A}TЇ$KFShAgUZ{ƲܪlL*ލrevw⽚n\}i#=Cb91''7;GUê }8HTP> %\GE|j]&,>_Z:bS^"(4CلJx3dbҨp3-Yk84[Qݗ[[-'SYsq>U:|̺3SκPՙro<nK7/jjZvf3^vIS]G%=#[&[|V3(^zUOi8>&4J!K#L"$(g0fB^&uki Ɍt*)zN0kT)n0 +Z{)*M}CdAO5xϮڙ[ϬYork;|^l.?Yݳ|2 ft{VjɥYDG*qv"=>V0Nư-9e 6*|}P$M.0.p8wLJm$):Jk{/no|Rr2%_;ӹV/ywcy#4x[`TQ/dkOO5P[Ӛ`pOL;1xկ.ƣMIx5@sFE0BiFD;9SG /ge|@bK co@ZSBvI"@>6.HjFbHsS#%afs,, $D'[Mi ++LSBeo]'R-7f;\pFbEK cjX,#9X$'l) XHHiijRe,I_G4UF +8Z]]P{ሺbe)1u0lPs\vV|ў)ysa2]<nP,zn۸ol)[ڟ+uѥUU]: +:K.8%d4U2fj#xs9tvӉ ++U[uHO +$'UU{6l3>eun*.U| +X[Uz,JwFR|:$Aq@[1"V[~->uxގ=휸=)yԧ״uv*ݾZӍi*/@Ca)'ܮQ0hw/R O^|<pd15L?Da8y*:]!qZSyD)$zi&\2i)o2T[P%ށ\|(>J!yoskxGU!ZGxwAK:qBGɒ<iFvnРXZNsFj@$E8hc'C3"a4n0v@sw +>Z1#{lSVxu[RG +á*NgJ+ʬ6cH@nHSיOJBaBCA;2^>zOWڢeo1._z˺]0ч_wЯOq=b8?}aca$6ao>ܵ}08h6M.Q\!/~`77/.6ɒ`z參F%)ʜ[I*dL2LgF~@iVae={3rSTX*yP%¨+ǡay/}+=aX cj**y|PlHux+rX-{cؐ/`F!E9R'_5a;$!Zl2,y/̔/ڋkh`6e +Og[uy3VznzRE}RO[xPnx{x%NJ̶Juh?R"ez +iHVݻ +JGOYVg&M^Z0*?&`䗓/V,NW(laRHCf~MRjYn UFȴiM21㑲uxYB1%玞jYK"X6B-bR4bMLKqio8 +,AVI *P5?' +ϝRt:SfL\8M\ZFmm~C,p9W|@W);9aSJ +JcNHJH08i*EU_"E?'ww?h}M&SsQ1fś0$$M{/~ԕe܁ۿ.w~s]U0cS)R$t*ze(2?,^ϳpUr]FUHi8TW$5*{,Uxm"x{9ra_X=}ώƾ`z ƾۯ[o8|Ay(L3xvlWe/O >nRv+*||Dg[GA%TvhԱNP +Tcµ% E)u9GܰQ9NUw ote6jUQ"MN3)EgqD{"8RRܰzHW d9_mYmf[T_WٮbE¸ਤK_HKŘT2bڑxrcAZb$u GF+k%Dm}?jkM[6A~[V@`Ӭi.4Egi]ܳgc?.=uՁLZx0Ӓos5;ȒB7^ 'UDZe95'{{rƥJ٢lˎ8;CDtA\!yGnl̄E&- +F(zW&+s" +蠂h0DQVF6qATihnׯn} O$Rj{=έ=cOvp2ό>PkH/oL +%_9$5÷y[X1Ѭ?Ke3܍<iljڞlM XayFΞOYpv [zK7qBs{n| 0& H<BՆm:f3} +\ˢ{qh̜Gz:&tsn +<lfq?Sp+08YC!Ӿ>uUW"M;nm̄_k6F{zVSUv?59n+&lq"2P|_sF!"eQ6ޯ^ol/D&TORm½e8C">\0)x"(EVj#,]uEDƎ') +e']YCq@9L ÝJՊ̊.sa'/c +_{#٭&jvnr"nZGb"ً:.FSHSM*Rԉ|ʑީDRcΚ}Ҵm*]J-"HGY!Q:o˙6,W$:CfG;}ĻCpdx8G3RB%7[(woIiPPLY2=hrYO(E + +vGR[8/!~OriVgo=JFL9]-;5JڸeN][ 4^`eaMś+[IH<AВ0"/(J/kU\8B^0 ;d x\gy)VQj]eH~RG9_Q{h岤Uk$^˓8"@]Nrn<7-:]- aXIJ%GvS}]>k<-[ژXc,j"L7$4mk{"dK0>Oh +kr +ԹԖxDm,<ԏw&Ĉ,t +Ie%툚R1K4bdBmcἤG#Ws}ZXn6ӑfX2۵'ΨN0S4P|p>4Z<Os8in*ZU݆; +6+؛h!e>u <L#A[V16d`O6!9s#k 7W2RrMڤQJIГ&&JTE A!Pis4il clY}}͞3;ǛvעR[! 4ȏ7} +ؓbMT|gh@ZJ7sACQQ +*֞C>MRWl)[WtGso"ث[tK>OJQ:9s2"n6;2gK7D땱T¡j@2UU#xCf7/G{ʺ_7oPxå{,NۦܜҊO+[{LNKpǍK%xNfC+*$k2#^$%DUnK-+sl$!@ +^%#ZϽ#ʆ)krD%%Fjv9_yN^sӮDCN]MBD>z(7p괢u%AS-:+^hʼuB,J!,Cm?m2ilW<&[Oa9MC_۾7TͶ(:ۜkMz൱\! +r7dc z֘]"QBC=Fa09.e-5E +{FXWH&2[Zo +na/*i +,\ƉhUUPlo'2<8_!t28("F.InA4YF<<>Cx7G(ΚrATN`ĵ+/Ns~ݍ> [`b-x:M:6^Ia{ބ.B!iE-ܙLjnRNBO(>u:vu*g-6E@dw<י"`a Ƌ;>;/4m6X<ݞT{*79wGv3f[n{.6u䲚u_N7QRv);*aDWRx*ؑd+%5w. +4I&ΈPBDq0pGEaL4ޔ&!YFOhiEU2NJJARf5$Q^%싴R%_M%qp)\ +>*hnq[}JdTj5[[f~d-dBf'8ނvO1sOൂe;@hǻK8nr:Ta{滥sIvbHR\de)zة"/yLf<yhLд}`ؾ6C/3Mii Hl%Ħҁ!d\1.+,pbi\z<E~w~Kbj7/0Ƞ&"nD0DC<M;);>ϗ}ܿ/LV.~Mh`7d( }Jd~P[ٻF;Y)_NC2{#k)x$A,w_8w#U +'z_/My=SҽC^< +2:&ef@v! 5JK:K; + +8 +-1DgNif"ɭOl+\ -cB:WNz$8zPiy@6\eg#CiPlH3A>6\ T;=xJc2k@c`gUq{JŒʄP5,ACj zC#gx=V[N6Apm7ys03Y=H/497=z⧳A8Fc3Bݫډl@[dNO9_ث䯧+Ԥ'Z=L}1*xoproT%H@E,Bxl|9d9#Kr<n;N$V^f};yf!a`nʾ8s(\E/b!ِ|mb)ix=/q xOFx;<7ވ~z)E#[5&HCnlXkG7NdM)%@ANfx3)xMO)xoxhѧ&vO-Wz^eGQ4&+M!Z˛]m6x;րױ96*~=]-{&2QiKەȑ"[B]BVY ,&m%kɽ@o<6f`%ƫ1.(9 ^Osf1d]b[)ˊ/ZQ;;o]11\ћ^76.b]1mFF4{ñ0.1)ll-x#ERx$si/0vGFZ)Q~߯*puf8wiRS-ݑ#7g, +|<P<# +{晳;wB$!nwkS~1,8x=(77,DBGhL५oQfX붸BQa ^=w/;JXFhͽ#4vxub 4hM.tt^CyiF{Wݳq5Zr8Y(j[T` +_`Z% 0h +y xxo>/ +bzntmvbMu& .YVϢ̖ٚJRU"P^ч9ҤW-$lq@RR2vۍDrbL3u]ȼ$ВDBAiv\ fx83E]vo8DyqI&4qbmF5XN)X_ymp2u;]xB2QxSO-Vw%_$?pv˂)-֭vvY_N۴".7mESvb0@(-S=t&Jap`$eua[.E}s74CZ1ӥ7Y1_lV#;?9xk֯hc +bZ:%Oޡ}SsZr5Z۟?vXe@USLAqĤ5J@G; +gC_6 eA^7gCFN22yn<p&9hg2t9k{͵4Ԓj6;Kb+ƖMcly-'$@ +/Vdˋ##.wS;]iRv2]oWR!-MJ̖ݭ7^a{ڀH좠҇'0x03oRQ=UWEc4S[Iǁ1k[B^LG6![ |_8 kX?t]M?j:X!]\÷zO0х$pIiU3糥xnȤj?Vo黌\,T~Vx}<7β||"|#"Y(ߎ2}>f.x;ƫFkd*#?y}xs5+x#90^\kgKm*j0Oh,(noE}, +Ǯp:냰揄L|`1Ъ5G +BPߵAt':WmMSҁ{qJi<UA%*V;F& O/U$^n,%9vo.xgR~<σWX/״]yCߙFC<odƋ[7C#^c!_I>lu{ྲྀ-4cgx1xAw6#wU!xrv;J@J!on_=t3<:NߵC`|xH +xf0^5<xx껴~wqM pAZ,v$*J|Pޮ ^ +;siJQ.M0F1(VI՚2wg"Ҥxos-ZWD@h @:MJ7+)\MA?+cꫂq'rN] +/Ew<[nq9.4"-ېXm`ܔ->U1Eiwyu(($W]g~.Ũ?Tzl+ +b_*/SEw%-aEE!j3Y[QdqjQ +GBû!.nxXA1 + +*bAD_A{ٽx;{ݽ۽?3Yva{uh[p8`-XF|&FXڶ[Sg, <>zpp09bFiP +g/IG(}Kk[(h{xrIN+g +k_ Ԁ+bo=n +h~UaxdjQ1gNƷZHpsykɾ2f`O +Fi:$0q䪨[}jPE=r_c#s1\j +V{hzh@|%l +la+8yM@ǜgլJt2+IB8naxyP82̾_:#s5_U{ꭸ.&u|U`NHBTaAH*F!uHS=^/Zv`8U-b84\E +Z5ǃ`0,.-k^JGuv!ubP&Y.<x2aOp[9fwvZtoS3^Ei*q[T3 +-$Jz&K#DiK7Q1N6mÔKFtyx+Vm x9&7)?=xf߳/5bIǜw^2_1L[P/!$O>oߜsD˰wΙi</hA`s &nv܈֪y/O[vjDhy=Z3Yij2E٪-5(tROt Nx/U=݆yZ<eĝ(r!P+ϣBA<ZVz<*u[A +[*hJ<ilRpDL>.Mei+ޖMl><SOk+" +^)u<xϑ<%0aeaV|Z[3ܹ#gWTF3KG~#ȞHg([.yv}2s,.zLoo:Oo{ǟI+ziGm!wiMH4.f˯tN8o)';M%wgo7́-ʹFf̵x +%ݏڻע2"f=nb]nG^AL(edcٻ̛gcczTh<% +ܚ?<te;AW +$f`͘˛[Rwz0Jb>%1\uп2#y-&/b$fQ0܄O +X.kSe-K=;l!hDe+rx)q>4 %gc q5pgC +y^*kFnd}8o +@v++F"WU֥%2ܰ!:o9_Xdoe +1u>HSg1yEd8+=uۙ6- xVD>~9 GN +0HL'A(03E jѠP+zY}e}xġusqYwK(# +F>I}IbU(f&joԁ@ +MM 'o|_ +$o?[`@5@dcx_G'TDzi7jz#8ܟ}%oתTs/nI3"͜0z;+xuٹ<)! +AoC-yыNQ-%l[Rߪ*O(,`f +]Oͼ}J|0u;i*}bBW78 1k>88&xQi.MLDE ; +*[֗MKK|zd@-+Y2@<n5g56ncxB*j~qU;&4]-2dy=?~jֿZSC[1AHmmshUɧ&x?$F0[w+w.9rR$w4<$&uwLFe$<A&[y0(rKYjHbh۔c;*}z!L۳h+}}xE{C$}b>损K-[QF:DLh`#,y'lqtY~MiT8]l +S}-mY|vrV~QT +s+0<t/'p +&' 8cc{=760nȤ'E-~?˭i-ٺ˝n-ڣ KBp~8M;L\ҬI$bKnBAN&SX&.:vx/Kۼ?U{=owpT<3Y9^ Ф7,]0ٶW2Dt=lJ-Z5o7K +CgQKJj_vW+f M'ՙ @B"As[\I!z^azpj5:4f"_ +KiIfHU}4.gF4ܥ(8f<Ib(3imw汔b3D掑d1]$S^H4Yi.bSc)]D~=-)hijޠk + +|^RBVvDdDIBt_}]^{y~ܻ{Ifjg.a|r52&I*eۣPt$̜Lx[Y% +[aZa0xba*t'* +[օ>SiJ0/J--Q6EJuerYv(BI4RtUtHaQڦhQBUbPoz82PpPXG{qb\?|S+m!AGPGS-\1xDx(7D<28]iX^ n37H4]O(QVM^5+tBܖ'4͗.>EKU.yX'5o#yL@@uIwzZ\" +c8謁4Al+S(LQ6f]ЬaA#OsxA2 -taA>ߙx<zp~P,I*꣨ +zS +S;L$"U9<e!`0.PcHz(pMBJ3%L1wZLQeL>?R1FьDTH;r3x,;n?oN ^ݽy<~}])aVc^Mm;vrMޛ&mQ9 +`@i%FZ[S{8{!'05U%gg2s9f[ζ]s:0:.Ոu ֕bG+ʝWBhCЧmQx+1S +8*zL?QdTW熽Us='9~GBdPy||,/H}? +nڕ̃IbݸJ +8" +ZA +^lʝ5{uiNʇ$<+[>,2+iNKytO{lN +m8q[Rv~e3$fуłW|uc*+<=%n{_ݲ˦͘va!VZA_*D5J=ݭ/x+I<}1TDH/{6.Ʉ SR=T<axztnϓ_/wqIo?cĽjg-d$B!FK~6)~tm D{vܹ/&&I礥q\nTT;;vO6u[wϜ7WeRF"Mv9^^K%f,Td##]+5)ܧ[|Kefλh,^bmEZ:#nNKNrvs8jCw]kgmHJIoZ".9~e냖ȘsfRw$ 6f=f_ZÀ/gʅ$4y@n +-I3qS'Pk>I/͙:y־FlMḅ:0~ADMJYԺ;vXSZiePĵS7`YjUFaz*"ȚeӰ$Ayk9gsN3g=Hn>O8r)HRF+ySw8bt.n<:6y +<J\??xz"wX(rᓪꍩ&9y-,dPGh#y,6wcSCeaݧiJ +ϟtv"s. O T[ eU`G^y6cyp&l1ua;B8>RwC@XH[Ӆߏ IB笋pv_2mmL}8(v9UZk(}c8Pclޙg`ą΄6[fL3x{KE*C'[,ݸ3i_WY$6 +`4=sVR֯8zNY}wt0I\}[K${Dv[U%RόY]F>y߱O}\n9=gHpL^<1@@@aW楷uwȄ||û4Zy+_$_70<#ag"PDNy0po矇@7i8wi}]? B}} l G Ӕх=$O>jN7qk1NoJZHځ98.;2毫5jzJ]F +QPZB +PijL8m<梔#dunډs<;&uK7^vBB^n +Ce{w`poTrJ2RjF[Q8ƞ +7f]w9f;i).0XyN(p^:k}K 8lϺ~׀&=ڿՃxaךs ^3|LOJrJwVFN\qO;+oks<uiJwo-zEb$P9Bo+M +?8*z`Nx]xaPd`x$]6@Oʭ@] x`7ל1N"$6n&Mü`߲6*`ݫ\5{gȁlnѮAuQ<42p#2*'j(o٪ p6 +ƋxI +IN(. +ժX:Vnbj)v*k]WEw ^(Hт]V +ovwu), ^8 +psvTBW#}I ACV-џ掦<MRY˛@ cY9Ct5CQr8xSyc}&f:z)37g6p +Oԥq@کLn}A1h(-&(ml +2xl:Ս_oh5p˝^Xhh{8|Ĭcr ٝ@Ca|p::T"W +3wsF?.挴+)VlЉnS̀Wg>ީNGK2a'lPYitz8o1_s[s͉_'J>쀐(綄YX5 QUCYKŻSz$bZk0Xq4nxu&ro<WhA'$q~mq{5 }!Eb;%)8 ,K$M֤vbM")^$K͒($JDR;$%/A`훠>1{~;I]$MV~MvY SYs>{;,Wr)~B0m_كLJ}R_(fLz +BSojzfwZ*3O"\T˵xXB{/_L!7 +S{tpWy{Kl})D$coƋ,JS)5s^G]Z{SBtXz%mm#ߑKn]ڧ(C"Ŀm(uih%<05q}&Ov(%i7BI3?1Q>hM8>`o{wW^(G?®:k~n?s3_5Nߋ>N@-k0xH4C<ӵ4ٍwefգp³d܁)ܚ9fes Oڳi&#&Z7}I#] +nDx%`>xԋJ;M +w f}_p뤔W73L`FBֽ2kߐ|hCDczZk;H~j#{8R]/{<̂0G<`VuD*{vrw֘A2TbPZNB4;eE3AHn &QiX*l'Kl,44/@K2 +0 +=>/%.X*SXk76ʺ 'pU!&8{W";@ +3uA%NBhyay#CQk#UF%6Q#{O#34FB2]Rt0q9il0ѓU`}&Lm*( X +#n̲aL{ +*L:ߖDJ@xyʚ7ST`v/x8o9UXNCI sd#w +En~CrߔD_U[ao(c%Od?e?w<~+zLp;gH{= |M'ֺOp aH$F+sHj-yRX=^hoM\F3AZUYCN]ƳUђgJhBR^/h;cn1FtVPn?R$:3W$KBΩ/J<, RVV+b%;ïόxb+OgnadAdk?a\oJ/I +KpSK-{>*ji_ +u^z p ҁ;*c?peR>>eW|°'CV;V{q +9{T-7 |zEkB^'v^WN5BJ6_״b7^:e9SgJmck\?kqp&+$i(+eJʮ?RL*U5SQKd4KD,:0*HL,6HaPefUfY[r}uCW=}w{9Õc-ÉTxnPrԗ-qhkM1hw\mBu4|e9_\ili<esӁ dW-7Qm$U[WG,cMݽ)U#$G/&^Hs/!s;x1[.hd|4*جFyrZ[6^k3gi˥M.jT2T)V5<Pݪ"DhrT$r\K oWmTR_TZ*PA+trjX)4`LFDHuvB6"CDLBW+Jퟔ@684Bj::zB%Q"hŧI&p喁+G=S̥FZlgj}|gꚙgw`"Zx2kBTAt+2<%5LAsfatRCסo$U`rESs5wbKjZ/i*CURUB14RZ.ʴЛ$,3*%RpMȉ͑P~ E[+`&"*z\)QHj:2 +毓G*caZFmPe"jUH\uUwFO^j(h;Z?qazRБz[n8'>k$ۇk~qG{=.['I;%ͧ^A|Zt2ƶ{v}Zͷ1_iꘘWm?dq/U1[vUgz2(jI3PڕQcsajftzc6gf W/8/{V +a4J2S[iC{e_'TxqWUpILcOZuOmߋ¦,_DWi> +8I:sI'rZ]fɪɬ=l|UݑV?Xf6Z39j}%gMj[o{u NbMO8(h u;PAm) SVv{ҥK߰|Dzeˮ]BR4:,Ǥ8^xizp'3)5QoffoT~ki +r*ES<%CPAKRSL,,,\~vIrG˘&AXҔhЁ',kǔB#Ӹݛo_b+igiKQ~&/2D-&n _LNN)Xt5X>8&oH3ΠFyv|^\Hxy;˒n7Ųrr(pc14$y?,K|`0p.>5V&&#'90B-g,x@fE)J{bp~Ac=Cx![} +yͱ^>/Bq34ji. +@%O4R2/f\^qhq8`YO"åKθ7rRsƈtmS]l9|-b +Wh\.EfbXZh.%s[NKKVwqlfD]ܾr8Y+#/[Xu6O&f,ri;8p`C,߸ؘ<7c`~+&'0tňOG۶mkSEs +&b{sz`||¨63}_a,6N8Ƹ+y&I>I3XnƊ$Icbb.h`9!=/G +#M ZQ"B-^u +mŊǏ\>ܹsc,ޏz-[ߏjk;;cƌl6accKb:ޖ.]gWx]9#8m*B峯oJ۷NaY[h[]~*_dz >,kvo*_)',Xӡvtt@w8sNƘC۷o9ϝ;tѣG]hg:i:eNq͛vr;v8tXݛN]y;rTaF`s"]xwիP/\!T١C~١[ڨ_و QhuCo;Ū>:tnÑü<4;7뿾Ɗ3x*-uo#1cU"4yYx:օňWi<"{s`z*Brá1Zg<ҽv?Do|VqON$W. +oAHEE/E+h!.PhgH +1t՜g _jM(DAq + +E-Dupn֙ +~xC?WHX͙fKnEy +VT7EkAQAa^OUBAtaՈp4?H2Z8KvQ2V7*89*DUTRƗPʬg,<"I$%^ub<:+'P1!whFjOSQrRd +} +緵`%|\*idK&LHS+lX.>w؏snwuOoY;ׯY:oymp8MǪXraׯ|֯}yL;x +/_<]NuRYE[+AܣшLlIulݚvtZ\m*q#@Xmww{9f;-s`^v~n][RISI?7f&n9{ ~P9cGH]z)6\plϖw/1}w$MZBqB A3lkf}~Ī&hy#z@]bR\ӧ&B>>6@$A݆Ij` ֩rӃ~ueVGl=jI$^x +V}RbQC|bީSSg\"e.F]xTC'~JjdoK\SSm<{vu38MօiG'' aE,7joԉ *Z81ohMY'_s2,2BOR,l!3%@pjIiw:*Tʻ#"05%yy.E+H:2b>{]4niYIN#mʢA^h<}YOAF`dkc}UeH2Θ2!nFULщO>sxH=Twd]}%T%/o80DF<J8khuɯ/(!2e@% +$~p|XD"Ƥ㋹{FN[b1jIfM_+r0e>(r%lchUL^`m4Fx){<6vIupi۷Gxla`!<b¼UNh7$H.zݹ]@ UqpȘabё +y-T0>-1]2۹)38sA+CǔZ M.VgKV[<5dbEvNJNѫ bb|Lƃg,OhCBN?|_5ɒFb(dA$` +KT{@&T͆b*ͼ{v|Pm類]jf$df@xU譌[ L+Ϯia5pI|BGvķ^u;ʰvSɾ=֭^:p7&oZg&FƹR@GDd/i6=oOيi #rcd KnRXD,&K^ٗq=9)Wgy>;n +?0IpXNWS־̴7TX뗥ƗZN):ٻO7"j- +c%s(#"(X"LJ%8HE`?(2p<=3QM9cjKRBP; *0TL&* \`QjLu(0-tk%;E4gLH;-;4sCI`p!;R#$ې5[z;7nXܦU_p)7kߡ#'D]Ǧ!Cx<e[Qxg +j_5'iµjMU_O<(+'qTƲ2dPc4Ƹ`bF(nJ̄ҩYI{Ø#4n7D@-FD^^w{$B[?ޢ}{w~_I7 2CgdYGvR4ZᴠJKm?<\iTdgخƯkߑa3(Y Kf/X-h6$ +2곘 ۿ7aY>F9pᲠF0OgaѳX*83k9"7/m<냙0%8ǽvo'CRŚ7/_8bDMRuN-[ ܟkVZJ#a:W +ឮ(\cO\a0(}:w-/:?2圄`q;x-6-LbReO.V%H[sgϚ5s.Acbߞ@xMftԏG,`B#Hڊ^9r)fڅOt2I$W:y#9sF1&q5bԡ&^ +аb4c|r#63Qtǭxbze[8 +uuV/~Oed7}w5 +E@L)z6oц$ȶ^P| /|5 +QIuo\ꈱ + +,E7,n1Xy:ڴK凜KvƉ~~#RqgĈ>)''+QrϦxtk_Fq97<Lk_xYɥo1gM4d8UܠtC:$p"*.<j-~qA_,Ix3cMKȹf3oW?pBJ~J-Mz'TAU؛CC,Io.r|Iy D0 +] "tᔕ%NMˬ%U60,V?T/63oņDHrxN *0ͅbKYjmT%S0F\b=:0hV.Á;SƝ`|ԅ峂 +oӱyb7b}ՅSTZmǦc\Ht +ЕxҭD:K`nj8Zvr<Yvi3#2P3A09-J^}u~ջ{ˢd*dKsF%y70)bc[)p'սv+7p1O|;#d|>~)>q^Ҏj]<8v):nOa[ +/x͘O,+Muwwn2a_&}/B!闺aZ?yw +^m*EA +H>wh)d,S*ˎ57*-ʸ6lvr5:+[b±[sWE1$P1-n'}Ul[c6nQts(U8:OU#.hRݑ;nU"fJ~RVjRRc= u^l'Yҹ`2F1FӦoS:?#Ql{~$,ċ$ A#H @AK7 . $dC`$@LOwߪs:vOW?f<}sUN}z?@ +ovoeaϳ%ςq @ +dDp;37/eT'm(d^ы7#pd I +q>͔XVb!f8+ =Qj)^G,ag^RE8'LCZHw!1³<ty;]&-(JQ)rH Yڨb~$ :x=d'v,!&܋۱(H{ +\jsuW&#IczʆTj|"5@_l-\M0l&C_{%)0X,P9e0K4@ +F_!ͼ\en@F~HA\*ȥ6gzb'@ # +8vxBpXXixAD$mQ +pI%I$NH +a0 Zʄ: +-o(p4mPq#v8~ReV\ M!BQVf#ļzAs^WaS1Szy ,@r01ػ/M[f.7b<tm ︇26%V8M%h3L<rxӷK%̃iCT/)@䑒D}Q ,Ja|QqJhduX &!rqyR9J6h*{F߁Ռc0 fՑ]ΚZM?s+ cbXRNŅy\u"atT^|x5Jy\Ǫ!bhl/v;*B^<Dp>-3cz#PuY2r7to7YalH%R<VkٱBTVߣS%0Bҽ +}J"zE,\)gL'کM'a)[ao3Ğ3NJGH*50]',=#ŋ$^Y@iAEB\&JTa&5u(Ҹ)i42&EoC.mnv( rIRx8w./GcH Yt\6,'Xvt]-XoG/5)jlaU1ℓԳe*{XSYkr~1EiRe ÎW|3cTݴv+JGWRR۱2!UMV;vfڴ$I2{"2v0ޣ4[Iv}$&YDȰohmʴL +"%t{6Ԇ_6#OaXdg˂#u~~ppX')Bu}|e A7Y3,S666Ξ={̙dw3Ih]6gؐP.-ܻw⼶[qh2UNlIW4Z>=+N2PhNDBaPq!Wlݵ_^ZOH)>oP]Jw˵=u +B(&ŭN1H͐ŧAѣe}XHFB!.E&-r#Mض_jQ P +B]O>yQ*/kuG;w2h䈨&ns=Deg9^ӟ^ӟr*ZĦcg4 j6t4 UѪU"j!jmPM`*hF1HLt&JhbH@Yqsw.hcg2Xػ{};_}}OӰDUqojjjyyyԷV!bT@a<ɛruyjDtQq}%KtE%?+I13ЮBNwNq5qG>J 65_ؿga5A`iLO3[tD|w*[@')_,X;d]{a; kXH!!etnP,NGbkGbSb/o[6uW&BpQAW}˺Âu}Y\w떢ϝE+_+n^ӖMNl\<Ԕ{ +mxATކoqo>Q4FMnՔ}k P&lС,p,,Hܩ P[Wׯ^(2b*4, *EJ+`aNŏTP^$&{+Tq*/ܼlg +{G>/G>6!Q),t_@md[dblZ>xB~ؾū^huya +{{Yc}TmP샃!WQ}C3D2_#_':*@*XB-Q8˓c +^+V.psZ0e]=S2Tt:HJSdͻ/G{0OUWRƊVX&9{s6FN2"ۣO +37>}[hx0/,LIx^B-QtA0N4"o> Uh77ph-,>bL_0k!hmCTtEBCYfX`SkZguIجJ--SYYx˷(H}')1x +?N`k*ǥ^/]YPp=Vp[5uf#f8NpO$ۈ\fx&䅋^߂gM ڰ0E/`1w(xͼtVjڃ4f +Sxqkv~mZjHr6pp'|Μ0pB: r"3tF>?q* ];3>kNPa&3P.>`[Y6>C$z+,!,:ң||/+W֔-SҨ5 >.ryi靻re9nK|n?M*K!ym~͓FQ7&p_dy_N7gΜ4Dvww|aiьg +_>![֯7PI#&ifăF[yi YItV5E..Kc*UYlrY4KvYK9Sf\Xh}wGdfdn߱Xޑ"yNOQ^^C %\JÙo<᭹InPn!E +8UT_w>㡯"]?c~g8sa{`*FͰAEbJl6>EƳ-}7#+]x\zOR>ydw@AM7C%h(p_$$<{{8-l=pI1ֱ>(K,WW<{c響~~~S20R8ViLlު%Jw+QJvnW=bx~jN%vA ˜TgO%I5T\ܼu* oՈ6fEDDաТc+Ks99ʛ44 yҤqBGhTg[DcޜEHxkmx`kq\8ݙU*p_t0İd?^9Q8,<?9|x?`=ga%7h=-K3y/|Z +5WumBXB^&#z{HqYmŇ}le<-wTwbC*Q*~eYLIIAb [ހߵt!h<;4f+ٿe]||T>'Bx,Wd:VSզA>0YصkvqO\iS LR%?p$g/o )XR*P|$18xڨ#"DE%x2`NdesX˰7ˍN_W.7!:i! +ssʚ: F4=i+o?TPfZxH+%@M4{^Z@0IPⶆsoW} ;MsT(Zॆ&3o~أYO&obz]\T=kTVƟ28/?{aIX5):4\"3$Ri{VFUUyGT;H8AC'bȄ(!(a %0HDZST8fcajdwW9{ЎP6}s +AaSnwlRȁ@eRV䓓Wݞ +'kςﳕ_(iEBX/$8P0{-d*='++wvw{")1. +>7?}AQ@*Tӥӿw)&cE"T^r0-ΟoxxUB*QvF{P$Yi(eF.ȶhoWi+kdȌ믻$ʠ@IJD?ƛ`w7n߸B +N<&n|?fX% +a(t+^x5A)It(r +yEa{CpH5Wc?Q:Maqкl&+H]IR8eqČ{"+s)HV"*X +Խ +DSLC@wd]AUo-=vhĂ}zs.[K!~aI8 ,r0нͰ.ٚoeF*Pc#G9uAcU~-geWsVZ35^a(.߳'iTR)(bqpRHDD>G<!*UoyfY SY7|7|7߮A +endstream +endobj +154 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T13:51:07+05:30" + xmp:MetadataDate="2016-03-19T13:51:07+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:B4AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:B4AF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:B4AF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:B4AF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:51:07+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +225 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +226 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +239 0 obj +<</A 240 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +240 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +219 0 obj +[241 0 R] +endobj +220 0 obj +<</Filter/FlateDecode/Length 2210>>stream +HWko6_pX-W;ٝ6mc`>$#Ӷ:t<{Dř,EX{=AJ$*H%~&zgwS]~B;~YofY{w5Hsm\$$qi>Q6ق+vOiB[o7/S?f$N|_q +4:zu@PB +rv}1!$Z45J< v/(&n U/FvmM]ߝO +쫄dh+qz:ET3XH<ZT*G粝4:E%kpYN +C-s3d$#ݢc(c}MrM4h&ЍɫH 0Zb`ځ=kpx͟X#]UC#uڻJ*qlU[:ߍ +jOC1fkyo|0cuEMثc +mR}odE4nk+|;9!5}raΠq4LZ)ꄴvII~H=DI(pVn2RUW$b,A`iGU=C1iSF8֝=0^g.* +[feZ9.{^h8b W$fvY7!ARO/p3r7h|pдa sgRIE7/8DgrˀxۿM+nK=?!#LJ>#vWs3N^4ԙ#^CTyHM( +6NP7snJܡ3_g$ר>L?x|&!ǵ閨L{g?Q^F>4"35+a'07aiQFʭg"lrzؑ>SjGaFpc? +endstream +endobj +66 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/DecodeParms<</BitsPerComponent 8/Colors 3/Columns 788>>/Filter/FlateDecode/Height 549/Intent/RelativeColorimetric/Length 128295/Metadata 153 0 R/Name/X/Subtype/Image/Type/XObject/Width 788>>stream +HkSyt\/pada>paV̓b+Kźbb*d^Ʋ(u+V⢨k/J6֤7ͥ_˹3i$i4x;yG +#L:`0H +V?~LYj +=<Vh'/ %#|P5z=A;E$m +- rp8l6{v!eXXA6_槍wvv;v uuuT*_3OGX," /-]h'ȍt Q);vȆ"шnO?m]fbj'iy^gVF*({{{gffzhtppp``3glܸ>K4ŋTtpZl2;ÇGGGWцv)6vRǚ>R(Y-[zo'ڠ9x`[[u8Çi2*++:TUUkߗ]vΝ[+W=zUWWS5uuuN8A+ȑ#h'(NI$H#h'NZW6vȄP B8{U~*\W)%Z|HxvVOszNl cݺu8 ݻW&ްaCmm|՛7oR8aɓ4߿_Tz^BNPh!P;GNXnˉDE;dJt\Kªv? +Łoty*j֭7oNG8sa&Qo9]]]ϟ,++ lԩSO<aݍlnh'(bNVU>v<?66p8]ZD;d(b[iJI~3OE_IICi/OOOSܺuӧr3/_FhvڶmgݻGDG(کMډcŊ~X,&D;AFm4=4vKٳgVS(:WwoϲZ}wܱZ6Ǐw:hiitҫW6mD>H۷| b;wƍ4XSSv"D۴AۑHl6B! +PPe2hk떭چ@8,dvZnwﮮAJEeeegϞ&۷}>ߵk˛wP{{41iŋiidVYRI6vpgٌF#uA@R$pM&>_("MкEp8(cz^J#Vk8nD":N"MӺtLghT( vx||d2 2h' T9Q܆ 8>7 [}i#]s_ȂcF?1Ү2bLLLh'̤)M'K5N*x yGuvJVY~@@'] HG;An&''.@fB|h)Ȳ>饔I-XbK?hbbBG;An(|Tjb%!. +|*;'GO]|&@tNC" +*>AkazzZb1`4}>q@6v4@D"E;AL& /X;@8Shth' +clB +ֲ(Ai4L9d2!fGyM:fsQ&y<ߙy|y<w +J +Gyo4E]vĉ9~W*SSS;|KΟ?/#?~lƿ#˾Fva0䢊D"ZaMŒC}Ƚd}{c̕iJwOk4sssH4 +' %kȝ<vc68o;7???}wM +fzuY%2L24My" +$䊲{v +B$-x biyy9LB; + +XL4h' +ٳ~.t"^Ki + +)&!!M +1 +9Eti$U*+[Xavݑ603w}.WNH=sv2pla>N'izeCN*fs! +r,iwvBr +BryC; +)?$~GN +~ɘl:y 04%<DQd@;e[|$%͉8){]t~͛7?GݺuKbwޑ?zۅy`VKNe0T*駊ISeRJ+yVm3Gxrw?|4ݹsG>%}ݫWo|qyv̪^h){Rnh?vʤIMi[hp_[7bqr 0<yrݏ>O>YYYrӧOwTׯ__.]goVZ%dI-t){<+J~ +؉DaJXPJ-+04SocԿjDgΜILL쑟obb[MMߖ-[o^N + +ڸqC|||SSӂ''q=~Xߙ+BV ,Bɓ'RNMR1Mu1K +Oq"v"L!Z)JKK000%Tb0DGGũI;w]Ξ=;jԨŋO>=)))<<\CCcǎ { v233o'.$ +]^^NDegϞE$vq`|;_s34e]HβC%,#apX,KJ/$X͛fL5|ʰ,~kKcccjj*j=zm6'77w ZZZeee˗/@ +b:Kkjjꉝ|;l0H;q-Y MS[j]]Z.\2)9}(Ȳ|iii%ISSSkkkqq10` +BDؽ5EEEޞ\&Lsoƌ8j*5aaaXlbii9|9sLCCIK.pGN +I8\_N/^Pԋ31lwpO2AGG}z-f/M)SKf(o0#o> +>&{Deeeɓ'oݺf +:|ptt5111˖-Cw +[gg砠 N2uԼH˗VVV=:p +obP-$vRH>V<Nl/\Z\\ۓ""" +/^%^4 +<}4 `ɒ%W\AT?,]>~]??.h(>>>''gرNZr3LLL6mڤ^-G"%&&XOֈ~c(pc+@KMMoIQC.,KsAA̰RP\Ꮃ)EXV}|wt)4`e;x G(YRbVf)J P/;!zՁGR4c!vRP`PؿXnyfoooar^^^6o߾9sopm,Ro߾E1j233544JKK`6JBFF\tU777ݻw_~}֭2ss#F>ӱ*AbVVVdB4%%퉝~666*&X0 +b'E< +Ha(BDإi -CJ +|G64'->LOK/:~`PTM?/að +UuEͰHvR)N +~Ĵ$ŭ@̀Pɓ˗/;;;C...mmmb8<<" GWWѣG:::!!! +B2$DD*RKFZԏ ~DJ}EU<g^}dּ,:s;}s>;(ᆆLz m}}M$IqYJ2ԤhQ膨G)ꦠJ*ˀcnvjĕqF3E<JEnnJ8DypDJ%9jF_[{O{f̘8NڰaUSSj*eƍ.\$ e(+n)--Eh gwH`{Ǐ䔕M4 <[nSUU,Z +ղl8W@PA0rC6w=zhVvhiÇv8c=X>|ŶH$' +zIl;d1& += +:uǏ322F s666;vl̘1<Ɂ=fϞq_?gp0` +}u0)Lӭ._G;wXb~χ[JKKa+WܺukΜ9%%%K,n9o<.]Niii6m7nڵkׯl@JIIIRRR4eʔtn5<cӀ۷/_9 +e8(cHʕ+!Xm';GvBOxkkkbGl;}(D".av4<3RR5MUtUbp%ν{|ee۷Ͽww[UTB3` 2Rj +<ܼzꮮ#GZ'Nxԩ|bȐ! SNNΚ5kpx}dFYTTd0ӧ1TB>g~ٲe60'N +~sI<P'!^1u(G3C5@.gngfw/y^%D'áp-)YaQ.&)hTd ?m{oذaΝ,6k-//y~%%%|rAAAJJʢEΟ?ʌ,@27nvgee;w.>}zVyfϞ}H*++w T[[Mv?Fu<ǞDM2>zߟavɘ.1&bQ>5GvaߦFax8(p84 +OǠU~X2RP'g~+BdCBAyJ8j"GkdϺH=kT)NŤ#<0ygQzuLY7| "fK,r<vXe,gΜ֭[϶Nvz$(:iƶwi.+Ҷ;ۏj)3<W-YUQ5[swhQI_}'Lq +I</qQl5Hϟ~]J9R*ʲ$IQ߲e{k<Q8^8^9zEd?8|u5O3,H5I~O0,**7oiJKKGm۶Y,.ݛ:uŕwe[[[AUUՄ g+;Ym';;xrZZZb^JmP3`Ķ[w4v}ʿ7>jv1ji߷WcI'( (pأ:@ʡQyNǞ/!nBeMs̙M_gfd +BP1F"8q_mӻ177 +a`ϻd +S- %%Q3@ t]z<πBQcVAt^8J#@áPsuę|wVk^qEoja:ΜjZp! +w8v$* +BjL yMHH>{M:Df<yv'ygFl*խo3 +&Yw9sNTA ,C$~L,GxR:tԩSO +f ܹIOOXlQXD4 +ǰvPDӿųVH燯_{ῷS +R(=#PxChګXhS>jW~Q.%12p¥T +(mRU2Pzxr~kO>{wo8ø5jEd'"<`'"G7|ftZv߾}˗/?yfTSvPNFA`r655z!i6+*e2G7"os` +OAEYsy~>A<|8HfiLb%>F4Lbfu/7٧ɾ7tВ£` +h4,lkkRSS͛WVV{fEf͚r⦦&`ҥE O|Jlp`z8?lve;LAʈ*ItH8 +jmmݳg,$QcĀؖSRRΝ~PҥKPYttf{e;vy)Fz` lY^ C%I oA#@EǃLH <>kw~3fx^(BS^F:a"V0 4e[=-]M14ÇӦGGn8qZRWWP`ܼݽFcVPjрzgsYY6\ۅk>ϹUpL$<U_U ;T`ۍr___С丸8x&--x" -|ʕ]-k4@ŋ5x"""d[j>ˁe˖%ȯg9sfk֬_lXX,bMhCH)!i8 +GHCz{{JJJ\.<((3g\bnGss36Oqd0g><:SSSp8 +Tjܱ miih4ھ}p\tŊ^>vla +k\e:vKNp [SrqHEN9_n=&plt&.A/W҆*eغ+_kʥa¼E;ds-W6X22/0vwuJx"ךkjZb-V*ѣs澾 +T/]T"Quiۧ<l6#),w($j +rFFD8 +$%26}ܤն%%7mT6uBRa<\{Y/O?,/W^,l>uIt)Wڵk!!!7nܨx{lW^ݹsgGGIK.U(x1Q]]䓒z `4Q|ɣGu!ecx<P8?0<_i5c''| +~;Q~;pd^&v +8zoɜ鳲tf<CL ] weJQca|v-7ge~-Aas +c';aNJ$ÇΜ5PDʂ|Uu/]~T`s$--cbb<X,f+**u֬YSi4H,((`;33 }bb]pv-b.m߾`N۶mZo'OOҊNXuG`'zDMÉ"ʭ&1Ev+/gB'fa2-L$L[P4N7otժx}g8ֿnmÍ{~FFagW.hvlNL4ůdI<^,=ٔ"0vwt&$4qIjƫƣGN2VJC\vRr|D|q.u Mk###rRinnnttw ;v4++СCǃp;vU8zjdp#YvvVp)v5މ6kUsA>$YoniyѽA>IpL3{&p mǞ?.EStIN6Šn2O2_$[k_Zx4kQs8aamN#8+nb\X3*J/gWR:fn +<VۚITeZ'$#3g32TwUQe'RT Bf3t:ĉpD!P(P 7""I p|u#&,_@B;::S(`Ϭ䷓?;D保|.<(9(NbpN9]eEBtqpӛp +;8NSiHj4h3`0'ͳؙL+i\}n7i5udtF +;tYfrԜΰ'٨0VdNMx +ՁjI&z>9cWj>j6 +fvjˇ8 +>.2>U]vH;T^;)|N?qFF5!V;={HRW\\e˖q̝l>vZ0#++ +lp\^^kT*~Euq +:qfthhNƉPX]46vLtIb1hCcw ,e}@jrY{9YN6<`b.xun8F;Kv("@$2DSxiC!$-}ᕇPH:7%8NJ00H~&I8PjpZK/ugbkDgjT;ulDڵwsrj픝V^[VfII7n[t'l=;GU;텝jmj'_uЖ-WJO7WV=r +vOь#NHUUʕ+ (jkkxjjjP=͛%CkںtҺ:iff&9T`Lu;v]`tGb)NdX",I|ىӀD!&8T1E_*8 +n}W_lf[+[j(Q(/qsII^+V}ynMR;T +4vҢILJ<g64 +"o> Zt5;E{IScpLr4)!*Xfcu*,6NjǻN?'AcNqVm8d +$Rèu>3'q q8UM +2cWc4yLNۇw7*Qq768un<7JLBl\S8^8}d>tFϞlVZ;i|t^);ҹw2_6o3vYmJNkmj'Z -b'xo-"vrZN>oںj&G3Zۜk[Ԕxivj Feŕ7#v2O_"T;!jJӧ].PEEšCP@۷\ҡ.^; ʩSRSSQjkk7nX__`Pps̙;vhUߨ)Sn'N(H,'.}}}QXZ"ih1]C؉iG6_JGӼhE<fd:n66v{Efa,\.OMWzҜI"9N&zi* +i5NNk`!l6V_Ļ.!;qrrR㭽E;8'6HN̎1ynTƭx<C}ssHbOə_G#+ad!V~8?}֕幑G9 +A;VkT}rvG''i#bNnZ˸}EnpPQ;=iJw8&'5E]YFSY٤RyXW,\d82nA`AX~=: +]y2r,W8/Gc&$ +usܢ;711_;w?&( +Ań% +P?a;ޭ+y&;FxUnfb_OH0wi22 +Lǿ2j8<%{<|"pItXADY.섮<;_TkRcr>6p.Ąf{|K3p>vTeNuŗuJbN}bcMMԡ1ѶTb2CtCM><2v`p"0oibţ7jO0tkž䔙4X%'ccgaKjەJZ[o1aW@`9eϽ{"MM|mW;՝U33Xoǎo2զ}~?whlFx`߾}ȧ@R섔%'\7sss#""9m۶!-C){Eέ/++Py)d8!;ŲEvD^[BvZClFaq p"Pappv;tgt ?0=V۸O$pKb@4h<P'`': Gb,ɠ0|$mP^qA9g~p),}73>@$7 +H(A&wX_ؿeXr*Q"U6;>}V&oINvlccQQ̋ft7C%vR +h##m)Ivς OY}FCu<swRb<Й;7~4|"A;Zdrnyc˸4M7{x@&뒧[xC*e^w]RܱG99,UMQ}Z^QkzW7?o;aCB Ne)fރ8܀cN38qqv[ZgZVqZ8Vj*bD.RVP\]Y,.D# !HB#B @}{o_[v˝s9\~>~e\xPvnٲaHcʕ`ۃ/rZbp8*++g";77+h|s8>;tL6z-_>;D(Cx)mqIMgtagDot>2R|Ss1jokA3 +<ChXk_sa(AhީX6j#8^Љg$)~"4?O17XC +?7مf>;b!v;6L|vz;8˱ P88v}/m"$gO-s<"8IZiwx},*pv|0d0s +xoYP&Si|nV&IBNWzSDҔc>w{i@=Zձc҃C*գN}SvN*gQOO""J3B_,[진m۶\ٙ?]â2ȡAst_ +VDF+ +Q$4?+RRDEhR97;+0=<LVa0|"y`gH +君)˦ʪ +]~3iqsEEMς@8"5"}dCjdց!}!{z+22nXy.&?gEDUV75~wdZ0PX0yiBdoo_Zj)EBXoޭA ggwv;v zf֮u2713Ս9گccjO~n:K˪|} =AD"5;KjvRZ.6?W*Rߙ=\ +Rx<opRRvr +ٌR1+s$B +a=y$BMMHgQTU>HIHp3Aahb c4,@)a$b4İ\745y봴~mr~[(4q#+;/(xҒ}>{czO60ĩAsaJ鷲#:04$`I +45N8:|kɒ}8{lKdDğLL?dnuܻ'3')(78gwbccBCI>ynb` ʚmMMێkch'.WH̎k*[qrjNmxzح3p +5O:ikiqعVUDE%03s00~^W^Cט}|ح?Ĕxt +YmsrH0Eu`ph(#/KNi +2NMMF!A*"`d4$b&,[Ԕ%qG?~in>45:/?YwQ!$GV,|*&7%Ok`LM|ak]ujkB=E/122}r"X\^ϸx3==Lfڵ̮ݺS䳡o߉dUFb^=s~.}:@g|}"@ʘh0(NL(-.*ۻgf^嚕 +FU (rȡ3a`FPDY@QexD-DbEȑQn=FSO6ɺ[WS^UV)<މNK`I__weK_~yQm'vRǬAMu'^FT,* eUJfGG,,-CCB}I<l+B_uGohpF1gfh4%90J (-3(Ԥ,i'괷Sr@yIY'LdJJ\SԯMRIҦDB 䰀g,S["NGQWG.ar!qg>+W8t +|ꔡNla6>P4+{bۼnJ98Dj%EE?>zm%eqAA?S^AOj@ +vii=Mr?#d.=,n32->kf4sW/}"1̄LIv]f[s|]YiΖ-K-,\Wߪ(o,~brh~B" 4vRI&''7s1;;:ʗ +Pe +r*z8IrВ<1|%^(ի)zu<UCOO.1%Y_Oo征6VVN[ZTr8WIJ3 #fc::&@# X +#cAzҹf"d'ethrU_d2d3U +g&ZJ\e +/pob0ռ`Y[{#o55a FwZ,03_owPJ462raNa_V60A8IqQtZ0DNsGұsD@Fp&)!hFpVS4'=DD0fP$)>SR]ACt[k014E9s.[ ~k7cc+S?$*>^YmD`xt:v?&&>tv.KI254||}w>|a4GS-QJ7ҔUyBccmmX)t^y?KNH=mkkC{)'&A"QuddufmsMpD##;:ٳGgd +PyqqIF_߸QMKA@ttoWԿ>UWT_[}MicӷOFOh469ij;Q:f`}|n>9~DaI DȀp˔$HN6N>M1D +73+?VҐbOtt,ONj}]Ohij1o8Y +s.;ff'@S;xvw3j;KSv|tvۉ)vc)!!ANY;}-<k`V$}<@ +A;7~$xgą~0LJSbo@ϫǛLebIqaxquwߙn05ަqG֛֜ӻ|ĸκi*@Zygddd&Ntp[@@ +Z)eW16F 4XD͗JpLdxH0G_CIOT*<T<^TS]?<"$,/['źF^v%rS#i4z$Ehp0͆MiiZQS*,d:o9bi0LVU1WRzES-Ad+,D6 +᳣ogr@eeٳlk#Oa̙ڔDi<䛻l1r8 Bo":ۋRRGefrxv*1п_YYHo}?_]b?+'JNr9:~M?~\?鄇G&+./ww﬩aQ7]\N6kj9>/۷!$dh:Dx.)4i ;%O)iNe2*)q_z=<ξ~o`8zNX3 P + +Vֶ69bbRR%uԝRR;Nϗ`HBQQ +,B DbD!jED +\S J\! +j3յD yN*k}3nv%oz"H<srZAAHQ1-.Q_rt|HW8{ආ;Y$cn`$TdhYHF$#ː!R`@ !=w<k " +;sU&96(Z{jck +fYI-[y/_FG[Xv45@pr322nB=h6,kkk`*ccc +=}}}p +*6tZwjWKsAfGJ.^?}ͯqLE!WpNζW燆jL٘OUטmh,Ӎ44|5th'9%08 +s%T3`܉`h[[|edofOO^JjT%$88H$'%ym_>ycUɞ'xwst}MJRQvzzY..0(8<ZSBFVY/C9͛+qnի=n+Jpv&**ަPPd +e>++c;;vcCK}|,5r{Fƹ#G.z,yPIK@q`wVBuA]`(9m$"H¡**B xxq( & +`yCC99} + +hGǹ/_~elISSn +G^p;H.8u"}'y/~5Uu#Qx7ߢ<o[݇"no[kg>1!&_/^3S3!75!ܾRmGwvP3y")H---f${wm$=sUVVΙbBu3(TK]mr*%u=dULyk59*A5Xjj˴mUT3<mFv'GnLzI=~m + + +k::;<55s+)eplB;{MMWx&o7m.pu8kWۖ-f̰Ԣ+_>u/*H2T6ݞrrklNcaQu(twv + +sCjLL.v@J$YoII h: +PQa"E^a:gڴO5Qճ +tt>SVTR{-/o _:eBAPI(QQᕺ*]Q>dgSoԾiYVUT~p!}_b?99!ASGNڷO_K돖***H?wvvjr-?kإ͛;Fb-]x@~+%JcnWSo܄8r[>Դkťc[[6zyR>_ibR8N]tI[jh671(}9B~}cLcOZZ.Ԧf=[PS$>h^Sӏ~~/Alv[@ +?ـyUaL@Y0####""ްh6G2Cy` TPPvFq;333 +8IP%3%+^+d:Iio6v26zb۶7;lo3u\:ؠ[Uw!ܑ#EjjD~ЅstryɠCX+;hO +3獍]?I"uuw+dىL%3kb jpp__Ns0"UUUsTb'킝gQ&PA]$ +߲lV*J}}{Ȅ窣dǣg|tg_}f};I|_r<qy".N)rRɔ3Jp;3+5((j~R +l#~L9>¯iڶlڲz5iÆtt̗h۬XĺK4=ff[j9D%C5%ss%R)pgT"+)ZD^[b-4椷KA2vwf_EqF(TnR .hxpʽw_r̹s5<Bg-l6*:*r`T*U'&$ZX[[kCi¬"㵗(H`r͝Hppa3,N[1;PTva˺r֯/{e/Hc:vz㬣P'p;mNgVNJğA$NE,cR Lc^3kͶ--TXoOz8ShI6ybd?1}w(9`{,47Ⱥ,HHho譮꽐iQ8~hg'+3KzNg$ +tDj)(Mc +**<<*SR74<)sD)ݻozw;! Q*`;lll j;j_V2lշ(&G2Xӓc'+XleK{]<>dWrH]K%*i)uwquu"2.$W.>Q)TW9"APrx)08aRs8gj٩alLೀՌ3U~9`iq +}%KկN'ZZ:v{T'#c+5;VVmL16^(T^Y9%@mmQ]H3Ex9=}g줥YsrB,9qwI~~*;]L78;Kgf`]v 1RښWWWDaB +uv"N3ՉI`'KKS]f-[Tv:<'nDa^NVV1;QUvջ1;]zNq;w +.wf]$&650;-uEmMcRx_@v22h1n'6h?ٯ4 +$-lbUJG[* U5A#dA6H27 +nw%r7aaGeJH9uzיksH + +BU`ij +6Cwt:q:m{ˍ8ktu5o㭀Q:kkoiR]A<~ƢJ2NwbNH= +~o7YUPTuq ML!YX[`fn>D(ʪMh:iR#TlhSNNl-E vNVd=NƩI;XZaaJOc{)N;JK;uwJRkǞ= >~a +nnj2:|,9ӦMF;凄KJ1a|Ӳe8;rv*vFv*rE̢П띖uSiEdl' .%pv|;<YKv::V!;H;I3vsvcqrS#w Z]dVNy)5&s66STgkktRRDJ줐HC_f沧O5#;Y2tS~X懓0ww xzz^v<Gh'NWPP +c-z^V~bKӜZL<_,)!9A( +t@(:X#ɾ&44*eUcMM줟uO;mNfVV+,-Uhg1k6K7miھ;Rd +>c KTE}n ÚdM,2MA +/_nai_P?Qhkc#8n"Kh$kЛB?ݻF +#"jjߎ15Sr@TڬTh;S~~X "R?}s4`{C{;sܹ$Jecc#v>ȽO>̙3.M#O8`i*`8,1蠖QEEU-b$$ȇZRC'N뱜p_Ѯ^j5CRF`ZOScLslllBrrgքÇ +?~S X<bHe#NN+G +zBko%3B(̊ؾR&bjmy;DVKM +٤TjotQmvaOn +,/;SEzg74`']Sii)Yo'N 2|'`ҫ +I{Ly+rsٓ'}=##+ +q??hZuJKY*=&;A_(:Xx;vbN$233` +Z=89%zA#)Š3N4r|tک7zDU^VF(3p**TwM}}V/yq"a͞}[11!733~owff'"^xiS6mX@R8;tE; Z??NOv;EJd`dD +v1vv99l~~8+<RU%b'>Ҵi<(=V'bhLNؾ)..N,wg&CRR<kNw'_limmB`) 202 %tK@ /:"埫8q~ۉI/\@Ӊ؉5<6迏}y>p?UN`a(?y ++'M:0wHĒ"Q;'M +«ts ++,,Y/Sk.F%:B*j);evN/xUwFNjl\ޞ545ݞӨծ8x℥~Sߍӷ +BoG-|eCKLtL"e'-@yZr\[r)%DMȴ 9;e [nL\N&:'[MScMIZE@js~*+Rv"03䛅0N5s1NW6g8 C'>X;N);;d2/r-&?]"?W8 +tat +с :&; +"jK#zszڇ3n'[TW{zaz#G_{|߾7_8K" |AHDxJ'sYBlwx"vTIq8I/)b"n +IW$M6i;e[M%0`Vgg"V\bhl8 +<R]mryÇ{_Ԯz3ANH< +A"qNLAb\TWWډӘTRRRPP + +qczÙ{<IW+MMn,Fomt]Ҏ9sr/5AUo(L,rcGgͺKq8|^h(T4ipPd"nTpN2XN:] [T5I!Ni3+@ޕ+X;L&2"frƆ̆8NK)~~'˩a2Wy؉B<$$ <;577wttAډ鄝 +/ϒHE詩k=Я]!s55@-BAELzE퉍IJZNq +N82FS+oENhPvʊ\ՒX!%YxN]02v&$؉Fi) &NceډtN9LwG];6},<NTMMM)iN]A<@<CFP("q,NGYPYG**C8Rq8w#η)\8Y6Q,vFv}j__FE˗twCQA"ɓH$>(&Keꤟ'{{=g +I)Y;vdvrI;SvښlݰtVͩ +SN7N n*"%5tf۶ +>^Z\L>d'&,YqvbDl'GSèikkkoodFXKk$?~dڞ$`"ӈ2\z]9c'c'܌8#1|석ڵ`W/?mwŁS3\!8w8ysb٭(3 +鑬ʥ +E'C/dR&Dڗ/^#țC&77Z>¢l4JSSmIn(?s}x̵ο_ЖXĻ]/6}gN~ZZnGiin 5?VYҋaɉ ))v7#`'ruDm'b''''MEiGw(NPo`H8"ihhO1XFXGJmG/-VZvkVΒOJؿ4'_¯J'v"ڂ>z{7TtKZJJ:̬&>a_s +9in6Kŵyc(fm=Xias+imNC+oBt};%<iuN1C驎D^vRv5b씦Ӯ"(vre2tPcj;Ri9NM;Q;ȈS?i'{TvjNñ05Si'Qt(:o箖Yw'>zTR^n3gR2u9oFNbxƍ`hB#yC%r=WBaoo-pH;$+Q +ֲSmDNm;v ;]ղSHCm-*;!\N`'N:I pR즶 NvNgӷ֓vj;%S[9Ne6J-;%$&]&G~yԪk:`#vp~'IjjcL}NE|w품 +;z*))SjjfFFuiȐv]>r;5vf`fNԩ3TǏ?; W:8(R`@ ?lO SbHT?saA^6.$S"29_>F#iooaE>uyyQ`:'7!q|7i`ie0Z==ͫ:>ww6VV3zLf,[Xg;ÞktlVJ`@P=`SGsL,L;;[N(a,wv"a'cS6`'gչc'WNC;=)N}|UiLfav:w;mMM=8{6NH;5](x|eOx8a@S +O vB;vn72v37Mj=g|CCSqj~@5u +jlp>\ PA$zZZQ;e,&<<q81i%Eee3=p$)1 +)(,vruqT;.vp8%`t]کv +gM|Ą)}Nԭ[NRdNC͕P'n n`+9訝|==yg5BPO $ra\d!4ƘXy3LCt'qvZj{bfb| +/NRqm<;=W8dl',`*X֙ +|ϱ1/H&t)LЯg:LxR3!jC$f/7ۋD/}38: JuND;At_hFAgI##Gnn*Qj5C|~OWg{>VÐP3?n!pF}CA|=E&H$g!fϖqFoHzVJNaA@@`'W`ϧ)ډ\Dbڵ:;?tw߀Ý}\1-IxaA:5W MM-w/dk@C ^R\ +P;(U*$҂2S:٩K䣳S}K{f;p+&&HMق}}v[[֭K#I$crFFA`SWO`' +ΏBJ$v2>ڿrh,ܢ$SZN0MM` INqqq%%0= ?:hO{uvjDD I,bEMVfߏ];U +/7XWj +.STW'> + 8{RNuTS^^I`'\mcv}N^Ο?@o'!s0~ +}Ā'9Npt1gLcGU@B= )|:>5nFO: tRwUU5jj57AZ-G4B;I +=Q%GZZ*/.[^mnb)ݪ\*읝/74:7Xs, Jl[\$mߵ+MO"]16&MKMsa77H{£ +AxXsrYY66|>:8ٱna -4lN*6x<#Q7_[N~DtPE6*Ľb6;;_&U'jv^bB?.HwwZ[OAwV:K59Zt`ɜʒb5L~|`L$RղY__yg(+olLJrut,>T]mm59ytzĦME9RK+tZ[:NAgy<U)2!)'*lΩհ:x<X_0l +fjve}`vj`H:p~U_v +|zWW;X!^L^>iS3U<~;+(+kNLh+fmщ荍д<B_jUӽQQZrkT?|FQUUTk-[橥9Eߧva1[&'WK746 `|wInt?CʫWhg_\t)ݣΝ>Wh4+lch 7WIfƨ]OY,^W{d6n[k\|WzA#'$8/0˽{[;l?~_A~ؕ+`'ggg,}Tv~_x<linxƇ9=ݝޣe11 JJe%na^7uu_s;gdCA!Źa۶g!CBNә,T_7&7roX֕_V |pd֩Դr}?>WS#yx̗u fyyuȮlM).2o:؇[Z0*j˽7VYYp)-ILlo?hbPUXYzr7 ϛ[Z?na| ȸ)O\\тy%%WBCO9l ] ja2GTTJ*Ѷ6===755qd2>>{:<@@ +]&55.CP-n.'l]v /^-`Ċ\|N#t["X$0`33E){q[[16b%KJJcJGG6e!,6---srr0BbA +ϟaݕ7NZ9(a<o}KhMlinalYz6G:0cLaեiSI[hJJW[:6_tYϻ_t> ߸hCCkCv]>%Hpuu[]][W`?ɟ8 +GGΰh232xI ٞȋH47寉I]QחY۴9:\D1ܜs2At### +m)VYLEPUAF6'#SSSqqqI6)---\\\T__<"]ԩS +Bt.c'F'1>ޞ@ށ[.A`D,lDEܠlwxMe&((gTuu5(}Ek٠;4ڸ +5/D m +oeyҖ,Q;I1IcvJ;MH$OyeNJC""Όt3'D"JK(IdaN$Kɜ4|bD2b T&>rɒ5<BCD y5cW +GΝsc-aރ + + +}w, >:Sg<s9s=~kتyYW7geFӡ!ka|4;-!7tC]\lQbZO!|}NfH$L58<!Kdj\/"+J$WY,K$&S?<2`0}="c2'a`5!bb̋j_Bl l{DrA,DI +Tݭwllf}=CA||?&".3!d5[*U:JIvuyNO0Vx8^/v5ɧ7SÎIjgg/77=؊JݬVo[|!Wxo%Eh!oiq~zZU{''솚eK3hlt\9NrRzdDQ(IjRًrYL\0RI{$))|'RMDKաP;)#JHx._~N*)O!ȉXOOOz?^Μ9s%Ȁ233!5Nݕ +E...!kGII `SvJF_*koo,W + +6m aXr;؉ʟ d`@DtXN`靫TDu#fM|[NMx<xF +N$@i(l +#TɍEqDe]pB +|AP@1NĦf91d$CPX[[ +8sya3cB_!]}NPe284fUI5!0~&jRo"TY"tZ~+4ab`'ح4n=}}{q0\t&I;!)bV$Jtw1b1"ao>h;9\ -Yb^аJ5kZY$&-v,23"aj?]\tFA[B|=#oڠ@/.DS8(([nimn6yltjjKh=>˽60b,_~?%40H?uj>3+<".l7sP`Pu씕5NͥM9vJtpN{vBQT}Qv +)1Q%,*||֟YZx +M77#"0v)6[mdzg});MNVtuIO#TnV7ZU +lo;55ʂ ;~ݼvBr>mSV+g* 65Pdi'IډO/Uyکdn;Q-v\;Q qj3te'zNNډ,;Q 3;]N!m'e{;Aϵױ,;q@G 4E FoK ZV(.m&V;G<M"X(è)O_eI4E{PS +Bv['2r ;.I;%EI32;`"/W]v\$%eC&M3m*rwu8aޘNܾ=2lgCry\̦ +h_Z<W؛eh;_yCii;uXZG435xg ";J$=Srv^^ӭ蠟>[∈bWޒC7| Ȱͥ̌̊*j~AAʠ^jx,m.d93 .466&J_h' jϴ89vγDrob'L;Y>;QYp/Paڛx8cGg`:Yz/N<NA +VgE)K;vÆCCN;=3PVhZjj@jw.]ZY 98F;.퉪DTv|oW\*Avj*4GCd[ZvhM~~7M<ӿd0XN9Vz>JEy4=[?O]`@,mt-{+[ +Wة)xVon˪H;4(E&&yb'b'&̌pnGWww;ctYBe'%e!N°Dw${<wO4e'J66+hI $Knng7mRRv4??씖 +v +ra8Wbc +`5yl`'fFр߯;rӉ*i%)x#IzI;JzNC4D{T--ة%XD..}EED"շ2*EJ)33dϷ%NRovpi7xY©eBPd2^Md=7^ـ|a7?bg8E0@@Ԏ#A#y"GPLKgm5:¨!]sl?pȀ4+59.>!G7o%N4Rg(EƦIAE);`xqwa,Ϟ]^H|g5i'V3:R +I{3oc[vJH +挑,95h2QNxV5mv}n}4 W0^#;A7.tZl\ZGN]yu,5mZn$HO &#BT[_@rx㵮ꄂ{dd+Hvj8ٴ;97N`';uN;<=eevRk>Ovb0uu1N6`^ϮS-؉;6ۉvJuttd03mVMkF(;99ĬȳAq4z> {gC"Ԍv.O ;)v*<e'j3v72YdX$e$؉M)$*v`oxOU+s8IImm!ANWW'%&Ik߾-*<; +LSr$,ji*~NJ;~'OAVQ"|}o'7wN_2}Ghi=!:@,}}ʻ2,lڲ455elJI054ムL6#;$TEssr n3A+Wkkɳ2^ǣk4٫>GCc|V)1:ZF-,[,`Җ,NM~*UJ)99%#ӡ)N»w4>ny;58 +63oSBBNZZZdii !) $v=z`_`,ovR7olÇۉ_p60Xǯg)'T孵\mjjzZxMl7rX/Mj.=<,ݻabE+^on-IGiS +or>I6!k/ٳӼqtJ$ nRQ%6i~٨a8$%ŗDB?'xlfY\^Tb8R3;;D*ܲ +ajJ;lruKn'wcz@@mYS97N䦥^9obL؉Fswr#;1Ra_t٩E̔28#씩JCBvHRNښY+S6~(c0";Oigc3I씟/ʾFyBu;hN9H.nB +]_VյÐln4ꎳX7tut\}֮Du[Oօ66>8˒sbb +EUA/###p*H_^48 Y; MT΅r|B`B9y6L&iE'fffEEE)zhDt:qShU tv;CAp\YYnccc" +NcFTcF +LoX{SV%,a:@Ok6n5;]ykѽxoc"_DP*}x]*wێ{1l{$j{J#-L*n3-,JH̨H鐌=&[??LȊ9!"":(LT줜\h'v;99xa;(H줅씃SyA*;rp5HڋNQl{d'-_/_T 1c&D\\!K_}(7%%%CCϝjj +<8808?4D=F)//VS( +3&$8Dbn͚g8/cmώҼBZgO"yX\c`нiӽώ]YMVO72j2x̓350Nբ]8ڌX +ZH1hP%/]jBrJjj* +xBBIF>|0 +]X[[=p +4NBaBPB0uX]hQ`SoFx7D>p7""hK@G);,l]_^^&F,@ ;;;@ +RR$bQ}]ŋ<x `<U/]vR-.. +lmqӡKCCSxKsp#<!Lgd_֯Gqwsdn|/ٽdc3 YXt%_bTs,ݽY!ڸ9:^H-߯[Wgj|/5rl`Pk[J,nL7?zmMX,_:="t`ocC婓3MITWmSYഴNOTě4=-vb2VFEn,`&}j2YaP,#32|Z9.-..FDD$%%|pGع5àA#..b8>>>%%z{{3\PoWSSC- +{ɼh4nK̭Cɞ!\-a\SX6e2\PP +m`'L$bpbjj]w=8^<zzz"LSݾ zyy577GGGST+f!]v!ӍHw˖-`HQٰaäFp8ZEEEJvxYƽw-FTG=~Ow_7\oRer_:V{$.ɍwUϕLqv=4$B$UC`&FSD2,|X,,˕JT +㊁;w-~Eʺ|ىDFv۷N29"V>`eݼ z=7kR)/ˏY,Xd2 +Vcȕ՛6u2{z2nd`0'B:RU;nmٕiӈqEZ:aNSr87? + +XW~lLϓBfܹC9k>W(Tm͚ Wic'Uc$Wӣ+U[i`%CCxͺDZ]]|e~ʵۿǝ'YXb5:y&qT_ + +x 4 +9Jd'R=2REp\5pǧݢ=xOT'bxGM$9mDv2~ӎ4k rA; >ɂ ez}eN7C%CNN``.?iةZ4jF+?N^RZ* +E5I9+5Һ<yx2v`lɀa@u{;rVXp +JpqBt.±ee:l߸mةTb88%RKD+VT%lvI}9R_=P(G:3vb.(,,bl'(`';_|!N`9wyͶwww(yZ5111!PNp6lJfd섏D"l'v/@̑[n +b'Bր$^sډ4MIϲm9#$5xqFa"%&Qw=Ʉcz"ϺQNlU9B9#QAF=R @w;Y#h)LhCZi>ф|EywUح<C]GGW-;Fy1Sn64줧픸di_e%f<%gNvMYsRUEv>l'Ԛ^N:`XdYVƪ둝"L"QFLggR v:v(Nr +)ӳQg>S^~$(:f;ףzi;AdINΗVjRSN!|ȳ5I30pe&X$JzݰXtlɹzC(;utl)4$v&V&7fm} ?n\1ݠ#W*UP +ct+;`;Fi'`' VvJKK;AeBcSvڰm9ty Z\SCCm'Bt씜ߵSpp0NՌRl;֮]oCC*Ʈ4<<,:w1G0v.t.oj;gO2dDL"ӋҌm1=5~}&+FF5qgC|Cq<($T6t~TL'Hw6w ++`| +E'ڿfx\=M(rAp'? + +HfwOLtXP&r,A|"fZ(^e=p:br;-_||h;QξNf;5۲l'J!N$SNٙ6쬥tb;)\gG;'mDv!;}RKQ/N9RgdziAPm^}93K,)N'JeSN~$c㶹T}>5eR#W(͛" Sl''`'pȄzg'; +bfw}oRT{TĨX=04$D?OR?;HIdM4]&ALO gH:Mt +N/Bv:vZܲlYR>6ۉ+HIi镊 ++;Wi'b^N:S$NY,;J\7e8;k ;,v픇?vZ$vfۉyZɄ$u<Z'MllPMDIC*6`!CGL ++DP&%)GSheH!<qB88 ={ιvBHp{w)o/.vr;s;\/))t'1}NS4 +;u2vii焝\ԲoT;Zq4{fS{Fl'K;N8~ vdk'8gvbbtt;ɢCyq;!mZ[[̙h؟xv)K_ħχwid Ifo +#f(]YD"HHPlxI"?!$)10#) e'Dv +mUE!&15܁~<aaX;-v&=ѣ5;MkNE;i3ؘNp;mu;ܙ; +hsa;j@KɈjOt`.5NU4;;[r;6NxRIɖY}eʇS +{[r;N>_Sii矟D,99na+S/(ѹdd;A>b@&L;E3aM`aD<rl:f3e`0n7j27C!'^pRQ iǎQvS%yy;U<4';RYUrpf۷۶q; +N +`FPr"&߽ _0bO)}4ôSOi]Sl6_S#|{mt5hiYYNLAvbIc'TBJXdbEW8YPPPUU5C+&`t~i$ +c )UʋfR5 #Jŏ`uA)'6hy27M ;v`'Ey'#V߲j]7/,t8`*/+TY)bvLLmiNC$.]%Ti'v:|={<>$mmm9p8d:pP>]MOU)l'"F_ԧKv;սQ(mEM>z=>W#ȴfzLdv^,D"NCv?P%N_;^:rz$fSMtE&jHJ}pBDvfLa;}/N?vz +-Xjiqӭ߯i{w}J5;v".J:;Jʴ,N֭S+F5#uDWČv-+&˄5/;h8pDB*W*E'n%lDkxNNWooRR.vNNi7~D vRKOi@w +#/CЈqWů~QzcǏ=rWJ;('iEIFT=))L;lb_ҁ>aN_-ةM*cAnuNW[gvvSN0DQ+N˥銊 +EQFn ~+bFa@;ai2!^SS3odeeO<yҤIĶWvlD %ݞ[;wy?߰i#bӦ6]/bABd1ٻO]kiT;|9u ;,vO=|&Tk?#v{7-* &gn',N%y턉Ĵ,>k'4 GJW-4#v£W,k]s8wzwS.\ѣ=~!FJRd!B}{X^ Bac_1Qw1!x5㮹JKQRMzQS`9]@x +V\ն@ӞR"+."[A`e_f~e늞/+3<}nN+9K +-Kfz$Kk>HT*v:~`sa~Lj)8"BN%W5*e1.AS;EZ=vzX핛ڐę-/5ܑ:q!.lNuuբm(6/9!I:NJ1v-ill4Ls)^;\NTHnz~;2܂',f͚;v !~JVaR%ĜX"d5!p}eΏcJ +u0ǫvzc[[\&{Ʋ|MMWRV$scMeb)ɗNb00&i߾}v;h'L&Gvp$~`BauHpjvDB*2O h88~ʓL=?F"#wBAħE]IoEAaJϰX6Y|[LbP`^IvNLr))-~ݗ'^</WeŕbΘa(li^o.;!į\LL۷ )Lj ~ +W*\w털P:,OZ# +(vj5ܮGhpPppHHȇ!!ȋGO:ERaw]N˖)~.a2%;کdNvTuRӃI^y))͉'9#!RZZi^ʳIS```uuLVg'C/)((v'BPG^yGRV똙R̯p);!MXc|d2777d q^1ůYXфHA +ʊF뎼M!tuu9v"N^G0(1}}}|$NZk +`ʕp/]!wvN!]NɰSye%;v&n1<S^ol{ɞN55 +SR&9qb5>{6BU +Vv}z SeiϞ=NxHF-H$갓y.e',f' +(7Wud +^֮]nݺXUd8nMua쟕ju}}-*Z}N7VХlцgFA5]]N +N#,Kӫ3{y1jNyz姜~~1!ab*UQ>'1Q'̄f't)//_vڶmf>K1|niiJ1RvBw0f6ljԔ,wwvrrƍ233Q}RSS;T Gmݺ;Q^ z bvb92q/J'j?e/q;q _mȘqj4d|v2Iv]rRsNv;Em9~q\Uur~^Çb"N>Q"i!`'$`9R000"o0PǒяO8Y\lժU6mBG9z+6o?]Ǐ#᧥L>lppU.oٲ v&:2b!@3'N$^?_}p743ga#J?i/BvӶ vRz11hNmKɺ8W_TZ_JfLJRD;N2NWUUw;w8?$dc'^V}6Sۉs;B}w.]dɒɯucI[djnnxu[%,(XݮOþ.|JEEgyR2 胴isɄxӑqm~)iuNN%*vOϻbzc|_E!6+t$)đqZ,;MSgg, +sFŸј^I:vb\IӌK(Yؾ[nrDE +;%$NN~ڊrd؎!R,8c?dDl""*J4h`>@`0P**5`4!i]pdq*={]רԄs=7nD%=rPYVTY)NP[[VJOoooc= Xtyƈb' d䌑C]0A㍒KFΉ F3ha=I(}0 B7aL4i߿ÇϺ#{ &iO K Po^z25;(oU@h(`a$Mߓ-AX-).~;bB 17dadȰp+;)TjO٬?X"BnAnl4RڠT$=|YNټu,ommX< Zh:Zut"c +Z/!49mc&"z"dЁÙKM1Wg3|~vjhh:uWyyDUѤϛ7z'&x۷5paͮGdǥC+sE]umthRy?L!#Q &='Dc<6|'>>ތc`֕_E8i4`'JLv:J)mxdri}'U)!:s}w7Q(AkMO[)1ZQN˃hoAOY8bP\QB$l1jAu19 ce$в]6eXk鉉:.##c7o|uR\\jmOAMb.Q53-GO(Ny/wg:ZgMS 1DC?+)ʕ+cf&]FNQ?.;ݎjec8;YiةgE ditRօlNHLuuAי<Cz#v];e×N:tTj؞ +s +n;^&ǧWbcWzs +EHDR +2hZoz谓;<xmhh*\0?"|V';p,;QiEMuZ֮K?<eūV ]bMQy-z)|V\mFtxQmxkuIN +.~RZ4ɿ(OZ4S;/,fMYq,;e:n\a`p{啱NCYP`dXhiԌސJ||9;Iڿ1v@MMMhh<u( +21N.6664vjnnFV5}&l8!:%8)J}jQ=DT$M|ʿ/])Ϸ6;m6qϞ]ICߡ}1%$*eU) +0BW`kP6m\xxxEEnv }Sհ 9[[[\.#x{{geeA{KQRR6Xv> +=hW+n|wWق +SوJpENF6GPӳ*Pv +}uO +>r^[vgӉt~V_؉2 2 +VYЋvXX섳Z`';QZBwkeuj%0k4}ٔqz7,kJB«(s7H*ѿb @( +H63$jFSSSdZd۷ogffVUU6[N\.GĵP(_[IiIVIQaഴ0vh%q$59V$U*T+;;e]_0 +g[gu4)5w|;d0t씼q9Nhv0Y6jzt̷9)qE}u5'WJ.rىK&~ȜjS&l Qw٘D^wR;674T9ii;3}}>`6GN%qUGcco7o/y"ǎՃJ.˳7hBŦM|{[<<$$9.{yTSnnnrʸ<(jP;m߾z0ClЊf'Z?<<윓39]F$OCű;+W&<if?`qwmmmt۷DW###q`|>|NfGGN1 ;9bspp5TN崞f'h&&& +5XYC&DsȂ`)q膆0:%$.sg_iv.yR+pU*yBT``xtv#苓HǓIb;.VyzRL;~xRS-10 ߄iK3xժU +9f zXfMaa!ĤM脖ĄP8*ߧ$=3IPSr_'37d`'BS !U0 (Լe:=;}AW֡`'åk!3҅2~g`P翈E]$E0Kut`_Xќ/N衧GK`pP,N%5VU[[Z:;.tJ:ۻTV:K96VV"a{sMc5R)78Q@@ɐ_1߭xXf7n\ FFfgg-Xj2,,%3=[̾ :p*4bq-9ZWW|ul˺:k={mVPGYY@ @H$%%uuuڪBaxx8.y;w+Z`{mii@,--A\P7#M7G AHHBӃ_}DD,**ܹs@fmmݬ+mǎ@8NߵkWqq1 +NqX"h%%%fH\x*<_?x`nn.Ʊz U x̬6t!Y/kd + bA~A~ChllĩvBJm +g' `GXh_jԉ!~c15x< Hcow~q~z_*~*jUZ<1"ԉ/SZ[E4y O('@)))FFFϟ744CGO~ʕxc"[^{2L,K#UQHZ7Z078*)Fq..+:)LFPCQuӮr;e0 +.dصkWpnPI2//;grvѢKxK>=vճӒJ˗J#rۧ{.].HxQ`k'dg\ȼx!GGE+e7灁[CCXwǏO8u9___WWWA^1 x3˗vr?$`,uiχ*}˪_ǝ4]?v6|[P H{zr##`WW6^+)}Ϟ=RϙL(zptt4ДoݺcAP.r8tT +ၗ`C~#p={PE0BCLJc 1OOOY +Gi۶m(gi_2gzg.a)>} +F~0/Y)W +qj#CŢpu +pWNiixMӮkiXnI$W4R9qkQsRN5>zysʕs!!v㫭V͘}_Y RYZ5sӦj5MM0АͅQ#EL5&uuuBB,VIAA=(1-kܹX,X +I\y7My!3c}\\:)g'<pEUn M&uf9bPB+W +@5/gPd`\R0, ;C &!eة|ӧ4x.aCh[NBb'F +;sGxgyq@@@}}nNpgQQQtt4.!CBh*\E +y\K,Aox!e;BСCx2F5k/z=F۞}-5NGO=<y⨻#uvwwMDDSCg{hNtjn}5TUQWU7Ɲ;B#ddX:'s8RtO[|2/_\РI1T@o倴iTrx֭;v\t 'ϟ?y䒒wm?H$"{dJT̼b-NEry">a+ovb9;ij2ӈYa.NǍg02Y]*0N/t>/NMMdX$'vҵGsvJN*ۛz_:aN U]=c/a?7'NAA],{1^tMy1]%ʚ+IQ!!)ʴEccìY_LYN"b'vvdc'`'j` v:qи0;L$m픙I씕% [/DN!섷4MMMB] =<w$cXGM`e ~8> KұvBMoR[;fn\Z YDD_bU݆ؖL/U{/[ZwGkʄX[5[!BJsrBB+W0ށy}={bcN ۦNb--|I)uZ +SE~,o2:uoHdgvʷS36Nk/-io'~;UxIl'ynZ/+[DIcqӺښiLbrʎoqil%SN5"QH|(;a;نTXXvZDNhod4QnGwd8>L8NP:`'LO1P;t]46',P==|h0,k2O:-M8[cf6iZTΜ9/BimRPGa/ +B%(G2/V(E[.{ٳg\I~ܹ#} +uI. + + +wttxw!IpšN 5N~/hO}HzVV;-ػ'?-͋;νܼyfN0BwrQvzj$#;nuR'ёψ/HMP)P +Kgx!rɸD zzz +E + +wX"1p?NrfkF^$bj_.vk6*.;NegOvva@|XQ5WߘtZNWG,^R-N-Nvr֔^NXƛ6mB_ةu]Sȩ$af627`MMM^.'Y;9s#T,.#P/+u` 볁8gGO%;鴪͛O9xQKvDgJ^`sve(*/][ףӚFZS`؛'?""Bb'twHvpA +8vVPRrj5L^7::9hd2Q7z#jCEu2R(˙&:;-pi +EOOzC-iqRQK\*pi'OSMtNpVOV8%U7< _Z +3u+VCffdڞ qӧ_~Qh#v~b9wy !XS6a~N?;T*YOQa{M'? )//K'%%;IHTVQӮ]N<YYY rRQ<x@y$;l6ך\cwfΜ]|9r7C2]zƍ`'T:t(""ks +{+#&'g'X|!`5;nM|g'ۋ/ +p,N},^]]=؉rƍ5kրj`jvvv-<8\uJf̘q!h&I|c.pETY{dOɍA V%P҅^,NNFŊ~씜\2^d47o8u℔SXXgٛ|||$vexMMZ?. +@@F_`BBٟǺ:\$.]oF"BQPPH3I?' 4)Bc|,1%?d-mb0؉eDD"AӺuQ1֗씔iN!aԲeߜ=!Dc'gyfӖJBfzکk +1ىcTl8F2UtxDze`0F٨t#xzzzxx`7r^`k>#'B5 %=L9|aDn҉vUg?zJDPBjL0v,貓A c EI/x80*/t7l<zJTxl7g'sojbAwޙmeVX>5idIv*V(&bTx{{M@5_p!`TĄO6V^`Q555CCz" +YdN48c__n;29f" +>e&;m҈ч@P܅G~UQy +;3,F"G_z]kZHqq,NϞ=ݛ= N aw͜9 +6qustϭ0<xf㌻ڵk>...+V&J88H/P7O~a3/߹]tfQqIq<#yJkj, +z6[:b,ԛ<ө˽NvSm[F#)c'MsB"YTԠT3+aL\bfi*l.I_ztE;~[YP0'{zzΚ5upwJ/8{˗{{{lmmAS]u%y<g:`:P69g/>""Śu=PaYq|?7JJot>c@0}DnT*";Q1Ϝa4A"8~RkllDN:::؞ˤ>E'܆/? 'F4˩rfV[]]}Eӹs$!䌾~~~qqqpL8Lߤ=2Ţv^`D{~JP@۶NMgg{GG;~;:kmqq=}6$NNd'=P=%:bẠ)3"ӺةS|7Qbd #; "9yv2pv_vJHHسgJ25zj/5axbҜQ(---a< ,Бńᑑ`FLBd2N}뛚hYh{Cea2YHV*ed5u2צ:v//4ck5!41IVi͚7i4MD,e[|RZ@* +E]ayAԍhE\`e=̽{gDܹs|;wؑho$F':JkvN<Jf>=;San +Dea'#;b`N$?%lO +tuuɛ#ZIIɆiwvv4`|xǪypõru~tQYPtgP8+! +vjSxzjM|y\㣌_͛ĜXҠùrss:/J5~6ed// A29u("_<;Lc&UWJnUTrsp,Y +9g9JM +7v0ի9rdDwv'F٩V`'!;ѨaMǬ^0c@^[aM566bS9hv5E_`Sx `DLR'WCCFL͛ͻIJJ냁1r: *N~@;7gvy7)=Q6VFtV?4IK`?yA&N"^&XyN;m>SvZHyyyNvv8|;I"IUSHH~IaNuWeMN^&N"v/{ة{֭Źk4sk3-/! ,) +EvBb9Qk6p%'ND{[kSSgD/,˴(1!±im2p9/B +)=x +y 3Ef*2h57섾I"e7?<,W_͞Y,7L4ORO~uҝ{[;9ҫ|t-(3?:H_X,(GOfOHqq1 ˗/yIҠYakFOBX[sSR+++<ݾO?)p.<*ZGayVG#@,Yc fzN&FCNo169ٹX[>900A3 +NqSc'- y70;^KO?w>K`Fv+[N~o_NF>cL&Z5}kUi즸,U0888ñh5rR*0}`7/R(?4:5؉*Jr>hP]$u09qOTCpDRy8-HӊPn"},prdঅR +2cW9LN_8#;-z+y;EN[)@}Bohvp׳S뵅2cav I)44tFvdcǎ gNƒ~yvWTSYV;::{ +ªEfhŀ`,\2:^r"Z1fuw{#;q?*{oWۧ\YF4Ք7%))۠^BQZZb +Lcc˦l`mRqFG֯_7Gєf>VYY+cyB ^ ғ,.$8);g(;}EkUhHoFv֯N2cbr%SR20ŻVVE";d+.ZKwN%FC~~;-,FvrüB%}?Üyv; ;{2/ةӋǁdLnDD >N :{\.N`kUTT2*x fш +jZڂ;* @MKFElhPpގ#qEQuTU-PEQTmWh;"h//wowsN~~~;28*666** +F4nt}}= 1 +"{^vN\s5xȘ~Bl߽{3ڎ +XCCv:Nϟ?b5:MlF%7$M;6n&g/k-35{B~Cd-k7 +ӥ7n)Qm+t7IЇ`'Wjll\` Sz{{PPC&WzHHO>SpUBQ~?>>B_%_ +EgYD*++Gۗ1}taù\7D%nk+T-D14{ܥip%M]VY\yqLVU^劻PBcڪG|祦EU*YbT>ɐVc(q8q\3gpA999|> +H +O'.@o`ӔnޱTLg^fi7;v*hRU(lZUJNzmG xgzYzs7;;%&&bb)FvǎEvzjo>ɣٳ/ϧd2a!N}Yra}K̲0f3yL뒔,]䜔kؾy\:u ~gle˖\r6yG2g0O4u>[VpDeee]C͛iTpTݎnSQ}PpK?1iZ%$.^unΠA>؋4R(vJ_iYje׳"EHSj{'S;9"ɓm}}jjj|}HP du*, +ʇOvnmM͋@EQ JpxY*8ǜuz71Sd25ʕ+(Ș4iȭ[U!e'\8'X +OZuJvZXL#) ;juIIIvr.;yp +b}Ƿ7S'gjlld$e'TYbmw8H,%Kހ-um +)06powE[ٸ.,,<x0|9""_U vh %/Nc5(-NNA*hMBcO;{:Oiu?b'Vw~h:;OIuP?S;uvyŢܗ余"KKKFJ(=n;lBx&N4)zs2b'5p03V{-iav];h4kR(jeJc_vZHى7evKLLdƓPb'RףDX,;^^duGaI$;577WWW.:ٸD«;ܿ7bl ?Gϥb'lIQqN~v`XX +;`5a:Y~Dl!sŀU"##=% +[_%SivJKKC00\Nϼ6#ISSS`ځVWW{ +y:hXp$ + +,OQ^/"+_f,;:ӎ,IJS5N3BBޕS1vvy*2:u0E8PގB?ގBwvvBNnlЋ"VZW0:R)#yZZZ+++3F AD&Ab8Ec!ӬTҞdpY~pЌUULHd~U|-4}SN)iyd| + + +nE +ˁ!oG!<8Mb'GtwwOA_EQ'O:Øf3NA.\p./N''Le#{}/=?k=Na|CyYŌώU9"ckҐwN +6lϲScc#)//c" +ةGA6dFfl}-IpBٱ>NHe»"' y'+^vR՝~i/^<{%K߿xxj:R\xJh+Y?wܕ+W'/}k_P(OrR)>4C>YP(5nnfƷ(; +NO2V$2gSaD)i<t%4.&%PxB +28 pqMA)Ν;~N|jŹMHHYbŞ={.^3e}>}:55uҥ˗/qzW6d)>=b>^uϯ6|Eae BE۰f\,{~0:<N3ryMNʣLN^$2JTA0IN7:_cl -V섙v ANXM&9T*lK&%&&C"!^viCZ{[՟+?~{˺85)-|!0oϝ;qx<}Y#Ǫ7u,;ICJ%`'%FOSsss[[۶myZU~ rYYvv,ɳCQ&2n}l6ZZSSs婌֙N/NOD4҅^k +^_W+]z˷= +tFQՄaMRfy_N,w w1aN(ޫ0zs֓iyLJ?eՑXXQRqwZe]{PH$z.h%ADUJDxhfQr C0u_73!LOӯ_ϸIׯ/X`֬Y`n0LNNr9Zh<jb++o+T( + + + +_{-[yaCAO8s,1?钽q~NߦFXWmYۭ%e)0#o91$tr";)++jC8Q;(& +#s7lI}zi0Gh#GxzztAzh91b̘1]o1cƞ={pm]M34n?ٻDIp#F6kFǸS:wzS&i砳qNSDDͣGmHJRS9N2CN/:o.bS>+*h4_`3YI@Syym^ +tl 7`'3gF+>Ulް@TɓȨR=,pXP/Qւcmd'bbTTΘQ2e)SZrRTe-N%CNr<>>NlJ %KmJa+ ϲ21\.i*))M*0@B1Mh_P@= +N?74t,ᩉ<{^@> + wرo߾<Vw0kٳg]v0B!++aPLh;]-)8UP@T, /ƀpz^P +1*>dvZNiIQ_Z._dg85 Z|y|Ol+0C= +Qٳ*NaU*U8b>O9D + +.`uȺ53?m{>\%C) I0###cgND!^PJNGٱRٴfv#;]UЁۺT³*G +ʢ(0P$pTDD)jŢ"a7}y'_}r{_6t9#`VΜ2[:?7V߬#~@1sѢ=q)"m$!zy>yduCUhdK-K\^݀N?/,!IxS;-FDP:0/9b'fF3uuRSc}}XCGhiY{{;%;]N> +6\W իW8q^1&31ZLJVUUmݺuvvv`pmooebbXS + +ظaM@}XаiXS]ʪӧ'<<¢ZVh`sk4KKKhɅnnno߆F!uFVeeeQQѣGԝFz>-++D4R + +,jjj +9M(Bd2K_Z_]Z]-PMLX}ԋ9?C0"i2.#C6:cSRIvF7Xsr͌8_ߓ, +lQa;wCBBBjj*@Sʹ?_{ fVzj4촷;D4EN7xD$2Fڷ@ +F2(lokmML~ +<"G;-3iba]Br Ť8* +n?~)WaäPJL∔ +vJ|ƱE~` +v8$;NacH8q(1C1"rinDON@C49 GSYW0zuyAax 0LOw{1fW類%;Ieᘝ%nf4XX0̲g˝k $MN7nى &HDDܳ(xMuuuE;Q^0JeWW8DqjiiuU=SMMIࠑr~*LgQ㾹}oHo?.4/IFBh1Ld1;wq777LrYطrdyf{ le#&vuDܗg.g_[ +C)CA8e}(rzu7|97"*h#n^HKFC]]d@JÆQZ"I Rd'Qx'Kv4RkغIČb0?0pCbHB+I)od`rgݻwRJ`")))66ѣgOFIjtxBݺMSJɗݬ!4Q..Ț +b;5>waP,Njo|pxCY*))ٰa&"5KZ;D7;::Ź,`v +\k +pV){M&!t8W씝v~Nr9S'A:9 d,;D:No{g֭\~?BBB,`0<yfK05:::Ո@522<4;M֣A%jj\$wY^,Ьʇ|Yg{s|#KTk *l+VؿÇ+++7nogunnn2,(K۷B\FH6WÐ4$|z냭Tcf^};4c)0ICu;INyq>5(LC![p)LN999N0r9tQU__d@D-;(JTD< +pv:>P, +rsϧavR+V~|;2*g +m@%jdd8T2?@b/N嘝ɩP,U).lLJ.*ө);;;++KpD͞`N4;Q3"0wC/eG c'` dȢY<(vfbYLM|}}ܺu+솬zbvBgL*0Xv$SD"sQDO.*lH:}ddNe'>TQQQ^^.,KfU*QZ$R*.~1Nuuu6n/pgMRw&;ׯz$ѣ/^c}tgϞ=7oϞ=Zv:-1E1!OSH;h78;y-]iN^N}d]$B8b@= +ԝL}04죏(6/𣰹9<<|dd˅ۿeޔd0%K@ESSLB!{!k\ODqh4<xQZZ:gL[O>uwwJd2%ɥK `{G7le玎 *U[Zkf~tiXvʓˑNIJ'B$UƲAKM; +R?ۇ\.{ޞ˩]r+z0;TIvVq8'^RHs,˶m-Qvu?o& +nDV2T +@)ܶm[HHýe2zxF0CGl-{Եoم=[hwZp'4\Q$/x63E&)?vkrrHҗp"n~-r5MMMLG2@QT"tvvZBc;! 4D~kdddnnX,eKBB=IeeWyyΌ0(zcu_EʕMٯX= N;ō\nsٱQ;U30%$4̇ 5jR&3,xov, +,47W|u1ShW֝x`v84;Xf4d=rJe]]8ć6Qtuu-]tŊO<Ǐcܝ@RSSg̘w ӧOD"X7.w! +-U[)6V$ѝD|> +%N`V;{˽;ICyy9 N~px=Q2(XkwH$0}~wG严"/**7o^vv6UP8,^jMvNEOOO^^˗/sYOa4GA}p>ӼuE ƈ]ڝLh?6ϙdɷc+0I&0R[ʝ-ڦ`lIuQ0T`hh[aGFN6Pa89n5yիWّ~ي]v>x ,D Z}0Vw"'( - +f_K`( +LM;]<DSNN(wZt#ˉ;{b%t!r8\mr{wÇ ++:D;9MR?@XPٹNNo +EDD˅+jLhCCCtvv655Ihii51R0 +sҾHOHKOK˻^4`@Hwp8# Axyz]&՝I8 ꄯtHwJ嵈7֡< ĉ@GANgǮa +TYY [%XZ{(,vˈd2/A&H#33رcLڵk|>?88X0R`k[tMJp<po=ZYyaH}BDv'ҾFGN6 &':q8AA_iN,'vEc8JfHDt[d4m__,PjX(D.32zwX=WZdRx<Ç=s挷REi2(A.]H 엿{[a?U*0L@:M&ѝ&'T}+pW:9wJJ>彈K6EO{LTWԊdcb4JE&aMVZ]]h6qw>e`M-դ]V**VG|vaf{ws/3 +L[[[kk] 0K/ $(-[vm8wO<\ͳX,SlL>XO̝,_~vEND",{7e\FB8j""$1s+SNʨT%Z~K_'$Ѭa&0`t#Rpg50?\ +kfJ0,A +H +3t+0ሽ*0.,&Ivdz{{O<i~vKL@da$0)"Χt)Qɖf&f&;;.+;iNggP.iڥK"w!c(0gáCWhHPpg00DaV3;>v"L\sg')ex#/lj1vDٔI!2P}G; ~hHH'۞`O3X}b0.dJ͌s'$Zp'oXmN/yxWj4iUlϫ~8̏9QH*E4,.Fw0khh +0we4;!HG%$z*}d^<t999r ddd + +dz4D@iX*ܺ10ၩMתjS +spzŝ&e4vG*3I,e $%gH\GG%/Q %h0IReݧ:B70Ϝ9sn,Ξ=[\\4;Aa=}PbR*փ^}X*#2hӱWV9[BNPH+;^_N+ӇӺ+?u'?Nq. 2FFK/?TܾUg00e"D3Z,w;)|`^8݁(v&u'x5A///;KXNa1uuu[L0z;[ڭvai9$㢒QЧ釺|0`IMѻwJJJNIII:,plVz#bX8Nt4ʝ +*Sӝ*&q'ɝy;yy1wZyyx\۶SonGv<$&Faw(|e߆ + +2BHCP)E,W<) r@Q_Wͱ/\ۼ7?^@BCvEMA;nTc5wC6%2Ye %nyAG"mll,,,lCoM6")sZXtFɏkW.w{<L6.8e"1;jm6{$K\mttnL=^pw;}tJfɠ;lk~ԝ|Vew{e/SN_bu:oNޝy0cǘ#4Ĕ%`M;)LFIq' Ǥ1=vr],3c*ayADB#W/[[rp:͵j0v})|^C^ 8p/:Tl߾Hz=ۄ5k,ZJ4,*hwgK|CWU<|3]b + \O8]v{yyyUUUD^Չ[5eՕwGݵ;[7u;m3ut};=:Nͯ(Jn\})++URǹ?T8'"c̃8rVASTH PdA4rH9.!j4Y+*0F@ +x^ h42#f555NP__V{2+aHfSegSdC3,Z`Y|{ZVLS=2[&Rq8o +xXħ0GC;P +d +VHgVB$u_<_'o*w\ZEF]~rp%~M+7]$weofrd +4akk렠°bww7 #h$`(YeۥdznGq:t>1cKaQ4?$+ͻŲN»Sl\;!םJ_ml\Lda쳖>]}pK{?%'IbC==M?rw,̓nOwܔ)&vkI6 +l}}}[[PwpCVwwwaa!<mSWWRS8 L/`FI?2.(~"/*~0WW\:/5l ܸ㱼(Y<sw#QzR!xJHH +!D$ fx@0kO"2%˙-'}ݝ(wUU+W=xmc2cS$rޗBFato,Ox٭;v,Rڴ~}btccpN(^3 +PH + +%G!䞔N_+P4kPi/P aR>DsNr;yƝB%zɗwea.>{Nb7eX2viQѽS'NmTS[}Me/Du/&jy&ОAݨժmv;֭j$n6EWbםzD I$<ޠpsoa{o"EM'xMn~$AZ"`ÊNZOXcvgwWi@QdݱN`(lGeݓ%@]]]iiҥK].O)PWmn7}^F:vw9"ঀb$G& BzQtv6㓋fޤ@=vHNΜ>}#6ug>h'2I$ߚ) xH$zVN4<=Jް?MCRObH}<Su##vwi@Xsy()Omo>}s[ና +|BtIӅ;4/z!h#Nu陟<ukWFNɊN͎ىu_bvbK^Nl*)A88?Zr7>}Ts~&XOp DBd;bt/FS>I!;%n/KJ9|T0<xթ}/r\<ϓPN4>kĺ/aXc*`K2?kI2l1%z?;yԿAH`= ++(o9ߵz~ +'srڬޤgߗ3!<UqDk>>v&582gdM$IZ]]]̬t:!}diGbMPvb@XIUo*$Nms\q}V-9lEi7!֜<ӕx-) jb >h,\ĊGSSXc*`]jmmyXm`(_J# +Y֔;C~+WUU>~|j'HUNKSss3BHAX1nllt\ZF\HfcH JQ +?|B?k|v +$J핕VX:2π +ﰓ57q+NoNsf7m}i@)D설qJsS⤦A.0;vE1;wR~Vt$rs}ڼ5s{RQdspU` +gAZZbɳNNң:C~RNߋ߯ xtttG@+F !d` p*D7L n驿Z_`13,Tc{I7۽ 5ՠTw>wyXR7L) +>`)@r7uڵki=+8N)X1;v9}4^TWWoݫ`'Ed\nN`i);%r_qu +Ђԅy9{#~A_vM"<!>X|3n[AXPSbp;*BKKKooSb7Nn;IIrv@c,fSFb(11=%E4K`:t݃流_];K+Jb@!*\i&/X,b}ocrh$C#Kdr:.'XNur\ծ[o1U;Vx씗y:]gy"'=\5kl{~7q8<f)i3}h_$5b6M$`<t,N|nȭMD$MfeWF%F˺xwϞBM#|smj2IwRp,wJ2w*0DQX,NS@$ICCC`P +s'lwSq\;HGCu:՝m{C}54y`?/TwI/ч#~0zw˩nQWF݉@$$AI`ܩH&dzd[Pq=1httPN!4pBCC}{kbNXҗ{SYs+nO>ps8W[{SrN0=dI }V +HnfIu,\ev_4vP(<|C٘W}P~G2-6 + +INawGEhvPUd U Ĭ)!3 ٷԥ3ϒgroNuZ#(P`hRMvWz{w ^EEylwVՍlRx\W\u'U(ܩgqq\Xc<cu'p՚H$U>ucZemdր;~OTH0ə/\6_kh8Y]c7;y~+S$!u[ñ}u%$$Sd0ZNQ0rTW}v֝,K2:.=}QWOυ^=ׇQz*82wy0u/ekL$HM|[w+_[{T0_gh4?w<ƶmpȺSAnmn2SwR +ȄDî7nPQbWTlշ|7wBaL= +/&9p'pQmeS_^WZźo:Np/Ģ9txf:>DvvxBW܉`՝$NBjFQa@``` +SAO9n6MTꞋԝvl:v쫎ί!XYBH'\lo26JY N;l6[<:F> +pJwuť)wD;$N<ݹsgllL`y͛7;aKa<oc|`ڦ u(faf)*DVA`k֬-//_~ b+Islw +CXIC +%)@ jN&ls]>?uOf_9BB.|m-@$0: !U泍2՝DQ Q$S!@=?2DW8} ZGyNWV{"Cht}dh +o9G[SN[:NUjTZ)$$ /* C˫)0y4捄hBɒM6{=9羰I $CX{/yyݕ.GP.dWV'Q/vW$3m +f{ySۏ]%|H* +<kpeS{TiʕwR] :r Н^\VXᖭ߸.2qNNsX,z5!WĤ`̵'A;t`0ifbVL\<fE, +HA46"@%JloY;I,`W㳿x3\." L`NBWt: _V>=nEƥ۶5`tZN6йȝ8]]]UUUH$BPIs@ 43Q +Y˺yp{<T$w]|wZmmW.-O`Ӗww+zm+2@ "AG]ANNJKKs: +nYJƥz9uv55x +Ird#lxx8BBd?qgU{{{yyy4Մht''d⽩w߳9CC=K?=Cw_bJЂlQX]e`{֫3so.'41ntEAƋx6tEM4ov'NXbkM[,&&15bq)]1!6bagLq@D0Z[[q4GLⴂ*Ucy|GjM +_|&_m뫒;:Jԯ"#,/?9W^vյmK%W\}(wR%krLxˈV]]] Gٸq#6UPSqck^8jOP;+AI.'9@eee NO=E.]GS&L+N.S+:=>p\IczKx(};N&=Rb,,z,%%uSS,´/ J:'Uqu777ڶퟲq6MP_ƿͼ}r:1g_p4:D -ׇ*>ndD`]z;*ppMWoĴUe(Lޏ}^iyn;1u(Pӗ-\]EW%DJ8ؖ,u7olYs˲.1spd?1GhnnB33քĵq[ZJ~g^"[3~=2(=1 <Ҕ(:Ng,z'!'~sĊ +eHɅ[c,#f +b`v̯jײ%F?xO.YYiنWV>GO\I@ +!s.|][xY*1!lqL1JͥNַApw0XOsrsh*UR&,*iR#`,%e>r`-!$o fxNU +pSSS})&<gJ` %$Q*8Չ/= +`e`SWfڽg <f:JG{*DT?.pY2sbFK1 gwƸZ 5Y'L6p)yhÆLZ +K +l)<%&Pqw2L)l +!`"3QByj +_k Qx:C\_zz-iX![v5W/y]ܚƝߌ?eun`ZXY*Ȣ`M/@ǑSI4:gqBc0~נ.+rUa'eS3l #tBqgi`G\}< WD;.>4`k4/?,+3ȘSNvhF"r5kOW^LY3tȰa +r[~ك=ٱ|ҷV\dUȚ,;Y|h2MC8'RJ{9m֭]bժ5ۛiN+iR*Fq[HA`:v[u7._m;|(9j7UQI!DK61uv>Fq BLAR3{.ڴ|anktQ&PR#uQD@e +TSKif-~c'=uA6à<JBǩS~9Kyӆh7ʶF@frdHp[ؤ&\/h|\ +2QdV}硟lUɺMdC6TT +ypfp\?Щ9N,qGh%[: 7%:2BI*P9-g.~:DR4}T:}T=pJoANV4PMZ|~*Φ)~T^@aS;hpkiI +&{( +:BԦkJW8))LI4;3JD婭?i%G=ϭ[8h]Z@5xV9. +c{ʽݞ`wֽ6hFOy ^Ԡ%eQJ7 +̊uH^ֽ[4ٹ7w9QR_xV'Gx#Hfco8F}qk}i2`ԔqA(]2I`h*ުo +730%S-P0g+C1qTZ),_*F%8#x#LQSSyrϜU<w^n6ԖEPKV:3ѷѽ-V?ut蕅}ۼOم>FӢ%(+iMÚ<4TSԷoSRHm۴fqg7ųq{]Xޢ;,hScI,hh4vcblF FHl (;}-';;;3;]wdxN~:^f.~5LZEPiP"Hчy{_ I +EbG) +$¥s6ff06ޠ2ݛϿp1- 1I)OJ՜(YG\P˚sbybӘƾfq|Ĥ%e܉0(betUD8̈& +#%LIj0m;<٘**qD+%JVK#A^D_7)sNOHfqbFP$MmI%NNDYc'(| 8;6^VPj OS<lDe؏&WQx AJSHDFO,(M[yITVTsDpC#Y% kT=Q!ҕ%ESxCrBUM$-ӑ9GĸL|AcpN<XLWDԈ/i긝 "ZnQ\B֢p"Ĝ4=W9^O$/iLխ"ɹr#pFpN6E+0U|ExBӓHDCK}Oѯ3F.(^IL7g'é(5S+% +J*z7"([BKPDOg-SheGWmU'4Ť;[MS*^W*ȝsݝfTq$Iqy/A&ynҝDaETըhz\9b +G̈:ȅjx G詚^TX*U;3&er/]$Lz'TMaMUb"(+BbG$=[ +`$ǩ}(QJG)GQumR3U#}"U/q!w ʁ RD! KPUe-.ܞF6XA܍\v0w?ݳArgp'܉t <t֭[m۶s'N~1fvԂiii˗.g4lEEEwNJJ*;qys=jXf$/_bcp)...""BQr;;CXc?ɠ ?Ybbbڴi;tAuԩE eec<|ݼޔojʖѣG_mسgOƍ8s|p +{8o>bج}ittt]6lvUjo߾1c@z- ~3n߾wSQQћ7o>ܡC??,[qq[ׯ_5QU!6rrr077ݻw$>>>AAA1;F1*f/ܨ>|X}?~İ߾}sz.CCC1;c+8@茞q#b*ñh1?f8p4ς_~UGt!!!uօb?ƞ`1N:5j(c'h%Xh&ѝVS<8""B+3 +zƍ8X,-[իWϞ=4i`#Gi͛P6lѣ.6lx4B۷۷/L]vbCPPPʕ05jsNMυ|}}۶mۭ[ڵk2ŋC8pȑ~~~͚5 8p +.!0ׯ_jmHNNFgܞB`R̒Դi`ݏ??"q;Ƈ/Cdd$%@YPa"܈Љ7Ƈ}*uRjԨTkX?v=R2SƦa!gOROll)rC4F1QԢχQٰ(QB{ͳ/z{}hyzڮԩ.[6 @ߟҸl) +O3g888xxx* +Х}"'%7L~7o.**,Pf\\CrD@Wv͏rï8E ٔOiQ8}|nܸa<T^y#$dvQԑhgTll,MYfXl>}4 #FdZqL+EQKNL[Mɓ}||&N7ns=vvvHmjj*- 8ԵkW&CxS-D&4܉ QQQX@77ϟ;;vln݊+TǸ8pʕ+ePcAA<ٱcޕ%KOѣ,Q .HW4`huc)lԳgORjoժ&0N?ÝÝ@Q _IKJJL +6,]/K.0;tX^^iee-xxxo∸gϞ;88s͚5xfI*u۷N$&)zLwڰabaeLgDcf̘ѦMc֭[w-ӧOH,i7;!i˗/_aDN4P^^^(X*wB2My)!{tR>3iY& Vp'[[ti&>֨Q#ÝP;6՝"KpL}w:IQEQ;a;_`&իWKKK͛ׯ_?dT۷LU6:ڿ?zj)H={!;߿TNqk;a,rҝ;Y+N6OxⅸӺuLf;!-Zh-WNkNcƌ?$ A*u^z;<zH6ddd4m_$*BVR{Hp3g(y{ĉ͛o >2j|rƍEq[nɲ;lr颅NtXDC<==Ndq#(\t y@{(Sյ^zZ$y}6 ' IIIr3#m۶۷%&B}14,<<IC%x^eeeo JIIÇ5ki&y5[n%ԩS[VVƬ[jȐ%J;Fdq!B+V%!nQ& +ܾ}ÇOѲҝ0=z41YJ0O(..=VPPCD܂Mѽ'OslHOO-%#;w.%VZ@hHgϞ}.ἼniY5asrr#}w%>ְaCÝgÝ7,Li8 +7vXdcwuׯ4'*(1aLjE>}*xsWu֕.D x[XX #2yȑ#4rXԩC߱bnذjL֭8ׯ_GfϥFKLYsA<xsdYyfʔ)xBQQїرQniҤ zJ;44T~c;v9r$Òݻw'%$eC<Jnٷo4j9ϑ͛7;88YNݽ{yzz"3O<u@222*' ㉯/q,q'K4 eNExخ];p'Ύ1B 0"O0REQφA iZ +Qm]T[fFWcbb/^J#i z{((,}rU=U{E1b4Owg*B>[53ò28(GR$7~NS㬾-C2Y-UV竎Sun(K=mUں凵ƞRMVEQEQEQEQEQEQEQEQEQEQEQEQEQEQEQEQ7o +endstream +endobj +153 0 obj +<</Length 1750/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-22T18:12:39+05:30" + xmp:MetadataDate="2016-03-22T18:12:39+05:30" + xmp:CreatorTool="Adobe Photoshop CS5.1 Windows" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:AEAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:59E25D3F0FF0E511AA50F6B5D9726447" + xmpMM:OriginalDocumentID="xmp.did:AEAF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:AEAF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:47:56+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:59E25D3F0FF0E511AA50F6B5D9726447" + stEvt:when="2016-03-22T18:12:39+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +221 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +222 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +241 0 obj +<</A 242 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +242 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +215 0 obj +[243 0 R] +endobj +216 0 obj +<</Filter/FlateDecode/Length 3836>>stream +HWkoݯկ/¢9|$v66m6Q#a=P|؉̡8s)\IDav~q劋+ +quN_M=@x泫b\YiɪbvL DXf$_fֳ_YW +E칢ҳ`WGUg_M҈o///P;dT81;U*{>lt%~;Q,OjǠz4V9ՉƕqD2C;R/:Z 8YD i!/REi:G`#q|fc(Ind*f;AmVҧ{̇!dъ'Nje? x?8eDV]&|4/ݼg=by.$G=sW>kxfwbiþe|iϳTBVgImٖ36,q v$|ZC$ ]Bz} +/k#]k5KȀyHnql.k T4֔u3z^.O8i\c"\^>xg^dlwKH%4Gi7bSƊ72Q7kU7"iߴUڔU}:NhEbA8@qdnov:%*±" l~=vzq&m[^MoED˲HuP]^/8̏eſR$E+Ӗq\d~jQJ7^;yw"+ؗA7*'FdN.a{k8[BH.i٪F Ye(Т7G"+ q'ʊ*M˶h <e%ܨMgX5{!3G +˷.tgcI2ˌPb6mD +w,Eeѿ0 Cφ~~H"5OQg_u=h.UTv}9Yk;cMT`zKm0i?{:!&J-d,~@b5W$TcKC73;Nsf@dp1 +>6in'}Q63OOx+ÑG;B57]xix}c|*û$ufS+?ptL==̵g. +s-agc43Lvi ]祺u3\wtq2WrXM@PF`Dew{>VMx%Rp!p6--wFJx۬*V`iiMܪP̸IhxhmEP!uFB0zNAg~c99GvM;QB2=Qs&K][|+BUGEGdc#VҏX:H",o3uy +)Iǁ~m8yxwh8qCߚI2X\ak=;Y +ӃظP1mH8qט_ϐ/&UhW]waaAc7kt?m76;wo1`/KM]L]x=rܭv +wTb5}tz@KîT|}]=3哰xC ²cDި8Yzۋ?QG^Kbԁu2P&I^Q4P1yIf3lf8cm1tmJ.Y?0&&>q ;}c)]Lʔӳp?0+)@nx(F`jFS!ȁo%Xˇ EP0nb꺡zhPڷW\1C4|5On"Aʥf$n +q>:SkzA:r]ڴ_:btʜa- s#o}/fj*pi&ʋ\jV7 +oDLwYu"b}uSƎymg@ZW[mf>݀8|?q6iNW@IQEGXⷲo?0&Uz2_<&Z_2Ԏ. GT"#7Q_{S\K^~O +endstream +endobj +217 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +218 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +243 0 obj +<</A 244 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +244 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +18 0 obj +<</Annots 245 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 246 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 7 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 247 0 R/GS2 248 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 40 0 R/T1_3 43 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 56 0 R/Im1 57 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +19 0 obj +<</Annots 249 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 250 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 7 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 251 0 R/GS2 252 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 40 0 R/T1_3 42 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 59 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +20 0 obj +<</Annots 253 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 254 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 7 0 R/Resources<</ColorSpace<</CS0 36 0 R/CS1 107 0 R>>/ExtGState<</GS0 34 0 R/GS1 255 0 R/GS2 256 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 43 0 R/T1_3 40 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text/ImageC]/XObject<</Im0 61 0 R>>>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +21 0 obj +<</Annots 257 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 258 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 7 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 259 0 R/GS2 260 0 R/GS3 261 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 40 0 R/T1_3 42 0 R/T1_4 43 0 R/T1_5 38 0 R/T1_6 54 0 R/T1_7 53 0 R/T1_8 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +22 0 obj +<</Annots 262 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 263 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 7 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 264 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 43 0 R/T1_3 40 0 R/T1_4 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +262 0 obj +[265 0 R] +endobj +263 0 obj +<</Filter/FlateDecode/Length 3623>>stream +HWms۸կ#1$irs3~I.\VN"! P@в|e]Mbzą̗$Cg$Gn]r<\'$G2z|ٕ#|/quՖf`jֳoeHb%>bt2'$esBW+_h`y5Ay!YQ?$]>>{:#q,E`-$K'/<kśջ7%CSnd5 ?*QVY矯ooh||Kk?Սc;n(|jMYhvk7C'\nVwoF/xs}'p<r/c=G"xc<m::~:VG5!DN#4 6㻽"GF՞Imy[O^ +`t.O dmƎߝ|p;re +* G/4:;=P@1$o+R{^wSu&@džO-@!̀NL^yӂUOJ +SN63 k Ej]@m[Ew.$]`kJ4XU<¾EbVJ +LPtx +dڙ3k+J$Ped5iVYv"U)fB|nALD$e9M!FZe^Bv̤ɠJސOٶIJ)&s}@{z;;cE+UW݃~`_+~@:{g]tW+]z9FJTNh:}[+dx`0nӔ2Zu)Ȫw^*m${2HiWKMW.j¦وOsn[/э(DŌrH.e1k%9',4BG'E-L-7n]]4}q!pu2z"DҔdcmUEq{WFb4w,]OVd8d\pny}]Jz]T5p2m@ݟٞ;=c:<)`F +__qz^0"#"LfzL6Sb^ym- +By*/Ze=}{"a&d7źR$['X=>md +2ɳM|r}$ޠj2@@=' +e{CefI6 |ϯH`RM]U==4G_YUE`'jofa_Ž22_?HL[ + x/*<X[.aB^<Nj(__J7?ѕapNYi@odjũ^¥Ţ_Rt"=zI0 hPu a4 +_# +0 +endstream +endobj +264 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +265 0 obj +<</A 266 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +266 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +257 0 obj +[267 0 R] +endobj +258 0 obj +<</Filter/FlateDecode/Length 3318>>stream +HWY^- ,lfnIF<A![mIn#{Kdu_pcGz\=}qc7śm,VO_˾YsB<1b6=jYijrt_ADxb{\P^m߯^nW./E(mQ[QܛSR,mتX_S-ҵ"7۳q4U*Xk^RqNGujNX]+AbJ9$Vq\p,;X^Ӑr Y&|A +?"3B(2HmIIlrpVD F+'A +, +&?ڃV*[>1uNU]m/y2P6[['M}Pg*FM5M +L'SVoyZG=Xpڼ*쮀Nm#NyQkxL[^.~'s]BYl +e>"`?h(wB2[nNIWl9О +B"Rhs:c%Z<9&[⺫s&UeR +Ǻ39s)[-*M[kG=r1$iKΥjZ@5Wdy?1]S.boXhlr&_cfI}TuhnNO +'?ŰX༘߫Kܴu.G㻗ӁMW\Bs=//ù + +qrkz}Hg2d] ++;A&r99$KT-i%ZF6)c!( QhgY;/mHtzfʏb(DXwM]wB>Ll@{7Q/=h?}ЗE:O +endstream +endobj +259 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +260 0 obj +<</AIS false/BM/Normal/CA 1.0/OP true/OPM 0/SA false/SMask/None/Type/ExtGState/ca 1.0/op true>> +endobj +261 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +267 0 obj +<</A 268 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +268 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +253 0 obj +[269 0 R] +endobj +254 0 obj +<</Filter/FlateDecode/Length 3036>>stream +HWk~|74>EjY5YrbJ?Ç8\i +86v[TȽ8͓7m=cg +U|8(D1bWMbBXMg +0ɐCM`|wSiS@p7#͝Ќ"t<W?}VMI^nE`pU6X/"@ˌ+*KΌ7o'Q/jHيITIK3\>Pz[Yдb_O2a'dXb/ֺػ-إADa^7mD5EA[hh`pǎŒXfYk2͊fm8(J!o>-*Fy2@Ҍ1ZʢjNOS۳猒(UPqۆUA6/Qn922WMD舴+imVMSO@d\7 u#9k=e*0⬥֊|OlGFϩ;͖ Võ-jWP\PErwi7rd7V4V$ +OSS*/"T:=0|g06-.S@AUcآLE&a +ps'~$tg#튤ɽHAP6E3C=Qb%'k(E _b'z,0ZMi1{dsr1Eh4;Cu;fdc{ĨzncNjx1\dO5m&=Ȉ>kF%M%ӱ7 +D4bN(sIwR31]<§[#"g%`5MeȣEYlw)nT 5D!#X˶RJO7{f?|?vFD-dw*sfGDژiU3;HHC+h NYhZn[XBr;J6FWc^=>,X%mu +5Dխd@c^|B;˱Qgb +$} +[foCI;c:*=χ>)|xM"pw +v}+ +\}Pv<3efc߿D |*&;_4/k7]} +}/X*eL"꥓uvC:uC͕/_F\1eMZB +$'BX9ܿq7,/8g$W돈u+}a @TBלUa)9fjfɿ{@x 5fB.tm(l +qގ&x4t|MZO9`hA:izjB"dx__t_ȪD|q,S7xM@$V/ODKGе4SP\N{YS.. wjbe%.'OէG@0ۢ +!;3.1 ' +endstream +endobj +61 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/Filter/DCTDecode/Height 713/Intent/RelativeColorimetric/Length 42305/Metadata 160 0 R/Name/X/Subtype/Image/Type/XObject/Width 409>>stream + + + + + + + + + + + + +EFVU(eufv7GWgw8HXhx)9IYiy*:JZjz +&6E'dtU7()euFVfvGWgw8HXhx9IYiy*:JZjz +sZeKXdj✶¨yF7ĸ(P"fdŭ,6j|mңd#EEp~xwB3-伶QqHYA>q6P(* +p$8|Ơ*R0Pj0kzéc5E)郡KQ%2 +C,lbǾ<m#A+ +mwfWUHt8@AQ&TJQMF$W(&ͶTت8r|0F툺@8`^؉@)* +B1rXQXJbchY6͛"R,o,N4e\@'1ƜUc*Ŕ +Џ/<pT +}ˮr|1SCgQ"ᆠ +UEF+Lk6]0FTJ٣,$3gau踄o +/)"qW+jj^N؛W7,vE"r1, +ePF:W5p*v)vQ91JƖF,8Y嚤⮦Q9y`o-oO|TpS6qN9t!Txex+ +\r㩗VS,SWa&@ũ'\8Q ģ84P +٫Lmr¥x5S6W7Lmw8SN7+J1LU68zd]UA]NUFjJS!:elT;P?+~ +iXGp;jsL T,6ƃQ^No*ۮ+epO\e-dR02aS+Alq#倨lc6YlM)hla9ƜUqy`Ĺf/!ylMEJDӮ0[qeh@b+6 +ㇾU)SUT +qElUR8[lDr(*Ƴlk⫹rLb+22\1q +q$ejb\r8R:L +'ZeCc)LnX;b62qb_ۏ߯1[ +U9L)*F3m+3>(s6&wf+(o42-p*ycJR\2HP=qB00+Dkʦ*zn?#~@R + +lc9e'回&N4*fQ=L&*_2cyʹq & n Q(tGX6/ogêACi*aSAjzڂJNtu41FZ8#"WW~cLaQQƘx1HM4,62F!v!*RelPR[SFUx8G.@. LbEqR`k1r-1CV'P3+}q%8*)f5 Ylil +W7,U.oؐaQ?"w>#DW5qWc8ژM؏,Yѱ.irlqB:O+VV ĕJ + Zy1P}VЮ9=a4[IU ؝vA^-tC_#ЛS#`v +0)-Zŕ֔EŒW!5z(j)ї5ǖTY9T +b2ݸ;Ec5úڲNjpTw)h0\*sKJ{fmW`j0Lr+An4[ݱ +c"wV)d$m8)NpC*AZIn.(F؟!,|8Xc9e^W +U + +/|F +J9lA/ J\ $p@E@8 +/Vz5RzpuTZ]/;W@@.qxX +\nfjUhbze:r똎'}U) Kp(Q*E@4F+!*'ڹl-N"(ŷ0%z%FX +:j +e;W| e6kgPs;cbv0BR6(s#GS&6T%|xep]T8(ea_/xГ]צ_/4R9)2Fs=v«*rAq|a|g*N;9Z; ݀wߣF*德0x&).pkEwpu ߌzCܙ+pTRԌFpTb0i*lz50%RfqIcMZPFPWF +N٤5 coz:(Sc\rLTtL9+ZoDp,ɽǮXt1KW +;uHGCQʭ:`{g6Tk32mQG-+F{ቐW';Ifnn40Bʬ\Ce2`%Pp$҆)PSlp<W\#mR ⶥWc28*E/Sa\([ +SztR*ZO\ě\e'30;حY)YRID +eM3rU5vJ&oSJv'́(L;G9aL-pWeqM{6.ZcA\aIZX1Fwֻb +Lŀ'3S)@=q)F2Pe +RzVr1Vg@8oa";G,)f}NEoϏiLrQUXlxB8&)S$aƐ4QR)4#*#lS42,(HrSCE54%Rփŋ!q`l +Uc'Xzus-mX>|`0R+WCңCJT18P3\'S|nKn.& +" +m@~"HqB%DZ%,hq6;!mTYwRIŗ)ֽq*ʆȣ(;`T4QUÝ80^B0@$U:!GłA`H[Jߎ#9$uoq8I2pzuBpL0C/6mbÊqGLFZָ]gT0⪄fS0ӱkU@#|eױUI@ +O9՜'햲S{P5N)@)PQd؋q +3,Ľ|RbzJ* +m1UŖQp1ZhMC勂q#ekȄuFsO6K:L3o\U[+[M86L7{L|qSk{ k{n0X`@i\RnlTW\SwD\Bjrm.X:l3S3A^]WZ̧A5S\aW$d87)W7@$*zǰX9_*Nc*Gt15lU~ElW,[UoW:z{. +^Qp/&27)@])Fx&>@PRB]S +n)@TaFq*F!0OA 2RJ@bך{ a\|¦;H={($*E1*@. + +*rL0~<0H5SU&(lpXӽN6PP}n+Jmㆉ[z + SNؠOi}UY4z(U;I`~ىbBH8H&oǦ]]+E0N6GrJ˄o-,bo$jI1N>9`BJõkipYPVC\*.5v888Ԥ)bj,j+?+[ҘCOLYį +rF +VGHS]Lu+ԯ +1q) Z~1łL*N; +aQSOL +3CL"nI}c#3u$;8< +[-u TimNcYf5D6N֘F8&'1$&_3\rcNNC$I'ɞMtC0r N,JXja. AbTLt) Sl*4s%Ԝ"Zm^Gaydqcx(h+eKeN5'y7L}-L",UV?k\0+SE^;vH,IJHryB1uQw85)PzE@MkS\^\djKl KY$ +# +JTiذQW +2sq_l !ILiQ@ +1) +DlFRv;bhmM`ĊcBƳk"ʢ)X{I$R(NX +uAH*Rj`IWJkgu䆛>B7&1oO*?K1;`I \ů +275Gv,*0D3 +9CUT`2@1QeVl T8|UU$: Qf9-FT``9~F$ݗO\I1ƕQw +l(+;0BM8U6 +퉠11LK/Wya]guʚA t(6scodߖ8;^it5rUhD5ƴkdtQ`E,|&`2qw:s8gGeq?1͉;dR|ߤ(;~6Ɏ:5{sCero%dB㾸|r:&z~DqF.tr1T+;kL]{Quqt%Kr\"ݿ'ckINda!u +-mnR+}MnAտAXPT|?{NW9z!Nƾ;Wf;?ఆIߗHcZ}+9zm6ry^"SO)'؎'xX920^g?*@E;ʠ ٪~Tʩc{֙,^nSOTzرcr:LD +|ZfiA>gVYSjx,F]ODŗ$Yr)WF>44CJ7ŢbJۿV +t%[ +~mlGe/Нݽ@-JRA6ߩ^0fIDv +BT5'z +$<@NrI#ܴ;Jq1{J)T!hOs^"7( + +>vZ FjT/kYOզU 32ԞYcp5pG>_rЊ?:giw,Va9`<+@س߀lIȲǓ{ѵB~px$9FRNFGF+#ZfHe"3n@N}beCCOma#VA: +̲iџq$X.%mD{Fd'x +fF+jӈǍ>ki4K^W.toCɣJ,UNKX謒67xȌַKkuBBթMLks""VHH2XoS\ֽ݈hT~bVxi'$n]6[Hɪ=WV/&~OmWq?b?݊}Fo~!$+>*ȮDSȒ/壟8r̦DVr XAJ?_Վxř}# ?hTq C +HJu5닥Ir +dQNĀ}1, +x..XUH]? K*Tf(}%bNfWDDTe5CQȎT +V${P109-.ԠQM(1k_=m96ؤݙRKEq>_Q%ᱎtSICu*>&AZw3:~l(-ƩrXS+FPh2ؙ&*9l hx3̊IJ0T6UsrӨƀVCeyLWsDr +~3)rL4{崀@Bߡ5r0zAfe(j|:=F1'InXO.,RE?^G"l>nivFW]Tn\~˭Z_\%5 +&6!ix0#H{A1xun!UVua +3DNWAYELD|Fh*1Ix,qքՏ +1@#vZ<oqg!,j@o' +xh$!K~iwY1`ܧ߄vAm9s$=kWQx'Bt@̑4f +3/s=7ySք텑Mߐ7esI%!x_q=>-I Pz`(D1P+ܩ;`䕲J +Z|Dbd`qq(jXsqH-IU<Df)QOPh- +iTUcPJQ@y0X!f`ƄO`T#GwN)ܚcV[ޔp8ޘq#5T{1lXr{aD=)2r<69UT5 +۱ +FA'sD%NثBMDyj@ +pxuga`Ǩ=돉7gA/ Z0Eiu*2)$benOoV}*&ށ@ޙY흖V jTj1dAKU"~e";a(%Xfq@+"wʄ,r81߾ؼZ=#m)\Ք. .^r*߾䃗m@WQЊ#jHd!MYoAeFV6s]!vI6|Jzq"GNLZa}VI#kDF4r+ i* pr4^aQM{ujSK*Mv`)VMja;L@_p)g5Vp& +ޝ +%Iwu5Sߡ0X#`\bGrm9]n&HCU + +xJdVKfdjJ+=TIPu\lOh>.FICCn;*V",:厒혪GF, +p7See`>m}6B%<3Rǹ̃~8C)W2T8N6AB]-M4VAR8i`wej<@9̖dgmQn֩S#~is`OC\G^(k";[inr)5[kԕb8+?<k7^"Rbұ&2XYJ/ZFuR'"\eZ>NL٭yh% +͢Y#UUxsS:%xL.g:_r/] +`9 +0rT@[oǀRz,B+G + +Xi +~#`UnkU!MM~g.]#v]19P9; +U +W`{aJ?ڝ 6{;@+(h:©߮!T3V^pTRX±A͉ +p +MHʘ6C.gc=č!m=XRݐ]r=O*\z`e5? + g*}鏶QUӓ0ݹ~ mó$UNͳF&04HmzSއo$ti=6Jzq>./t먄j +2Ƅr4;<c꤃u +mZhфT߾.fB7'z +C<9d& +xA8? ]!&wt!0Ѡe IЊmUx4/^" +zQٔZbN&ЅŀԓmL<I<?X(,)LEE@Sޠ{`M6@W&P8taE<WoF9DܢV ld1mݝM P +iH +nj(q.H!JrָbLTntm:KP%> +oA%O|s$wAHxZv(̱5T +kɯfQU~X:E4nU)ژj{xLQoCAP:PDBRz aNLjWŒh +"1n*~TGʸ.6Q +X%.4G*(;m[D&% +߆(kI⮾7}2+nk9Pp=GTV!WPӘoDvCCVzzPעE_bJju'危V褐kєrG?V:+'Wi@ +MYn"hp6xn0K7zֿy4%Uj7&;ceHc: Փ+PADE %#lW5 _PQ$] h)qM!ݭ w7PFw +m֎K/z|FX +nqQaVJ:N I,`Qԃ\GdA?ۏ1b0P}liS{^HGnII3}a;1;t1_R2#D=Ы8 2@&}Th/' њ +PRe"Vw>?v\JmjSxѣnr#C^[8/$X]8>~cҴ&+C:1I= +w:kv*BTq%Yg3JQZ +:v8巵eUfM=J[B+֟+. QZcm-mF?S_r%җ +$ +7aǚC, + +)C֕R=JVq;R8U`Uua1[ra\ix W?i|`B|_y$'1]"H$zj6#;ujhV6OLֱp.d)bޒm+Ш4bA{Z-D=@QH4i2bwۍ*;P !OAK4!8H89/%EznprGC֞?NNsMvD#_DrZm/ᙅ(̣;(uf$7On٥zH$p~ASkh2<Oݔ\s~%Z.g@x(=^C' ogoA\K$ȼ?(I,e۸Uʺ2C!Apy R9)8$7:G4 AגO +/{PjޡCF0^z34BRq8垝@ wD''49V +<8̂@(^4J&金VBjPqkO_,4݂Z_5 + +Z~ҕ1TUZ^q8_ox2#BE1J*M6'eJn.+Cʧƀ%xynÏY3N´4>pE=YQÞzmyǐ!TN!N{a%DH^@1fXndFUjcv=w2 dZ9(1Hm( +իSOqIm<vf%MӋ +*4Df7Pr |<z~8y7*bT j-/">F-d)7ȥOAal%"Q ++MW1,8F%#%OJcCy;#EJ'L0άXcP{ZdIL O'<_NXN&P~jS|v +LKhGĮ/ nw?dӮ/=)X̼XJ{ +#jXѲbKDJƭ8!Z֤Zn'ih+ZW`#_U#IzOcKQJ~%әJzC`PWB$ -fdj9ظ+AQCqE5caFQLdv5S0nUWiZ~Wd=Iv#-m&)d ]5ڢ-T3RN*A}d'DZ*??YUu9ZDV*5*A1'8ѩ+Q@'8Νi;4fD +$nh䪫( 7k0H5Ssn_Ci)!YAӮ`*۴ .+$l{=GddZGhxA +Tat6҄h.BM* {\i弘h"тᄯT*Kr?:DSl*NCqQW,\ZļӃ#JCFL+p-@I4%hvc.\i$b حv漞?\(^]ڝEXJCk\Ug$/DF>0)#LU6iܝ1Y9VG_zAEȶ+omv-ڤߥ2ƴs@BwLqBZ\WT(ҕRm&oQzT>vP*EiBj|@$ȇ̒mF;H͒}"ߡ"se +N]1}OD +h =; Ah@e-_F)h+\Hz*ĬYPV2G_K)mie^@jAM4/v;߾];Z[2CFI= q,N=+J WIH:Ҕԕ.XP \G,ޚh*)Ҹvki͍=8R3MA0ĎCl.'EY[X@aJSӂd.!d}&ֈ@=ܰL@ŕBÞV ?)g3H1^⨍P< 6Rn}$qGZ;eųxd@FO+Z$*eDq@]k~T#f$oƞ5X8.u :7Z+?G$HJj(9|nVG-z1Ib~$II'ܐ=qP + Z:w-]2!Q֞jRH +Ua}4~.DA+}FKYB|x'$Rh$|QVӰ;S.cfKxːE\ԎcJ[sFQPNc,.Ռ$r_s,Ix5*Jї)H=6klQvK 1UUlqMCH,rKʂ>]P2J"B)RX㨧B +>%d_W:J6-`y"^,(߈@ܭEрQQuWU!s!YM`jwVͿC.]*6:H Ihvނhct=PtzG >;t? +Txj=ҩjȃSNlIe7ZD-Z7!hi֕V*AA#ki""̜-f.@E2Q;&tx[-ԫ 6#nzդG +@fCSC¿ZNA #;`W-Ш2uj&j7i+zc@AuSn5;YJTSߦ,q@ԫt$wᏏOyPA2TUx$B>;2Vy`!y0<Ov6啁/]$2\&B~Sc[ņarA߭wM7$4Ne*@ڟ_ +3s:BBFSRJaɍ+@z_ +:Mɉg01U24f;4Jђ + +K~h +O_oNX!7Z8խ+\y}OZq5LgyB[l3L\s.ҝvV]U%;4&I(*wqs-EN}1xDظZƘQ]&^tk9(?i0ߒCȃ^v$Y>aZxW<X6Pbrm*[&fZ:cƻ3G +}Up5$N!7oM-,&3":xT) hQ a`-P4Ue, +H舢ƌ"c5tˈU"=0ZT% `<WSyȏ*STgR?bc7)g3S,)y)^i1[t)F*~n$h)Cky}BAkX'axF$W+ƫ>*hrF}RⳚwUXԬM>`*A2'T؇S=åi?@ ZWlPi <nUɠʑ<+64EFoVG&7@;cTauu mOmo@ ++]]4aAŖ[DAP{t82H +0J*Ơv0}F&ؚ)-LL-U*h?Ϧ +` +m2]A_F;Q_4<R4<hI$ +ւ#OQ? s0N+J%n2ts M&t]}*O),p[U#P o</bk`-(Ou.jhc33LvԳ4b) );D? 'Lx>%SĴpA+n.b.kaN#H/=ONV-s 4%i[$䜷|`:#*QI<x/-o4SH~t> OZ!RL/t#WCZ=m&r`#(jF\Ai'~t0UV1Rɠ7tE8YN@l i[YWe=;ű0wI*M=V%ԅ]B7VM$5"BQĞ$?pΣPݐ<@F['x(UktĭߚG!Z+Il +i焑$9Fڸ%xYNH%=VʊJiZ1;Ӡ,'VGuخKG6JEsrqZ/pgE +M@Vmz6H-ؿRh)mmau{>d2#p"fӊVn;a_,2M`-!=YomyegksHjHR[XG`}~E+vJ W订m֣pZzR`hIbH%k`i +`IFR;G|Eըb)piABh78KqX +hk̲[\ U?ǭfx^.w >WlPCAKK:m +Y &7mBWaԚWJ: +>l(VguPt +Jf^B|J*3Wy4"IOoե@h( Aƿ<^8<Je }z$Zh.UtO ƸOIጆډMǤ]fr 1HQTF;N5 Z(-չYLzeN51iO\Ф~)O2?Zdeu0ħo#' +:&;$mLwlm`Z醰<RYﰡ?F^4J8{JEzS +PJa\D$ +%s݁Shm8*m^{tN<J8@Fɖ?VE)CC72C0ؚoj0#րWxqR'Uh*TlHN|J]zᅼq u +ͧTM师ƅr3Z +Ŵx(qГZ|bLK !.V4-92/TiP7_[pT2`i0)mm+۩Y_`Yya#Zؤʦ2@rjp5˸95UGR$ƪ<>czdQD0keit+A?W:`'PM%ܳ2ʫA + ③%s0y>i +$&&$C!CĐ0枈#VO5ǦKs +:K0`iN +% +q$yY=?XXDGT"ew;b]ȒOJv% +7UB#r4Op{?N0 a"(zLRiCu[[/ +P\ y*CTw ('m;:9 Yǎ +q<:ĕ5%H +"ZS{52Av|cHH.G +;31+koy+RI.ME3-'{2rU+*FGr$l\pcs騧\%[foȚo@4QH$r +i`A4;S|76!U&U +KDAȚp,W>dƭFNVRi0U@HxP+]/^h$oޝ~rB"%sR9NVXVPxjzgqe&eҬgN@wRz+]W2WN^> luNA D|b8kU gdw'`OLt~1F"t\ Ip0UH#mVyoQ~_Ds"!݅+ZċTW<B>+FUXZ̎yH.8)Z'-Ѫ1*;IS~,(q'xznLu~dpl-X~k0Z%YӭN7QP+]Sm҆وr@5/o4EQ˱P +2ZKsZ +z{-Cr[rmٛ7?L?~@ǖ>BG4)2 +Uv涒k\"dK*nn;' +Y] +@4wRJvL +ڝ$U*{5yd(HR\0 +1ڢ"6/ƝIGM}#N\>bq +$T|a@\omif$KI4WC&S %=2ִWU.M ]w]TsRw +5ڿ*b7d^<⢀ +ʕ/[`Gb^cȥ8I-AZ0z3HTq]{Q J+r%yGSRpMr*#~@.6X +x.Li4J deqPN:WF7$b%E#=>▏̆%B@.g2jXO-͒i +(78UP;av&骫F=K۴Mw+"RpFp*]i+ NE+n9펆f*.q4D6 +P$ +§~`=OHj\'M'+,#DfHo3}搳Kv48嚩,{mNHU,.^R<г2Jv=Ν%,hYO"ǎ،첯\|0o Q92!5z?G֧i}6V`'khfn+V^&p]z)+L_PY!$$c0.n3(oO(XYI|v9"VS7(++>Dںi"U)SjmcL#odH`z4=: +\ܥ¬w=N9֬7r[jP_Fr +OQ\*\z֊%B^T40DR5HƵ$s gԭCAz8[, -'+ƙPCj@a)Lo<a}b;`Fv&Oa$w>0PųKg-#ymM.X<D^'F-VT{Syt"q[STmZHTxPKԕIx +S;XHoLp]I"߲qNy"*oV8M"RC5 +נ8WMy(;Hī|OJb(M&zulJK_o\oGlm-(;meেCw`ZU՜x<S-ǟ1L[zS6YFU[{~?F/&uV#cF݇<$#c)14@('v0Iw#!z~0s<qYC!ȭpu-G0#{npAGƖ !P' +#lNPg^R`3#YRХ7 +Q#S㊿փ%kZVPk,Vhѫ:(D,h2 8)5nLutQbRRH܁a<r$G̟Vq6~xeÕ9(bAݰ^XaBمiOO#'iui}m;JjwOwU/ |r +)T`t!nFNwnjFWc%pp9j(9ݫiQ[fSxPS'X%'ϩ[,@ob n4"`<<Љ&K1]9,\i@>BWhUxe jN1&xXjO#ls4$ZGv)MFQ?ӹ*oҪf~&rT~vzr9UW${bSS6<L6Zdq%'K+@ũι_)6{"j-ň+$ě7ak5!UADE +$RՖTxNCڽIR>xi嫑HR(OLR +)QpYZ +vOYnmSJT_\fu"Dn|+^Շ\}~8"*NzᇍȢE'm? +endstream +endobj +160 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T12:59:45+05:30" + xmp:MetadataDate="2016-03-19T12:59:45+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:491702B99BEDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:491702B99BEDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:491702B99BEDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:491702B99BEDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T12:59:45+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +255 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +256 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +269 0 obj +<</A 270 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +270 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +249 0 obj +[271 0 R] +endobj +250 0 obj +<</Filter/FlateDecode/Length 1011>>stream +HtUkD+?D$vC:J$$B^@NlGa<P3luglHgȕLQLiV](3!$56Y&&,@ݯW=L\C}LV7^m^F)ɬz=z!Zi&»<UGzz<Ws_UN.ՅzY|V$]:mY(KY46X˜ʽy''ZX'ت|* +0JFSH-$:U.LlAUޒWJ35HP2ȓ4A9uhՉ@72'zɞ+*y>)롲i$زDH&c4K3̹,0ж1Z z0 )?`"0aE_`ڐ/}XYH&E0`E9ZZy%$bj'cpf}L +%U +endstream +endobj +59 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/Filter/DCTDecode/Height 1244/Intent/RelativeColorimetric/Length 171830/Metadata 159 0 R/Name/X/Subtype/Image/Type/XObject/Width 934>>stream + + + +EFVU(eufv7GWgw8HXhx)9IYiy*:JZjz +&6E'dtU7()euFVfvGWgw8HXhx9IYiy*:JZjz +[<D a +FnykwK֭BE~Ku| + + + + + + + + + + + + + + + + + + + + + + + + + +ǵwL +<$ ,h:9Z<8NZ +be>Jc) +PRϹ=v?~W> +2ܐ@XϬs~eyLp^̀ȱXC|^k8,DFȦ:41Ja:9^nr̒( + +r + ID + =|:yvKK!e?mk؟aekMZmӴaW#Ԍmޘ +U%*hajbw)͙LoA\~TjG-1ҷ 9O4yNWw9OR '>n]^[^*l[v7 :B<H1ۚ3'-ŗ9i͋ +w放WӠޭi,[iAB<g5ӗHFKC$֨. h]IʢUݰoV`>vmy+oqg]Uo%q?&2qvGm_ϖkˋn#>cs +EGݓؼN=H+/x.[?T.K-nhёw=į,j'q%}6ё</dN6Hod +K)t{mn(DXWjV"k.$UA`r)#s' +M"H)rZI|{F尖RSΉ/i +,ܱ.Ycļ*rĹf囖<K«7,KnX/ +,ܱ.Ycļ*rĹf囖<K«7,KnX/ +,ܱ.Ycļ*rĹf囖<K«7,KnX/ +,ܱ.Ycļ*rĹf囖<K«qŻ؏$WnX%H)TWk0;.k8.^5c1?v 7qI.Z&U4 t];I+f5fcRO8 +PY_z~? +i +Tv9TΣO\s +Q8M2E{ +SPF+ծnonfT{T Dd +JQNq}[{er::,u]}\\\ +kk.A1r7D]Zzm-_^N55هLsgczZD !љWuo<6־YEw`M9'#!@h5 + +15h4;9.,p;a)<洙[We| +/kΉ/M?i.\Q5mQc_e!)ۏ6WBM\ɦ1 +vɿ?q +'ιJYEeJ-j@+GKYe5"G(r;&E1M2 |\K)#<b#ㄛ@Lk9AwuՑS:Es +tOέ~Z6web9[F}KiĜBV8luHNJ +<ߤ\E핬YxQ+S<tj<kw`dwFShӒzmƉH}6lLr"pcy?1"|,8dlٲMn͛6*ٳb͛6*ٳb͛6*̓O2?"sɡOZ4RF7O*Zs}a?~'f倾NqK|y7Ϣɧj֕?&XqzIm -w|YO_f:t>)pmOY)d]vӎik2_\Nc->dD)|u+^;X] yn!j7s=~iX̱}%@B+&;qYُ]!dh~>¶Ѯ4{ldy}XyК:L7tk1VX'g@DT +Bzd8TȎX=ٳf[% +=R%_2^Ȓh㌣#\Qp-(6_F{Z"9~ +,<8(=ٷ'97< +E͛7f͛vlٱWf͛vlٱWf=3e⯞Pz +6뛙L@n##3~S +?'|_G2E(KpR}^Z++rSaeoP5m:l:l.b'#qw$`l,JY +V,e'rLBaHZ?P?i + +%$kE角|Trxޞ<Nq\\GZc/A ^)owJt0HEWvk6nE(#oaջn?,<w5iz}f4=+e>MכWSx1y_h>Uew߽,zDLJ +2G.͛66lثf͊6lثf͊6lث +bo<H#AW^Mܡ*OΘUF6lc[ۄttΥPi63=e!ӐCL? mZE= +rVp\bTsWASQ=P 2 + +P:iBgcQ^riZ~ +M`A|r ^}o8*N@9ո$mη H,BW-7]kcÏгf&*2f͛vlى*xR7VHc_+{Y"OāDqz3=diQCNBraw7VJ$w2BR&QF& M) +f͛vS2bV +Ok$U5;)1|Kt"jo->Z$UD ++VJӱN9RBӸ☫hi/6*njܘCXQUܵWԓaƯGJ̳c9Tδ#*)ZF.>Am4̣ +YIT8uFԟE4o={ +S̒`M䱚l_Tp=p0 zV`4K{Pj 8%6͛6*ٳb͛6*ٲr xU(,_0;ZC#ԻICUԎ +5Vx$ +KI b|DLJV$ĥo:u^Dho/N02rV˱=i1ϤpriSZ/SǕiZҾ92&^7A^os<r\FlSpr㘯ƕ5]u ռaȮ;%yEbT71J1;VqVW GSn iU;|55 +6HXHvvlٰ!ּmE#M;0=⽶钬c#Iy!>-.!EcɏMpNl9f=Cz\y^5ZvTj.OU!*+ҿxpHg(%A;FB=$;9fLbnL|[&YLHMV]_j@Vw;W/LJx# z~ =~xy$ +aϟ$qG"24BTr߭}42Z%սx"JȦu 0ܴcUD?)O=,y~/-xA,FbM*w!z +L|;sm÷46lSSyZ'Qm2"[OlYozxdX4&^hm[{i:L:V%{osiϓPF\k>\7WӤw*v +B͏U>%.vbI?p65ITշMqxŀ=HVT^bY#&Q"~.O.Osf͑bٳb'<<`4%;ҽ2.d[fb"2( +PD@^Ƨik\ch4>|L<Fv+E +@EAZwl%a(A%4Bޕ~Xx@IwXi7[%M亄!JEIzƣk-ԬU"Rҿ1$qE$ Gɝy+{~] <RgsfٲJ<ݬ/ע $ZeS}'9gmͶfQ?YL}f[%4!!ni +f]6lU7+D䯦MhT>Yb1g rkJzyr) +g,JZ@OW3(`Ar +&KOB1kM+KHӉxIEӲEzef͊6lثE /)1LUٳf]6lUٳf]Z=V +һ`և\EkMqX{}mècZ(zR~lU`/6lUA`UR + TA#lتבbRB*I4 +o/n-HѠ*)LlG&C,Gއ6lٳf]"s~`JEz*.s[3<'u7Gц6^q +Ѓ}з*(<m\=Iwvspy +:*a. +2f0`d:'Egӥ[ȇ + '&?^U.irrd})O ++u5̱qE +l$Hٳ`Wg-/DwUYHV@Z>YmRE#1 +?F.j-(ƸzD?Kjϓ=7#ZtXՏ( v;'^PӚ%isHnP_x +0͊ou4 +<oTˎ`/'"wMoN"d_ٹ>6Ǐ J=b̨ +A//6l&f͛vlٱWf͛vlٱWf͛vlٱUtyn'pĥُ`07|s;nM"5;S m~WQT*oK + T +UseHٳeMN͛6*XĪzAsyB$wUIܰ=J5&V|gߜU]JdVHqd-YpF͛.p6lUٳf]6lUٳf]6lU^֡}I;*rpd%40EQVf4 + +@H|͔զc62@ƁHf;.̨;cӯV":U+zW94kfmO +C_HqC\4n/f2JDC2]qg9#5+@H>I +70~(f́͛6* +v+@.O6Gk[}*0~u +?ֿA +0MHa";Y$g8п1v罵ʘocl+8_[$SN$e4Ք9Y<FmvfQs >)K6C +l 7Lt6IAkp:$j}˃tCߚ +'.N,t}2%$:niV~6RM> 0rC+˲9nV{>?a}O3dn8Ǔe3w+7\淂FbG8969-ZLI˭z~^>&I%fN\I*W/<aQ.U@f$:ۮNs6ȜJ +I|\ٳf]6lUٳf] +͊6ll+C>a-Z%9jhGcC/42$ʵ].m$woL<6Rcrε;[=.+ʼn +Pw5#-ٓM.8S[uO]ӿ1ncܟ#Jc +5Id\R`mSJgQX4w}T +q +eM" +[Nc +Cu/(?0mCׇ̐.5cI%y.~i0WPGz9DNA-]vVG${܅0a־\Fey0@$%9_J_#vۆ,c%cKnGa>Va%#"cO'/45ɏJiZR+ӕi7ɯNi +J0 +աm[g*6Si\u0^k:ßDnaqV4u%@~5t"kwZqI (r?iWY<F"'[!͛6V?O2O{xOф_fчC+].4-?0UO/M$'-:e4sa*WE4+i8*m3V$ +8ƽM|SSR#$74E!%$qoؔcC\~֊x/. o_0<S +×잕ڸs6&kv0iO-_==DWŁcǫ8^%wa}O( Ѷݰ?w=ɷMY?FGB(GC.yv g.(PYl>Lۚi6lٳf]WiOόiqȂ0V/6*YkĐ*+և͛RVN + +zW9oCW:Y3@'` fM=(~|Cy+d]Eu!gB֬ߗCDF"#lA/X- +/qHc^0=$Pf2=7ʶ-iB֙y},aWA"J_%!2Ʊ* +;Ԟ[:h$Y.FYXֵi!=y +91I8NPCM|~Ann%x\QYK$.V#j![86ln͛6*ٳb͛6*ٲ0Y +7C?Fy?bِ"+߅J[;W,$1mi_` +2Q$D9ij%Q"y%$?iiHIݳ;Rv?R`BI2a؎a_ ZO-A?2gPOkrU`%f͑b2yFR2Db,x?+RMv#+CŬ9༺2M&rƛY\ =05Ӣ1'sSŧN`qkB":SClj-_5FFSFVX34MTq*9;6lٳb͛6*u/Mxio Ԑ`~шO\W6l zx9cE9DZs>`R.#17C20f'|#jdW_>cl̼+#eb> +ܢr +lٲe#A65̽vBW+$ʒ -5(^躝[JfA&SWr}Ndqm"coX͛6Vٳb͛6*Ӻ b +?du;^!F+R2E_5,8DB-p9zc5ʕȕg2'gi' +?#> +Ќܓ{l*em-.捃z<1'ju< +V~/ +RAꜺ\"eZ{2j:(ٲf͛q +ysI +`;MbXmXz*l';#:b.cY٥X8ȩ$|rMY֝}wwh:pE~C!ݾ#W'vxI:>k[-ͫn87#GZҫrv.o +U4n[$*Pq!|z +c MA6B0;0*'rBM+yzV}|昼n]pδW;K暝2.= +_3Xy9_;#L$ٳ`CS6lUٳf]6lUٳf]eER>zhݱBT+v/f9"xG~Z?MY)l=:c*`++0# +dhzM + +7)sm^QySOyf@غsUju㐉ݳNw}Yocex5@;-Tu=Nb"FD N͛6;6lثf͊6lثf͊6s0ܝA4֍xH +]9#n[q;ᯑ|uYm,o HLN⃦Xql8,ٳemn͛6*+jm+ǒ#M~06H)l_Bguq/Ѵ + +O$o;̺elAZrAcIҴW4pͧ>x2`|S@n9*14y<M)֭H]$ayɵb]^Z۽_ܰRbJbl/璴/+UT%Mwpљ<1A\}5lbU ^`u4ppĞ/Wމ4/_Cs*8,/Q<'9QRA^A]yJVYZ+%"&_њܐE{W$6v7a<~x˵"w~d8O#{mӭ>1m[z:.:Ӆ+ ~,{:]MI-{KIۍW{U:ye{c~OlҙtwL՛nb xן]'ZסW1\Dz<NM=Ԝc +%aLCO̱k2 Hvvlٰ!ٳf]6lUٳf]6lUٳf]6lU*<k+zG1Iv`,=[Et@rI*{ö)jqhֲhch:|i +0͛l$f͛6lUٳf]6lU }J"éW>'ZNu3V q՛_ZJFʪRA +*I44:z +H +QMPjk֜^yVVzeyXz PUOMo%A*\ϗws +)gQҒ:qS$ف&f8xvV>[˥(erۇӽ\~^nIH_D}4XWr~/E4/#QCG 0PՑј1&|ZQ{&3r#oXtmF=KI$X(2 +YeWYT=pYvVk{Q^X +YjĹ"?-vVS<rLG2V|ч6OUe?'>͟ai\P4aQQI4kGր$OTaV0xd zw=Ysf͑mvlٱWV/7y + +z?1ZS=[A~'dPA +;rP +vlNъ[͉[ڥx߭X K7V#͊!*H؏!kq»9S¸ +ٳe=B=io6r?+˝a:FiPƠ' +#0ygSL+Tc ZQ^PY^W`Hgwfĭ!kxʨ>vf͛vlٱWf͛vlٱWf͛vlٱWf͛vlٱT^w݂K + &u8gCz2AFyK^ދǑ"hw?y~/gd+zC**eWs͆Ƨ D]Fxd*&ClBg+sdT7!I4N/Qrf́]6Z\IlXب7z|e YF@ +xar4#y1+j֑#E,ǘ +bg2C6+֎NZRivΫhl/?-ԝ5ͨ==) +g,oaԠ7XTIKN, p~!_6lq-*̠FE*M;Rٳb͛6*ٳb͛6*ٳb͛6*ٳb#s?s9'䐮# +t&i=q!2jK +4#8UVc7Ip̶pŨʌHMSeۋ)]Fg~OYȺhPb: +-ǐAA4v8C'z{6TZƍ"`~S6lUٳfR_\]5@VF +wέksI,fM>,ǛnH<sf͕;6lثf͊OC#,RğOC#;kh~3f͊6lثf͊6lتRTR^d@ZfTtjp_Bm,2UՈ6/ĮR'CEK1vQS1f8 v9@%ʟ0j^OXh/O{Ĝ.`OOf8<&+Tԙ#}!ZŸF Y=Cą9V9ּU;P|izrI|\ ?8.Pdŏ6I萰cwϯk<4ˇS$FM}>x4 +93,7mcoq'eqgآ8VzRkP(tuCڬw$.̽iOW엵_Yf1(m=>xhLЄW/i,1zz} +u)N{ב3|+H$Y=X +I,&N9 +?\hWMsd.l.o,^-ֱp[%@_ѓ7nGztu<EQ@ +erOT&wzbwXSJ.͛6*ٳbǛGmf`vc]s=<rL cCP.oOVCJ_ +;ထݷ>z4IUn$Q@j0p7jo~_y-<e$<[#/n~3(ųeme_(QWQHÎN Ko⎡Hpq$ +qZc(+(.͛6Ef͊6ͫr2A^~{&]|H +3٥ +$rR;5:4r;"wvlٲ,]6lUٳc#fn\{U~ro`Y+ +g3ϖu'ś'Up~7iO|tÂxs🜢d'ھ)xBX` ys35/[hkaNp9[$XPM%$tj)xԈ?-&;ެyTefP~װ8k42=> +|'2̌D},u+{MB`,P܀&gk0ۣ9؟e@{ +VV<B*lV({cl#Z]uSe&7+kv5XtIIUG&cJTnMpfC2sk[vfPvV( +]&xpC)UMwcr$7S@V`M~6Aq3Z\~PBbh" +H̠R@$Wm1Wf͛vlٱWf͛vlٱT|FIFH+U?#t/UdbJxìD] 7Z}0j@C.xjHi'THqD gN2)em<p,Sg.;|!p,ːOlːLl6lٳf]6lUٳf]6lUK/*y8HI;waA ykʖ[gN +,Uw_ +'-wgS͙nË{&wy& + +ucO<}0DHqrFH/9HRCȱ/ؑCT>S.5{Ҹ#<YBDߟj^qז,Ӥʖ5Q]BM<@ +$^\X0#;AET +o +VUvtaچk4<H5$}zxE +fvVh8q(ݛ6lRu_{ٯ,D2;<$jjvbXv;B)NR]6lf͛vlٱWf͛vlٱWf͛`_ƞL?{/~7&jX +nBW}='2UϗsݼFfQB4u +]g|ٮ'|٧N),Ec̣0vԜ}CACtg><HǯlUN$3"HH3&3B*3ʺ7Sʑ>ڳqhݸ#, ڸOh+RՁKO^!1:* +3MWKȷ2]-I#hT+NpϾmo,6kEch^[Y)J&`,U-Fj|ϫi?04څvi^YsŮfɎ˰_1kZUqsmho"<7-Dž튽ߘ>S46Z(%D/PpfPG_DWH+1at-<_;nǨ)q]{N<vߙ>a&XMĥ1t%|<x^P L5@RG8#< +\@ Gi^5nJ^=dH-6l]6lUUyb(V: +#g*)ݱd (yC~}]ym櫦j1h$ARe(#Lw^i.f [;hs2Iej+Sf=}]Ů<5`*TqSG_2|>N +#O$Ԕ<s!⠡40eHSc9xuwo-}g'yry/iP-XUk<+Xވ㋊)]~]ʜЮlV?4/04p/ʹ<cmlE7]L +[D +HF +;0-dٳ`Cf͊6lثf͊6lثf͊8WW7qrm%Z2T:$NK 69p^ST,SRHzlCxq\M~#q>Gt"ug^ƥ>i!e(pO %.cIrV-q}8FJ %m>VGU<QS˱jTӮJ,K!u)P6A<@`w\_Ca7r(_;}|,"0I-as@bWמQX{EΧYbJ UJR+!,Qg;1 +L¤u*Hejc)nm?RTIwS;&-|EnK"N&÷[rCỸ2z9)kuk]eY@Zq'x]FxWRYi@:lwN6N6WVZii@SfZnf +E_smZ7ePDw u4r/=~"bĦ<}A 4$S0K^8rY$mD:05l8ImI:P=ʅRw`쨊j"f͊6lثf͊6lثf͊/w4d/ܻ.iW06i5|X-]9Y +{qkҧ[A^aя^F\םA$U2Ff'uB\Iw"+| +S}_h6ZZtu'2ۘr=뀏7yG'Pѹt"0 +<Zt|UsLmb.R +vm]Wmc$ =iSau д<H^,73b͒[ +[V?- ҍJ +Ό]nD+ٳfٳf]QTT +tl&I ePUjf7ʞU]INB +ٳb͛ê[Op iy2 0 hye9TrOOClF&(yߗwq-O۴̢[¹1֝u2%lXG1RZ6JY)dd͞uX_LN4jGCo<bб+z~b%X=\ˆR߹,A>g%ΚqqwҨ +~fip^U"3ފ*}y37;%s=6I:u1KZq+<q&l5;"w6i|Q_ga]GOxve>\^'~2ج;Vhž۶l,B[j_lcx_Kw? +MóXt$r_(Zͼ++QXPS6@nxy;64H~vN͛6*ٳb͛6*ٳb͛6*/O&K:=9䁧o?%* +@~~9͓eM,iٳf51yTC,3QIn;tNWַpRve>sZk,ȁ".xe'B>?||h@ҹrvkG\Q(BdiCG& +ֵ"S%l2rN +s$( +fʚ6lU]ynXs`iw +b2;c{XmC3UF(wrxa6桨E@4;_܅iQ^L\Ikk4!wTb( qmfamb $lXP5e8j?ac#7fM̗K*wYhH +><g!+1j֛Ë_-k_PۡEkY}35H⟧]6l;WNOא^a#Ltx,F@BNfˆ0MRFA> ,-@2)P@#)͛*$ +We;ce늸£6eP6*ٳb͛6*rx唎`>✹0َFo 5r)(Wx& z$Nj2h:\;7[˱$rFuJ'chiZuep_VFՔf͛*jvlٱWf͛vlٱWf̀nJ!Ssa,uѮ溎U@ +33blٱU# ͊awp\E`OR>M?Z{9݂IG%oͺDO;FE#!Hejqqbwd4DB,YFq4;6lٳf]6lUٳf]6lUٳ`WԠQ=ڿ#+6lثf͊6lثRsfRCt.B)#ka$Kf́~ZY"u>PMSD9?9 +f͍ +~ޔ~[\՞:|{0^X)c<<}?ב͘ + +5تٳb͛6*ٳb͛6*ٳb?lHxA~) +T_♱Wf͛jGॼs+ +f͛vlٱWf͛vlٱWf͛vlٱT&CYYb7@[qcL +V +t/"ٳb͛6*vX2KWy>lYv!) +8 +!m:A,7VS?,?&ɥx}Fx=)eowpYܬB)&٨P?65M)3pKL|G<ď]ޡ)T + +Aٳf.͛6*ٳb͛6*ٳb̀R-k~HXMA^A1`Խ)ۑ'O~;J8!8㔆DĮrGR<A#V&Jto^CqGn^ڭ7;d5ke͔eٳfٳf]6lUٳf]6lUoF mi0^#oi2سw8}]6l vlٱWf͛i8 A ֺ]$Q*Y4~cko 5=RY[mVXYeʫ|V.̚|5Qb"p)«}͛6*ٳb͛6*ٳQ6bLUٳf]6lUٳf]6lUٳf]6lU7X +\lNC|!yF텵VH+RENg> +kGKIufff*'"~AĊPmٳff͔UslG/_VERM7:6He( {h}/TeU#g1ιBcT:8&@:gNvPl;6lإj<&{V( +3Hmuu:7C،ehږ==092(}HVGA.nui/kDn#'bfF8]qz~lٲfM j + + +u+'54jһH;EA6?E$4⒄Ҽ|O鶦*E+\ykZ_$k#տv@j^lc +ZD + +vsiHXTB=D9eE(X.C +^[y2X[+Ew*J^ކ#?l>k"=++愍Xn" +S&9RR͛6A͛6*ٳb͛6*ٳbLٱWf͛vlٱWbwxFI1LPTU^Oy[;r[iRS#! + +H+_L +NOK;[;te0=<K-#tv%I +UՈF+LD]KVx% +<=o)%ē,YSڵ`/"ii6~rck ,<i?ހl (;'ZiuK.GB.nXF0>ڙ?͛ ٳb͛6*ٳb͛6*ٳb͘nq{.)fC@w*6lUٳf]6lUٳf]6lU5H.du7Brysd~CӼ1_zxN OĽ=2E]1HѸ iG5Tǂ4El_.yomUv +t}181b1 +\bS]褂EGQX +~0dHmF;8` +Ҭ@U~ljiV3ޱ"$n8\yN?tȯ5Y4枮Oɞ$o\ Gyɬ+U/<47R]2ijGwȲ#2Plٰ%ٳf]6lUٳf]6lUٳf]6lUٳf]6lUٳfPZݬ7]uS@w#9Dnmcat)EֵRURZoҹf<S +W20̛. $!O/NA?,|{Y,oUrZI;@(15e3-Vf~/?埗_k6ƚ*lUX$-'o`to*Qyzu+JqT@z>ݹu2[!&>@ +Hmܖ?;y +_1:\/Z1AB: ý/CEYU8zK9_v8mNElQ,** +jyWf͛vlٱWf͛vlٱWf͛vlٱWf͛vlٱV!Җ|Pͱ5y?ya&n17'1m9nӷlfɜ1g$iٳf0[$bU*zev#PW6*i7w\ٳb͛6*ٳbW_*j][M7 eXIa.%us+os/?k>2s%")2A=yu;:57V_߲%U~*+(!=6kZHiYk +P+ViqJap +2W^_[s</aHcuFf ҁħ 4<U?UִD&oQR47Jt_~|\fX#YڥVnq\HES +EƊZI4Evrp*WM+6Z<|=ݼs]ւ:T$8H +`F| +Dkh)JbVM5MA"<aoO` +kDf͛vlٱWf͛vlٱWf͛vlٱWf͛vlٱWNf]6lUو͛x֩]wktL.%ehgS*s- + 3ed)yLN͛6Vٳb̈́~utɵǢȟ$F1h_6cm[4K$"(fg:XS}qeVy{EfZ>1=ُ)en^Uz**zUk(6QS4rH(:iς* +ӥqٳ`Kf͊6lثf͊6lثf͊6lتU6$P_i pgӖfd +w|M^@^IrO|uNru47X:lH c5 + +XsSayY.(c:XnVV5O_~N{pڭO{LpuGi ݺ?&tC<RH*CϚP6$ +HA^=7u=T!LޟHWQQ51kKҼfSc:e-#M]}^'Vچw2am]hWEa9ɿ+6-R3zE,*#2Wp9;P^%Oؽdԙ3<i#&F4߸/WO*swjCBX&IU4YE\anZKDQ^rCR/? +S?}uWjW3o[E& +'qf^LJyOK߉K.H +⪙f]6lUٳf]6lUٳf]6lUٳf]6lUٳe +ӿ-#FYE%0*u +2R>!yTkS~q^0ѫ$r|wWCDuB1&>ʇ{[&>r +(&9̷#qٳf]6lUٳe+qVɦlP#2Rr5АYsazjVlʇv\تaiz3S4uh +dv,u=NWZ#X,#3f͊]6lUٳf]14GyCYhM\ ©~45R8c3gfo\̈́>HeỞ>@BT&}14@ӳf́ oEQSC@EVJ@Rz|R7JǦ? GQ+U˧M5̳<cͷ%A#.<엵H 5/ +ͣ?'0v4 +9Wìٳf]lN*;dGOH0+7 +F+'_V7B=?LD77HKzWRf?YM4jQ(iSH)Pz#tҺb㸰{\I~a%Pr2,`t╍\!$/GN)X5W>b{T-$,i?(fZX:╢>++2,V9˥REj-g)_QGZQQK_N5}B+@E +I䩷*~Sy[_tX/;?Dw + +ҘCmohtˈVRT:<_6I +t;֣*7̈́HI#V1,Q(UZsR~f́͛6*ٳb͛6*ٳb͐5%tjW` +OnMORy5f +,@T#lDnQ iS֍N!$ΨVAWx-, +lS n<\iHӧt*/ 1'j!VW:)#{˄slCMAɈ +MYs#?]bP;0!c/.ZMNتC; ܗ]ҹ[zYM&f@?:W\ߘV'Յ64bQ Ё*\rE ^y.ktmhF<*>-ٹw2M +GX9CxU~(Pzg8ѽk+V +|*kɇ)Ovlٰ%b]ݖsZ+&EA sB[=x<rE/,,ٺ0ҹrWj>}߾IdIdƝ6l[f͊4K:27Fy(L:ŌxoUC2\~64m+KX8P( +ge.tFKn 9B +7lyf͛B^O4rDA$߳.gY9ᧁy(KG O|pNPP@!7Su#6%օ|XKf͊6lتϕvO~`)vlٱV+?@jZ0Rh7?NJ5Gt6ߪ:Oh:z\"'f0 b61͑O?57-"*YLp2*(݅~V+P/]>$ TJnkzd)p#znlٲf͛vlٱWf͛vlٱWf͛vlٱWf͛vlٱVjX + ܂wRWUxB*jE=Bm A=~s]$x$${mR䬤URINXeЙOQ'|Vͱ$ц$ ;*B{FԿ1`DЉZr˺~yKig?Gu;94/g-}^㈩Q }z44sF8 2z܄1pe~N ?~?9Lw4=@^fHZ`ؘ>?|MKkp5nx˱R]WW dX;T>8\V{X~JLī@:Zy)bʀ)|3AFBL,'PHX%>5"e_yz}rüx +3ּöHaN@Sf͑bٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb 6W0͛vSJP9y:b`/˟1iԧނJgQF5•9,eonR]='f_Rݱ?qӘzjǚxߵV1ytsf͙{f͊6lثCu]7F +3j}2Kar,|E✤Cu"O&B2&S5kf͛vlٱVCu͛vlٱWf͛vlٱU9m5v4<PbWf͛vlٱWf͛vlٱWf͛vlٱWfRG^*ٳbV@@)@ +>V&[بTgN$aƹ +&r$K\ݾ<c68PԑU15ծTeV +9-BܒP+ԟ| X +Ll()REjVu~HҤcӎEAާ잸5 6D8#e9ѭwpCQ"`e<C+ڧsm#}gVejڇlf +(hTto%>O-eLuPAq;s3m\_2$P(?VONѦմ`> + bM +7<Tl).uspX +3}@6l +I#:b7WgXҽ8ՅS%{ݾXWԵD[[г,[P0ԯ=B#Ƈ`}˚0AB߭IJ_$Ess#ؕnky[WWE=]@Iu*Pӭy$%Y%sL?54)n9jN* O{n]'M;/'j.-MV +Sӗ3CB +Å=EEh~Y #lx;Yfȥٳf]6lU%k/ $e֪|iUGM= + +Sl!s"TFmO,xv0^-3ܿ6]z;~rI*Z{<#O!:)LOKvEM[ +I&tstZgb=o?:,B;z.lٳ{f͛vlٱWf͛vlٱWerwiM0>"UkwRwVyTJޚng/k+_Mܑ_cQ)1%Eqn=)cz+R(j@:pn9a +}B;/S?#ƘbHٳ`fٳb]r(klu͛vQPH>$li]bĕ'`iJtQ3+5**(E97miW6Zj+#҄⫴jv4@_u#¿FMU6#Cu]<mp/h64iϩCD" xNN5C~EFҹ'VF[=29ou$VZTv.g>_-:W[dEĎCӧLU5K_4]9naAQǁܓ~Ag.ɔکtd: +"#ZPTPf#ލåP"/J^̝+Nv$|QCT6BKHLjKr좀8_pHHcZAKw,( CVg+o^#ӣYu[7hJb7z텴Z]Nch9tg*z<[IqmiB@vZd-/?2Dʿ;UOyn^NYo<=Մw_ׇ/MZ1MO|'"ejP8Yw;Mni,H|a +|.ggq2*1YXBIik4#\y݄PJnzb={RI%AEmS)G!gU%6fwV-5:}o,aM@ޜH,P/;bλ.Vtg!Gګ4Z1M̕ePRrq&[,cqy~e}JҐDP1j +u*yβ.ҡIn8r*×D.|-bjLXyIJw⇦jWz]=#&6n@ďqA*4;>0KpX.6 +PwTg5{sJHIY +A( sF(FGw:\ x28yD4-rYyQi@{w}FvH +rkBw.嘸G<b~ J`sj)>KĈ +Bʜٳb͛6*ٳb͛6*ٳb͛6*u=|m%Vp',*ϷX7S%RD>l[R>A{ǮNXlQf͛ ٳf]6lUٳfRoMf^(T5Fvӭn. +i<2=X?H鄚;\$WgpZT#FsxJ@яm&( ErB3 bK5(A?E/bQ$&&~"czSq\[FR o(O߬Ew3 +94NcI@ +KH>$tYmi"ijJQ6 +/{{(VLOR +MNOB=#JѣHL!Bu4;6U64G +UȳuHnOJرa-~pT-(mH=D)OƂ-15,(b +9bM<^وr*YGݒi4MkV,(CJ/e!bixE?<hi4Z:SR6<h(gkA-AZ|?4^YAƆSNXӭF#SӍFb +F/Lݩؑޯ\U.5Mn*-( +9T}'*>y#C=hxtlJ -(?YG5#j9G (Rz銳}{]Ie0[ +z{TEV!QNN#-!1otDmɐ4Iqi3L77!ˇ-_@k5˭/|#o#b~?u};K*?|A4ϑv"8x#C3SC(ܔ+@j̀!j^Y-r:Ԑ_ƃ66ƀu3]ZECaRRy0ge9VI?0c˖\B:~ሄxZyTbRQUg +-ֿ +2?Px&,B'gc4g/N +r֕k%aU$Ňq^w{Ό*O.^MmhWxc<kZGpƠbCZ +W#_z(<vӐmd DGWf͛'f͛v{.sDžRG+3aA}:QR4IFH؈RiITT@gpYC& +ҔŪr_{|kΒ>oP{Yoy@~t1-U< +q؊ƌ2_Bdf%,/bNmTǚ23+ +u[Eq +Tv>o,sYIR7QsY/')ד-}55}9$ց,0Գӽ<*zeٶ~\ٳeMN͘cee]U[sɿf]v{KeT*ǍO%"8/XIx2Si> +yuPYi5㆔ӗf-R".eݍY9.fG6qW+W>#u\8 +3Oq*ZTͿOX4 +FzSp7 +ϔ,=N[=>{J҄P~1|~_m-V1j$ .GSO,gB4}/T".ce$\94?/z1tky6t-7Bc}:H9ӛGX*筼Qï6yt'0E"(Tt osa +Xԏ)^CrSϕRujʾ8ɫ$/w[L."G5ߛ+,1Pi_˃6Z*}0N⬊O($^ďeƕy +@ +ߑz?uu&_]r?=T|78"/ʟ3|ysb7 +}%[AY|ӭ1R@':ThmڊǷ]tŎ+zXo~f6mE+a:j@puo.HK;`SYBWuO]Eh yTyp%PO"iNEYhm\d:7Ma<kEDR\ 5I4k&g1L|A: +x`.`:Q\49%36^{:2,>_ . +Ey1V+eyԵˆڨ=*lx?9ͯtn`%M2 +&Wj5xVUVcHl̇PSOHB -(? +m?|1)judZG(y3Qij32x'+Uycbf +x@S[FDAQCRAmijS19ֳb+a +l,Iɕ^8*MBQL-#8HZ14S\ٳdY6lثf͊6lتbYPAZvc<[335*ıMf͛6lUٳa/Z*FӶ 4 4fQ~`^iA-u 8a:wGZT:|S`p0;fM:[w`w8iB7o .m8h$GfC]_y=4iēY8xG-)i"͒ S!2;6l.͛6*ك6*͛Ku2]Nբc,V;V,9nc_p$~|c>Cn$x)ֽ~ƍ{wD+2Hآ$OCqX1{!{jq:ȵtV%W@x;x"m6Zk3JгrMD[^](eڊ$pּۡHb#pHuHdRenFBkvNOo=>cJCNޔ$ +Xo!xdI?uNIB:+]ռwjVΟ!@ʯ:y$BoT力_M}7`tn.<`vhvڠ(($|/|*ԭ7ʚ+rȳUO'7'}`on$*c~'Iu= IetӍʪuh$k8m%"OZ^,8-G +9PO_Ë)t0TD+vDŽ=+_n4fܫ -AV⠪iy[WhIwPiWU5tx(EЕh+ǯ\/Hdj8-Vb*Gөe8p7NQ:g,v$ёʖn܂ӊ#1i~ed:$jArKZIY$?˯+kO,Mg mUb_դuXiΕk +P ++jd*\ZWScLg}ۇ~+Ov, +h +<Fܿ+jP0I +Ob2Gcj̤ߦ& IfKDפ& +|,4͑wb֗Ym>GK٭vOhcMo&kRػ`G*Ƅ֡{գFw!fp7_n3vR3o{O d/m/y2\Gey?l^o? +4Cv#bs*UFy-dV#oQWV6l vlp'3#bTw@9BE+WlYёCӑԬ8Th-ŋvoc)DA.@ADU$1;:ZT$Fqs[_E&5< 5B #qle{1H$" j)Eـ[EIs#QX֣lGyAU=F=#T +O<S5e`@ǾVוK?!O|<-ca`e7OG->%>=:Cģ-M؏jcPbqѲ_v4ȈT2ȶ0m+^;m-]zo֛q<1*ʭBuO=fR=3.(t`f͊6lثbR@rNg-WqV'^nC!?bĩu4} 4ܔ5#vGK%MT^\⟗yG/g4^PImӾ3vקiY!R5f}'%,ݜJCt-ӱ,#GE'7 +Ԏ6D+|diZd5V8*a^)i">:ne?}--%V4*}'?'(Fn`cu +}[kH`(I"e'l]6B@VtmwQdkJLY|s(eQEag_?i> +Ҟo:D)HV_ +l+#/<b4NcygF%@U-=*:W7w3# -v?Fn|wsy"z>o&! +0(HChgKÒ<2Sbmyi@>{" +1= +#FO8[]\MK,Q//QrC~z|Ө$V]%>qzS*{*K9DUЈ:To4}14d: +|I5$|3[M @g0F*ٳb͛6*ٰ=P{uR9StK@5 +Ԧ*i,U[r +`K +jp,V_bE8]˾Wռ5! +{cMœYY"X'gb[*` + +:ᲵwVmjr<?6oWPIWQaٳf.͛ + +1ſ!S<ijܗ4-OLiұWKz}e_w"YN2n]$ߪ +,{o6q/#/5?3=Kʵlwx\\E"wU4;WsfL^\J"XԨfn%|3~ji^G̐DI eX;Lzao,/< Og@hH+aOɧĴ47u4Om +r,Au^_%FRs +k~\ʓJ\Ezגs0 צپ5iMYF_QٿO4ѹ Mф4˻ƑjVuSАwG- +US-cma@%EP'~Gv-֫\qEETL]M8x3 + + +x~e&'Y \9W"6ޘw + +@{c8D[??DmCK;;(VF0u[ʗp&%ang?|Uw7dtOKhH3+q#NY[O UybG`AeaM_@NY*0hd7Ich"P + +H +E[r{Hq}n'H֢XnWMoωqt:-Z%+NFjjqYccqN2/*4+o7))XLy+Iuy:[HZ[:LsI@" +aڕ +ivib,݊J]=`f4?]-_ˑk"jd +kP2]!y\w"&K` |@t!z}9HxQL)eiX2IX!IU$oV˿16%")QYlaVڻ½An +#ZXA\y}PELӵpf wr-sqd&u$ԅyNYc+>E (Ǡ2'419(H \SyTg)t[}WjRo5ǒt(YHXۯWFK͚M3crf4*ῗ[#c1VR[ӑxFdwKtsX=`|L?:/ +V5q[b(WV3\O*åQduF7 +! +fP;Pj + +_*mWP١Pbv &4~8iK)ouuYthdDઈ璕yS|qđ +Zd%ItުWoݶi\V(kwOg(_R*# +=|UM~'-Ė\MD"oPG3zܸԟ\3]N{༴hV yE>8ã+cHҴZ>vYTei[ )WDY.D$k;b.YY#xSl YR PwrHl4|ۮyR}8ClAIGG. +C\; +́?LX +ZG7֥ +E] +E] +G/YE +IK?vo +[KWHRWOcFp۽}1sn +ߚ5w\<͛vlٱWf͛vs/1^ӏ.jp':nj;S˨M%[\@AiK&2E^ewɎj6*ٳb͛6*~gQX3 +Ds()P:9/~9(Oa^Zedε>O,*}eZvI5Kչ4Z, +hãq)=^7MSN;).cpK)fUO=/kbo~{:<h?Mk"ҏ2[:u +PGkz5yqCJVURfmKr/~8kz +ݕv +I.ՏG^dpĺX+h$g~bʵs?_*]D/51iV#go Ϲp +ƾm˥q/Αqj[y~$eJޏň$u߬Wry5MsFUfԮŴKmΈ95fߕVZ'y<D +vb-d2T6lLwt4H:qXK2"Zja5j_ +] +Fgq|"y=EG)A^pݗlԼ=ܤ,L~GߕkQ\-Qi6v6w2)%pţZu +7mHT<R +b9ʿw4~qyZKYe͵Xxc;JÇ +nӿ#Z6[ ~u V)?ߢm&g0v +jD'/Ylu!Gmj#PƤ+Tԓ!_*}CCH[U?+1o" +hԪw,w^+^1~C?<<?bݏ-A41"beKS@MS)OdOL,ռťi7hKII䕑*$T!NLc#IaT& +<kVz6[K,"*9[õP$/lѮ߉2VR@{_wZ緑;9X) 2U^]So<%r^Y?zSGOŷqVU) + $; + +ң#4}c̾_ɶ%+'F(CjY +j4F_/<6=Ԫ\\0G)^Q(cW7旙.mFm:OYeA =;s~sO9y&,9n"KVE12^Fe$Ɨ~>nUY!0܄gC,oq>AWER +IAROr ~HcXb١pH屯UB1mKitVX/)ұݽίhn5ce>W]Z4(nW0ۚpdtߦ&?n|~կ!Ze_A{UMB'o4!?,ѯyK̉n0)@\DӢ_0Fچh* , +ۣ +~'ie,:X+A4j[҉ +Lֿ3l[Ct.?m鹮yBcn̶r)*Ul9̃zL:GR[%~(ddhX7!,1ʷ'-\ ܅yԐ)Vjr0yHw:xظ+Zڵֵ̚m'[+{XѲ8YGfZ +]_5h嶷]EPY^oٗ;*yH:'冨{Zj2I"<d$n̽yɺC̺%ct9`Ζҿ_Xܢ^p$U$y$yKռWtbɩM49hTG^o[J.[HlMCD_ysY5[ZM1d* ֚[N0I+8(,B'~j2^_W)ڀ_JZ8~cO\Y_>뼵Kh˩z49\Q,nm&-$#H/zOl<_3_Nӄ14)*:2t/qK닫kmf-R]~.x8Gr+yK̞mХ{uPi~9Ews+IeS?«nмyXeuk*j?xz"1?CfMv3H#Trs9p77rJdsJa4jy +mL!Ϛ- +9NP!VƦYɭ{bmGjRjpCo-3_JFP*2+?){,Ieqq77r +O̥F;o*YG54J{s4 V?DZa@'ez&lٳNlٓ +0!^LjƨI +zu{ywN!niDJQ-:Dԭmkۃi!FPS[z=3Pw.[ 7qMQjal +ǓSa|kwm܆1ȝhê!VLPZ +.͛#e.͛66U٩6ZdP+ւRav5V :cb@sf]@3f͍EC +X͛vlٰ+5X(i;6vlٰ+f͊6lUٳf$S +Q0 +(3f]͛WL͛*V͍[K!T +);6l +@ +ڻ6l͛6WS6l٩6vSFN@o͍xeʻ6lԮRQ@ +͍j66Uٳf9sfOzR94EAsiQ$_W( +?[ :̚ң}jKqlJuB6Fx<Ǭ]Xmo2iZUxUN_-9aS:7(_1^|XtkYY|% E_xtfmF*Gj\ćiߔ +5:{Iu_Aj8/.Y#~ ]{i?ڷ䇗quݿq72Gܼji|$ +WܒCW#DGX&mgP &{ksɦpt;?^Hγ~GywQy +\ĜYtIß2\hjZ?mRCAOݺn6o\L[M-ٝCmte%VZIl3##рp*z>@Z,5ryiem +Zn<w(f9=F2R5UNk +7Vėwc{S²%E,d⬵'>X=u{9-#B" Ұ˟K=JJusK~5dJ5ڙ#i>LgeI-5 +~ڒ~6R , +t_K_0POOZ*ƥk,*go=yɤ^YI lr=~|Y/,ehf2?&U=Hvv:ޠڍ,'R*2<2hf'u9{{]6ku-1z.si\x㵛N.5("<hi2zևwk=ҳDAF$k]\C*$B$B503yhOs}gSa%ԠAOp162ͽ?̾bbU{`fjzs!dX\2`G 9<q%9 G<q{+iZzƙpwBsYX ?GXR_Fy_0[f2Ol@G +Hhd~?1Ik3QXU ۮUe(QcET* +1GzeZw95eajj{u=?M* +:F FNͺgmQ +G +_ lEC<բjS5ռsᔧ5Ĕ5rI%K|k]bnVޥ9*! OGK֟ygk|-n@#ީϷ,vTO|_K<}mJnt +,2:[h!R|=2yt$SBb'zl?~C[krLNʳ$DY#¡`zז5}]g\u6nؠE5(4kYPFH +~rxǧ^:a>~iǾO<4ѯUEhO!48s7>mvhڕbV(.+#CJ,S+K0?44}Cwx.3ni%iEQ:?Go?:.tϗ,mfeQr^9D|c5AEgOo#Z#T +R)zG +bX/b*_F~Vb|5Ŧ>H'#5fJxa=#U- pN"7_?7aүAۨ# +aO^^tO)I#l#<ҾZ<FC= + y +ӧ?My}4 c Zutyng`ąݏ@*ND, +ҧ,ǎ&"ٶi>h!{ؖX|;O i7f>&,hNq-vy,śA,jb}?swxȩxmD٬ߜ6p&m&M1UM<i-V).n-$zylC̒\^U_y{WK<'~`+suS+IQ٨bx +1PJFcL +#}6=TcQ6JLnY6.t{me#>h0~c?LM*d#I%y#@Vt+~\ysMʥщy5Y)79,~j~@5kX8ZIQDDLWݍ+ο佞<>F ^,7*#,$X@ +!]`"a5F/Tm2tDp >זtV^\;{p Yʿ<>f_"Ep0> +W8}9+w叛4k{ 9<+ےdna,C-*KYb8;@zTN@CL9͏V~Xi̚UX +rQ,o᎓yy]Epb.6Sn)6>,i!gm<涑ݼ\j@Y:T]ZƓg=x7*fy供u閿[YK;u?8+ߔNT5;N{Jq9#Dry%ϽizciKm$rՍ?5t[]^KİK"7FR)Csdx+i:zT$q6?Lbxo_|y^VASAשܓ$X.YGYXXhL%Djj}X\]Pү4RQ70N8A/͏%YOYկlIG]~94g+ۑZl6cw\F#{RG沣C +֒/%.zzX+$_)[WZ2H_P֓+p(y<r^u~OK,eRi'dOV.nNƯso.eJBP4ǍeS*<[/;Gn'i!d:,qL9&:Xo&'*Lz"͑%[bT +bZXqh^ +џs6CUO.[K-W0,ceVj2?.ZUP@~*alF^d6B[TNQ" +&tk^t+2Y&F2ZqUtU,!HwY#n06>$ՉX\ZZėw3ٵi +REbO98L-ϷשŔ$DO0G&ٱ%wjKkFP/4oT-ص1JFKL|ߓzmVXQ< +5=sf2H+,կԭoRA-|oU⢀S<[/!ZojJM4IdjvLz6z[C#@p8ב"Y~`EivORD@t3Ue,~$̓@y1]iڥ/O+|%r(RH߃rNh0h%(dE2n\a!O]q%ϽioT/uw]}dqT"D4ҸUuf +>#]{`+~U>PU;<<G+k|IwMJ=ǥOe%D)`0>G̉E)!eD5W49!͏+KIi4b2a1Tx<yo(鶺m/J1r5cNĝfiXmF<j҅Ҁ2u0Z{k#^=}fxZ`c52 Md6eRު8ju7M\Kj7j3 +7㒼<IU*W-XONԂeH;r'Vߣ<écNشBi!!Zm9%JKg\i6Z{дS7 +>]..n&/F{/ڤj\fĕR?#mi}.~sß3~WŅ^Wyz_Y2e;]No'n +D*h;6Է³ $>ZeB$w!:5oJ..F=G`F[gK-I-Ⱦ1_FKÝr[fueՏ4zs-$0 +͐0nWrZO;҈A2}$zŞk3ʡ@Ë)3a7ߦ)Ӧwg.j^uҴBM~v̱F<EMi|*y#k4pܤR +MZ<<IA"%c*V] V^c$ZlRy>^PX)&+c_+VC#1~ci7zTsGd[4KFn +BBMҿ +z1N>9д]Z=rDYWYP8eQ!7˧{7<h^,0|Ҽk#zLOA.c˹Yl_oJ5dX;BŬ^ұ +ŏC Z%ޥ)DyV% +㇖ uJe0<$ULή=(.#Pehe0Y*^K^wzuGbkIX'Om9 ~qiVXXʈLdm5jL(ңRZV@Tl;ϚWPe2BŔz.'цn-ZSeЫhwj>ו?094DЊbf|pO,ust}OK}_x\|9_%gy9?^LzIԅ\Wtւ`# 7GÖ Uҧٲ3o7)lf72H"i]T½#LnV,(<沒4AcPt1ȋgY@7[sFIHet%M$ZOV\څ[7C1mfާiݮ<nIĐEHnl^ +JۢpKSoΟ,x=#rX?z +*v9·layol[_ӾRG̈́HKe9` ǧhБg %䶮^"}r=Y/MO s46$<!*$S_845ET-\ҘSs ~uyfknGIOl5W;H`C,~#WY&l"мOQC\Vc(*P~pDybD$lGhdml|9w+6͌eFvX͠ +Tӎ]dO˿W.ť +~ESk>^䶓B$q =vC\|9]R\؍:1ȡYH o7[kI0E_uM}MC[%٢rVT5vZo5?5];ydfR4FEZ.kǂ]f^=䳆EwoJ$ARHJ78˿:ivZ +nnU8>jtFES_+IQXS$VXz6ip̈́EU/"ս<T62y7Rr='[2VtOM)BbA"Hd/͍7og4K4`4m)/瞴k-5i/br=z*3rٲ/o̍Imm+<k:7ܯ +%z##,z6l+Fa{1IuKr;݆k:g=ITT*͐?sBR)$0_]HIe,V{ +k;H9o`eqQFIdc1ƿaRٱJ'Dpr +oq/-jR/|lhq[/*N3^vO:y٣_ @#^B +\DۻǗ +2,)ʙ;_:6'S'&i:/?.u}Z]?SVTђK325q-)RK~5ؾ#~i +I +Jѫk?4&p"%X0ANN +jkVɚ֟tKp~Ա~]2Y2Fb3z-KrxX%"{?8^y ŜvB.uLQC$R\|MK˗z5ė +K;:d]ntyv#2N)p[VӼGt4OӳaP?i[/cƦ4HK;i=HS9{O1CZKqmgVJ +44/qEhknY$pC;s¦'?+aԮu0_w5Z/pUJ۹H +x7fS.^x'Tde8sK +qu- i#%|9+ +|DLZ?9,{wJ,$0zos^YŨA$ xRV#9]嗛=~DIsm +I +ӵFWB,KT41X^-})9z,,PۘH2Θ\CYL.yRSr[c_ f +7_;Z鿗";{mn7 ?`.J|6yǛ77P7("x}n=OS$F+o/oxޣ_qq(ʎ>S~d/0 uEZDe,N _>N,E4hI1ȧ6BPEiޟ}9/Oo_MMfwxKkc껴le?c~aOAm_LբMJxGsTaQ$c"ZUo4˽RR -ƥH"^ +#}v;{_ʿ1]2([x5-auLI_32_fm*Fֆf4 +Miqٍ\Le2m)ϕ'V/u-EnYc{x/sߥqh?<7l9-ѹ) +AkW̺~$Be}/I!nxˏ2Z\WbLo?,ƽ24l<H]۠+4|S0@E5_%^Q[OXMw)^AB +yIwV߷L<pkj=e50iL/9#T2VZ +dƷyq)mbH@aG 62vT߮Is;鿠OMс2FqX9}/O$^7zz/̩EJEu4$$LIM1Y4-]ZԤu;*-OL~kږm5,,'8nEXбl~~cqկa$.B*E+^<FQ +HSǬ7tp.yV^[.RYIpEIH9pݫTO|2@yB7Z$0seo>9˿$-ص٭K[t!v?W7jJW,QRi~]E +'A$GzAԚTW»3S5zwZo>Ցim<_VZm͕y +L݇.qam4, +垛y&^,y;{d" +Ta峄ܐ>y?&!KX7vukq?9T>Լ揜5=FYM9EyfR$T퓖m[`AGZG+;o_[ZM#r8i˿ߚ<$6\\+{{$9cc ?+Pqm%M +ON(͌ FT5i-U&6 +@i"thTQ2"Iy̶zM՝mpы $*~ +wȿ5|^QI¢m풧09S5Msaܴo;sk#绂)Rk2 m*ZZPY|=[V4{+on.Qd,{ +c:u%-askRkY#,˲E~ZcZz*>ת +8?ϓ|gawCp#qJ+-Lf<Cot-&mFUW%$7Ȍf͐jٳdRٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*}0'6d +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +)뚓<aUb4>sRǃ*lFjOqyV͈IS?0ٱOq?}[6#IS?5'O +6l +lٱWf͛vlٱWf͛vlٱWf͛vlٱWf͛vlٱWf͛vlٱWfQ6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*ٳb͛6*}0'6d +\9zWn;/F~'ꞓzӧʝ?W^#^)~rZW8܅qk~PѢ&KQX>#JXw%ukSYIn?yHKrWl}u}.ʜhk) +S9}gߗWw7멍b^f*Wss5z^~^>!ʔ@~/Q)}u> +\M#OFFfѵ-[k^}Ug=É.4~/ƾZoKgՅk_O㷿9`x^=5m"=bOnՁ%{]۾J,tMJG5u$ +{~T[ U֩=sCyV|-ס?NO:M5 +r#ƙ +oPF&]mXf +?? /G=N]OW=ޭ}&ygܖZE2噎ǶL)yM$`M=9:vs/^Kd:_\?B^_>ONZuC$!%/Yt/iҴ7:#,dx)q~p5,]F$Դ֚ѣsB?t_^&2rHz5z{RmKQ>¼ycÏwLGKb-hXyG +mv#~O}^OCovR)fm:R|y3KN)kZ?f<ok~'yr=?ڧg{ūt3i4[{ +~RNkkwFUB9,ܷ)m\y +*b~y}sB/qu;\Ep9HXhW:'Aǯji +endstream +endobj +159 0 obj +<</Length 1464/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + xmp:CreateDate="2016-03-19T00:30:32+05:30" + xmp:ModifyDate="2016-03-19T13:00:19+05:30" + xmp:MetadataDate="2016-03-19T13:00:19+05:30" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:4A1702B99BEDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:4A1702B99BEDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:4A1702B99BEDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:4A1702B99BEDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:00:19+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +251 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +252 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +271 0 obj +<</A 272 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +272 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +245 0 obj +[273 0 R] +endobj +246 0 obj +<</Filter/FlateDecode/Length 2807>>stream +HWn=[THDIIIܓkC\cr$M!8_/]{-9\kXy8]Zs>{?r5lՈg[GF^4¢*de}bv磓XoFyٵ:/'/~`AxsZvYD2Z쓵\9|Vߜ_<ܨEkN<gzrW5O{/~{ƧnZe߮n|y]<tUkz'FOXgr9[t[NF=`9E_FƓ^{}:(۠~A@m-k'~|SdU] +尉dNDɬeYȰ[͍}.!(H%P[$|u"٤,Jr9p=B[ eztJLu+5e<O%,qo!R$eD*bleZE LuD=^a-~'c2^ +1XaTnwy%E)x~r3iJ{rꊜLT+Sv'40<h<kGCoRO8cXXeՠM<61m/[[֩c7BJdE3?N]ɤGCu0B0(mvyc4W'_jUT{ n|E9!d_3%Vr2sW$:OPHS +~v3P9vG8Q=ox}J3._jVf6@J+R` +*nPӡ(`((k7oOWJBQZbK--":su"GRDJp.zeE&>mmDɚr`g9+c`;۴ ~櫾[wj#p"Bc[,wPk -92>)R2]N>g&neeQJ5ӖԥA,<+U772Ff,RdVt*<Φw筢7,°#϶ܠi'Y3soY},PahA\_v4I]Ygu1pOVfby +ktv@"v+0ghv +}&%Qb'x2չ*Jx]*Tjj\m¼ǟ ŔV;b1wYn\ugȊsDTHQE$o."2T ⓪'fP{QˁwQHf:϶4&&ՎUa"^~eq]`}$\94A43v6c&dAu#ka "sоZ=,kYʃ裯a߅W_ ~GG)@SIԞO)/uU@Vn\,B*caR:̡N[-Nfݺ~hU%$$-hԻ^aKUFhQ*oW1,CYvj|v+0dQqwA[bBџ HB;aAVG; 1I{U\dBwA#}#{[Kׯ80lH# Jnh1 Q6|6k6|6 +-(,BRimt2=q02M!6FM)o&ZoPF'=U#<z'G]-;@WE#;R%H<ngv_F-͖hd۔+i«椄 eb51D?[Tp#ZK$@Ji!V <4Ds(! +]h +9? +endstream +endobj +56 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/Filter/DCTDecode/Height 311/Intent/RelativeColorimetric/Length 35089/Metadata 157 0 R/Name/X/Subtype/Image/Type/XObject/Width 467>>stream + + + + + + + + + + + + + + +EFVU(eufv7GWgw8HXhx)9IYiy*:JZjz +&6E'dtU7()euFVfvGWgw8HXhx9IYiy*:JZjz +?NNxnγU=;ʦR[S7pl$gg'XD+7ƳR\ +2A1XD$bTt0U91-S;kj즃$Z7JWT@YR^ +JULfP-+4;b`7@唷i +ȽJ?:X +oJ +*|pL1bz`)cz5q2C1eA@&JBO`t1W>0X<5[4٥+=ͳM!8e$< +ݤ;ӡ#-ǖP g.0xeHٸ}1}?v_`((pkP~R=v}:o{ &8w1DP#OuLb#R9-683>{JP$*zvxA19ؔhJ4/iJ@mZWQ_b+Rr)$7:pX_շ +FZ}iRIy +j>MLG?Xj|z0c@1A18Pkxe$v88(MK l61B6f$t>í1Iͯ|7N:m3c*#~Qoᝳ+I7wOj+QzրWzS9_%֟VC_?G&P5+7>c|G藚R&`v8v/ro-y-}&?⨍w +G办hz)r]vN1r +Cc/#ANo:}pGcmn%aZl: +EXmIԴˣ'{)O?i^mе+cy5R奶. +TT];Pa͞K*!5JA'k]>'>(q`PE~0x-yx_w($pGa]L!-[JD hvïqVv{9xnNӭƍN+V$E܃db$fTCD +DVFA$҅Xu7it+QIӭHu5Bz?j1k!8YB̒P,jT9P>pm,`yH`cAQxPW'jAq)Jwc=MZ0Sѵqdbt)zϙ^Ezxw9k5 +Tn?ii<{Yw>)Tc IPny"M'6)R]Gڦ7%?EŨedX?tOo ^o=s46bX,\QH@$z.i|]s#i#uu9Lj +y{׆t7(= +TH(zqIac됎)JB#4Ciuox(%vuku1V("\=umV2V3E +y6e7<[zXxKn4/BJ +I^U$ +VϪIoU1F)yRT;þWoh,|YꨖڒB9?హ晅QެFV fZڪH" +ʢ\\p(J8@(J'@= + +GEVH5葺'Tceq +5sw,ג_Z\dh&WbIj)`> /4SN2h~fTuc<X o{pNA={caX!ZB+O\3O=yHY|CՀE8ȕ#a)3"2c4_>Qm|}v|id]U]%$+UO8w9ĩg/-9l% ZUz1%[Te +-N̓\EZ0֘/SS +Ni_/)FC%,vh}]=rᛮlȶn隧6Co6٩]ʫƙjMH2$&ݲ_ok%vAbAZ##H䆐Q +3, +>(o+5 ++ɩNGB>*tpkN +[^N0H5a_t[-AW<m֢J{?3qj<"PCǬ +nC!\.CQ#ybT"Xt8і@: +dr9&eiT2`97]?^,jqFr<+XEDׇZV%琟p<S!4co~di2'aK?I;K"weD,:?QLlCtEi<c*Mc㜫OK{h^i5 +ĵ>/6>"`Krv@۷iq(;s6iV& <r;Qbf^+ʤU^o|Tdb[ItIYb(j?ZWyg̏k26=UndO@xi~O$UZ9D"Jec-yxhJmZ Pǁ+Uy@\V=SWܗ-oqC(93_j!ser+ZIɖюy[3͠Ƒ$Rx#˰!$ 捚$a2$?j*ڲv:ȰYevbVIPhru~ +(: +)-6/-nJn&`$ +j+#l&I^ܜy(ˮxW6!etztϿLOp|xAfhZ>]x pRvIgbzW, yd!ekkm<kYdTR+aH4n6lإ/\Hu(22U} HU,pA}19]2eQ۫nr/#ku؝Rp,6;:naGQZ|njzDղEs<7rJ.I>i>dM_yD +ңī1*[cclk$^:x*PMd7ېzl#5s4M:e#T(;%$Mjܺʊd)OJ<PʲDysQ9)e +<+NEe48{Q|W3*zGaN٢?QF`cq +> kyG:g~rw/~C:ߙ>/^Fej +܀OyfR]OwVx._vTLMHb>Nعs;)a5D(pf#'Sȃ7985DLpfqٻq졼0e+rZ0IgĐM-S^x4ibfbrBWoQ + +ra-@;bJm,7qߟA:?<}q7xa0X?'G<{4ӭuWI\RٸR79.JנNysZL׃rh +*G~-O,u1E<:jz<En2'GgkOCď&Ɲs^6':C8JHxEskZvC' We^YF +F)OrRpnF\M6fj&[)I"ɡumBۨ7>}f咵R<2pt ~{st!PO$B z +|3q>qdAG"@;aiR[hW~$5A)omq^Ԙˆh5jUXn'f"zB'#~۾uՆp@nqaPa{TQm) +y!s=ڢ}1MR%ZLT(6z%t?6 +(cml#͇C1\W_cY״=.Kmͼk0}f9j{mmT8}W/'y5,(xA mD|4e#!R˚dN1Dbʭ@85&`_)WNT)?q<rd 6yaG#~̑y~U+Ќ@Wa$vܤjXz#HCQVvdvӉ{!fo2yTt9P{J-lѯE;$5_/# +h(mqDT6Em`uS$:a:̱H$T,\n-3?!B),nb5h`Ф6 +ҧߜZS[n㑊_X8%dNL7eH.x:ЂŶm] M/MuTH &,N* +xDKzG;墥[7vg= +aVȟf|,{Z{8|dzĂyiSb +Jv%5zuL'J1O4%#Us,$Wej +Brp@~* + 4pYRPO2}kM,mR*F-:pT:+t̬sv5a#_f +a"V? rhzuƔ;oR ;]kGNپ*7\:?iG#L~_(^Dvoƣ¹7+sGvA`@A"5u0aPr&=Ŝrw[w)Ў1vxORyJeS>Hg nx5a1ڎi;KW<!Uq1:d-w$HZqRC2WI`R`U;PJ@udD]tQ&n\y@&ڲ$ɇJwml,oՈV**?tA5dq$Dw>)j_8hǨ߆ 1{9?=QC6{Gyݽ1盋<w蒻 p +rX\$,y~隋ivPЩ4Ӿ2;fD98vمOAOոՒ.|#VU9WUe;u=sbܫ˖?UDjȍִP2WcP&*_2 ddj),ۨ%'*[{xn99C_7P@ 0y_Vkj!611G,f4.k$Q0Wc2B<r'#*I#Ė(ڎ+톺EwNu{4:Յ M,"$o"+#G*2j<Yj/I(O#2{[*P}*yHHY]SSOZ.7Quڧ^NtsVSl֑ZG$*<%H>FZk^Oy"k',vԭY +ROF=&C<$o:'QJS(aAR;ſ&FJs +Dck}:ve# I>uP='AƄxxn|f]+C~FFǩ=b[k[WsN}0,a?e+xss|A}iYQmo:V[XݥZa!TBHe;'Ӽ`-8KǸ?X۷:.N:~w=Q55<y~iś[Df"xMӣFdS#m/(J7_NE +=/0ӗsrHnuڝ;\>Ѽ:(PRѨPj;|yM((n:4-5[M!)I#No +g +ASӾ#W(,lT_-=*st=JׯZ|=86w +U! ߏz$ǹ͙!ȧ?3mRzSA +GdbD?XxԳZFh !;˷rΏsG䍫-k0ӡON#ccTM +=;/&y+Fp94;|}2=iy~iҿPE-KSK6$V;\DaԒ$fFRy$xaǎdodykDfTF@qal~\W7D1iO7n@x2|ۡf)o(ZR$4*7L!m/˞[`5`7Jeƴ<a="YuKt˭̚ +9!n[uJZ֮'aJ8;ؾc{KOӾ_2J֮ +vhd>;^P\}Y8 +KRq2øXʽ|FW +xRS(XbşivSx(L~p<JC +)յ-j4W$^PKr&;E^$Dk +//#Pr]ʋ3IMB[B +{12xlGN|Tϭy'ZX^]}V&~ +|QXiY`DIB-?Fu:MF%ޢ #xt|:fDQ#{Ȝ2.kjfٰ-#"z<u.. E<REic&J>!Q +@*{d<G#v"6huzrd/*rEWoz?` p)fƛp: +#߀'qT;||C@Q1PG#)2B:~ +ߥymzQ-M:æe s;z>v:_DU#SɈXMI7bӲE0q~$koMmo%!#Ve:|^W['2nHO^v?1?*BeBIZԞ!wߧarʗmcv=^5 <dAO{pS[Fh<F rs]k~hHp6wHbCOMq +oNpfa-"?/=?+pR8 gі1}arխqYH%C^Cv>xb1&x\ԩ2!F?1y{DC˸*<H[Y.0U:(R `v?kε1Fm=!u?v;dϑ@%*\QUZS3qˎ +kƨ9SǙu_3h~|Dm>ڭIqUY#+v#PkHAKv@SL 3|N߀-<aR ]r#zXngYl5V&VQ& +8J6kXG|Fce4n*9QVv _cn:pG`?'AE[*~C24:K@BD?_ //#jI?~V +3q"SQg>'Mf'|x%$$$H"I+Mь5 +T,ԬMՖU`K?]I*Yup+1#^~ y/:Nca=gRnސ[ER?(F +&Zm4 +Kw#ӘTilݝba5"m"EY$MՕOr/ӆV)-OOLKpC|c(堖Z''LǨ.fK[$LQ]ǁ=?$1lzfqTuHeN9T#5%i +Ub)4:2*0=W-.nXˮ4_\YJyfɳS6o|XLLUyVe6*_6Vv}r(o,euWN1Fb#E!?V[y>|).jTw`/&"7YH2Ep:8g4`ҭT2_uo#qji/KRcqjWjM݆R$r$R +*kJ)3 +Mi6VxF؍؝.D+u&:?5Y,* Q[GM7ZtmRT5F"ZX7(efeZ_I{c5ji+e܀@GOpk#v8WW},rZRz"61,9[M+64seW6o5w͊]\U͍&f͛ +Kf͊6aWf͛:Yy+Yf͛o|6*cҀf^(,H$9a= +<<RlI>5q3 +qemm>@ݥ:WOOS̺<hVgd +6lUٳW6?+T-f˦jaE5Ly]eҙӲX͗Lح-͗Ӷ͘aZk6]3SY~6c +)iEAE4hp|ƝxlCǷdڪQrs_hwm_5Q AnOSu LT%TĹ:(~d|@V""1McR)VťY +/0Ʊ/D0Ph{xdy6l` +B=ڙX6L_}]ֹL|6 +5ja +d7nX90-Ag@M3Bň?dWu/Y-aO_bdDJ"1:%d_A>r<o$Kxx#M9RA^l 됏`4^jsU-2Q}Xb; +H+nNlf ~|yr e.7G#Ҩ<{|C;/-I4\zM.{bHfWdF92;J'n +Pa7Hhg R5dp6]+gΪN]*kl'xHZ?|En!ʪU2\m}2H˦ݒ M?e#3zONb҅lq5ʹِ؎|#lakRbg+FU2he)e+S6lدTfɬٳb};_6lQ͛vlٱQG6lU͛lW6lء6lدW +{6lXl &.5A9ؚ~>'A +;fu{ +endstream +endobj +57 0 obj +<</BitsPerComponent 8/ColorSpace 107 0 R/Filter/DCTDecode/Height 545/Intent/RelativeColorimetric/Length 41062/Metadata 158 0 R/Name/X/Subtype/Image/Type/XObject/Width 409>>stream + + + + + + + + + + + + + + +EFVU(eufv7GWgw8HXhx)9IYiy*:JZjz +&6E'dtU7()euFVfvGWgw8HXhx9IYiy*:JZjz +<E% +M:@]vɅG+>t]2ցcV#0ѮAgpbF> (3<F@SA2MRl2da(Gwҫ@+W'֍ пpd mqF2jK;^~ipm7)n\IJJNv,z3{.Uek^ + +g20"~dO-{U_OrƲ&8BO($Wa_ZHad,:rQALz܍++k5ߛDI<Ǿ DH&'{RqYt?S98ZB@p +^5Dy[!Ue,HCn_$}FUF4up隌;y89Rb;H4"I +*(rqܘwę9$gG='MՈO8&/+[hi4fv +k.aT#?BVk{eآe&D3y1/*\9/=˖q +̀@!Vhֵ])m!cgjUyH|î<EQVV + +G${嶿cʬ"+v&O\%UɅ5|[븷7?~ɚ5=[Dl)o{o:U)YG#@Ջ+4 +BV +i?4yex14Fˉƃ.2nⶮ(z\@ؐ1À,Pz}3w1~qv>öJbd"u&{&6V +jh42QNɵ>[·~KDM&eyκR7 +hrGE"nEiv&A +uk. d)tto*AZm%յK$, +`Ll-bX-oD@il6l?%巗ih1OPa3Z-qG^z +H#BWg!ZGӞs +G<hOFybH|Ҳ<Zo`C]ټ~H^|Gm<RєtVPUCWܛ6Y%]AxV?Ȱ4ͬ@qwKozwP+O)3!n=h=(y~!DӍG2ȊJ*kZ>8*[#%! +G0b۩+7IȄԎOύvJ턗דEh +OEkDP?^2xoڹԚ +jE(qhz/OgJYT27߄ +Cmߴ=V2M +xT*@/pOv +` +FѺ-Y<jMnĒEQx7g +M%Mӭ +$M]kD +49c5qJU>0O.WoqJNaFյm'Khf F@ƦAަW9Kb٩^v>;lzRv7~/5CJO_5VtYHRJú|#sG'n<F- m?F=즲Jƾuum\" /Vi]IqbE`IP[[+ o+8 +Aq9\ +xfQ*gnDkV;[,ثm\~ثYXS6*3S/6*nyVb^وZ/6*l,UVWe|b7|[rdž\2rY|'/!qX8tuͻTn:aFmQ +'W!S~%EW!qɑ&r09唴zJE5Z^?E5C\7,UC~I\}H5<<REvc9{eѺsWOʯ*7#[5k㛗2xUYU9[^Qolٺbc(o^c/ev`f|<*2˧]*51xf*5+9XYF]61Uc.j펦n1VL[Jeo6{b2>|Upٶr'V(I#&|x;5TKcqN9+d?psCb&hb`v1RZDo+,b2H9USzL̴<H%[Yv[͛7\Uٻf6*a2Wf/vl<0pv*2ǡ늬X}KSXohMo&NҀ撕X?do^xH!Z +~ٳRyY<Uf뚇o7l9VS6^*_lLULzQ<u:c<0+j0Gv'.=#$Gs!i:vVIzOaݴviDZ&YzFȠG@ԡEoHYۂЏZ;ߴ0 +(qZLi$aÈLj_rTp1b>HzS~FCDcR:mS/#*ۋy;\^VI$5yILmc6щ**%р]v;>=p`.$x)" + +bdژ1Txk]"R;}eՅhBT@Li7A ^44ߨY(Xþ7(Eq]Lٻm*챘f\wX@1We˦*2`1m*1@+=Fثj<JY +N5Ad&2aP +M&؟ʠ_NNZtfv|'n$6Jz"p<yUN^L~Ust46$[Z8e`%wQڔOܚ 70|4:*UQj72e}kw'dvf.!MɯCL +)}=VдVŭ/mPCu^q+"+kj˥Gx|-3ڛ&}'l?RKg+_MA#~_BjfELQh;!2|M +1K,0LkJ((20* +z<b5-J5:L(Gш +\[tI^N#;u +xK=QHYM)"Bc-ryOe=(^Ԛ50'1qFg?xSnBob1q1s,Ed(Jm1TPF%g +wXDQ,[j}B$Y5kJW~ix4xǭN+CAo펵&9gYQ2!{gQGHKo8xjMϧ;I$xՔ<M꽰-ŽhR浍b۠2'ybuX%7V +zS4트ux}r8U/(p8N*v@t})k +mbO-忦#FMG<}ߥ28" + +,<q +_X@궱 +E>:~2, {z@xBܚ?,&rt4~<ռhWuCqU?~S2ris'w&QjcyXOሸޣJ(M +D]*hizz3$ Nr9ܱÃ$*@)+[-O9`9?a0ZF +V$ +OR|O.)jcF()ԵKmN%*0_FZ+IIX +".ȨB@${}6,eV!v<k5YtүgXg"Wޞ#q.fa,g@t)]3p&uWCP|ADž[9~s7ȨRޞɃ l*O27ӑ;*ƤsɏBl:e8 rys74dd1ȁն`Gr+ZykXR +Q`R@TlI˷~ @]ƢC#~`nbXI*Rҥq/#J0 Z1'7*p ԑM() <iHrF9VcLp +G2Jn{YH$ +E|||qq!IcEF`ի +Qi|%FV +8?%)z^2*um:``2;\&u5\;K$YY'P3HdcY\iHM{u}b:U#j8X<Wq.|v2[ +fK[*К#)o|l?7w~^]bw[1V= meSv[/+*ʥ1WeZX^*< +buܳI;zPD+$QOlFKh@%$q::o;Fͫ +CS*x{fu"B ePvZg +qBKYyÉG\ኪD4T\M +G|Qh[#kiexԌIۉnm4Cqy(( +:j:rF%{@ +v +E +Ye}(ӀqZ)oĽO!;Pm ++S/%hFJ-,bO`.Ū֧FJƠAr>:c٩= 8X<ox3A^ +e,U\p@`H#JVڟ[jTr?V-iZv㔲 +ӡ<6##xݩn.lO\KuKmBGC$UEQVy>rnTtD-:{LrTK 4UZ}Z6N%.Z'cթ&ԟa_Qk;Z[r|֦$`x,-֗&zpNN8yPkm}ܜ$2[}t#PB@ڀv9eE]b+OOՅ7$Mw'#I )]]]xEIr;}\Zci>>Gwj71UIr?5J{碁ԓşy%=yl|'JRv>8H= +wPdj`y! +˾Ul~_~[[ܼA()O^,Gyw"CV +i'Yػ)<Wzgt;uj?gz(E=AǢϞcw}q"R%=]QToU5yKٯn$ +kvrM[!mRnBnM^!Y6qǤIF*ᇖ1FoJ2r;43m_hzקӉj7$iMyq@wIBLylFs +7ېQk+[N:y4ԟb\|)dB7OXaMS0؊ +#~bUlzzʈYN;@zw?ZV8B-l(IKJO~RiRw?3zu5K9P怀AW7{ξFgLuIUY㍋}s-ʚ_[yb~!ПXCC(<霢B@z!}E8֞s˺; +`TDJfy\N#K*IB3?9ZNN1GS%5)ۦZo>Kd-R9-eY&QfcTu$5J4Ueq8m+Grn-\[T@kF|ۆ46!^)lFi;_w[¾ +GQ"dYg1뿵>(}8*>gь?~˅z}$"E|S:XW"?0ejߎ1Sڔ=PEvLT;ip$<Knʎ5#)qi&R;ˀ$*rڂ}_ +Ak^,|:S,)`A99qW݁ +ت%7NA?Ǩt{)Dq/Z2*(n9ǟ4w1r x\(^Š9aTtS.-970ژ1bmjs##Pх6z&.rֶdXN +v +&*\ҟdubecN¬| +z{g +״+;#9nlpI c@: +hk7 7yXۤ~|z.l/aC䒂Sꧠqr(lZAJDo]Zo7Q@ WgxѱPƄ߶] w9tOZV4$Q$^ :VФSykՔuo&܅*;pbQso`^ D +pfLe,5FALNuykV%+CPVHPtXnKXUAx4V^ZNߡ>,OoF>9,i}:6=x*7Q*VKHGѳuu@~yX4.;t*NtnaK0'XHS`6O +a]YIz/-S}ځ|FLӡg0;z]\m֏,no4h + Դ"ړqjy3 + Ijln\*i) +r0Q kI[o1j͡i-ʵVyݶ~迟m-wxaoj~Og&Mw'|=NYQ;7oMOo4:8!ʟo{ahɬ +WzC>6@ *PFُu*WB&nqI9b?7Y.u(Dn' 8Mё^$PǏ+y隴1)2^AM0қ:Rz֠hcxJ:Ƅn0SnR$dbJM+%>0Pmf&0\K$!Om*=KYVWzJCQKSX/љӀZT +Eo>YL'!^Vz C^ԧu)] +vfcwrwހtۮ9+Xc + +5_,\ؤ.Ub7kդر/~uk1=x!/N{푈|6#X:dgfJC_QJwjyv Խl|PH~ݼ&=~Xu?'_:! E$5+^j71{<e#o* +v!֫wO/Yq[vb_,C + +ǦNnĞH!8ZM#g0/c-)>g@ΕM^jvVxKY!4<hp|Fo.+4|VXW~"8 X"U!\iy.k~c~__?Rw +54͜,@ *evDZVi~W7>%lƛkIhg_[Td[L0}r؊T. +2"zo5{z])"<DO~IRuE5\F10mF90#r,I'c>eZé%EP Pq%'~#cј)M/ucr[Լ{h}mX +c[쮧ӡ6ZxgW>ɿr\P +<,3~S~~^xHpťETwW,v4W\OOOʤ(R֦;ADf,JnY~Wpam ++L2ƴ1H+-xq^QkE(2PFIq%P +G@{+HARWzr&1y]"G +n&;kKޞ +n=80۶\C2P&PT[8 +{W-Q'vrk|N(n)Soڵ$OCn;]ݻx rr +D@@jJm + }5U`"Qp,6p]aIn=e!*O藎som[j.TJ +b[eKqrVV??~g}z43qIn*7eåNntk(mA +`T,~XL5imMyC<+=G?v<6tvdW% +%~쁸k^ + + +~+2Q^[omw|w +ważV$L&U$REgk6{pҞ+iobDe<&2K.N<3'p&76^h"Z0%܃JӋ%%Wә( ++u?8mmvQDYI5e +n5=fhD.JWbEͷn@(LGpԧˬs cT=<2aVg@])lgs;\x 7VwIFc~''L[ʗfԭ/yd=hZoHQcHwT*4&ӯQRh$1)*N_/@@5aLZCkzl֯V䙹R;n>E*:CUaU#b7)ԏO>m6>AC,vЃIx%^AM2XIu2zTr=Fn[}nНQ+ +JaHi<S=|wXGcpNqS`*O|iI4m$ ufvTՔF=[m}HKodzoNL.Ԯ-lO$hDrPi_:4rwv9$Nimf_[Qu"r֧)n},ki_H@ +{o@YDj1]\IukImBZe&FGAjuh2jq4UwRh#z*I,5y(84!j`?7Z:-EXAM(;9th_ɁzGZq@6Znjvp,M* +zS猖-cQ߯T|@Il <ɥzTO)|~ +Ws cҗq|6˱N%q|?,o7je}8@$GoPzrc`m NF4[k]DwgVY?A Z\8ROr#x?uc|(V}BK}ݿӍc)PU1W{xI_StA<SD-̫}Os%e}6| ʶLE`-?ܞkMeI;{(jZd@\ۨN;*=+7QS Ǐ*~LDc +{Oas0GS(X#-ܓ8:\KZY'~4;_:fpMc^e@Ѓ:uɜ1.^L>uT#c)](0Y|%]Mn5ʢZwy}-};X6Wntn|x6*=6>?O@RRI|曄R_`ԖmxqBy'xPr r+F&y^KuKIhOVn)=VһrVx.L7Չ(uuK8i.!30 +ejrO8y:Ro-}cK&܈ZH`\:Urr<yPl妇\+{<qn6!#]n1^2;Lx3~֏<YjFm\_7JA'BѤtb0O +\i94tOo*~n~تj}Bwb5vy +q-j3JDiBzoYp&.Z658Ԛ0+*zEyz}}!z*}m + yK6ڂlU{+ZP[K]VW}qjZփdypg[Kt.EKGr +Mn?뗱Id%'/|,=]"6X3UTS?ɦ_tEZwASju'菊Ǧ'0 +Jhw9 +*hĜʠCݏ7s0d29 + bM䞝`Eח70C3'.qIo$ɧDŬ6aʟ;[1^P$x@=2qDnĉrJ4WQ[+s*w|Eqyg;2u%2IO|W˗wUKu(8e,{BΚZ5P AlF`h)M +7[>nڄ/|`hjhNyndȣoJ-ǁi4m:Xz@P¥)8>w,%דPN}+0f$$ +h8hݤkP[]1Xb* +-%̉ + +Bz}~>jX +=< '".#+RVX=T,cɁY"l}b(O?$)7(`x9 +;w<鯬j.?WEڇ.h[ +vn +bDN:6̦X +3W_q,M6ڥk2jVΛqxc+u}ύK4cc(S|%.tY~&&2iiXچ:ie28US!tVVFsj7Jju]q-yhXT~}hё\DO hmZO D^ڊOjn/JLn(r?HI +[5MqP\Yxef*ٳbǩ7/|`o +wlE[Mc mhbnciIDaȗPxIuiwh;2[]ە64PkWIpJј +֔3)pR-XnԺI.~~FLؐ:7kh~st?n#ն MGGr]ZsFfS0F>ϙg@E[B?v߳ _ևexؿAɆ%AZ6ee"sݙA>&#Ю }y.IDʻ(1U-W4_E@u +x?)ko0t9<k9"5֣J"umQ[GH<x +w^5ۯyo7O\$ j\^:\cm3C}N"2 #χ4yWk^N# +<6#HtˍYu暆+[m,4zqHsIY_FA;a{,fԯ,#@?<'>(mCrNsp;Oޓфf-RKR!ݩL]?u%8hes2CIN}~(Б_/n-5/SfmTˡ9kɈ.ƽ6ai!-G;7S`#PQt~V+IՔms5hv#Ok(bzv*PAtI0"(r' |_2F|H+ӨĤ,ZnGMSָ)q9U͘CGl6*͛TI +BeME7yjJv8;l({[BmٳaCy[͊rV*b͛6*{Qgz-ăPa佤 +:vlXo8HܑUg< +Fԥ%~{vf/Pr#b%tyc +cR[(#w>&y::6k4@DrhGkd@/w8fn%\i3˓U4+xLH۽ YE[Le +BVI}v=LױW:'4|ȋq!^n6V-5^R;w+e2R^2WH++6۫`-FiJGӡb8X&8P-Q̷@zb[MsmАd;QGy-6{r`$kmYF:)M_0N[!Mޤ1BGuٺjFlWivk\\7&}*&R}Pzđ7{ t-jڝ~kt<WĔŤjy\*Fql:is_-hR5MSozәX@NJl;>FKe1ʭOzru1Akˈfu5ȫH%4N,:r蟘wMV?.\φ%ϕ#qpRS9ܡSޙ'<tmVc@}aT x/éc~~.8gtQP +Ҽ둛xH%Ԉ{.M-qy-b:%O:gLTF@{K0<"[JiHIS:o|,[TB}ESjn4yXoY"\R|+hc̥4=]$nAl.1M-i$SX`ٵAӭ~7pM+6*v`<=xMnD{;i5OzQhˋjM\o־HKK[^R>w,o%-QCdty![5ڦCKQaZw0j(x̀[ +PTIky+8.dATD<kz⨛t!=A#UQla9mY$56lU6lUٳf]6lUپyb͛7|UyYcqYg+vlٱWٳbͶoj⯢nҦtsT +W">dFޘڡzo4i$\@ѳ + +}9 ]Jk-MuQOX≆֡`zmrkW7!.Mq$6c{'@5֠M;Ҝ2#hX~XQ#'8k1kK[MH/q)G&@#r.ڷn!<YT5/;tjmCZbVw]mF9wmf +t'Po/HX`f;U'Ûߐ^+O&Ȑe-ŖgAX^`/wΒjyO+;JݨWaӶC40HlfJyz+&}SQ'ŝ\Ev!!VO&@߽tP3\-#tQjo.$S|%̉yV#_D|O;t3Oд)Y.FWԇĆPw>/ѯo +%6os@8f<3$[~Y~^gFMXIvfa.>y`gĞ!ӵbX#OPIUQ_lw{m=p¼TL:&n{Z$I +px.j +endstream +endobj +158 0 obj +<</Length 1596/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + xmp:ModifyDate="2016-03-19T13:00:37+05:30" + xmp:CreateDate="2015-04-16T13:55:08.784+05:30" + xmp:CreatorTool="GIMP 2.8.14" + xmp:MetadataDate="2016-03-19T13:00:37+05:30" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + photoshop:ICCProfile="sRGB IEC61966-2.1" + photoshop:DateCreated="2015-04-16T13:55:08.784" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:ACAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:ACAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:ACAF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:ACAF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:00:37+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +157 0 obj +<</Length 1594/Subtype/XML/Type/Metadata>>stream +<x:xmpmeta xmlns:x="adobe:ns:meta/" x:xmptk="Adobe XMP Core 5.2-c003 61.141987, 2011/02/22-12:03:51 "> + <rdf:RDF xmlns:rdf="http://www.w3.org/1999/02/22-rdf-syntax-ns#"> + <rdf:Description rdf:about="" + xmlns:xmp="http://ns.adobe.com/xap/1.0/" + xmlns:crs="http://ns.adobe.com/camera-raw-settings/1.0/" + xmlns:photoshop="http://ns.adobe.com/photoshop/1.0/" + xmlns:dc="http://purl.org/dc/elements/1.1/" + xmlns:xmpMM="http://ns.adobe.com/xap/1.0/mm/" + xmlns:stEvt="http://ns.adobe.com/xap/1.0/sType/ResourceEvent#" + xmp:ModifyDate="2016-03-19T13:00:53+05:30" + xmp:CreateDate="2015-03-19T10:22:39.50+05:30" + xmp:CreatorTool="GIMP 2.8.14" + xmp:MetadataDate="2016-03-19T13:00:53+05:30" + crs:AlreadyApplied="True" + photoshop:ColorMode="3" + photoshop:ICCProfile="sRGB IEC61966-2.1" + photoshop:DateCreated="2015-03-19T10:22:39.05" + dc:format="image/tiff" + xmpMM:DocumentID="xmp.did:ADAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:InstanceID="xmp.iid:ADAF5479A4EDE511A84E90D9A5DFCB6E" + xmpMM:OriginalDocumentID="xmp.did:ADAF5479A4EDE511A84E90D9A5DFCB6E"> + <xmpMM:History> + <rdf:Seq> + <rdf:li + stEvt:action="derived" + stEvt:parameters="converted from image/jpeg to image/tiff"/> + <rdf:li + stEvt:action="saved" + stEvt:instanceID="xmp.iid:ADAF5479A4EDE511A84E90D9A5DFCB6E" + stEvt:when="2016-03-19T13:00:53+05:30" + stEvt:softwareAgent="Adobe Photoshop CS5.1 Windows" + stEvt:changed="/"/> + </rdf:Seq> + </xmpMM:History> + <xmpMM:DerivedFrom rdf:parseType="Resource"/> + </rdf:Description> + </rdf:RDF> +</x:xmpmeta> + +endstream +endobj +247 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +248 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +273 0 obj +<</A 274 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +274 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +14 0 obj +<</Annots 275 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 276 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 6 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 277 0 R/GS2 278 0 R>>/Font<</T1_0 45 0 R/T1_1 44 0 R/T1_2 43 0 R/T1_3 42 0 R/T1_4 41 0 R/T1_5 40 0 R/T1_6 39 0 R/T1_7 38 0 R/T1_8 37 0 R/T1_9 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +15 0 obj +<</Annots 279 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 280 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 6 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 281 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +12 0 obj +<</Annots 282 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 283 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 6 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 284 0 R/GS2 285 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +16 0 obj +<</Annots 286 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 287 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 6 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 288 0 R>>/Font<</T1_0 47 0 R/T1_1 42 0 R/T1_2 43 0 R/T1_3 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +17 0 obj +<</Annots 289 0 R/ArtBox[0.0 0.0 495.0 720.0]/BleedBox[0.0 0.0 495.0 720.0]/Contents 290 0 R/CropBox[0.0 0.0 495.0 720.0]/MediaBox[0.0 0.0 495.0 720.0]/Parent 6 0 R/Resources<</ColorSpace<</CS0 36 0 R>>/ExtGState<</GS0 34 0 R/GS1 291 0 R/GS2 292 0 R/GS3 293 0 R>>/Font<</T1_0 39 0 R/T1_1 49 0 R/T1_2 42 0 R/T1_3 43 0 R/T1_4 40 0 R/T1_5 38 0 R/T1_6 54 0 R/T1_7 53 0 R/T1_8 179 0 R>>/ProcSet[/PDF/Text]>>/TrimBox[0.0 0.0 495.0 720.0]/Type/Page>> +endobj +289 0 obj +[294 0 R] +endobj +290 0 obj +<</Filter/FlateDecode/Length 3989>>stream +HWn}E?Ja.`q08TKԒ5?)k 0`SR"\$=<ͻ{_|!u{8ٛOeabv?%,GEoVWYv&g<ȁLzI$և<Kهb'Q*?ۓ*[+Ƿ JzYYKUl{aL\3Xe҉ãEu0$D +Hi$8IFWg%=)yMANVWG^hؓ8"bZ"xQB8A}/h$3Ic,B?jXgB/ʰ,$C䈢}8csJwRX;@`f_^c}q҉d ?,3Smg,v!`2B[%2v2"VZarܾVBbLNqlnj첂EO +bV +ΔZ(SAКSRC27V۶%rt,NmO.Nj(lQ$RhΦ#A.Q˳)7ydFYaQ>,וP#uT[4Cq֧~3qmE(%)Ulq-զ[7c61֚u3K!eTI'ί!KQiF!BR{VMA윚AfHDA:X/z3=lPuGD )|oٻMתIȘpAX`9y>\խzD{:s_]2OFp)1b ~;e4@!xjd#^ci^:0V9h때q7G-ݘ]kF8bXWOf@cK);hU$aG.Sږܰ7I;!ʁ/S6]ӆE:(a2Q`9ͩ~͍`ɫ]iZdȒq;knOQޖЃ]q(Aj<W +L"WOw+/aZb@Ub'-yçZPJҰeSz"vA|#%"xq]CQ,c1^F +*m~m"G<Ŋ7=5bߒ"+݅v}P: +92rJjԤZo.y]>nsضǞgúgǥY?t0v⹎zXRbxzR`3?#/Ft`wXlnz ޟiCܓG1~ss +4|"zO'8je;OD%T\h8>M1\s,JstkthO.6H%ΉqLPN/иAʍq\Yvxq@P&}(C_hF7QEækMWaWjBkQ(ݢhE1YH,zkx1{h.ζkȂMdYZzgtח,jؾ.ֻGۘix/NюH!kWַaUoƸ.a_Ѩ.Lɾ`}fE3ED":nǦhM`}sAOJV6kLY<nA`==TPқ5?T5S58Խs<&vj{q]͒u +;զ՛;5 +endstream +endobj +291 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +292 0 obj +<</AIS false/BM/Normal/CA 1.0/OP true/OPM 0/SA false/SMask/None/Type/ExtGState/ca 1.0/op true>> +endobj +293 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +294 0 obj +<</A 295 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +295 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +286 0 obj +[296 0 R] +endobj +287 0 obj +<</Filter/FlateDecode/Length 3653>>stream +HWkoݯ.lG/6X ٙvg&M%fo{.$SeIs=t?k.s?\(]nv6F|lt#Ԉ];mFf-l9,ljwPQ6ں?~"V<tlFKpɂu>^tOF|mjq}ehuɔM;WgﯮVb?ݲ^˷-+ڷ[\o9wf3uS-:.O~;U#oxߩ;wқNq\,p\`*\ck͜arp +I^*x$MOĘ&Dqܸ#v",eOQĉLhdDV]t?Fs4MmY7xMc^/9\:0Ynm7ܐ<ape$O:z^ +6=JdN*STRz0j8ǿf?֘lϣ*G{Ijlcf1 + +.4k2AWyl[YJiw),[boC( +8ķ17eyaͬn=#=x=#2D(0F~UE2:쀤<T'Q>EA)01-eK48ɜEAM/`K;uӰAH8v'ԏc +Y$GχY}rL'ˍ$&.CCs4[£'fz(xA1eAJ..t |cwuhp؇~R`S(8MW ts%Y$yA8DtH! + ӭXJNw{KuSlf mZFU^A+- gt[MY>`c9R +ē̳kok]S^F7Ŗ(=kO9Z}-%in\KH/stm#]﹚=uhߠ<aqQcʟ\) #RWt{pŨi'acHoFDGs<> M] Ia:V]tH'haJؔlh˖]J4IODئI +Jp=&pjWM`brт0nb)]_?laIp,v!H݀j\Lak';ynIJ 1;8=/A~ɂ<Ň]eQMYGLSٽBC+#.+;acAj>Q +}uJ'E+Dlr3Xƣ;;QmrUqax2c?۷[hK<# ^u.âSC3B' +]ok_al46\ߠ8Т+ѤfJTl-:e 4=Ǧb,0]}ƙ裠x)h{3kvN/'ŜЂ1Z%Bg;1~|p.*]؞ǽr$+_d)ObW-g{a0Z{i@J;"ۀcƻ;j{<-Ӧz|]6 +dVm4ag5y7կ_(V +",J:ef~˕q.[%Rϩ,RnKs^ˤ +05rSI,2+ѷv`>ZWN&zgK +m%L]Ju$sO$cw +9$Nv#XEH?.bBEpóI2u5vbTb}{JΣ>+bzvz 0 +endstream +endobj +288 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +296 0 obj +<</A 297 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +297 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +282 0 obj +[298 0 R] +endobj +283 0 obj +<</Filter/FlateDecode/Length 3924>>stream +HWk+K$.jymvW2d#DQc茱Y5INU_pNO HO~x}KYL^ovfB&qᷘOf^ѫՕVɋU7ZN7~ȁEॱX&EV]M~b[2YZM~%?R|ՋysJ}n_կg_k1F"J,z{Ier14*;]2r2{:U-m<$, &5DHce1Ǖ/N[:yAkt)xuEVH +"zIrL}8`sF-=@pĒf_^`}IDCE`pn;eٷ+|Nj(D5Y"q2Ju~g,͝ygن +,J|Տd!s"}bĞvkwc"}ǞrFsO +C'q!^Ng-oEL![i5JƩ'gY\D/~ +]6>֪JQmE^城J;PN_SYOJ{k8Nsz$xSU6BCeŶp*},uH,p٫wRթܹ-Ob:ozS4yIc?|l4<@JS6b}R.8}1ջ.P;h|)Av@SWÛǻ҅,G>LePk#UGq&gy%>UUCF_ԕ;s{4.ڧz}*h(ԃ*(ʵl1m407%WnNapE5z}t +@zBʓeae53N#u%sJQUk +-oVz.F1c<% 4IOE +Bv%qS۪ +=߃M-uII[I<Z2>6z?ՃXkhaji0L{Um8E]2 QL3~8NZ.Q-7i.%4hGtTކJYDJ>TzCZQ]\Rme0isf}/MUލdPCGyvٌj2 +k0,8$'Z+/6t\yD=T~UqlK" ƶX /Xp|-嗔χpGxAඦ>9"䒿kM̨UH>OP*FsڹRjxoY7+>?řBH1Q.5vM'tdz}jڌj67HPMIUڜ=Dޣ)O8t0@a[iэOӌdÖiݐvAؤ:5sϠbVY:(dbce~Nx0.iG:\^J0^)'RpBo)Z7ar3.ғw{ɞ WP7oC~O7=[R[dO +yU6p +1DhUt_"%.r +=2M1]jwwNwuaRiRJ%01b0_[.ЍQ61hsNɠ(X3ú*L!z;&"3j5.Q2Wq ߉!d`}"pFV-Zx +PVG96d=rCkb!" @1=#tҸЮcC{k|3tRؖ$XKji{0v;::nteA,Gm^M;<ѺǧVrDWo<0UFS")8ǩhn<[ˏ3O~+ku끧.5?@.(;<z==W$$qnR|4tԅw;iPaMLc,~gɓkDD+ ڛd7jI쌥<.tU`;HnÄm +^k)?n?4& +YR"R(wsqgF]̉qmy~$,bu0Q0kI^dP+i6NYX=ﯛO/Gp#GI?tQr~Gv=&Y + +plEV,cTMAzb7idR͠Ma}TMQ:EcA{5(O[x{ДDs'H)7r" q't&evF%z'F)2-Z6B.sQ#ƴzN貱*]Wc{2⿍Z4`|=r& +S]z 5ɠ0jg8(_IZ^dՅq@^j0 + eΫ)C'(ln^&_h}k]uusZW,H(, +>ò2VNU [@Hcpp-]Cwl:}M>e1fEM%өhD#I7[1dҜ(T9OΙf4ʁfDQ$&i)(F5`@ZSH~7Z1vA_X`cϱ`J]o(tk{K.0Ѱ[KL]e~|dP='ExfG 0w\bg^S6 _afY5ՠ@Tw4bI6<xin~,GۑgR$.^L@i78+k&!mu&aES!a2h"v&[:DP/d"CLyjaL +endstream +endobj +284 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +285 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +298 0 obj +<</A 299 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +299 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +279 0 obj +[300 0 R] +endobj +280 0 obj +<</Filter/FlateDecode/Length 3614>>stream +HWiWR iI +?/"cofǦ(U,Bt՜tZyԃxdjfbYJgi.M7eesIN_gBRaKߧ!qZŭ뱨%C3eG)QБqR^h5ŷrv(dSeSy?<ZITCf:`4Gp}.Ŏ2wU+/v-U-4ɾ^+aS2piΊ$OdQk4R0\=X4iqDmJV^M;:%$UD^u4nT/V^<Xl?4-uB"TRMq)1Tzo |v.W)U[C+Tl2: \Ȭ&"Յz<L*QxR\%j/# +7C6<AT~Cڣ=/Fɰ0%訨d?(Q$X3+Tfnzff#uKjT3mi +E +;\qV6٩$Q4qSonew7PV*;i6s]}wN3DCspFIS +@a3 4h$xw\?*DW7"2i(]Ԫ쥖Lya7Ft&Hǘ T(^#3)RŚծn ++)J;JM#gm:g";l=SRvPy. +|'0rY|iP=$j\ ] +0^h!k` 8R~(P5"aL@3EkDvW +#~%m"HqbIxAz5H} r7<X\M?\fseEb0<($ H;W?g +{ZB<e=B텆Oi+u/]"T +endstream +endobj +281 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +300 0 obj +<</A 301 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +301 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +275 0 obj +[302 0 R] +endobj +276 0 obj +<</Filter/FlateDecode/Length 6616>>stream +HWk+S ͇^ +?Ȥ&7wM!6:ȶɮߚ|u7,t0E)3%NJB!Ӊ,ɭDYe +X'r7;V;HZ3eGuD@gE8Z0z}0vXqE}JSu$Zu{Ats=Lvur(fYHk6W)A(Az:_ऍy~@F%<GHL^&T.&S'ܰz_e=LMUӦJ]$ܔsMEU>Gm+rJe:E2zyfޏo_>a2w.Srԯ>I;~ `ÍH"~ݕIB%Haw +eIi_.k#Y'Y +˭r>?Rږ2OT5M;,RS[7jVYionjxh: b1(9J`]TtIm6nܥv2j<%4^yK?AI|=Un`?g]7j?5망F3KhVXO# N3Yl:Jth5%i*j]qܚm20ze?Ê-(>[@rπ݉x48'csq胯dI5.==OWtN`6RgԂ}c̜DR蠲gA_g`*FJ +6 +#!;C&w>70<1HWxi$-"X,*jH1tM +|h_Lk +`ƕI"&rMuGc'gp:0<ev+xFR[p1{kF1ImbYsU+CR隇r)F+9)MstIJ>03\5) r N`|~"ޣRt{Kkg^Y[>zwڣ~?H3#]#JGbg訸Ve0MA8uBg +n"CЯN}d1uPш&fͧ5d +T"-dޅZ;[g`|2QFuvyyu{}2j'ä^A5!'jJyկ;uڻfOK ,ϘEFٚhMP8~7(` +?3es>I{T!;|jW7n1 +V &%N#V.0)xj +ی.nAܥn1@v|hޮA5E+[!7k͢^ma@:jBnv'[_^`P:Wز8Kx+ixR8Ll-F{R$pDtk~˅ـ6IbNaC>,ͦPVN0mJS6DvB#!ɪT1I3!œ:w+!ԝAnA\Y{.e[{#f@~GRXF5X uX +}<]?Ւcm}kT0,4l-|}WF|=Ci#d"HΠuO?pƖxǗo~~)SG;{-~^<[?uqBatuctR%v[}wcìc+/|[+P~/xLuy{q~YO5uo&߾Ӌm;}RǾbc|%ƾoB($|[øZU=PwUDM?>CJMs[/ٰ +'gɥ/c-0N|.X0?0>~p~ϗ&<t/~tun$\ +.X&̀YCz鋎&3sê]Av"N<&c1@%SY\wyyn۬ߘ5Nb1etƠJ/6Sz8y'zp|WӋCvIJ˰Ąòly3AS뫨`4-f瓿()9NwƄ3VgdZbꉨ&S@BR\Hrh}XX,2:<#߿|0pdĭD;0LOtXL]*7C~-;p_]vt3S4x#W Dk&H2̴..2}ʤCMԝTܩ3InDhg^V;3ꚐS<ASт7Kv6_y1wޙԝ&4Q3ݎE(P66^I~oO-t.RK]`.s\<TFP|T6ǑXFD6trh*T ^)PHdXUq0327W/ZnWe>DcK1BNdGIK_гF ">bQ:&ugvR\pR7ar9CVzZ@`yö́Ms&3жQaB-zYjcUD_f_R:kh]sYl??9 iqtM]}TDӗWPS壄{3}AvG{qp{e`~,Br8PZM&#џxV#5P$ߞT]i㊣qBBJqcYD8f)dt`敡"UsZs0OSp0|qY\sSsy!kum|;R[C>x0o)屄kg]%9a`{vݪVۯ_73Zέox[7H|zd2 +*8;FmF2M#L,.ZZ!C:"BBE(TYآjjʒ]1\HΤh[_yn];sN`wUx"]T"%S)Wafs`6ld+TƧeIUl)ZچR[M *Y\#\6tj +^1)Z"l^V$gU8R41:KD&d[ +UIkEĤQS1Dy +F:q+ñlCYg@Q\(":EXHjgRqt]ow& R +2=-HZv=*>«X(u=/ +W9],8llCRDl%QuQŶ$;d"gΜ93CndA*`1ޏX\$$yM6q^4'' qY +pݯo&sk4+'8٭Z5Z't,Q.ɆSNV冚Pjڈӽ!;-Hr}I9!/\>s$)Nx K/Ȏ ʊ[t\ԭeķcfԬgIJ +e^!n1oPChl^l_twb|k ;V %2e+8\q4]Ԃ5J,q7e{խ4u=Z\,~s\[Lʄ/chú?ߵ5>rrx><Za{TU>EI7ZW͛8m,Oo9۷K:h`_hp٣!Xim_~ES[p=|\ݜUsMo±`4N|'.:P陶{䔠!3|ZPzGù?Fm9͑~~<d` +endstream +endobj +45 0 obj +<</BaseFont/ELNWVA+GillSansStd-Bold/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 162 0 R/LastChar 121/Subtype/Type1/ToUnicode 161 0 R/Type/Font/Widths[278 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 271 0 0 0 0 0 0 781 0 771 0 0 0 0 0 0 0 719 0 885 0 875 0 0 677 0 0 0 0 0 0 0 0 0 0 0 0 0 0 531 583 500 583 552 0 0 583 271 271 0 271 0 583 594 583 0 448 427 406 583 510 781 0 510]>> +endobj +44 0 obj +<</BaseFont/ELNWVA+GillSansStd/Encoding 164 0 R/FirstChar 30/FontDescriptor 165 0 R/LastChar 122/Subtype/Type1/ToUnicode 163 0 R/Type/Font/Widths[500 506 278 0 0 0 0 0 0 0 323 323 0 0 219 323 219 0 500 0 500 500 0 0 0 0 0 0 0 0 0 0 0 0 0 667 563 708 0 500 469 740 729 0 0 0 0 781 781 823 0 0 0 458 604 0 604 1042 0 0 646 0 0 0 0 0 0 427 500 438 510 479 250 427 500 219 219 479 219 771 500 552 500 500 396 385 333 500 438 719 500 438 417]>> +endobj +41 0 obj +<</BaseFont/ONQEFG+TimesNewRomanPS-BoldMT/Encoding/WinAnsiEncoding/FirstChar 49/FontDescriptor 167 0 R/LastChar 56/Subtype/Type1/ToUnicode 166 0 R/Type/Font/Widths[500 0 500 500 0 500 500 500]>> +endobj +37 0 obj +<</BaseFont/ZOYSDK+TimesNewRomanPS-BoldItalicMT/Encoding/WinAnsiEncoding/FirstChar 32/FontDescriptor 169 0 R/LastChar 85/Subtype/Type1/ToUnicode 168 0 R/Type/Font/Widths[250 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 0 667 0 667 0 0 667 0 778 0 0 0 0 889 722 722 0 0 667 556 611 722]>> +endobj +169 0 obj +<</Ascent 891/CapHeight 662/CharSet(/space/A/C/F/H/M/N/O/R/S/T/U)/Descent -216/Flags 98/FontBBox[-547 -216 1206 891]/FontFamily(Times New Roman)/FontFile3 173 0 R/FontName/ZOYSDK+TimesNewRomanPS-BoldItalicMT/FontStretch/Normal/FontWeight 700/ItalicAngle -17/StemV 124/Type/FontDescriptor/XHeight 453>> +endobj +168 0 obj +<</Filter/FlateDecode/Length 284>>stream +H\ϊ >C1M҃JB: +#;j +f~2~×O~ihME6<-N"qІsPZ)~YIܮDZ1Ą + +0 +endstream +endobj +173 0 obj +<</Filter/FlateDecode/Length 1772/Subtype/Type1C>>stream +H}L]:[/.sTYЦj,+P2`Y)co cpߨ8f]k&AA*ݦw;4{ܱbT+MTx^$7W2c$"|p>7@I{?Pe+D-M"u~m_)TTȕMj\WHO˚MGt_#v0'*y]tqqQ!z_-nmS"H ObtB1:A'rSУ=%Y\V"*ܺݼN@h2u#ٯ8>N3 +sL+&8ez`0vnsOCb+- +JAhR=],1;6;7V#~Q%9jm6?>}7@f/Ҡ?"30wYrvo ;p&ԯku(#fKʶ `ə~O1ГU XrTwLՌv<|aiwܒ^6N|8ާ2PCpr:6?FM55tv%NϞ4Z&jV;{>>b"hțJw@H5Ugm4iMNk+u &8O#w1Sġf%jqis4OOiY$'17c= +endstream +endobj +167 0 obj +<</Ascent 891/CapHeight 662/CharSet(/one/three/four/six/seven/eight)/Descent -216/Flags 34/FontBBox[-557 -216 2000 891]/FontFamily(Times New Roman)/FontFile3 172 0 R/FontName/ONQEFG+TimesNewRomanPS-BoldMT/FontStretch/Normal/FontWeight 700/ItalicAngle 0/StemV 136/Type/FontDescriptor/XHeight 457>> +endobj +166 0 obj +<</Filter/FlateDecode/Length 261>>stream +H\j0~ +Cq>JCA`̰qyv`[?!%K?F(]D++PZ^98m 8fmPp ~E +6쾮:3 +endstream +endobj +172 0 obj +<</Filter/FlateDecode/Length 948/Subtype/Type1C>>stream +HPOw+\{lzw%*/6H6lpаBПWJ-h(?<XkmBQqHLYf&/ɶlL4߃k<0`&kk>:_o3m5L>dmj X,wɶ[<fQ>a~PdL&-]:X.'2ͬvښDuF}ɧfuwc1t62&|* +H%H +1,*q-Q@r8 +sFJe(x;Qu*%AsHdblhԅ`qUYg?O{: +uPa@~^ ~PGV:ږA`].'9zN!0G[J|?m_"GS%<囱_#9IB/'xqkrxР^nʅA\xNw@TpPEX^Ʋ)/ᔜ|/rD JUɠ<# +endstream +endobj +164 0 obj +<</BaseEncoding/WinAnsiEncoding/Differences[30/f_l/greaterequal]/Type/Encoding>> +endobj +165 0 obj +<</Ascent 911/CapHeight 682/CharSet(/f_l/greaterequal/space/parenleft/parenright/comma/hyphen/period/zero/two/three/A/B/C/E/F/G/H/M/N/O/S/T/V/W/Z/a/b/c/d/e/f/g/h/i/j/k/l/m/n/o/p/q/r/s/t/u/v/w/x/y/z)/Descent -250/Flags 32/FontBBox[-162 -250 1041 911]/FontFamily(Gill Sans Std)/FontFile3 171 0 R/FontName/ELNWVA+GillSansStd/FontStretch/Normal/FontWeight 400/ItalicAngle 0/StemV 88/Type/FontDescriptor/XHeight 449>> +endobj +163 0 obj +<</Filter/FlateDecode/Length 473>>stream +H\͎0<3̽3B$EL"5Y{O4l>ۗt~qylaq~pos1!Yы%\iLʥ?mwcxNs~8_óKi.aX\udA_[s .^qcEvuj079$UfU;I˜ˎw3'M2{6ws),YcJ~2[\k`N"'\Udk9cdy!X +ߑ퀪%KO`/_"\BgY,d +3Bx"s3_/YpJ|;w'ܯ`WW_~w_W+ +_W+ +_oQ}(OgyZwTz?ϯq'g$ +endstream +endobj +171 0 obj +<</Filter/FlateDecode/Length 3394/Subtype/Type1C>>stream +HTU{Tgd&lD3+ +ت,*R_< +I $g9muk*#Z!j}ЪG݁.Ͷ]so>R*(͙,kYYVQ3e +pZRʆH'WFb|qk0QteYY\2;U+f+W9%.qIuXqB|q^lV9]r8bQiw(N/+3C`ivաÐ61$N:"(2ˋ+DE.5vתJ8W&BtKΐ&h],q!R*Lbo,,rU"f<!V:Nuy(73+;9Q4- MQhw +j0Eiijz +*ަ)BKPv +Hz[zE"LSǴ+Yer2 +lKpTj0.lZ#d?`׀w##J"j#TF#FE^}=LRXVc +lgC/2V|h!Kjկkxsb7p0u܁i@LE.|9ߠOs16yii$}ȟX$X,pY`5v絅抮~pl{Vld}meZ^$ldq6r"6dUVlMMMM6A]+>M>Fs, bF%"Y"Q%CL,:!%^y?hK8,<~ƅh&fU/6@Km[i+pд4(D|?wxqŔ>oe0^-wnNaEFmmkAԷ̪kG|ywAWC$pӵ8Hgrҟ{ +,X@|.7ZK95Q+MBIدc`u_׳yM-wtO%s9,/5$F%(!cyyep >T#Э~&0:0o6սrO@%T-Jy2E?0b d=rq&K%(҇@ +ڟ"R8,a(/8u3m 2$܆MD])dHnW%P5Kɗ{I=TZH=Q>aNz5\ =xD!#Hh5V[s'gk<nljhb;^Ecwq`:vKp@L~r4.?<rr~p/ũ4_gΒ;`N'Ltđ+ +`fCHYP +hd!ǒ+@AF% +<*0?$wWOJCFкG̥KN?zc +|徯/(?P]٦-Wg_%JjhFjܭd/l 9і'c8,:Hv{Hj!}ՠ=Af6a.$[:@@9w¸pJV%##^>83ee39yeO8pn聑_^US:V=%~bwq!Fu6,J3&WNeɽyC͆6mo<%oxj]ol8~fCguGr20$5W}ƺv=xII/Pt:I<rqq}g^S۶W @"=.Ow =4bs#]AARo-#[Gp3^psC:#zj4:2 xnzמu[з=}(1\[sZ +>&?AIq8=@muǾ4`;Twv:zsᬭgaQqkitxwe7vFš#Ъsm B(.V"J!):aXprSm$vskX\r{}?% +$f]g5Tw}?gI F +üp1 43]zp=CTkSMMִ{zVKRj"[bvi1Ցx]Vl,PnT.PimTІtZ-LˢAʹA+s_PEcjFxuYoy݃Gps|i+G*P +(CR6L5·Nɘ + qTDy0F$ڡG7""PXOs4H0NWǀ'6Ћ1ub]Ր + +5Z΄A>(tC\Xbte%pR>RMB*5iOЍܚiJ)߰B xAj(Dj{Z'*Kړx<ã9xꏓ.6o ~*C: +ݾHJ^R-jsd'čPԐ-jE$AV\nqMTÄDZ%8D5ˇ@ϩB]쨧OD3Q R@ q2O`h07!wPO"/T*&擰MQ=D"xheES\ VDNY&<𦾂`@a"}+Iئ%t^ 6zt#'Ylx<Ew~f3h=a +E'7NgP%/85Jt E[rlwy_GΗ +~љ +endstream +endobj +162 0 obj +<</Ascent 929/CapHeight 682/CharSet(/space/colon/A/C/K/M/O/R/a/b/c/d/e/h/i/j/l/n/o/p/r/s/t/u/v/w/y)/Descent -250/Flags 32/FontBBox[-177 -250 1167 929]/FontFamily(Gill Sans Std)/FontFile3 170 0 R/FontName/ELNWVA+GillSansStd-Bold/FontStretch/Normal/FontWeight 700/ItalicAngle 0/StemV 144/Type/FontDescriptor/XHeight 461>> +endobj +161 0 obj +<</Filter/FlateDecode/Length 354>>stream +H\͎0}`@VDQu\~g:M W$Ey,}3=t=XW5^,3;>zm۪ &_au'cl+E쫸erG<j,RU2ix3N9 _}e!T¤rir4]k]a2Y#cfyż">0G33lQ\GQU5Tk5yCewSD>|4Q5;hrA&bVĚYnv㭐ϳՉG'xxޮ%f#~ +endstream +endobj +170 0 obj +<</Filter/FlateDecode/Length 1990/Subtype/Type1C>>stream +HlTggHf.ġDA{<9 +U +$LwR[=.q}QW@"=(kNbw{<9翹 MC(G͞/ΊMdmr{IMZByۢ5/~&3a]Bh>K+¢r)i8eM +qҤI,}Yʬp8lvGa,7Y%%b)-6;"TX$F:%T0kՒ"ev,דnB+0$M*'jK2$\2LRS/1VHfGv!uX&k0'3K<E2-E(jE8DLQ)jjEePH`![q!BJTUTEZQC&2l4kb5jM`7MֱݪjyK`a%A9y5ClnHά!rp 6[M]]]]lq@Pluo~.x𱁁tHy,<ZX`S`}RU093}=p +&۠ +@taSLj7 n@ 0&@߫$ a|E`c!usaך[{D>L؋Gʖ-ZX3 +>1\kYuew=x?^4Ƀg ,C9n͙ҹ"6NDO]vJwR(4a6F_@0l:&ACHy:LGfe-; +#q1#I}FA:vwgHlrIkAnq`M7#jè1tJ*]`sCupmyK^Ul"7-/!՞M=B79[64lBfvnlH73SJ R%?/k O1*j#]r{T~YOO+B<Vs*#`$#}2Gg%X?o}ѲwJmz[vC0CdfgE^6b4VXsQEh!ԥ2ױSmuny +V{,Ƴ1^XD>o% +vzDu2;LÇ,sm]CI/}7MMgH _D?,q]5U5՚M5C-VUîaColw{ρ~ĽзC97R# +endstream +endobj +277 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 1/SA true/SMask/None/Type/ExtGState/ca 1.0/op false>> +endobj +278 0 obj +<</AIS false/BM/Normal/CA 1.0/OP false/OPM 0/SA false/SMask/None/ca 1.0/op false>> +endobj +302 0 obj +<</A 303 0 R/Border[0 0 0]/Rect[215.505 25.0 255.58 32.0]/Subtype/Link/Type/Annot>> +endobj +303 0 obj +<</S/URI/URI(http://hfs.sagepub.com/)>> +endobj +11 0 obj +<</S/D/St 864>> +endobj +10 0 obj +<</Names[(05_HFS641783.indd:AQ-1)[12 0 R/XYZ 38 345 null](05_HFS641783.indd:AQ-3)[13 0 R/XYZ 38 82 null]]>> +endobj +174 0 obj +<</CreationDate(D:20160729162342+05'30')/Creator(Adobe InDesign CS5.5 \(7.5\))/ModDate(D:20161002115650-07'00')/Producer(Adobe PDF Library 9.9)/Title(Portable Weather Applications for General Aviation Pilots)/Trapped/False>> +endobj +xref +0 304 +0000000000 65535 f +0000000016 00000 n +0000242779 00000 n +0000242847 00000 n +0000242812 00000 n +0000000141 00000 n +0000242917 00000 n +0000243010 00000 n +0000243103 00000 n +0000243196 00000 n +0001817247 00000 n +0001817215 00000 n +0001778963 00000 n +0000244179 00000 n +0001778139 00000 n +0001778599 00000 n +0001779351 00000 n +0001779727 00000 n +0001462264 00000 n +0001462717 00000 n +0001463159 00000 n +0001463601 00000 n +0001464061 00000 n +0000793769 00000 n +0000794181 00000 n +0000794623 00000 n +0000795077 00000 n +0000795519 00000 n +0000243303 00000 n +0000243703 00000 n +0000244609 00000 n +0000245051 00000 n +0000245427 00000 n +0000245851 00000 n +0000276713 00000 n +0000000000 00000 f +0000276924 00000 n +0001804925 00000 n +0000781897 00000 n +0000288632 00000 n +0000251765 00000 n +0001804714 00000 n +0000252325 00000 n +0000289447 00000 n +0001804258 00000 n +0001803846 00000 n +0000000000 00000 f +0000251425 00000 n +0000000000 00000 f +0000289067 00000 n +0000000000 00000 f +0000000000 00000 f +0000000000 00000 f +0000782776 00000 n +0000782443 00000 n +0000000000 00000 f +0001697856 00000 n +0001733152 00000 n +0000000000 00000 f +0001520998 00000 n +0000000000 00000 f +0001475463 00000 n +0000000000 00000 f +0000000000 00000 f +0000000000 00000 f +0000000000 00000 f +0001327197 00000 n +0000000000 00000 f +0001125257 00000 n +0000000000 00000 f +0001021620 00000 n +0000000000 00000 f +0000799097 00000 n +0000000000 00000 f +0000000000 00000 f +0000588506 00000 n +0000717716 00000 n +0000651098 00000 n +0000000000 00000 f +0000544052 00000 n +0000000000 00000 f +0000312531 00000 n +0000000000 00000 f +0000000000 00000 f +0000288500 00000 n +0000000000 00000 f +0000000000 00000 f +0000246226 00000 n +0000276959 00000 n +0000296024 00000 n +0000295616 00000 n +0000788628 00000 n +0000788008 00000 n +0000788101 00000 n +0000786728 00000 n +0000786425 00000 n +0000783597 00000 n +0000783206 00000 n +0000293925 00000 n +0000293605 00000 n +0000253836 00000 n +0000253063 00000 n +0000253169 00000 n +0000290279 00000 n +0000289899 00000 n +0000265176 00000 n +0000264656 00000 n +0000539544 00000 n +0000778636 00000 n +0000777094 00000 n +0000775552 00000 n +0000274522 00000 n +0000274161 00000 n +0000583662 00000 n +0000539580 00000 n +0000299553 00000 n +0000299580 00000 n +0000279607 00000 n +0000279744 00000 n +0000279880 00000 n +0000280019 00000 n +0000280158 00000 n +0000280295 00000 n +0000280432 00000 n +0000280569 00000 n +0000280706 00000 n +0000280843 00000 n +0000280978 00000 n +0000282316 00000 n +0000282204 00000 n +0000282119 00000 n +0000282049 00000 n +0000281961 00000 n +0000281873 00000 n +0000281771 00000 n +0000281669 00000 n +0000281537 00000 n +0000281405 00000 n +0000281273 00000 n +0000274923 00000 n +0000265774 00000 n +0000254515 00000 n +0000299880 00000 n +0000296514 00000 n +0000294278 00000 n +0000290765 00000 n +0000300044 00000 n +0000300114 00000 n +0000300456 00000 n +0000300376 00000 n +0000789237 00000 n +0000787059 00000 n +0000784069 00000 n +0001455758 00000 n +0001322975 00000 n +0001120275 00000 n +0001017223 00000 n +0001776095 00000 n +0001774421 00000 n +0001693037 00000 n +0001517975 00000 n +0001814343 00000 n +0001814006 00000 n +0001809983 00000 n +0001809455 00000 n +0001809553 00000 n +0001808091 00000 n +0001807777 00000 n +0001805565 00000 n +0001805246 00000 n +0001814767 00000 n +0001810526 00000 n +0001808422 00000 n +0001805919 00000 n +0001817371 00000 n +0000780550 00000 n +0000780577 00000 n +0000793398 00000 n +0000793511 00000 n +0000252973 00000 n +0000585859 00000 n +0000585886 00000 n +0000780178 00000 n +0000780292 00000 n +0000541494 00000 n +0000541521 00000 n +0000585487 00000 n +0000585601 00000 n +0000308872 00000 n +0000308899 00000 n +0000541122 00000 n +0000541236 00000 n +0000304654 00000 n +0000304681 00000 n +0000308614 00000 n +0000282428 00000 n +0000282455 00000 n +0000304282 00000 n +0000304396 00000 n +0000246340 00000 n +0000276824 00000 n +0000281115 00000 n +0000281216 00000 n +0000304496 00000 n +0000304597 00000 n +0000308714 00000 n +0000308815 00000 n +0000541336 00000 n +0000541437 00000 n +0000585701 00000 n +0000585802 00000 n +0000780392 00000 n +0000780493 00000 n +0000793611 00000 n +0000793712 00000 n +0001457958 00000 n +0001457985 00000 n +0001461892 00000 n +0001462006 00000 n +0001324889 00000 n +0001324916 00000 n +0001457586 00000 n +0001457700 00000 n +0001122189 00000 n +0001122216 00000 n +0001324517 00000 n +0001324631 00000 n +0001019137 00000 n +0001019164 00000 n +0001121817 00000 n +0001121931 00000 n +0000795973 00000 n +0000796000 00000 n +0001018765 00000 n +0001018879 00000 n +0001018979 00000 n +0001019080 00000 n +0001122031 00000 n +0001122132 00000 n +0001324731 00000 n +0001324832 00000 n +0001457800 00000 n +0001457901 00000 n +0001462106 00000 n +0001462207 00000 n +0001694951 00000 n +0001694978 00000 n +0001777767 00000 n +0001777881 00000 n +0001519889 00000 n +0001519916 00000 n +0001694579 00000 n +0001694693 00000 n +0001472329 00000 n +0001472356 00000 n +0001519517 00000 n +0001519631 00000 n +0001468428 00000 n +0001468455 00000 n +0001471844 00000 n +0001471958 00000 n +0001472071 00000 n +0001464449 00000 n +0001464476 00000 n +0001468170 00000 n +0001468270 00000 n +0001468371 00000 n +0001472171 00000 n +0001472272 00000 n +0001519731 00000 n +0001519832 00000 n +0001694793 00000 n +0001694894 00000 n +0001777981 00000 n +0001778082 00000 n +0001797132 00000 n +0001797159 00000 n +0001816843 00000 n +0001816957 00000 n +0001793162 00000 n +0001793189 00000 n +0001796874 00000 n +0001788768 00000 n +0001788795 00000 n +0001792790 00000 n +0001792904 00000 n +0001784759 00000 n +0001784786 00000 n +0001788510 00000 n +0001780187 00000 n +0001780214 00000 n +0001784274 00000 n +0001784388 00000 n +0001784501 00000 n +0001784601 00000 n +0001784702 00000 n +0001788610 00000 n +0001788711 00000 n +0001793004 00000 n +0001793105 00000 n +0001796974 00000 n +0001797075 00000 n +0001817057 00000 n +0001817158 00000 n +trailer +<</Size 304/Root 1 0 R/Info 174 0 R/ID[<7F04F90492A3E240AC729410CDE273F5><A07716B7D11DB2110A00D50910000000>]>> +startxref +1817613 +%%EOF diff --git a/content/pubs/index.md b/content/pubs/index.md @@ -0,0 +1,60 @@ +--- +title: "Publications" +date: 2023-07-11T13:09:59-07:00 +description: "Published articles and posted preprints" +--- + +Mezlini, A. M., Caddigan, E., Shapiro, A., Ramirez, E., Kondow-McConaghy, H. +M., Yang, J., DeMarco, K., Naraghi-Arani, P. & Foschini, L. (2023). +Precision recruitment for high-risk participants in a COVID-19 cohort study. +_Contemporary Clinical Trials Communications, 33_, 101113. +<https://doi.org/10.1016/j.conctc.2023.101113> + +Mezlini, A., Shapiro, A., Daza, E. J., Caddigan, E., Ramirez, E., Althoff, +T., Foschini, L. (2022). Estimating the Burden of Influenza on Daily +Activity at Population Scale Using Commercial Wearable Sensors. _JAMA +Network Open, 5_(5). <https://doi.org/10.1001/jamanetworkopen.2022.11958> + +Caddigan, E. (2018). Reconstructing simulator control inputs: A machine +learning approach. _Proceedings of the Human Factors and Ergonomics Society +Annual Meeting, 62_(1), 54-56. <https://doi.org/10.1177/1541931218621012> + +Caddigan, E., Choo, H., Fei-Fei, L., & Beck, D. M. (2017). Categorization +influences detection: A Perceptual Advantage for Representative Exemplars of +Natural Scene Categories. _Journal of Vision, 17_(1), 21. +<https://doi.org/10.1167/17.1.21> + +[Ahlstrom, U., Ohneiser, O., & Caddigan, E. (2016). Portable weather +applications for general aviation pilots. _Human Factors, 58_(6), +864-885.](2016hf.pdf) + +[Tseng, Y. C., Glaser, J. I., Caddigan, E., & Lleras, A. (2014). Modeling +the effect of selection history on pop-out visual search. _PLOS ONE, 9_(3), +e89996.](2014plos1.pdf) + +[Torralbo, A., Walther, D. B., Chai, B., Caddigan, E., Fei-Fei, L., & Beck, +D. M.. (2013). Good exemplars of natural scene categories elicit clearer +patterns than bad exemplars but not greater BOLD activity. _PLOS ONE, 8_(3), +e58594.](2013plos1.pdf) + +[Walther, D. B., Chai, B., Caddigan, E., Beck, D. M., & Fei-Fei, L. (2011). +Simple line drawings suffice for fMRI decoding of natural scene categories. +_Proceedings of the National Academy of Sciences, 108_(23), +9661-9666.](2011pnas.pdf) + +[Caddigan, E., & Lleras, A. (2010). Saccadic repulsion in pop-out search: +How a target's dodgy history can push the eyes away from it. _Journal of +Vision, 10_(14), 9.](2010jov.pdf) + +Caddigan, E., Walther, D. B., Fei-Fei, L., & Beck, D. M. (2010). Perceptual +differences between natural scene categories. Object Perception, Attention, +and Memory (OPAM) 2010 Conference Report 18th Annual Meeting, St. Louis, +Missouri, MO, USA. Visual Cognition, 18(10), 1498-1502. + +[Walther, D. B., Caddigan, E., Fei-Fei, L., & Beck, D. M. (2009). Natural +scene categories revealed in distributed patterns of activity in the human +brain. _Journal of Neuroscience, 29_(34), 10573-10581.](2009jon.pdf) + +[Simons, D. J., Lleras, A., Martinez-Conde, S., Slichter, D., Caddigan, E., +& Nevarez, G. (2006). Induced visual fading of complex images. _Journal of +Vision, 6_(10), 1093-1101.](2006jov.pdf) diff --git a/static/posters/2008ecvp.pdf b/static/posters/2008ecvp.pdf Binary files differ. diff --git a/static/posters/2008opam.pdf b/static/posters/2008opam.pdf Binary files differ. diff --git a/static/posters/2008vss.pdf b/static/posters/2008vss.pdf Binary files differ. diff --git a/static/posters/2009vss.pdf b/static/posters/2009vss.pdf Binary files differ. diff --git a/static/posters/caddigan_cns_2012.pdf b/static/posters/caddigan_cns_2012.pdf Binary files differ. diff --git a/static/posters/caddigan_sfn_2013.pdf b/static/posters/caddigan_sfn_2013.pdf Binary files differ. diff --git a/static/posters/caddigan_vss_2011.pdf b/static/posters/caddigan_vss_2011.pdf Binary files differ. diff --git a/static/posters/caddigan_vss_2012.pdf b/static/posters/caddigan_vss_2012.pdf Binary files differ.