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. + + + +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. + + + +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. + + + +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. + + + +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. + + + +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. + + + +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. + + + +### 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. + + + +### 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 +``` + + + +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. + + + +## 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. + + + +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). + + + +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. + +<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. + +<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. + + + +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? + + + +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*? + + + +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. + + + +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. + + + +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)) +``` + + + +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") +``` + + + +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") +``` + + + +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() +``` + + + +```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") +``` + + + +## 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") +``` + + + +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") +``` + + + +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()) +``` + + + +## 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() +``` + + + +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 +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/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|