diff --git a/.gitignore b/.gitignore index 97279387c..02c3e2ecb 100644 --- a/.gitignore +++ b/.gitignore @@ -2,3 +2,7 @@ .Rproj.user .Rhistory .RData +*.pdf +*.log +*_files/ +skeleten/skeleton.tex diff --git a/DESCRIPTION b/DESCRIPTION index 6a3d42234..07c7ade3c 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -47,6 +47,6 @@ Imports: utils, rmarkdown, knitr, yaml, tinytex (>= 0.19), xfun SystemRequirements: GNU make URL: https://github.com/rstudio/rticles BugReports: https://github.com/rstudio/rticles/issues -RoxygenNote: 7.0.2 +RoxygenNote: 7.1.1 Suggests: testit, bookdown, xtable Encoding: UTF-8 diff --git a/NAMESPACE b/NAMESPACE index 1a89fd193..bab7d0eed 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,5 +1,6 @@ # Generated by roxygen2: do not edit by hand +export(acl_article) export(acm_article) export(acs_article) export(aea_article) @@ -18,6 +19,7 @@ export(joss_article) export(jss_article) export(mdpi_article) export(mnras_article) +export(opmi_article) export(oup_article) export(peerj_article) export(plos_article) @@ -28,6 +30,7 @@ export(rss_article) export(sage_article) export(sim_article) export(springer_article) +export(tacl_article) export(tf_article) importFrom(rmarkdown,includes_to_pandoc_args) importFrom(rmarkdown,knitr_options) diff --git a/R/acl_article.R b/R/acl_article.R new file mode 100644 index 000000000..ab3a3db83 --- /dev/null +++ b/R/acl_article.R @@ -0,0 +1,21 @@ +#' ACL paper format +#' +#' @inheritParams rmarkdown::pdf_document +#' @param ... Additional arguments to \code{rmarkdown::pdf_document} +#' +#' @return R Markdown output format to pass to +#' \code{\link[rmarkdown:render]{render}} +#' +#' @examples +#' +#' \dontrun{ +#' library(rmarkdown) +#' draft("MyArticle.Rmd", template = "conll_article", package = "rticles") +#' } +#' +#' @export +acl_article <- function(..., keep_tex = TRUE) { + inherit_pdf_document(..., + keep_tex = keep_tex, + template = find_resource("acl_article", "template.tex")) +} diff --git a/R/opmi_article.R b/R/opmi_article.R new file mode 100644 index 000000000..2908fa520 --- /dev/null +++ b/R/opmi_article.R @@ -0,0 +1,21 @@ +#' OpenMind article format +#' +#' @inheritParams rmarkdown::pdf_document +#' @param ... Additional arguments to \code{rmarkdown::pdf_document} +#' +#' @return R Markdown output format to pass to +#' \code{\link[rmarkdown:render]{render}} +#' +#' @examples +#' +#' \dontrun{ +#' library(rmarkdown) +#' draft("MyArticle.Rmd", template = "opmi_article", package = "rticles") +#' } +#' +#' @export +opmi_article <- function(..., keep_tex = TRUE) { + inherit_pdf_document(..., + keep_tex = keep_tex, + template = find_resource("opmi_article", "template.tex")) +} diff --git a/R/tacl_article.R b/R/tacl_article.R new file mode 100644 index 000000000..c8d16a596 --- /dev/null +++ b/R/tacl_article.R @@ -0,0 +1,21 @@ +#' TACL paper format +#' +#' @inheritParams rmarkdown::pdf_document +#' @param ... Additional arguments to \code{rmarkdown::pdf_document} +#' +#' @return R Markdown output format to pass to +#' \code{\link[rmarkdown:render]{render}} +#' +#' @examples +#' +#' \dontrun{ +#' library(rmarkdown) +#' draft("MyArticle.Rmd", template = "conll_article", package = "rticles") +#' } +#' +#' @export +tacl_article <- function(..., keep_tex = TRUE) { + inherit_pdf_document(..., + keep_tex = keep_tex, + template = find_resource("tacl_article", "template.tex")) +} diff --git a/README.md b/README.md index c7a321e1b..a6528f1e7 100644 --- a/README.md +++ b/README.md @@ -49,6 +49,8 @@ The **rticles** package provides a suite of custom [R Markdown](http://rmarkdown - [NNRAS](https://www.ras.org.uk/news-and-press/2641-new-version-of-the-mnras-latex-package) journal submissions +- [OpenMind](https://www.mitpressjournals.org/loi/opmi) journal submissions + - [OUP](https://academic.oup.com/journals/pages/authors/preparing_your_manuscript) articles - [PeerJ](https://peerj.com) articles diff --git a/inst/rmarkdown/templates/acl_article/resources/template.tex b/inst/rmarkdown/templates/acl_article/resources/template.tex new file mode 100644 index 000000000..5a982f284 --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/resources/template.tex @@ -0,0 +1,56 @@ +% +% File naaclhlt2018.tex +% +%% Based on the style files for NAACL-HLT 2018, which were +%% Based on the style files for ACL-2015, with some improvements +%% taken from the NAACL-2016 style +%% Based on the style files for ACL-2014, which were, in turn, +%% based on ACL-2013, ACL-2012, ACL-2011, ACL-2010, ACL-IJCNLP-2009, +%% EACL-2009, IJCNLP-2008... +%% Based on the style files for EACL 2006 by +%%e.agirre@ehu.es or Sergi.Balari@uab.es +%% and that of ACL 08 by Joakim Nivre and Noah Smith + + +\documentclass[11pt,a4paper]{article} +\usepackage[hyperref]{naaclhlt2018} +\usepackage{widetext} +\usepackage{times} +\usepackage{latexsym} +\usepackage{url} + +$for(header-includes)$ +$header-includes$ +$endfor$ + +$if(aclfinalcopy)$ +\aclfinalcopy +$endif$ + +\def\aclpaperid{$aclpaperid$} + +\bibliographystyle{acl_natbib} + +\title{$title$} + +\author{ + $for(author)$ + $author.name$ \\ $author.affiliation$ \\ {\tt {\normalsize $author.email$}} $sep$\And + $endfor$ +} + +\date{} + +\begin{document} +\maketitle +\begin{abstract} +$abstract$ +\end{abstract} + +$body$ + +$for(include-after)$ +$include-after$ +$endfor$ + +\end{document} diff --git a/inst/rmarkdown/templates/acl_article/skeleton/acl_natbib.bst b/inst/rmarkdown/templates/acl_article/skeleton/acl_natbib.bst new file mode 100644 index 000000000..2812c36be --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/skeleton/acl_natbib.bst @@ -0,0 +1,1970 @@ +%%% Modification of BibTeX style file acl_natbib_nourl.bst +%%% ... by urlbst, version 0.7 (marked with "% urlbst") +%%% See +%%% Added webpage entry type, and url and lastchecked fields. +%%% Added eprint support. +%%% Added DOI support. +%%% Added PUBMED support. +%%% Added hyperref support. +%%% Original headers follow... + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +% BibTeX style file acl_natbib.bst +% +% intended as input to urlbst script +% +% adapted from compling.bst +% in order to mimic the style files for ACL conferences prior to 2017 +% by making the following three changes: +% - for @incollection, page numbers now follow volume title. +% - for @inproceedings, address now follows conference name. +% (address is intended as location of conference, +% not address of publisher.) +% - for papers with three authors, use et al. in citation +% Dan Gildea 2017/06/08 + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +% BibTeX style file compling.bst +% +% Intended for the journal Computational Linguistics (ACL/MIT Press) +% Created by Ron Artstein on 2005/08/22 +% For use with for author-year citations. +% +% I created this file in order to allow submissions to the journal +% Computational Linguistics using the package for author-year +% citations, which offers a lot more flexibility than , CL's +% official citation package. This file adheres strictly to the official +% style guide available from the MIT Press: +% +% http://mitpress.mit.edu/journals/coli/compling_style.pdf +% +% This includes all the various quirks of the style guide, for example: +% - a chapter from a monograph (@inbook) has no page numbers. +% - an article from an edited volume (@incollection) has page numbers +% after the publisher and address. +% - an article from a proceedings volume (@inproceedings) has page +% numbers before the publisher and address. +% +% Where the style guide was inconsistent or not specific enough I +% looked at actual published articles and exercised my own judgment. +% I noticed two inconsistencies in the style guide: +% +% - The style guide gives one example of an article from an edited +% volume with the editor's name spelled out in full, and another +% with the editors' names abbreviated. I chose to accept the first +% one as correct, since the style guide generally shuns abbreviations, +% and editors' names are also spelled out in some recently published +% articles. +% +% - The style guide gives one example of a reference where the word +% "and" between two authors is preceded by a comma. This is most +% likely a typo, since in all other cases with just two authors or +% editors there is no comma before the word "and". +% +% One case where the style guide is not being specific is the placement +% of the edition number, for which no example is given. I chose to put +% it immediately after the title, which I (subjectively) find natural, +% and is also the place of the edition in a few recently published +% articles. +% +% This file correctly reproduces all of the examples in the official +% style guide, except for the two inconsistencies noted above. I even +% managed to get it to correctly format the proceedings example which +% has an organization, a publisher, and two addresses (the conference +% location and the publisher's address), though I cheated a bit by +% putting the conference location and month as part of the title field; +% I feel that in this case the conference location and month can be +% considered as part of the title, and that adding a location field +% is not justified. Note also that a location field is not standard, +% so entries made with this field would not port nicely to other styles. +% However, if authors feel that there's a need for a location field +% then tell me and I'll see what I can do. +% +% The file also produces to my satisfaction all the bibliographical +% entries in my recent (joint) submission to CL (this was the original +% motivation for creating the file). I also tested it by running it +% on a larger set of entries and eyeballing the results. There may of +% course still be errors, especially with combinations of fields that +% are not that common, or with cross-references (which I seldom use). +% If you find such errors please write to me. +% +% I hope people find this file useful. Please email me with comments +% and suggestions. +% +% Ron Artstein +% artstein [at] essex.ac.uk +% August 22, 2005. +% +% Some technical notes. +% +% This file is based on a file generated with the package +% by Patrick W. Daly (see selected options below), which was then +% manually customized to conform with certain CL requirements which +% cannot be met by . Departures from the generated file +% include: +% +% Function inbook: moved publisher and address to the end; moved +% edition after title; replaced function format.chapter.pages by +% new function format.chapter to output chapter without pages. +% +% Function inproceedings: moved publisher and address to the end; +% replaced function format.in.ed.booktitle by new function +% format.in.booktitle to output the proceedings title without +% the editor. +% +% Functions book, incollection, manual: moved edition after title. +% +% Function mastersthesis: formatted title as for articles (unlike +% phdthesis which is formatted as book) and added month. +% +% Function proceedings: added new.sentence between organization and +% publisher when both are present. +% +% Function format.lab.names: modified so that it gives all the +% authors' surnames for in-text citations for one, two and three +% authors and only uses "et. al" for works with four authors or more +% (thanks to Ken Shan for convincing me to go through the trouble of +% modifying this function rather than using unreliable hacks). +% +% Changes: +% +% 2006-10-27: Changed function reverse.pass so that the extra label is +% enclosed in parentheses when the year field ends in an uppercase or +% lowercase letter (change modeled after Uli Sauerland's modification +% of nals.bst). RA. +% +% +% The preamble of the generated file begins below: +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% +%% This is file `compling.bst', +%% generated with the docstrip utility. +%% +%% The original source files were: +%% +%% merlin.mbs (with options: `ay,nat,vonx,nm-revv1,jnrlst,keyxyr,blkyear,dt-beg,yr-per,note-yr,num-xser,pre-pub,xedn,nfss') +%% ---------------------------------------- +%% *** Intended for the journal Computational Linguistics *** +%% +%% Copyright 1994-2002 Patrick W Daly + % =============================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files, listed above. + % + % This generated file can be redistributed and/or modified under the terms + % of the LaTeX Project Public License Distributed from CTAN + % archives in directory macros/latex/base/lppl.txt; either + % version 1 of the License, or any later version. + % =============================================================== + % Name and version information of the main mbs file: + % \ProvidesFile{merlin.mbs}[2002/10/21 4.05 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + %------------------------------------------------------------------- + % This bibliography style file is intended for texts in ENGLISH + % This is an author-year citation style bibliography. As such, it is + % non-standard LaTeX, and requires a special package file to function properly. + % Such a package is natbib.sty by Patrick W. Daly + % The form of the \bibitem entries is + % \bibitem[Jones et al.(1990)]{key}... + % \bibitem[Jones et al.(1990)Jones, Baker, and Smith]{key}... + % The essential feature is that the label (the part in brackets) consists + % of the author names, as they should appear in the citation, with the year + % in parentheses following. There must be no space before the opening + % parenthesis! + % With natbib v5.3, a full list of authors may also follow the year. + % In natbib.sty, it is possible to define the type of enclosures that is + % really wanted (brackets or parentheses), but in either case, there must + % be parentheses in the label. + % The \cite command functions as follows: + % \citet{key} ==>> Jones et al. (1990) + % \citet*{key} ==>> Jones, Baker, and Smith (1990) + % \citep{key} ==>> (Jones et al., 1990) + % \citep*{key} ==>> (Jones, Baker, and Smith, 1990) + % \citep[chap. 2]{key} ==>> (Jones et al., 1990, chap. 2) + % \citep[e.g.][]{key} ==>> (e.g. Jones et al., 1990) + % \citep[e.g.][p. 32]{key} ==>> (e.g. Jones et al., p. 32) + % \citeauthor{key} ==>> Jones et al. + % \citeauthor*{key} ==>> Jones, Baker, and Smith + % \citeyear{key} ==>> 1990 + %--------------------------------------------------------------------- + +ENTRY + { address + author + booktitle + chapter + edition + editor + howpublished + institution + journal + key + month + note + number + organization + pages + publisher + school + series + title + type + volume + year + eprint % urlbst + doi % urlbst + pubmed % urlbst + url % urlbst + lastchecked % urlbst + } + {} + { label extra.label sort.label short.list } +INTEGERS { output.state before.all mid.sentence after.sentence after.block } +% urlbst... +% urlbst constants and state variables +STRINGS { urlintro + eprinturl eprintprefix doiprefix doiurl pubmedprefix pubmedurl + citedstring onlinestring linktextstring + openinlinelink closeinlinelink } +INTEGERS { hrefform inlinelinks makeinlinelink + addeprints adddoiresolver addpubmedresolver } +FUNCTION {init.urlbst.variables} +{ + % The following constants may be adjusted by hand, if desired + + % The first set allow you to enable or disable certain functionality. + #1 'addeprints := % 0=no eprints; 1=include eprints + #1 'adddoiresolver := % 0=no DOI resolver; 1=include it + #1 'addpubmedresolver := % 0=no PUBMED resolver; 1=include it + #2 'hrefform := % 0=no crossrefs; 1=hypertex xrefs; 2=hyperref refs + #1 'inlinelinks := % 0=URLs explicit; 1=URLs attached to titles + + % String constants, which you _might_ want to tweak. + "URL: " 'urlintro := % prefix before URL; typically "Available from:" or "URL": + "online" 'onlinestring := % indication that resource is online; typically "online" + "cited " 'citedstring := % indicator of citation date; typically "cited " + "[link]" 'linktextstring := % dummy link text; typically "[link]" + "http://arxiv.org/abs/" 'eprinturl := % prefix to make URL from eprint ref + "arXiv:" 'eprintprefix := % text prefix printed before eprint ref; typically "arXiv:" + "https://doi.org/" 'doiurl := % prefix to make URL from DOI + "doi:" 'doiprefix := % text prefix printed before DOI ref; typically "doi:" + "http://www.ncbi.nlm.nih.gov/pubmed/" 'pubmedurl := % prefix to make URL from PUBMED + "PMID:" 'pubmedprefix := % text prefix printed before PUBMED ref; typically "PMID:" + + % The following are internal state variables, not configuration constants, + % so they shouldn't be fiddled with. + #0 'makeinlinelink := % state variable managed by possibly.setup.inlinelink + "" 'openinlinelink := % ditto + "" 'closeinlinelink := % ditto +} +INTEGERS { + bracket.state + outside.brackets + open.brackets + within.brackets + close.brackets +} +% ...urlbst to here +FUNCTION {init.state.consts} +{ #0 'outside.brackets := % urlbst... + #1 'open.brackets := + #2 'within.brackets := + #3 'close.brackets := % ...urlbst to here + + #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := +} +STRINGS { s t} +% urlbst +FUNCTION {output.nonnull.original} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +% urlbst... +% The following three functions are for handling inlinelink. They wrap +% a block of text which is potentially output with write$ by multiple +% other functions, so we don't know the content a priori. +% They communicate between each other using the variables makeinlinelink +% (which is true if a link should be made), and closeinlinelink (which holds +% the string which should close any current link. They can be called +% at any time, but start.inlinelink will be a no-op unless something has +% previously set makeinlinelink true, and the two ...end.inlinelink functions +% will only do their stuff if start.inlinelink has previously set +% closeinlinelink to be non-empty. +% (thanks to 'ijvm' for suggested code here) +FUNCTION {uand} +{ 'skip$ { pop$ #0 } if$ } % 'and' (which isn't defined at this point in the file) +FUNCTION {possibly.setup.inlinelink} +{ makeinlinelink hrefform #0 > uand + { doi empty$ adddoiresolver uand + { pubmed empty$ addpubmedresolver uand + { eprint empty$ addeprints uand + { url empty$ + { "" } + { url } + if$ } + { eprinturl eprint * } + if$ } + { pubmedurl pubmed * } + if$ } + { doiurl doi * } + if$ + % an appropriately-formatted URL is now on the stack + hrefform #1 = % hypertex + { "\special {html: }{" * 'openinlinelink := + "\special {html:}" 'closeinlinelink := } + { "\href {" swap$ * "} {" * 'openinlinelink := % hrefform=#2 -- hyperref + % the space between "} {" matters: a URL of just the right length can cause "\% newline em" + "}" 'closeinlinelink := } + if$ + #0 'makeinlinelink := + } + 'skip$ + if$ % makeinlinelink +} +FUNCTION {add.inlinelink} +{ openinlinelink empty$ + 'skip$ + { openinlinelink swap$ * closeinlinelink * + "" 'openinlinelink := + } + if$ +} +FUNCTION {output.nonnull} +{ % Save the thing we've been asked to output + 's := + % If the bracket-state is close.brackets, then add a close-bracket to + % what is currently at the top of the stack, and set bracket.state + % to outside.brackets + bracket.state close.brackets = + { "]" * + outside.brackets 'bracket.state := + } + 'skip$ + if$ + bracket.state outside.brackets = + { % We're outside all brackets -- this is the normal situation. + % Write out what's currently at the top of the stack, using the + % original output.nonnull function. + s + add.inlinelink + output.nonnull.original % invoke the original output.nonnull + } + { % Still in brackets. Add open-bracket or (continuation) comma, add the + % new text (in s) to the top of the stack, and move to the close-brackets + % state, ready for next time (unless inbrackets resets it). If we come + % into this branch, then output.state is carefully undisturbed. + bracket.state open.brackets = + { " [" * } + { ", " * } % bracket.state will be within.brackets + if$ + s * + close.brackets 'bracket.state := + } + if$ +} + +% Call this function just before adding something which should be presented in +% brackets. bracket.state is handled specially within output.nonnull. +FUNCTION {inbrackets} +{ bracket.state close.brackets = + { within.brackets 'bracket.state := } % reset the state: not open nor closed + { open.brackets 'bracket.state := } + if$ +} + +FUNCTION {format.lastchecked} +{ lastchecked empty$ + { "" } + { inbrackets citedstring lastchecked * } + if$ +} +% ...urlbst to here +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} +FUNCTION {fin.entry.original} % urlbst (renamed from fin.entry, so it can be wrapped below) +{ add.period$ + write$ + newline$ +} + +FUNCTION {new.block} +{ output.state before.all = + 'skip$ + { after.block 'output.state := } + if$ +} +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} +FUNCTION {add.blank} +{ " " * before.all 'output.state := +} + +FUNCTION {date.block} +{ + new.block +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} +FUNCTION {new.block.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.block + if$ +} +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} +FUNCTION {emphasize} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" swap$ * "}" * } + if$ +} +FUNCTION {tie.or.space.prefix} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ +} + +FUNCTION {capitalize} +{ "u" change.case$ "t" change.case$ } + +FUNCTION {space.word} +{ " " swap$ * " " * } + % Here are the language-specific definitions for explicit words. + % Each function has a name bbl.xxx where xxx is the English word. + % The language selected here is ENGLISH +FUNCTION {bbl.and} +{ "and"} + +FUNCTION {bbl.etal} +{ "et~al." } + +FUNCTION {bbl.editors} +{ "editors" } + +FUNCTION {bbl.editor} +{ "editor" } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edition} +{ "edition" } + +FUNCTION {bbl.volume} +{ "volume" } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "number" } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "pages" } + +FUNCTION {bbl.page} +{ "page" } + +FUNCTION {bbl.chapter} +{ "chapter" } + +FUNCTION {bbl.techrep} +{ "Technical Report" } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. thesis" } + +MACRO {jan} {"January"} + +MACRO {feb} {"February"} + +MACRO {mar} {"March"} + +MACRO {apr} {"April"} + +MACRO {may} {"May"} + +MACRO {jun} {"June"} + +MACRO {jul} {"July"} + +MACRO {aug} {"August"} + +MACRO {sep} {"September"} + +MACRO {oct} {"October"} + +MACRO {nov} {"November"} + +MACRO {dec} {"December"} + +MACRO {acmcs} {"ACM Computing Surveys"} + +MACRO {acta} {"Acta Informatica"} + +MACRO {cacm} {"Communications of the ACM"} + +MACRO {ibmjrd} {"IBM Journal of Research and Development"} + +MACRO {ibmsj} {"IBM Systems Journal"} + +MACRO {ieeese} {"IEEE Transactions on Software Engineering"} + +MACRO {ieeetc} {"IEEE Transactions on Computers"} + +MACRO {ieeetcad} + {"IEEE Transactions on Computer-Aided Design of Integrated Circuits"} + +MACRO {ipl} {"Information Processing Letters"} + +MACRO {jacm} {"Journal of the ACM"} + +MACRO {jcss} {"Journal of Computer and System Sciences"} + +MACRO {scp} {"Science of Computer Programming"} + +MACRO {sicomp} {"SIAM Journal on Computing"} + +MACRO {tocs} {"ACM Transactions on Computer Systems"} + +MACRO {tods} {"ACM Transactions on Database Systems"} + +MACRO {tog} {"ACM Transactions on Graphics"} + +MACRO {toms} {"ACM Transactions on Mathematical Software"} + +MACRO {toois} {"ACM Transactions on Office Information Systems"} + +MACRO {toplas} {"ACM Transactions on Programming Languages and Systems"} + +MACRO {tcs} {"Theoretical Computer Science"} +FUNCTION {bibinfo.check} +{ swap$ + duplicate$ missing$ + { + pop$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ pop$ + } + { swap$ + pop$ + } + if$ + } + if$ +} +FUNCTION {bibinfo.warn} +{ swap$ + duplicate$ missing$ + { + swap$ "missing " swap$ * " in " * cite$ * warning$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ "empty " swap$ * " in " * cite$ * warning$ + } + { swap$ + pop$ + } + if$ + } + if$ +} +STRINGS { bibinfo} +INTEGERS { nameptr namesleft numnames } + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + duplicate$ #1 > + { "{ff~}{vv~}{ll}{, jj}" } + { "{ff~}{vv~}{ll}{, jj}" } % first name first for first author +% { "{vv~}{ll}{, ff}{, jj}" } % last name first for first author + if$ + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + namesleft #1 > + { ", " * t * } + { + numnames #2 > + { "," * } + 'skip$ + if$ + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal * + } + { + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} +FUNCTION {format.names.ed} +{ + 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{ff~}{vv~}{ll}{, jj}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + namesleft #1 > + { ", " * t * } + { + numnames #2 > + { "," * } + 'skip$ + if$ + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + + " " * bbl.etal * + } + { + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} +FUNCTION {format.key} +{ empty$ + { key field.or.null } + { "" } + if$ +} + +FUNCTION {format.authors} +{ author "author" format.names +} +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.editor + * + } + if$ +} +FUNCTION {format.note} +{ + note empty$ + { "" } + { note #1 #1 substring$ + duplicate$ "{" = + 'skip$ + { output.state mid.sentence = + { "l" } + { "u" } + if$ + change.case$ + } + if$ + note #2 global.max$ substring$ * "note" bibinfo.check + } + if$ +} + +FUNCTION {format.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check +} +FUNCTION {format.full.names} +{'s := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{vv~}{ll}" format.name$ + 't := + nameptr #1 > + { + namesleft #1 > + { ", " * t * } + { + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal * + } + { + numnames #2 > + { "," * } + 'skip$ + if$ + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ +} + +FUNCTION {author.editor.key.full} +{ author empty$ + { editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.full.names } + if$ + } + { author format.full.names } + if$ +} + +FUNCTION {author.key.full} +{ author empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { author format.full.names } + if$ +} + +FUNCTION {editor.key.full} +{ editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.full.names } + if$ +} + +FUNCTION {make.full.names} +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.key.full + { type$ "proceedings" = + 'editor.key.full + 'author.key.full + if$ + } + if$ +} + +FUNCTION {output.bibitem.original} % urlbst (renamed from output.bibitem, so it can be wrapped below) +{ newline$ + "\bibitem[{" write$ + label write$ + ")" make.full.names duplicate$ short.list = + { pop$ } + { * } + if$ + "}]{" * write$ + cite$ write$ + "}" write$ + newline$ + "" + before.all 'output.state := +} + +FUNCTION {n.dashify} +{ + 't := + "" + { t empty$ not } + { t #1 #1 substring$ "-" = + { t #1 #2 substring$ "--" = not + { "--" * + t #2 global.max$ substring$ 't := + } + { { t #1 #1 substring$ "-" = } + { "-" * + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {word.in} +{ bbl.in capitalize + " " * } + +FUNCTION {format.date} +{ year "year" bibinfo.check duplicate$ empty$ + { + } + 'skip$ + if$ + extra.label * + before.all 'output.state := + after.sentence 'output.state := +} +FUNCTION {format.btitle} +{ title "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + } + if$ +} +FUNCTION {either.or.check} +{ empty$ + 'pop$ + { "can't use both " swap$ * " fields in " * cite$ * warning$ } + if$ +} +FUNCTION {format.bvolume} +{ volume empty$ + { "" } + { bbl.volume volume tie.or.space.prefix + "volume" bibinfo.check * * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ bbl.of space.word * swap$ + emphasize * } + if$ + "volume and number" number either.or.check + } + if$ +} +FUNCTION {format.number.series} +{ volume empty$ + { number empty$ + { series field.or.null } + { series empty$ + { number "number" bibinfo.check } + { output.state mid.sentence = + { bbl.number } + { bbl.number capitalize } + if$ + number tie.or.space.prefix "number" bibinfo.check * * + bbl.in space.word * + series "series" bibinfo.check * + } + if$ + } + if$ + } + { "" } + if$ +} + +FUNCTION {format.edition} +{ edition duplicate$ empty$ 'skip$ + { + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} +INTEGERS { multiresult } +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + { multiresult not + t empty$ not + and + } + { t #1 #1 substring$ + duplicate$ "-" = + swap$ duplicate$ "," = + swap$ "+" = + or or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + multiresult +} +FUNCTION {format.pages} +{ pages duplicate$ empty$ 'skip$ + { duplicate$ multi.page.check + { + bbl.pages swap$ + n.dashify + } + { + bbl.page swap$ + } + if$ + tie.or.space.prefix + "pages" bibinfo.check + * * + } + if$ +} +FUNCTION {format.journal.pages} +{ pages duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ + { pop$ pop$ format.pages } + { + ":" * + swap$ + n.dashify + "pages" bibinfo.check + * + } + if$ + } + if$ +} +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + number "number" bibinfo.check duplicate$ empty$ 'skip$ + { + swap$ duplicate$ empty$ + { "there's a number but no volume in " cite$ * warning$ } + 'skip$ + if$ + swap$ + "(" swap$ * ")" * + } + if$ * + format.journal.pages +} + +FUNCTION {format.chapter} +{ chapter empty$ + 'skip$ + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + pages empty$ + 'skip$ + { ", " * format.pages * } + if$ + } + if$ +} + +FUNCTION {format.booktitle} +{ + booktitle "booktitle" bibinfo.check + emphasize +} +FUNCTION {format.in.booktitle} +{ format.booktitle duplicate$ empty$ 'skip$ + { + word.in swap$ * + } + if$ +} +FUNCTION {format.in.ed.booktitle} +{ format.booktitle duplicate$ empty$ 'skip$ + { + editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { + "," * + " " * + get.bbl.editor + ", " * + * swap$ + * } + if$ + word.in swap$ * + } + if$ +} +FUNCTION {format.thesis.type} +{ type duplicate$ empty$ + 'pop$ + { swap$ pop$ + "t" change.case$ "type" bibinfo.check + } + if$ +} +FUNCTION {format.tr.number} +{ number "number" bibinfo.check + type duplicate$ empty$ + { pop$ bbl.techrep } + 'skip$ + if$ + "type" bibinfo.check + swap$ duplicate$ empty$ + { pop$ "t" change.case$ } + { tie.or.space.prefix * * } + if$ +} +FUNCTION {format.article.crossref} +{ + word.in + " \cite{" * crossref * "}" * +} +FUNCTION {format.book.crossref} +{ volume duplicate$ empty$ + { "empty volume in " cite$ * "'s crossref of " * crossref * warning$ + pop$ word.in + } + { bbl.volume + capitalize + swap$ tie.or.space.prefix "volume" bibinfo.check * * bbl.of space.word * + } + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.incoll.inproc.crossref} +{ + word.in + " \cite{" * crossref * "}" * +} +FUNCTION {format.org.or.pub} +{ 't := + "" + address empty$ t empty$ and + 'skip$ + { + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ", " * address "address" bibinfo.check * } + if$ + } + if$ + } + if$ +} +FUNCTION {format.publisher.address} +{ publisher "publisher" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.organization.address} +{ organization "organization" bibinfo.check format.org.or.pub +} + +% urlbst... +% Functions for making hypertext links. +% In all cases, the stack has (link-text href-url) +% +% make 'null' specials +FUNCTION {make.href.null} +{ + pop$ +} +% make hypertex specials +FUNCTION {make.href.hypertex} +{ + "\special {html: }" * swap$ * + "\special {html:}" * +} +% make hyperref specials +FUNCTION {make.href.hyperref} +{ + "\href {" swap$ * "} {\path{" * swap$ * "}}" * +} +FUNCTION {make.href} +{ hrefform #2 = + 'make.href.hyperref % hrefform = 2 + { hrefform #1 = + 'make.href.hypertex % hrefform = 1 + 'make.href.null % hrefform = 0 (or anything else) + if$ + } + if$ +} + +% If inlinelinks is true, then format.url should be a no-op, since it's +% (a) redundant, and (b) could end up as a link-within-a-link. +FUNCTION {format.url} +{ inlinelinks #1 = url empty$ or + { "" } + { hrefform #1 = + { % special case -- add HyperTeX specials + urlintro "\url{" url * "}" * url make.href.hypertex * } + { urlintro "\url{" * url * "}" * } + if$ + } + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { "" } + { eprintprefix eprint * eprinturl eprint * make.href } + if$ +} + +FUNCTION {format.doi} +{ doi empty$ + { "" } + { doiprefix doi * doiurl doi * make.href } + if$ +} + +FUNCTION {format.pubmed} +{ pubmed empty$ + { "" } + { pubmedprefix pubmed * pubmedurl pubmed * make.href } + if$ +} + +% Output a URL. We can't use the more normal idiom (something like +% `format.url output'), because the `inbrackets' within +% format.lastchecked applies to everything between calls to `output', +% so that `format.url format.lastchecked * output' ends up with both +% the URL and the lastchecked in brackets. +FUNCTION {output.url} +{ url empty$ + 'skip$ + { new.block + format.url output + format.lastchecked output + } + if$ +} + +FUNCTION {output.web.refs} +{ + new.block + inlinelinks + 'skip$ % links were inline -- don't repeat them + { + output.url + addeprints eprint empty$ not and + { format.eprint output.nonnull } + 'skip$ + if$ + adddoiresolver doi empty$ not and + { format.doi output.nonnull } + 'skip$ + if$ + addpubmedresolver pubmed empty$ not and + { format.pubmed output.nonnull } + 'skip$ + if$ + } + if$ +} + +% Wrapper for output.bibitem.original. +% If the URL field is not empty, set makeinlinelink to be true, +% so that an inline link will be started at the next opportunity +FUNCTION {output.bibitem} +{ outside.brackets 'bracket.state := + output.bibitem.original + inlinelinks url empty$ not doi empty$ not or pubmed empty$ not or eprint empty$ not or and + { #1 'makeinlinelink := } + { #0 'makeinlinelink := } + if$ +} + +% Wrapper for fin.entry.original +FUNCTION {fin.entry} +{ output.web.refs % urlbst + makeinlinelink % ooops, it appears we didn't have a title for inlinelink + { possibly.setup.inlinelink % add some artificial link text here, as a fallback + linktextstring output.nonnull } + 'skip$ + if$ + bracket.state close.brackets = % urlbst + { "]" * } + 'skip$ + if$ + fin.entry.original +} + +% Webpage entry type. +% Title and url fields required; +% author, note, year, month, and lastchecked fields optional +% See references +% ISO 690-2 http://www.nlc-bnc.ca/iso/tc46sc9/standard/690-2e.htm +% http://www.classroom.net/classroom/CitingNetResources.html +% http://neal.ctstateu.edu/history/cite.html +% http://www.cas.usf.edu/english/walker/mla.html +% for citation formats for web pages. +FUNCTION {webpage} +{ output.bibitem + author empty$ + { editor empty$ + 'skip$ % author and editor both optional + { format.editors output.nonnull } + if$ + } + { editor empty$ + { format.authors output.nonnull } + { "can't use both author and editor fields in " cite$ * warning$ } + if$ + } + if$ + new.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ + format.title "title" output.check + inbrackets onlinestring output + new.block + year empty$ + 'skip$ + { format.date "year" output.check } + if$ + % We don't need to output the URL details ('lastchecked' and 'url'), + % because fin.entry does that for us, using output.web.refs. The only + % reason we would want to put them here is if we were to decide that + % they should go in front of the rather miscellaneous information in 'note'. + new.block + note output + fin.entry +} +% ...urlbst to here + + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + crossref missing$ + { + journal + "journal" bibinfo.check + emphasize + "journal" output.check + possibly.setup.inlinelink format.vol.num.pages output% urlbst + } + { format.article.crossref output.nonnull + format.pages output + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {book} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.edition output + crossref missing$ + { format.bvolume output + new.block + format.number.series output + new.sentence + format.publisher.address output + } + { + new.block + format.book.crossref output.nonnull + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {booklet} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.edition output + crossref missing$ + { + format.bvolume output + format.number.series output + format.chapter "chapter" output.check + new.sentence + format.publisher.address output + new.block + } + { + format.chapter "chapter" output.check + new.block + format.book.crossref output.nonnull + } + if$ + new.block + format.note output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.edition output + format.bvolume output + format.number.series output + format.chapter.pages output + new.sentence + format.publisher.address output + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + crossref missing$ + { format.in.booktitle "booktitle" output.check + format.bvolume output + format.number.series output + format.pages output + address "address" bibinfo.check output + new.sentence + organization "organization" bibinfo.check output + publisher "publisher" bibinfo.check output + } + { format.incoll.inproc.crossref output.nonnull + format.pages output + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {conference} { inproceedings } +FUNCTION {manual} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.edition output + organization address new.block.checkb + organization "organization" bibinfo.check output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title + "title" output.check + new.block + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + month "month" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title output + new.block + howpublished "howpublished" bibinfo.check output + new.block + format.note output + fin.entry +} +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle + "title" output.check + new.block + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + format.editors output + editor format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.bvolume output + format.number.series output + new.sentence + publisher empty$ + { format.organization.address output } + { organization "organization" bibinfo.check output + new.sentence + format.publisher.address output + } + if$ + new.block + format.note output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title + "title" output.check + new.block + format.tr.number output.nonnull + institution "institution" bibinfo.warn output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + format.note "note" output.check + fin.entry +} + +FUNCTION {default.type} { misc } +READ +FUNCTION {sortify} +{ purify$ + "l" change.case$ +} +INTEGERS { len } +FUNCTION {chop.word} +{ 's := + 'len := + s #1 len substring$ = + { s len #1 + global.max$ substring$ } + 's + if$ +} +FUNCTION {format.lab.names} +{ 's := + "" 't := + s #1 "{vv~}{ll}" format.name$ + s num.names$ duplicate$ + #2 > + { pop$ + " " * bbl.etal * + } + { #2 < + 'skip$ + { s #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + " " * bbl.etal * + } + { bbl.and space.word * s #2 "{vv~}{ll}" format.name$ + * } + if$ + } + if$ + } + if$ +} + +FUNCTION {author.key.label} +{ author empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {author.editor.key.label} +{ author empty$ + { editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.lab.names } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {editor.key.label} +{ editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.lab.names } + if$ +} + +FUNCTION {calc.short.authors} +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.key.label + { type$ "proceedings" = + 'editor.key.label + 'author.key.label + if$ + } + if$ + 'short.list := +} + +FUNCTION {calc.label} +{ calc.short.authors + short.list + "(" + * + year duplicate$ empty$ + short.list key field.or.null = or + { pop$ "" } + 'skip$ + if$ + * + 'label := +} + +FUNCTION {sort.format.names} +{ 's := + #1 'nameptr := + "" + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{ll{ }}{ ff{ }}{ jj{ }}" + format.name$ 't := + nameptr #1 > + { + " " * + namesleft #1 = t "others" = and + { "zzzzz" * } + { t sortify * } + if$ + } + { t sortify * } + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ +} + +FUNCTION {sort.format.title} +{ 't := + "A " #2 + "An " #3 + "The " #4 t chop.word + chop.word + chop.word + sortify + #1 global.max$ substring$ +} +FUNCTION {author.sort} +{ author empty$ + { key empty$ + { "to sort, need author or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { author sort.format.names } + if$ +} +FUNCTION {author.editor.sort} +{ author empty$ + { editor empty$ + { key empty$ + { "to sort, need author, editor, or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ + } + { author sort.format.names } + if$ +} +FUNCTION {editor.sort} +{ editor empty$ + { key empty$ + { "to sort, need editor or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ +} +FUNCTION {presort} +{ calc.label + label sortify + " " + * + type$ "book" = + type$ "inbook" = + or + 'author.editor.sort + { type$ "proceedings" = + 'editor.sort + 'author.sort + if$ + } + if$ + #1 entry.max$ substring$ + 'sort.label := + sort.label + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ + 'sort.key$ := +} + +ITERATE {presort} +SORT +STRINGS { last.label next.extra } +INTEGERS { last.extra.num number.label } +FUNCTION {initialize.extra.label.stuff} +{ #0 int.to.chr$ 'last.label := + "" 'next.extra := + #0 'last.extra.num := + #0 'number.label := +} +FUNCTION {forward.pass} +{ last.label label = + { last.extra.num #1 + 'last.extra.num := + last.extra.num int.to.chr$ 'extra.label := + } + { "a" chr.to.int$ 'last.extra.num := + "" 'extra.label := + label 'last.label := + } + if$ + number.label #1 + 'number.label := +} +FUNCTION {reverse.pass} +{ next.extra "b" = + { "a" 'extra.label := } + 'skip$ + if$ + extra.label 'next.extra := + extra.label + duplicate$ empty$ + 'skip$ + { year field.or.null #-1 #1 substring$ chr.to.int$ #65 < + { "{\natexlab{" swap$ * "}}" * } + { "{(\natexlab{" swap$ * "})}" * } + if$ } + if$ + 'extra.label := + label extra.label * 'label := +} +EXECUTE {initialize.extra.label.stuff} +ITERATE {forward.pass} +REVERSE {reverse.pass} +FUNCTION {bib.sort.order} +{ sort.label + " " + * + year field.or.null sortify + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ + 'sort.key$ := +} +ITERATE {bib.sort.order} +SORT +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{" number.label int.to.str$ * "}" * + write$ newline$ + "\expandafter\ifx\csname natexlab\endcsname\relax\def\natexlab#1{#1}\fi" + write$ newline$ +} +EXECUTE {begin.bib} +EXECUTE {init.urlbst.variables} % urlbst +EXECUTE {init.state.consts} +ITERATE {call.type$} +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} +EXECUTE {end.bib} +%% End of customized bst file +%% +%% End of file `compling.bst'. diff --git a/inst/rmarkdown/templates/acl_article/skeleton/naaclhlt2018.bib b/inst/rmarkdown/templates/acl_article/skeleton/naaclhlt2018.bib new file mode 100644 index 000000000..7d4e90b82 --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/skeleton/naaclhlt2018.bib @@ -0,0 +1,110 @@ +@book{Aho:72, + author = {Alfred V. Aho and Jeffrey D. Ullman}, + title = {The Theory of Parsing, Translation and Compiling}, + year = "1972", + volume = "1", + publisher = {Prentice-Hall}, + address = {Englewood Cliffs, NJ} +} + +@book{APA:83, + author = {{American Psychological Association}}, + title = {Publications Manual}, + year = "1983", + publisher = {American Psychological Association}, + address = {Washington, DC} +} + +@article{ACM:83, + author = {Association for Computing Machinery}, + year = "1983", + journal = {Computing Reviews}, + volume = "24", + number = "11", + pages = "503--512" +} + +@article{Chandra:81, + author = {Ashok K. Chandra and Dexter C. Kozen and Larry J. Stockmeyer}, + year = "1981", + title = {Alternation}, + journal = {Journal of the Association for Computing Machinery}, + volume = "28", + number = "1", + pages = "114--133", + doi = "10.1145/322234.322243", +} + +@inproceedings{andrew2007scalable, + title={Scalable training of {L1}-regularized log-linear models}, + author={Andrew, Galen and Gao, Jianfeng}, + booktitle={Proceedings of the 24th International Conference on Machine Learning}, + pages={33--40}, + year={2007}, +} + +@book{Gusfield:97, + author = {Dan Gusfield}, + title = {Algorithms on Strings, Trees and Sequences}, + year = "1997", + publisher = {Cambridge University Press}, + address = {Cambridge, UK} +} + +@inproceedings{borsch2011, + Address = {Canberra, Australia}, + Author = {Benjamin Borschinger and Mark Johnson}, + Booktitle = {Proceedings of the Australasian Language Technology Association Workshop 2011}, + Month = {December}, + Pages = {10--18}, + Title = {A Particle Filter algorithm for {B}ayesian Wordsegmentation}, + Year = {2011}} + +@article{rasooli-tetrault-2015, + author = {Mohammad Sadegh Rasooli and Joel R. Tetreault}, + title = {Yara Parser: {A} Fast and Accurate Dependency Parser}, + journal = {Computing Research Repository}, + volume = {arXiv:1503.06733}, + year = {2015}, + url = {http://arxiv.org/abs/1503.06733}, + note = {version 2} +} + +@article{Ando2005, + Acmid = {1194905}, + Author = {Ando, Rie Kubota and Zhang, Tong}, + Issn = {1532-4435}, + Issue_Date = {12/1/2005}, + Journal = {Journal of Machine Learning Research}, + Month = dec, + Numpages = {37}, + Pages = {1817--1853}, + Publisher = {JMLR.org}, + Title = {A Framework for Learning Predictive Structures from Multiple Tasks and Unlabeled Data}, + Volume = {6}, + Year = {2005}} + +@InProceedings{P16-1001, + author = "Goodman, James + and Vlachos, Andreas + and Naradowsky, Jason", + title = "Noise reduction and targeted exploration in imitation learning for Abstract Meaning Representation parsing ", + booktitle = "Proceedings of the 54th Annual Meeting of the Association for Computational Linguistics (Volume 1: Long Papers) ", + year = "2016", + publisher = "Association for Computational Linguistics", + pages = "1--11", + location = "Berlin, Germany", + doi = "10.18653/v1/P16-1001", + url = "http://aclweb.org/anthology/P16-1001" +} + +@InProceedings{C14-1001, + author = "Harper, Mary", + title = "Learning from 26 Languages: Program Management and Science in the Babel Program", + booktitle = "Proceedings of COLING 2014, the 25th International Conference on Computational Linguistics: Technical Papers", + year = "2014", + publisher = "Dublin City University and Association for Computational Linguistics", + pages = "1", + location = "Dublin, Ireland", + url = "http://aclweb.org/anthology/C14-1001" +} diff --git a/inst/rmarkdown/templates/acl_article/skeleton/naaclhlt2018.sty b/inst/rmarkdown/templates/acl_article/skeleton/naaclhlt2018.sty new file mode 100644 index 000000000..e12160660 --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/skeleton/naaclhlt2018.sty @@ -0,0 +1,543 @@ +% This is the LaTex style file for NAACL 2018. Major modifications include +% changing the color of the line numbers to a light gray; changing font size of abstract to be 10pt; changing caption font size to be 10pt. +% -- Meg Mitchell and Stephanie Lukin + +% 2017: modified to support DOI links in bibliography. Now uses +% natbib package rather than defining citation commands in this file. +% Use with acl_natbib.bst bib style. -- Dan Gildea + +% This is the LaTeX style for ACL 2016. It contains Margaret Mitchell's +% line number adaptations (ported by Hai Zhao and Yannick Versley). + +% It is nearly identical to the style files for ACL 2015, +% ACL 2014, EACL 2006, ACL2005, ACL 2002, ACL 2001, ACL 2000, +% EACL 95 and EACL 99. +% +% Changes made include: adapt layout to A4 and centimeters, widen abstract + +% This is the LaTeX style file for ACL 2000. It is nearly identical to the +% style files for EACL 95 and EACL 99. Minor changes include editing the +% instructions to reflect use of \documentclass rather than \documentstyle +% and removing the white space before the title on the first page +% -- John Chen, June 29, 2000 + +% This is the LaTeX style file for EACL-95. It is identical to the +% style file for ANLP '94 except that the margins are adjusted for A4 +% paper. -- abney 13 Dec 94 + +% The ANLP '94 style file is a slightly modified +% version of the style used for AAAI and IJCAI, using some changes +% prepared by Fernando Pereira and others and some minor changes +% by Paul Jacobs. + +% Papers prepared using the aclsub.sty file and acl.bst bibtex style +% should be easily converted to final format using this style. +% (1) Submission information (\wordcount, \subject, and \makeidpage) +% should be removed. +% (2) \summary should be removed. The summary material should come +% after \maketitle and should be in the ``abstract'' environment +% (between \begin{abstract} and \end{abstract}). +% (3) Check all citations. This style should handle citations correctly +% and also allows multiple citations separated by semicolons. +% (4) Check figures and examples. Because the final format is double- +% column, some adjustments may have to be made to fit text in the column +% or to choose full-width (\figure*} figures. + +% Place this in a file called aclap.sty in the TeX search path. +% (Placing it in the same directory as the paper should also work.) + +% Prepared by Peter F. Patel-Schneider, liberally using the ideas of +% other style hackers, including Barbara Beeton. +% This style is NOT guaranteed to work. It is provided in the hope +% that it will make the preparation of papers easier. +% +% There are undoubtably bugs in this style. If you make bug fixes, +% improvements, etc. please let me know. My e-mail address is: +% pfps@research.att.com + +% Papers are to be prepared using the ``acl_natbib'' bibliography style, +% as follows: +% \documentclass[11pt]{article} +% \usepackage{acl2000} +% \title{Title} +% \author{Author 1 \and Author 2 \\ Address line \\ Address line \And +% Author 3 \\ Address line \\ Address line} +% \begin{document} +% ... +% \bibliography{bibliography-file} +% \bibliographystyle{acl_natbib} +% \end{document} + +% Author information can be set in various styles: +% For several authors from the same institution: +% \author{Author 1 \and ... \and Author n \\ +% Address line \\ ... \\ Address line} +% if the names do not fit well on one line use +% Author 1 \\ {\bf Author 2} \\ ... \\ {\bf Author n} \\ +% For authors from different institutions: +% \author{Author 1 \\ Address line \\ ... \\ Address line +% \And ... \And +% Author n \\ Address line \\ ... \\ Address line} +% To start a seperate ``row'' of authors use \AND, as in +% \author{Author 1 \\ Address line \\ ... \\ Address line +% \AND +% Author 2 \\ Address line \\ ... \\ Address line \And +% Author 3 \\ Address line \\ ... \\ Address line} + +% If the title and author information does not fit in the area allocated, +% place \setlength\titlebox{} right after +% \usepackage{acl2015} +% where can be something larger than 5cm + +% include hyperref, unless user specifies nohyperref option like this: +% \usepackage[nohyperref]{naaclhlt2018} +\newif\ifacl@hyperref +\DeclareOption{hyperref}{\acl@hyperreftrue} +\DeclareOption{nohyperref}{\acl@hyperreffalse} +\ExecuteOptions{hyperref} % default is to use hyperref +\ProcessOptions\relax +\ifacl@hyperref + \RequirePackage{hyperref} + \usepackage{xcolor} % make links dark blue + \definecolor{darkblue}{rgb}{0, 0, 0.5} + \hypersetup{colorlinks=true,citecolor=darkblue, linkcolor=darkblue, urlcolor=darkblue} +\else + % This definition is used if the hyperref package is not loaded. + % It provides a backup, no-op definiton of \href. + % This is necessary because \href command is used in the acl_natbib.bst file. + \def\href#1#2{{#2}} +\fi + +\typeout{Conference Style for NAACL-HLT 2018} + +% NOTE: Some laser printers have a serious problem printing TeX output. +% These printing devices, commonly known as ``write-white'' laser +% printers, tend to make characters too light. To get around this +% problem, a darker set of fonts must be created for these devices. +% + +\newcommand{\Thanks}[1]{\thanks{\ #1}} + +% A4 modified by Eneko; again modified by Alexander for 5cm titlebox +\setlength{\paperwidth}{21cm} % A4 +\setlength{\paperheight}{29.7cm}% A4 +\setlength\topmargin{-0.5cm} +\setlength\oddsidemargin{0cm} +\setlength\textheight{24.7cm} +\setlength\textwidth{16.0cm} +\setlength\columnsep{0.6cm} +\newlength\titlebox +\setlength\titlebox{5cm} +\setlength\headheight{5pt} +\setlength\headsep{0pt} +\thispagestyle{empty} +\pagestyle{empty} + + +\flushbottom \twocolumn \sloppy + +% We're never going to need a table of contents, so just flush it to +% save space --- suggested by drstrip@sandia-2 +\def\addcontentsline#1#2#3{} + +\newif\ifaclfinal +\aclfinalfalse +\def\aclfinalcopy{\global\aclfinaltrue} + +%% ----- Set up hooks to repeat content on every page of the output doc, +%% necessary for the line numbers in the submitted version. --MM +%% +%% Copied from CVPR 2015's cvpr_eso.sty, which appears to be largely copied from everyshi.sty. +%% +%% Original cvpr_eso.sty available at: http://www.pamitc.org/cvpr15/author_guidelines.php +%% Original evershi.sty available at: https://www.ctan.org/pkg/everyshi +%% +%% Copyright (C) 2001 Martin Schr\"oder: +%% +%% Martin Schr"oder +%% Cr"usemannallee 3 +%% D-28213 Bremen +%% Martin.Schroeder@ACM.org +%% +%% This program may be redistributed and/or modified under the terms +%% of the LaTeX Project Public License, either version 1.0 of this +%% license, or (at your option) any later version. +%% The latest version of this license is in +%% CTAN:macros/latex/base/lppl.txt. +%% +%% Happy users are requested to send [Martin] a postcard. :-) +%% +\newcommand{\@EveryShipoutACL@Hook}{} +\newcommand{\@EveryShipoutACL@AtNextHook}{} +\newcommand*{\EveryShipoutACL}[1] + {\g@addto@macro\@EveryShipoutACL@Hook{#1}} +\newcommand*{\AtNextShipoutACL@}[1] + {\g@addto@macro\@EveryShipoutACL@AtNextHook{#1}} +\newcommand{\@EveryShipoutACL@Shipout}{% + \afterassignment\@EveryShipoutACL@Test + \global\setbox\@cclv= % + } +\newcommand{\@EveryShipoutACL@Test}{% + \ifvoid\@cclv\relax + \aftergroup\@EveryShipoutACL@Output + \else + \@EveryShipoutACL@Output + \fi% + } +\newcommand{\@EveryShipoutACL@Output}{% + \@EveryShipoutACL@Hook% + \@EveryShipoutACL@AtNextHook% + \gdef\@EveryShipoutACL@AtNextHook{}% + \@EveryShipoutACL@Org@Shipout\box\@cclv% + } +\newcommand{\@EveryShipoutACL@Org@Shipout}{} +\newcommand*{\@EveryShipoutACL@Init}{% + \message{ABD: EveryShipout initializing macros}% + \let\@EveryShipoutACL@Org@Shipout\shipout + \let\shipout\@EveryShipoutACL@Shipout + } +\AtBeginDocument{\@EveryShipoutACL@Init} + +%% ----- Set up for placing additional items into the submitted version --MM +%% +%% Based on eso-pic.sty +%% +%% Original available at: https://www.ctan.org/tex-archive/macros/latex/contrib/eso-pic +%% Copyright (C) 1998-2002 by Rolf Niepraschk +%% +%% Which may be distributed and/or modified under the conditions of +%% the LaTeX Project Public License, either version 1.2 of this license +%% or (at your option) any later version. The latest version of this +%% license is in: +%% +%% http://www.latex-project.org/lppl.txt +%% +%% and version 1.2 or later is part of all distributions of LaTeX version +%% 1999/12/01 or later. +%% +%% In contrast to the original, we do not include the definitions for/using: +%% gridpicture, div[2], isMEMOIR[1], gridSetup[6][], subgridstyle{dotted}, labelfactor{}, gap{}, gridunitname{}, gridunit{}, gridlines{\thinlines}, subgridlines{\thinlines}, the {keyval} package, evenside margin, nor any definitions with 'color'. +%% +%% These are beyond what is needed for the NAACL style. +%% +\newcommand\LenToUnit[1]{#1\@gobble} +\newcommand\AtPageUpperLeft[1]{% + \begingroup + \@tempdima=0pt\relax\@tempdimb=\ESO@yoffsetI\relax + \put(\LenToUnit{\@tempdima},\LenToUnit{\@tempdimb}){#1}% + \endgroup +} +\newcommand\AtPageLowerLeft[1]{\AtPageUpperLeft{% + \put(0,\LenToUnit{-\paperheight}){#1}}} +\newcommand\AtPageCenter[1]{\AtPageUpperLeft{% + \put(\LenToUnit{.5\paperwidth},\LenToUnit{-.5\paperheight}){#1}}} +\newcommand\AtPageLowerCenter[1]{\AtPageUpperLeft{% + \put(\LenToUnit{.5\paperwidth},\LenToUnit{-\paperheight}){#1}}}% +\newcommand\AtPageLowishCenter[1]{\AtPageUpperLeft{% + \put(\LenToUnit{.5\paperwidth},\LenToUnit{-.96\paperheight}){#1}}} +\newcommand\AtTextUpperLeft[1]{% + \begingroup + \setlength\@tempdima{1in}% + \advance\@tempdima\oddsidemargin% + \@tempdimb=\ESO@yoffsetI\relax\advance\@tempdimb-1in\relax% + \advance\@tempdimb-\topmargin% + \advance\@tempdimb-\headheight\advance\@tempdimb-\headsep% + \put(\LenToUnit{\@tempdima},\LenToUnit{\@tempdimb}){#1}% + \endgroup +} +\newcommand\AtTextLowerLeft[1]{\AtTextUpperLeft{% + \put(0,\LenToUnit{-\textheight}){#1}}} +\newcommand\AtTextCenter[1]{\AtTextUpperLeft{% + \put(\LenToUnit{.5\textwidth},\LenToUnit{-.5\textheight}){#1}}} +\newcommand{\ESO@HookI}{} \newcommand{\ESO@HookII}{} +\newcommand{\ESO@HookIII}{} +\newcommand{\AddToShipoutPicture}{% + \@ifstar{\g@addto@macro\ESO@HookII}{\g@addto@macro\ESO@HookI}} +\newcommand{\ClearShipoutPicture}{\global\let\ESO@HookI\@empty} +\newcommand{\@ShipoutPicture}{% + \bgroup + \@tempswafalse% + \ifx\ESO@HookI\@empty\else\@tempswatrue\fi% + \ifx\ESO@HookII\@empty\else\@tempswatrue\fi% + \ifx\ESO@HookIII\@empty\else\@tempswatrue\fi% + \if@tempswa% + \@tempdima=1in\@tempdimb=-\@tempdima% + \advance\@tempdimb\ESO@yoffsetI% + \unitlength=1pt% + \global\setbox\@cclv\vbox{% + \vbox{\let\protect\relax + \pictur@(0,0)(\strip@pt\@tempdima,\strip@pt\@tempdimb)% + \ESO@HookIII\ESO@HookI\ESO@HookII% + \global\let\ESO@HookII\@empty% + \endpicture}% + \nointerlineskip% + \box\@cclv}% + \fi + \egroup +} +\EveryShipoutACL{\@ShipoutPicture} +\newif\ifESO@dvips\ESO@dvipsfalse +\newif\ifESO@grid\ESO@gridfalse +\newif\ifESO@texcoord\ESO@texcoordfalse +\newcommand*\ESO@griddelta{}\newcommand*\ESO@griddeltaY{} +\newcommand*\ESO@gridDelta{}\newcommand*\ESO@gridDeltaY{} +\newcommand*\ESO@yoffsetI{}\newcommand*\ESO@yoffsetII{} +\ifESO@texcoord + \def\ESO@yoffsetI{0pt}\def\ESO@yoffsetII{-\paperheight} + \edef\ESO@griddeltaY{-\ESO@griddelta}\edef\ESO@gridDeltaY{-\ESO@gridDelta} +\else + \def\ESO@yoffsetI{\paperheight}\def\ESO@yoffsetII{0pt} + \edef\ESO@griddeltaY{\ESO@griddelta}\edef\ESO@gridDeltaY{\ESO@gridDelta} +\fi + + +%% ----- Submitted version markup: Page numbers, ruler, and confidentiality. Using ideas/code from cvpr.sty 2015. --MM + +\font\naaclhv = phvb at 8pt + +%% Define vruler %% + +%\makeatletter +\newbox\aclrulerbox +\newcount\aclrulercount +\newdimen\aclruleroffset +\newdimen\cv@lineheight +\newdimen\cv@boxheight +\newbox\cv@tmpbox +\newcount\cv@refno +\newcount\cv@tot +% NUMBER with left flushed zeros \fillzeros[] +\newcount\cv@tmpc@ \newcount\cv@tmpc +\def\fillzeros[#1]#2{\cv@tmpc@=#2\relax\ifnum\cv@tmpc@<0\cv@tmpc@=-\cv@tmpc@\fi +\cv@tmpc=1 % +\loop\ifnum\cv@tmpc@<10 \else \divide\cv@tmpc@ by 10 \advance\cv@tmpc by 1 \fi + \ifnum\cv@tmpc@=10\relax\cv@tmpc@=11\relax\fi \ifnum\cv@tmpc@>10 \repeat +\ifnum#2<0\advance\cv@tmpc1\relax-\fi +\loop\ifnum\cv@tmpc<#1\relax0\advance\cv@tmpc1\relax\fi \ifnum\cv@tmpc<#1 \repeat +\cv@tmpc@=#2\relax\ifnum\cv@tmpc@<0\cv@tmpc@=-\cv@tmpc@\fi \relax\the\cv@tmpc@}% +% \makevruler[][][][][] +\def\makevruler[#1][#2][#3][#4][#5]{\begingroup\offinterlineskip +\textheight=#5\vbadness=10000\vfuzz=120ex\overfullrule=0pt% +\global\setbox\aclrulerbox=\vbox to \textheight{% +{\parskip=0pt\hfuzz=150em\cv@boxheight=\textheight +\color{gray} +\cv@lineheight=#1\global\aclrulercount=#2% +\cv@tot\cv@boxheight\divide\cv@tot\cv@lineheight\advance\cv@tot2% +\cv@refno1\vskip-\cv@lineheight\vskip1ex% +\loop\setbox\cv@tmpbox=\hbox to0cm{{\naaclhv\hfil\fillzeros[#4]\aclrulercount}}% +\ht\cv@tmpbox\cv@lineheight\dp\cv@tmpbox0pt\box\cv@tmpbox\break +\advance\cv@refno1\global\advance\aclrulercount#3\relax +\ifnum\cv@refno<\cv@tot\repeat}}\endgroup}% +%\makeatother + + +\def\aclpaperid{***} +\def\confidential{NAACL-HLT 2018 Submission~\aclpaperid. Confidential Review Copy. DO NOT DISTRIBUTE.} + +%% Page numbering, Vruler and Confidentiality %% +% \makevruler[][][][][] +\def\aclruler#1{\makevruler[14.17pt][#1][1][3][\textheight]\usebox{\aclrulerbox}} +\def\leftoffset{-2.1cm} %original: -45pt +\def\rightoffset{17.5cm} %original: 500pt +\ifaclfinal\else\pagenumbering{arabic} +\AddToShipoutPicture{% +\ifaclfinal\else +\AtPageLowishCenter{\thepage} +\aclruleroffset=\textheight +\advance\aclruleroffset4pt + \AtTextUpperLeft{% + \put(\LenToUnit{\leftoffset},\LenToUnit{-\aclruleroffset}){%left ruler + \aclruler{\aclrulercount}} + \put(\LenToUnit{\rightoffset},\LenToUnit{-\aclruleroffset}){%right ruler + \aclruler{\aclrulercount}} + } + \AtTextUpperLeft{%confidential + \put(0,\LenToUnit{1cm}){\parbox{\textwidth}{\centering\naaclhv\confidential}} + } +\fi +} + +%%%% ----- End settings for placing additional items into the submitted version --MM ----- %%%% + +%%%% ----- Begin settings for both submitted and camera-ready version ----- %%%% + +%% Title and Authors %% + +\newcommand\outauthor{ + \begin{tabular}[t]{c} + \ifaclfinal + \bf\@author + \else + % Avoiding common accidental de-anonymization issue. --MM + \bf Anonymous NAACL submission + \fi + \end{tabular}} + +% Changing the expanded titlebox for submissions to 2.5 in (rather than 6.5cm) +% and moving it to the style sheet, rather than within the example tex file. --MM +\ifaclfinal +\else + \addtolength\titlebox{.25in} +\fi +% Mostly taken from deproc. +\def\maketitle{\par + \begingroup + \def\thefootnote{\fnsymbol{footnote}} + \def\@makefnmark{\hbox to 0pt{$^{\@thefnmark}$\hss}} + \twocolumn[\@maketitle] \@thanks + \endgroup + \setcounter{footnote}{0} + \let\maketitle\relax \let\@maketitle\relax + \gdef\@thanks{}\gdef\@author{}\gdef\@title{}\let\thanks\relax} +\def\@maketitle{\vbox to \titlebox{\hsize\textwidth + \linewidth\hsize \vskip 0.125in minus 0.125in \centering + {\Large\bf \@title \par} \vskip 0.2in plus 1fil minus 0.1in + {\def\and{\unskip\enspace{\rm and}\enspace}% + \def\And{\end{tabular}\hss \egroup \hskip 1in plus 2fil + \hbox to 0pt\bgroup\hss \begin{tabular}[t]{c}\bf}% + \def\AND{\end{tabular}\hss\egroup \hfil\hfil\egroup + \vskip 0.25in plus 1fil minus 0.125in + \hbox to \linewidth\bgroup\large \hfil\hfil + \hbox to 0pt\bgroup\hss \begin{tabular}[t]{c}\bf} + \hbox to \linewidth\bgroup\large \hfil\hfil + \hbox to 0pt\bgroup\hss + \outauthor + \hss\egroup + \hfil\hfil\egroup} + \vskip 0.3in plus 2fil minus 0.1in +}} + +% margins and font size for abstract +\renewenvironment{abstract}% + {\centerline{\large\bf Abstract}% + \begin{list}{}% + {\setlength{\rightmargin}{0.6cm}% + \setlength{\leftmargin}{0.6cm}}% + \item[]\ignorespaces% + \@setsize\normalsize{12pt}\xpt\@xpt + }% + {\unskip\end{list}} + +%\renewenvironment{abstract}{\centerline{\large\bf +% Abstract}\vspace{0.5ex}\begin{quote}}{\par\end{quote}\vskip 1ex} + +% Resizing figure and table captions +\newcommand{\figcapfont}{\rm} +\newcommand{\tabcapfont}{\rm} +\renewcommand{\fnum@figure}{\figcapfont Figure \thefigure} +\renewcommand{\fnum@table}{\tabcapfont Table \thetable} +\renewcommand{\figcapfont}{\@setsize\normalsize{12pt}\xpt\@xpt} +\renewcommand{\tabcapfont}{\@setsize\normalsize{12pt}\xpt\@xpt} + +\RequirePackage{natbib} +% for citation commands in the .tex, authors can use: +% \citep, \citet, and \citeyearpar for compatibility with natbib, or +% \cite, \newcite, and \shortcite for compatibility with older ACL .sty files +\renewcommand\cite{\citep} % to get "(Author Year)" with natbib +\newcommand\shortcite{\citeyearpar}% to get "(Year)" with natbib +\newcommand\newcite{\citet} % to get "Author (Year)" with natbib + + +% bibliography + +\def\@up#1{\raise.2ex\hbox{#1}} + +% Don't put a label in the bibliography at all. Just use the unlabeled format +% instead. +\def\thebibliography#1{\vskip\parskip% +\vskip\baselineskip% +\def\baselinestretch{1}% +\ifx\@currsize\normalsize\@normalsize\else\@currsize\fi% +\vskip-\parskip% +\vskip-\baselineskip% +\section*{References\@mkboth + {References}{References}}\list + {}{\setlength{\labelwidth}{0pt}\setlength{\leftmargin}{\parindent} + \setlength{\itemindent}{-\parindent}} + \def\newblock{\hskip .11em plus .33em minus -.07em} + \sloppy\clubpenalty4000\widowpenalty4000 + \sfcode`\.=1000\relax} +\let\endthebibliography=\endlist + + +% Allow for a bibliography of sources of attested examples +\def\thesourcebibliography#1{\vskip\parskip% +\vskip\baselineskip% +\def\baselinestretch{1}% +\ifx\@currsize\normalsize\@normalsize\else\@currsize\fi% +\vskip-\parskip% +\vskip-\baselineskip% +\section*{Sources of Attested Examples\@mkboth + {Sources of Attested Examples}{Sources of Attested Examples}}\list + {}{\setlength{\labelwidth}{0pt}\setlength{\leftmargin}{\parindent} + \setlength{\itemindent}{-\parindent}} + \def\newblock{\hskip .11em plus .33em minus -.07em} + \sloppy\clubpenalty4000\widowpenalty4000 + \sfcode`\.=1000\relax} +\let\endthesourcebibliography=\endlist + +% sections with less space +\def\section{\@startsection {section}{1}{\z@}{-2.0ex plus + -0.5ex minus -.2ex}{1.5ex plus 0.3ex minus .2ex}{\large\bf\raggedright}} +\def\subsection{\@startsection{subsection}{2}{\z@}{-1.8ex plus + -0.5ex minus -.2ex}{0.8ex plus .2ex}{\normalsize\bf\raggedright}} +%% changed by KO to - values to get teh initial parindent right +\def\subsubsection{\@startsection{subsubsection}{3}{\z@}{-1.5ex plus + -0.5ex minus -.2ex}{0.5ex plus .2ex}{\normalsize\bf\raggedright}} +\def\paragraph{\@startsection{paragraph}{4}{\z@}{1.5ex plus + 0.5ex minus .2ex}{-1em}{\normalsize\bf}} +\def\subparagraph{\@startsection{subparagraph}{5}{\parindent}{1.5ex plus + 0.5ex minus .2ex}{-1em}{\normalsize\bf}} + +% Footnotes +\footnotesep 6.65pt % +\skip\footins 9pt plus 4pt minus 2pt +\def\footnoterule{\kern-3pt \hrule width 5pc \kern 2.6pt } +\setcounter{footnote}{0} + +% Lists and paragraphs +\parindent 1em +\topsep 4pt plus 1pt minus 2pt +\partopsep 1pt plus 0.5pt minus 0.5pt +\itemsep 2pt plus 1pt minus 0.5pt +\parsep 2pt plus 1pt minus 0.5pt + +\leftmargin 2em \leftmargini\leftmargin \leftmarginii 2em +\leftmarginiii 1.5em \leftmarginiv 1.0em \leftmarginv .5em \leftmarginvi .5em +\labelwidth\leftmargini\advance\labelwidth-\labelsep \labelsep 5pt + +\def\@listi{\leftmargin\leftmargini} +\def\@listii{\leftmargin\leftmarginii + \labelwidth\leftmarginii\advance\labelwidth-\labelsep + \topsep 2pt plus 1pt minus 0.5pt + \parsep 1pt plus 0.5pt minus 0.5pt + \itemsep \parsep} +\def\@listiii{\leftmargin\leftmarginiii + \labelwidth\leftmarginiii\advance\labelwidth-\labelsep + \topsep 1pt plus 0.5pt minus 0.5pt + \parsep \z@ \partopsep 0.5pt plus 0pt minus 0.5pt + \itemsep \topsep} +\def\@listiv{\leftmargin\leftmarginiv + \labelwidth\leftmarginiv\advance\labelwidth-\labelsep} +\def\@listv{\leftmargin\leftmarginv + \labelwidth\leftmarginv\advance\labelwidth-\labelsep} +\def\@listvi{\leftmargin\leftmarginvi + \labelwidth\leftmarginvi\advance\labelwidth-\labelsep} + +\abovedisplayskip 7pt plus2pt minus5pt% +\belowdisplayskip \abovedisplayskip +\abovedisplayshortskip 0pt plus3pt% +\belowdisplayshortskip 4pt plus3pt minus3pt% + +% Less leading in most fonts (due to the narrow columns) +% The choices were between 1-pt and 1.5-pt leading +\def\@normalsize{\@setsize\normalsize{11pt}\xpt\@xpt} +\def\small{\@setsize\small{10pt}\ixpt\@ixpt} +\def\footnotesize{\@setsize\footnotesize{10pt}\ixpt\@ixpt} +\def\scriptsize{\@setsize\scriptsize{8pt}\viipt\@viipt} +\def\tiny{\@setsize\tiny{7pt}\vipt\@vipt} +\def\large{\@setsize\large{14pt}\xiipt\@xiipt} +\def\Large{\@setsize\Large{16pt}\xivpt\@xivpt} +\def\LARGE{\@setsize\LARGE{20pt}\xviipt\@xviipt} +\def\huge{\@setsize\huge{23pt}\xxpt\@xxpt} +\def\Huge{\@setsize\Huge{28pt}\xxvpt\@xxvpt} diff --git a/inst/rmarkdown/templates/acl_article/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/acl_article/skeleton/skeleton.Rmd new file mode 100755 index 000000000..a9f0a94ec --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/skeleton/skeleton.Rmd @@ -0,0 +1,36 @@ +--- +title: Template for ACL Papers + +author: + - name: Alice Anonymous + affiliation: Some Institute of Technology + email: alice@institute.edu + - name: Bob Security + affiliation: Another University Department + email: bob@security.org + +abstract: | + Dolor rerum beatae doloremque animi qui fugit. Dolor ut sed consequatur rem facilis. Unde quisquam id et voluptate et natus. Amet assumenda rerum autem reiciendis. Et sed et deserunt possimus cupiditate aut totam fuga. + +aclfinalcopy: false +aclpaperid: 12345 +bibliography: naaclhlt2018.bib +output: rticles::acl_article +--- + + +# Paper goes here + +Tempore et aliquid occaecati et sed non optio. In sit et laboriosam doloremque error dolor quam est. Quis maxime cupiditate sit velit illo impedit consequatur. Reprehenderit et sed perferendis. Ut et dolorum perferendis molestiae aut eaque impedit veritatis. Officia error repellat eaque libero eveniet deleniti. + +Dolorem dignissimos itaque saepe earum. Officia consequuntur adipisci enim. Molestiae iusto provident ullam labore consequatur ipsam perferendis. + +Fugit ullam aperiam harum. Dolores facilis maiores rerum sint vero enim. Et facilis impedit possimus ut. Eaque facilis suscipit unde quasi facere. Unde explicabo quibusdam maiores deleniti placeat id voluptas. + +Vitae aut molestiae itaque possimus ipsam. Et qui repudiandae sint et ad. Fugit quam est dignissimos provident nam. Ducimus et ducimus eius qui voluptatem. + +Debitis et fuga ea. Rerum ut odit officiis consequuntur quis voluptatem sit tempore. A a assumenda veniam aperiam doloribus nulla. + +Cite things like this [@Gusfield:97] and this [@andrew2007scalable]. + +# References diff --git a/inst/rmarkdown/templates/acl_article/skeleton/skeleton.pdf b/inst/rmarkdown/templates/acl_article/skeleton/skeleton.pdf new file mode 100644 index 000000000..a8eaec2a6 Binary files /dev/null and b/inst/rmarkdown/templates/acl_article/skeleton/skeleton.pdf differ diff --git a/inst/rmarkdown/templates/acl_article/skeleton/skeleton.tex b/inst/rmarkdown/templates/acl_article/skeleton/skeleton.tex new file mode 100644 index 000000000..3b1a5e99f --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/skeleton/skeleton.tex @@ -0,0 +1,84 @@ +% +% File naaclhlt2018.tex +% +%% Based on the style files for NAACL-HLT 2018, which were +%% Based on the style files for ACL-2015, with some improvements +%% taken from the NAACL-2016 style +%% Based on the style files for ACL-2014, which were, in turn, +%% based on ACL-2013, ACL-2012, ACL-2011, ACL-2010, ACL-IJCNLP-2009, +%% EACL-2009, IJCNLP-2008... +%% Based on the style files for EACL 2006 by +%%e.agirre@ehu.es or Sergi.Balari@uab.es +%% and that of ACL 08 by Joakim Nivre and Noah Smith + + +\documentclass[11pt,a4paper]{article} +\usepackage[hyperref]{naaclhlt2018} +\usepackage{widetext} +\usepackage{times} +\usepackage{latexsym} +\usepackage{url} + + + +\def\aclpaperid{12345} + +\bibliographystyle{acl_natbib} + +\title{Template for ACL Papers} + +\author{ + Alice Anonymous \\ Some Institute of Technology \\ {\tt {\normalsize \href{mailto:alice@institute.edu}{\nolinkurl{alice@institute.edu}}}} \And + Bob Security \\ Another University Department \\ {\tt {\normalsize \href{mailto:bob@security.org}{\nolinkurl{bob@security.org}}}} } + +\date{} + +\begin{document} +\maketitle +\begin{abstract} +Dolor rerum beatae doloremque animi qui fugit. Dolor ut sed consequatur +rem facilis. Unde quisquam id et voluptate et natus. Amet assumenda +rerum autem reiciendis. Et sed et deserunt possimus cupiditate aut totam +fuga. +\end{abstract} + +\section{Paper goes here}\label{paper-goes-here} + +Tempore et aliquid occaecati et sed non optio. In sit et laboriosam +doloremque error dolor quam est. Quis maxime cupiditate sit velit illo +impedit consequatur. Reprehenderit et sed perferendis. Ut et dolorum +perferendis molestiae aut eaque impedit veritatis. Officia error +repellat eaque libero eveniet deleniti. + +Dolorem dignissimos itaque saepe earum. Officia consequuntur adipisci +enim. Molestiae iusto provident ullam labore consequatur ipsam +perferendis. + +Fugit ullam aperiam harum. Dolores facilis maiores rerum sint vero enim. +Et facilis impedit possimus ut. Eaque facilis suscipit unde quasi +facere. Unde explicabo quibusdam maiores deleniti placeat id voluptas. + +Vitae aut molestiae itaque possimus ipsam. Et qui repudiandae sint et +ad. Fugit quam est dignissimos provident nam. Ducimus et ducimus eius +qui voluptatem. + +Debitis et fuga ea. Rerum ut odit officiis consequuntur quis voluptatem +sit tempore. A a assumenda veniam aperiam doloribus nulla. + +Cite things like this (Gusfield 1997) and this (Andrew and Gao 2007). + +\section*{References}\label{references} +\addcontentsline{toc}{section}{References} + +\hypertarget{refs}{} +\hypertarget{ref-andrew2007scalable}{} +Andrew, Galen, and Jianfeng Gao. 2007. ``Scalable Training of +L1-Regularized Log-Linear Models.'' In \emph{Proceedings of the 24th +International Conference on Machine Learning}, 33--40. + +\hypertarget{ref-Gusfield:97}{} +Gusfield, Dan. 1997. \emph{Algorithms on Strings, Trees and Sequences}. +Cambridge, UK: Cambridge University Press. + + +\end{document} diff --git a/inst/rmarkdown/templates/acl_article/skeleton/widetext.sty b/inst/rmarkdown/templates/acl_article/skeleton/widetext.sty new file mode 100644 index 000000000..a8f805e98 --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/skeleton/widetext.sty @@ -0,0 +1,86 @@ +\NeedsTeXFormat{LaTeX2e} +\ProvidesPackage{widetext} + +%% Mimics the widetext environment of revtex4 for any other class package +%% Eg: article.cls +%% +%% Compiled by: Anjishnu Sarkar +%% +%% Advantages: +%% *) Supports float (eg: figure) in two column format (Advantage over +%% multicol package) +%% *) One and twocolumn exist on the same page +%% *) Flow of text shown via rule +%% *) Equal height of text when in two column format +%% +%% Acknowledgment(s): +%% 1. Instead of re-inventing the wheel, two packages (flushend, cuted) of +%% the sttools bundle are used. The sttools bundle is available from CTAN. +%% Lisence of these packages rests with their corresponding author. +%% Any bug/problem with flushend and cuted should be forwarded to their +%% corresponding package authors. +%% 2. The idea of the rule came from the following latex community website +%% http://www.latex-community.org/forum/viewtopic.php?f=5&t=2770 +%% +%% This package just defines the widetext environment and the rules. +%% +%% Usage: +%% \documentclass[a4paper,12pt,twocolumn]{article} +%% \usepackage{widetext} +%% +%% \begin{document} +%% +%% Some text in twocolumn +%% +%% \begin{widetext} +%% Text in onecolumn format. +%% \end{widetext} +%% +%% Some more text in twocolumn +%% +%% \end{document} +%%%%%%%%%%%%%%%%%%%% + +%% Package required for equal height while in 2 columns format +\IfFileExists{flushend.sty} + {\RequirePackage{flushend}} + {\typeout{} + \typeout{Package widetext error: Install the flushend package which is + a part of sttools bundle. Available from CTAN.} + \typeout{} + \stop + } + +%% Package required for onecolumn and twocolumn to exist on the same page. +%% and also required for widetext environment. +\IfFileExists{cuted.sty} + {\RequirePackage{cuted}} + {\typeout{} + \typeout{Package widetext error: Install the cuted package which is + a part of sttools bundle. Available from CTAN.} + \typeout{} + \stop + } + + +\newlength\@parindent +\setlength\@parindent{\parindent} + +\if@twocolumn + \newenvironment{widetext} + {% + \begin{strip} + \rule{\dimexpr(0.5\textwidth-0.5\columnsep-0.4pt)}{0.4pt}% + \rule{0.4pt}{6pt} + \par %\vspace{6pt} + \parindent \@parindent + }% + {% + \par + \hfill\rule[-6pt]{0.4pt}{6.4pt}% + \rule{\dimexpr(0.5\textwidth-0.5\columnsep-1pt)}{0.4pt} + \end{strip} + } +\else + \newenvironment{widetext}{}{} +\fi \ No newline at end of file diff --git a/inst/rmarkdown/templates/acl_article/template.yaml b/inst/rmarkdown/templates/acl_article/template.yaml new file mode 100644 index 000000000..55d2a9525 --- /dev/null +++ b/inst/rmarkdown/templates/acl_article/template.yaml @@ -0,0 +1,4 @@ +name: ACL Paper +description: > + Template for creating an ACL-style paper +create_dir: true diff --git a/inst/rmarkdown/templates/opmi_article/resources/ManuscriptSample.tex b/inst/rmarkdown/templates/opmi_article/resources/ManuscriptSample.tex new file mode 100755 index 000000000..5fcbe0a7d --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/resources/ManuscriptSample.tex @@ -0,0 +1,179 @@ +%% Documentclass: +\documentclass[manuscript]{stjour} + +%% Manuscript, for double spaced, larger fonts +% \documentclass[manuscript]{stjour} +%% Only needed if you use `manuscript' option +\journalname{Open Mind} +%\journalname{Computational Psychiatry} + + +%%%%%%%%%%% Please supply information %%%%%%%%%%%%%%%%%%%%%%%%% + +%% For Open Mind: +%% Supplementary Materials: +\supplementslinks{dx.doi.org/10.1098/rsif.2013.0969} + +%% For Computational Psychiatry +\supportinginfo{dx.doi.org/10.7910/DVN/PQ6ILM} + +%% If no conflicts, this command doesn't need to be used +%% \conflictsofinterest{} + +%%%%%%%%%%% to be supplied by MIT Press, only %%%%%%%%%%%%%%%%% + +\citation{Niyogi, R. K., Breton, Y.-A., Solomon, +R. B., Conover, K.,\\ Shizgal, P., Dayan, P. (2015).\\ +Optimal indolence: a normative microscopic approach to work and leisure. Open Mind 1(1): +1−12.} + +\received{20 October 2013} +\accepted{7 November 2013} +\published{26 January 2014} + +%% DOI address: +\setdoi{10.1098/rsif.2013.0969} + +%%%%%%%% End MIT Press commands %%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% author definitions should be placed here: + +%% example definition +\def\taupav{\tau_{\mathrm{Pav}}} + +\begin{document} +\title{Title of Article} +\subtitle{Subtitle Here} + +%% If shortened title for running head is needed so that the article title can fit +%% in the running head, use [] argument, ie, +%% +%% \title[Shortened Title for Running Head]{Title of Article} +%% \subtitle{Subtitle Here} + +%% Since we use \affil{} in the argument of the \author command, we +%% need to supply another version of the author names, without \affil{} +%% to be used for running heads: + +\author[Author Names] +{Author Names with affiliations\thanks{Current address: MacMurdo +Sound, Antartica}\affil{1}, +Another Name\affil{2}, Still another Name\affil{2},\\ +\and Final Name\affil{1}} + +\affiliation{1}{Department, Institution, City, Country} + +%ie. +%\affiliation{1}{Gatsby Computational Neuroscience Unit, University +%College London, London, United Kingdom} + +\affiliation{2}{Another Department, Institution, City, Country} + +%ie +%\affiliation{2}{Center for Studies in +%Behavioral Neurobiology, Concordia University, Montreal, Quebec, +%Canada} + +\correspondingauthor{Author Name}{Corresponding author email address} + +% ie, +%\correspondingauthor{Ritwik K. Niyogi}{ritwik.niyogi@gatsby.ucl.ac.uk} + +\keywords{(a series of uncapitalized words, separated with commas)} + +%ie +%\keywords{work, leisure, normative, microscopic, reinforcement learning, economics} + +\begin{abstract} +Abstract text here. +\end{abstract} + + + +\section{Sample Section} +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +\subsection{Sample Subsection} +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +\subsubsection{Sample Subsubsection} +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + + +\newpage +\section{Track Changes} +These tracking commands allow copyeditors to mark text so +that the author can consider whether he/she wants to make +the change. In the manuscript version of the article, +a list of changes will automatically appear at the end of the +article, as you see here. + +The comments will be seen when +\verb+\documentclass[manuscript]{stjour}+ +is used, but will disappear in the final version, +leaving only the suggested change. + +Thus, if the author doesn't like the change, he/she should +delete it before resubmitting his/her manuscript. + +These commands are used: +\begin{verbatim} +\added{} +\deleted{} +\replaced{}{} +\explained{} +\end{verbatim} + +Here is some text to illustrate the track changes +commands, quotes (with apologies) from Albert Einstein: + +\begin{quotation} +Two things are \replaced{almost infinite}{infinite}\explain{`almost' +detracts from the strength of the statement}: the universe and +human stupidity; and I'm not sure about the universe. + +The most beautiful thing we can experience is the mysterious. It is +the source of all true art and science. \added{-- Albert Einstein} + +It is the \added{supreme} art of the teacher to awaken joy in creative +expression and knowledge. +\end{quotation} + +\subsection{Using [] to add comments to appear in the List of Changes} + +\begin{verbatim} +\added[]{} +\deleted[]{} +\replaced[]{}{} +\end{verbatim} + +\begin{quotation} +Two things are \replaced[AH]{almost infinite}{infinite}\explain{`almost' +detracts from the strength of the statement}: the universe and +human stupidity; and I'm not sure about the universe. + +The most beautiful thing we can experience is the mysterious. It is +the source of all true art and science. \added[RB, April 7, 2016, +4:30pm]{-- Albert Einstein} + +It is the \added[NWK]{supreme} art of the teacher to awaken joy in creative +expression and knowledge. +\end{quotation} +\subsection{Citatation Tests} +Citing, \citet{anderson}, \citep{anderson}, and \cite{anderson}. + +\nocite{*} +\bibliography{bibsamp} + + +\end{document} diff --git a/inst/rmarkdown/templates/opmi_article/resources/OpenMindSample.tex b/inst/rmarkdown/templates/opmi_article/resources/OpenMindSample.tex new file mode 100755 index 000000000..deffc4a05 --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/resources/OpenMindSample.tex @@ -0,0 +1,603 @@ +%% Documentclass: +\documentclass[OpenMind]{stjour} + +%% Or, + +%% Manuscript, for double spaced, larger fonts +% \documentclass[manuscript]{stjour} +%% Only needed if you use `manuscript' option +% \journalname{Open Mind} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% For production only, not authors: +%%\documentclass[OpenMind,finalfonts]{stjour} + +%%%%%%%%%%% Please supply information %%%%%%%%%%%%%%%%%%%%%%%%% + +%% For Open Mind: +%% Supplementary Materials: +\supplementslinks{dx.doi.org/10.1098/rsif.2013.0969} + +%% If no conflicts, this command doesn't need to be used +%% \conflictsofinterest{} + +%%%%%%%%%%% to be supplied by MIT Press, only %%%%%%%%%%%%%%%%% + +\citation{Niyogi, R. K., Breton, Y.-A., Solomon, +R. B., Conover, K.,\\ Shizgal, P., Dayan, P. (2015).\\ +Optimal indolence: a normative microscopic approach to work and leisure. Open Mind 1(1): +1−12.} + +\received{20 October 2013} +\accepted{7 November 2013} +\published{26 January 2014} + +%% DOI address: +\setdoi{10.1098/rsif.2013.0969} + +%%%%%%%% End MIT Press commands %%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% author definitions should be placed here: + +%% example definition +\def\taupav{\tau_{\mathrm{Pav}}} +\begin{document} + +\title{Title of Article} +\subtitle{Subtitle Here} + +%% If shortened title for running head is needed so that the article title can fit +%% in the running head, use [] argument, ie, +%% +%% \title[Shortened Title for Running Head]{Title of Article} +%% \subtitle{Subtitle Here} + +%% Since we use \affil{} in the argument of the \author command, we +%% need to supply another version of the author names, without \affil{} +%% to be used for running heads: + +\author[Author Names] +{Author Names with affiliations\thanks{Current address: MacMurdo +Sound, Antartica}\affil{1}, +Another Name\affil{2}, Still another Name\affil{2},\\ +\and Final Name\affil{1}} + +\affiliation{1}{Department, Institution, City, Country} + +%ie. +%\affiliation{1}{Gatsby Computational Neuroscience Unit, University +%College London, London, United Kingdom} + +\affiliation{2}{Another Department, Institution, City, Country} + +%ie +%\affiliation{2}{Center for Studies in +%Behavioral Neurobiology, Concordia University, Montreal, Quebec, +%Canada} + +\correspondingauthor{Author Name}{Corresponding author email address} + +% ie, +%\correspondingauthor{Ritwik K. Niyogi}{ritwik.niyogi@gatsby.ucl.ac.uk} + +\keywords{(a series of uncapitalized words, separated with commas)} + +%ie +%\keywords{work, leisure, normative, microscopic, reinforcement learning, economics} + +\begin{abstract} +Abstract text here. +\end{abstract} + + +\section{Sample Section} +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +\subsection{Sample Subsection} +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +\subsubsection{Sample Subsubsection} +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +\section{Sample equations} +\begin{equation} +\label{eq:rhoCHT} +\rho^{\pi}= \frac{RI + \mathbb{E}_{\pi([L,\tau_L]|\textrm{post})} +\left[C_L(\taupav+\tau_L) \right] + +\displaystyle{\int_{0}^{P}}{dw~ \mathbb{E}_{\pi_{w_L}}} +\Biggl[\/\sum_{n_{L|[\textrm{pre},w]}}C_L(\tau_L) +\Biggr] } {P + +\mathbb{E}_{\pi([L,\tau_L] |\textrm{post})}[\tau_{L}] +\taupav + +\displaystyle{ \int_{0}^{P}}{dw~ \mathbb{E}_{\pi_{w_L}}} +\Biggl[\sum_{n_{L|[\textrm{pre},w]}}\tau_L\Biggr] +} +\end{equation} +As long as +$RI - K_LP > +\frac{1}{\beta}$ +\begin{equation} +%\def\theequation{5.1} +\left.\begin{array}{lrcl} +&\rho^{\pi} &=& \displaystyle\frac{\beta ( RI + K_L \taupav )-1} {\beta +(P+\taupav )} \\[12pt] +\hbox{and}\hbox to .25in{\hfill}&\mathbb{E}[\tau_L | \text{post}] &=&\displaystyle \frac{P+\taupav}{\beta ( RI - +K_LP)-1} +\label{eq:analytical_linear} +\end{array}\right\}\hbox to 1.25in{\hfill} +\end{equation} + +\subsection{Simple code sample} + +\begin{code} +\begin{verbatim} +procedure bubbleSort( A : list of sortable items ) + n = length(A) + repeat + newn = 0 + for i = 1 to n-1 inclusive do + if A[i-1] > A[i] then + swap(A[i-1], A[i]) + newn = i + end if + end for + n = newn + until n = 0 +end procedure +\end{verbatim} +\end{code} + + + +\subsection{Algorithm environment} + +%% \begin{algorithm} takes option [p][b][t][h], or some combination, like \begin{figure} +%% See documentation for algorithmic.sty for more information on formatting algorithms. + +\begin{algorithm}[h] +\caption{A sample in an algorithm environment.} +\begin{algorithmic} +\If {$i\geq maxval$} + \State $i\gets 0$ +\Else + \If {$i+k\leq maxval$} + \State $i\gets i+k$ + \EndIf +\EndIf +\end{algorithmic} +\end{algorithm} + + +\section{Jargon definitions} + +\begin{wideboxedtext} +\begin{glossary} +\symbol{Term} Definition +\symbol{Term} Definition +%ie +%\symbol{$1/\lambda$} mean of exponential effective prior probability density for leisure time +%\symbol{CHT} Cumulative Handling Time +\end{glossary} +\end{wideboxedtext} + +\begin{boxedtext} +\begin{glossary} +\symbol{Term} Definition +\symbol{Term} Definition +%ie +%\symbol{$1/\lambda$} mean of exponential effective prior probability density for leisure time +%\symbol{CHT} Cumulative Handling Time +\end{glossary} +\end{boxedtext} + +\section{Itemized Lists} + +\subsection{Roman list:} + +\begin{enumerate} +\item[(i)] at high +payoffs, subjects work almost continuously, engaging in little leisure +in between work bouts; +\item[(ii)] at low payoffs, they +engage in leisure all at once, in long bouts after working, rather +than distributing the same amount of leisure time into multiple short +leisure bouts; +\item[(iii)] subjects work continuously for the entire price duration, as long as +the price is not very long (as shown by an analysis conducted by Y-AB, to be published separately); %(\textbf{Figure \ref{fig:task_data}D}). +\item[(iv)] the duration of leisure bouts is variable. +\end{enumerate} + +\subsection{Numbered list:} + +\begin{enumerate} +\item at high +payoffs, subjects work almost continuously, engaging in little leisure +inbetween work bouts; +\item at low payoffs, they +engage in leisure all at once, in long bouts after working, rather +than distributing the same amount of leisure time into multiple short +leisure bouts; +\item subjects work continuously for the entire price duration, as long as +the price is not very long (as shown by an analysis conducted by Y-AB, to be published separately); %(\textbf{Figure \ref{fig:task_data}D}). +\item the duration of leisure bouts is variable. +\end{enumerate} + + +\subsection{Bulleted list:} + +\begin{itemize} +\item at high +payoffs, subjects work almost continuously, engaging in little leisure +inbetween work bouts; +\item at low payoffs, they +engage in leisure all at once, in long bouts after working, rather +than distributing the same amount of leisure time into multiple short +leisure bouts; +\item subjects work continuously for the entire price duration, as long as +the price is not very long (as shown by an analysis conducted by Y-AB, to be published separately); %(\textbf{Figure \ref{fig:task_data}D}). +\item the duration of leisure bouts is variable. +\end{itemize} + + +\section{Sample citations} +For general information on the correct form for citations using +the APA 6 format, see the following sites: +\href{https://owl.english.purdue.edu/owl/resource/560/02/} +{APA 6, In-text citations, The Basics} and +\href{https://owl.english.purdue.edu/owl/resource/560/03/} +{APA 6, In-text citations} + +\section{Natbib citation mark up} + +\subsection{Single citations} +\noindent +\begin{tabular}{ll} +\bf Type&\bf Results\\ +\hline +\verb+\citet{jon90}+&Jones et al. (1990)\\ +\verb+\citet[chap. 2]{jon90}+&Jones et al. (1990, chap. 2)\\ + \verb+\citep{jon90}+ & (Jones et al., 1990)\\ + \verb+\citep[chap. 2]{jon90}+ & (Jones et al., 1990, chap. 2)\\ + \verb+\citep[see][]{jon90}+ & (see Jones et al., 1990)\\ + \verb+\citep[see][chap. 2]{jon90}+ & (see Jones et al., 1990, chap. 2)\\ + \verb+\citet*{jon90}+ & Jones, Baker, and Williams (1990)\\ + \verb+\citep*{jon90}+ & (Jones, Baker, and Williams, + 1990) \\ +\end{tabular} + +For example, some citations from the OpenMindSample bibliography: +citet:\citet{anderson}, citep:\citep{antibayes}, and +cite*: \citet*{anderson}. + +\subsection{Multiple citations} +Multiple citations may be made by including more than one citation +key in the \verb+\cite+ command argument. + +\noindent +\begin{tabular}{ll} +\bf Type&\bf Results\\ +\hline +\verb+\citet{jon90,jam91}+&Jones et al. (1990); James et al. (1991)\\ +\verb+\citep{jon90,jam91}+&(Jones et al., 1990; James et al. 1991)\\ +\verb+\citep{jon90,jon91}+&(Jones et al., 1990, 1991)\\ +\verb+\citep{jon90a,jon90b}+&(Jones et al., 1990a,b)\\ +\end{tabular} + +For example, multiple citations from the OpenMindSample bibliography: +citet:\citet{anderson,antibayes}, citep:\citep{anderson,antibayes}. +As you see, the citations are automatically hyperlinked to their +reference in the bibliography. + +\newpage + +\section{Sample figures} + +\begin{figure}[h] +\centerline{\includegraphics[width=\textwidth]{Fig1}} +\caption{(Colour online) \textbf{Task and key features of the + data.} \\ + A) Cumulative handling time (CHT) task. Grey bars denote work +(depressing a lever), white gaps show leisure. The subject must + accumulate work up to a total period of time called the +\emph{price} ($P$) in order to obtain a single reward (black dot) of subjective reward +intensity $RI$. The trial duration is $25\times \mathrm{price}$ (plus +$2$s each time the price is attained, during which the lever is retracted so it cannot +work; not shown). +} +\label{fig:task_data} +\end{figure} + +\begin{figure}[ht] +\widefigure{\fullpagewidth}{Fig1} +\caption{(Colour online) \textbf{Task and key features of the + data.} \\ +A) Cumulative handling time (CHT) task. Grey bars denote work +(depressing a lever), white gaps show leisure. The subject must +accumulate work up to a total period of time called the +\emph{price} ($P$) in order to obtain a single reward (black dot) of subjective reward +intensity $RI$. The trial duration is $25\times \mathrm{price}$ (plus +$2$s each time the price is attained, during which the lever is retracted so it cannot +work; not shown). +} +\label{newfig:task_data} +\end{figure} + +\clearpage +\section{Sample tables} + +\begin{table}[!ht] +\caption{Time of the Transition Between Phase 1 and Phase 2$^{a}$} +\label{tab:label} +\centering +\begin{tabular}{lc} +\hline + Run & Time (min) \\ +\hline + $l1$ & 260 \\ + $l2$ & 300 \\ + $l3$ & 340 \\ + $h1$ & 270 \\ + $h2$ & 250 \\ + $h3$ & 380 \\ + $r1$ & 370 \\ + $r2$ & 390 \\ +\hline +\multicolumn{2}{l}{$^{a}$Table note text here.} +\end{tabular} +\end{table} + +\begin{table}[ht] +\widecaption{Sample table taken from [treu03]\label{tbl-1}} +\begin{widetable} +\advance\tabcolsep-1pt +\small +\begin{tabular}{ccrrccccccccc} +\hline +\bf +POS &\bf chip &\multicolumn1c{\bf ID} &\multicolumn1c{\bf X} +&\multicolumn1c{\bf Y} &\bf +RA &\bf DEC &\bf IAU$\pm$ $\delta$ IAU &\bf +IAP1$\pm$ $\delta$ IAP1 &\bf IAP2 $\pm$ $\delta$ +IAP2 &\bf star &\bf E &\bf Comment\\ +\hline +0 & 2 & 1 & 1370.99 & 57.35\rlap{$^a$} & 6.651120 & 17.131149 & +21.344$\pm$0.006\rlap{$^b$} & 2 4.385$\pm$0.016 & 23.528$\pm$0.013 & 0.0 & 9 & - \\ +0 & 2 & 2 & 1476.62 & 8.03 & 6.651480 & 17.129572 & 21.641$\pm$0.005 & 2 3.141$\pm$0.007 & 22.007$\pm$0.004 & 0.0 & 9 & - \\ +0 & 2 & 3 & 1079.62 & 28.92 & 6.652430 & 17.135000 & 23.953$\pm$0.030 & 2 4.890$\pm$0.023 & 24.240$\pm$0.023 & 0.0 & - & - \\ +0 & 2 & 4 & 114.58 & 21.22 & 6.655560 & 17.148020 & 23.801$\pm$0.025 & 2 5.039$\pm$0.026 & 24.112$\pm$0.021 & 0.0 & - & - \\ +0 & 2 & 5 & 46.78 & 19.46 & 6.655800 & 17.148932 & 23.012$\pm$0.012 & 2 3.924$\pm$0.012 & 23.282$\pm$0.011 & 0.0 & - & - \\ +0 & 2 & 6 & 1441.84 & 16.16 & 6.651480 & 17.130072 & 24.393$\pm$0.045 & 2 6.099$\pm$0.062 & 25.119$\pm$0.049 & 0.0 & - & - \\ +0 & 2 & 7 & 205.43 & 3.96 & 6.655520 & 17.146742 & 24.424$\pm$0.032 & 2 5.028$\pm$0.025 & 24.597$\pm$0.027 & 0.0 & - & - \\ +0 & 2 & 8 & 1321.63 & 9.76 & 6.651950 & 17.131672 & +22.189$\pm$0.011 & 2 4.743$\pm$0.021 & 23.298$\pm$0.011 & 0.0 & 4 & +edge \\ +\hline +\multicolumn{13}{l}{% +Table 2 is published in its entirety in the electronic +edition of the {\it Astrophysical Journal}.}\\[3pt] +\multicolumn{13}{l}{% +$^a$ Sample footnote for table 2.}\\[3pt] +\multicolumn{13}{l}{% +$^b$ Another sample footnote for table 2.} +\end{tabular} +\end{widetable} +\end{table} + +\begin{table}[p] +\rotatebox{90}{\vbox{\hsize=\textheight +\caption{Here is a caption for a table that is found in landscape +mode.} +\begin{tabular}{ccrrccccccccc} +\hline +\bf +POS &\bf chip &\multicolumn1c{\bf ID} &\multicolumn1c{\bf X} +&\multicolumn1c{\bf Y} &\bf +RA &\bf DEC &\bf IAU$\pm$ $\delta$ IAU &\bf +IAP1$\pm$ $\delta$ IAP1 &\bf IAP2 $\pm$ $\delta$ +IAP2 &\bf star &\bf E &\bf Comment\\ +\hline +0 & 2 & 1 & 1370.99 & 57.35\rlap{$^a$} & 6.651120 & 17.131149 & +21.344$\pm$0.006\rlap{$^b$} & 2 4.385$\pm$0.016 & 23.528$\pm$0.013 & 0.0 & 9 & - \\ +0 & 2 & 2 & 1476.62 & 8.03 & 6.651480 & 17.129572 & 21.641$\pm$0.005 & 2 3.141$\pm$0.007 & 22.007$\pm$0.004 & 0.0 & 9 & - \\ +0 & 2 & 3 & 1079.62 & 28.92 & 6.652430 & 17.135000 & 23.953$\pm$0.030 & 2 4.890$\pm$0.023 & 24.240$\pm$0.023 & 0.0 & - & - \\ +0 & 2 & 4 & 114.58 & 21.22 & 6.655560 & 17.148020 & 23.801$\pm$0.025 & 2 5.039$\pm$0.026 & 24.112$\pm$0.021 & 0.0 & - & - \\ +0 & 2 & 5 & 46.78 & 19.46 & 6.655800 & 17.148932 & 23.012$\pm$0.012 & 2 3.924$\pm$0.012 & 23.282$\pm$0.011 & 0.0 & - & - \\ +0 & 2 & 6 & 1441.84 & 16.16 & 6.651480 & 17.130072 & 24.393$\pm$0.045 & 2 6.099$\pm$0.062 & 25.119$\pm$0.049 & 0.0 & - & - \\ +0 & 2 & 7 & 205.43 & 3.96 & 6.655520 & 17.146742 & 24.424$\pm$0.032 & 2 5.028$\pm$0.025 & 24.597$\pm$0.027 & 0.0 & - & - \\ +0 & 2 & 8 & 1321.63 & 9.76 & 6.651950 & 17.131672 & +22.189$\pm$0.011 & 2 4.743$\pm$0.021 & 23.298$\pm$0.011 & 0.0 & 4 & +edge \\ +\hline +\multicolumn{13}{l}{% +Table 2 is published in its entirety in the electronic +edition of the {\it Astrophysical Journal}.}\\[3pt] +\multicolumn{13}{l}{% +$^a$ Sample footnote for table 2.}\\[3pt] +\multicolumn{13}{l}{% +$^b$ Another sample footnote for table 2.} +\end{tabular} +}} +\end{table} +\clearpage + + +\vglue 3in +Example of table continuing over pages: + + +\begin{center} +\begin{longtable}{ccc@{}} +\caption{ApJ costs from 1991 to 2013 +\label{tab:table}} \\[2pt] +\hline +\bf Year & \bf Subscription & \bf Publication \\ + & \bf cost &\bf charges\\ + & \bf(\$) & \bf (\$/page)\\ +\hline +\endfirsthead + +\multicolumn3c{Table \thetable, \it continued from previous page.}\\[6pt] +\multicolumn3c{ApJ costs from 1991 to 2013}\\[2pt] +\hline +\bf Year & \bf Subscription & \bf Publication \\ + & \bf cost &\bf charges\\ + & \bf(\$) & \bf (\$/page)\\ +\hline +\endhead +\\\hline +\\[-8pt] +\multicolumn{3}{r}{\it Table continued on next page}\\ +\endfoot + +\hline +\endlastfoot + +1991 & 600 & 100 \\ +1992 & 650 & 105 \\ +1993 & 550 & 103 \\ +1994 & 450 & 110 \\ +1995 & 410 & 112 \\ +1996 & 400 & 114 \\ +1997 & 525 & 115 \\ +1998 & 590 & 116 \\ +1999 & 575 & 115 \\ +2000 & 450 & 103 \\ +2001 & 490 & 90 \\ +2002 & 500 & 88 \\ +2003 & 450 & 90 \\ +2004 & 460 & 88 \\ +2005 & 440 & 79 \\ +2006 & 350 & 77 \\ +2007 & 325 & 70 \\ +2008 & 320 & 65 \\ +2009 & 190 & 68 \\ +2010 & 280 & 70 \\ +2011 & 275 & 68 \\ +2012 & 150 & 56 \\ +2013 & 140 & 55 \\ +\end{longtable} +\end{center} + +\section{Supportive Information} +Here you enter further sources of information, if desired. + +%% A possible entry might be: +% No supportive information is available at this time. + + +\acknowledgments +Enter your acknowledgments here. + +%% ie., + +% The authors thank Laurence Aitchison for fruitful discussions. RKN +% and PD received funding from the Gatsby Charitable Foundation. Y-AB, +% RBS, KC and PS received funding from Canadian Institutes of Health +% Research grant $MOP74577$, +% Fond de recherche Qu\'{e}bec - Sant\'{e} (Group grant to the Groupe +% de recherche en neurobiologie comportementale, Shimon Amir, P.I.), and +% Concordia University Research Chair (Tier I). + +\authorcontributions +Who helped formulate the project, who supplied data, analyses and +experiments, etc. + +%% ie. +%% Project was formulated by RKN, PD, PS, +%% based on substantial data, analyses and experiments of Y-AB, KC, RS, +%% PS. RKN, PD formalised the model, RKN implemented and ran the model; +%% RKN analysed the molecular ethogram data; Y-AB formalised and +%% implemented a CTMC model. All authors wrote the manuscript. + + +%%%%%%%%%%%%%%%%%%%%%%% +%% The bibliography + +%% \nocite{*} is used here as a quick way to get every entry in the .bib file to +%% appear in the bibliography. Normally the bibliography is made using only +%% the bibentries that you cite using \cite{}, or one of the Natbib citation +%% entries, like \citep{}, \citet{} etc. + +\nocite{*} +\bibliography{bibsamp} + + +\appendix + +\section{Sample Appendix Section} +We derive the result in Eq. \eqref{eq:analytical_linear}. We consider a linear $C_L(\tau_L+\taupav)=K_L(\tau_L+\taupav)$, and +make two further +simplifications: (i) the subject does not +engage in leisure in the pre-reward state (and so works for the whole +price when it works); and (ii) \emph{a priori}, arbitrarily long leisure durations are possible +($\lambda=0$). +Then the reward rate in Eq. \eqref{eq:rhoCHT} becomes +\begin{equation}\label{eq:analyticalrho} +\rho^{\pi}= \frac{\vrule height 10pt width0pt RI + K_L \{~ \mathbb{E}[ \tau_L | \textrm{post} ] + \taupav \} } + {P + +\mathbb{E}[ \tau_L | \textrm{post} ] +\taupav } +\end{equation} +As discussed in the \emph{Results} section, the probability of engaging in instrumental leisure in the post-reward state is $\pi([L,\tau_L] +~| \textrm{post}) = \exp\left[-\{\beta (\rho^\pi-K_L) + \} \tau_L\right]$, which is an exponential distribution with +mean +\begin{equation} +\mathbb{E}[\tau_L | \textrm{post}]=\frac{1}{\beta (\rho^\pi-K_L) } +\label{eq:analyticaltauL} +\end{equation} +Re-arranging terms of this equation, +\begin{equation}\label{eq:rhoversion2} +\rho^{\pi}=\frac{1}{\beta ~\mathbb{E}[\tau_L | \textrm{post}]} +K_L +\end{equation} +Equating Eqs. \eqref{eq:analyticalrho} and \eqref{eq:rhoversion2} and solving for the mean instrumental leisure duration $\mathbb{E}[\tau_L | \textrm{post}]$, we derive +\begin{equation} +\mathbb{E}[\tau_L | \textrm{post}] = \frac{P+\taupav}{\beta ( RI - K_LP)-1} +\label{eq:solvedtauL} +\end{equation} +which is the second line of Eq.\eqref{eq:analytical_linear}. This is the mean instrumental leisure duration as long as $RI - K_LP>1$, and $\mathbb{E}[\tau_L | \textrm{post}] \rightarrow \infty$ otherwise. When the former condition holds, we may +substitute Eq. \eqref{eq:solvedtauL} into Eq. \eqref{eq:analyticalrho} and solve for $\rho^{\pi}$ + +\begin{figure} +\widefigure{\fullpagewidth}{Fig1} +\caption{Sample Appendix Caption. Here is a caption that might +appear in an appendix. It is as wide as the full width of the page.} +\end{figure} + +\newpage + +\section{Making Your Bibliography for an Open Mind Article} +{\it Open Mind} uses the APA author-date bibliography style, +apacite.bst. For more +information on apacite, for examples in how to make your .bib file and more, see:\\ +\href{http://mirror.jmu.edu/pub/CTAN/biblio/bibtex/contrib/apacite/apacite.pdf} +{http://mirror.jmu.edu/pub/CTAN/biblio/bibtex/contrib/apacite/apacite.pdf} + +\noindent +(In spite of the mention of apacite cite commands, please use only +Natbib commands for in text citations, as shown above.) + +\subsection{BibTeX} +You will need to use BibTeX to form your bibliography; typing in the +references would be +a huge and unpleasant task. Look at the openmindsample.bbl file and you'll see why +typing in the bibitems would be difficult. + +For a good basic introduction to using BibTeX, see +\href{https://www.economics.utoronto.ca/osborne/latex/BIBTEX.HTM} +{https://www.economics.utoronto.ca/osborne/latex/BIBTEX.HTM} + +When you use BibTeX, the form of the bibliography will be correct. You +don't need to supply a bibliography style, since that is built into +the stjour.cls file. + +\end{document} + diff --git a/inst/rmarkdown/templates/opmi_article/resources/_template.tex b/inst/rmarkdown/templates/opmi_article/resources/_template.tex new file mode 100644 index 000000000..9c2d49465 --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/resources/_template.tex @@ -0,0 +1,51 @@ +% File tacl2018.tex +% Aug 3, 2018 + +% The English content of this file was modified from various *ACL instructions +% by Lillian Lee and Kristina Toutanova +% +% LaTeXery is all adapted from acl2018.sty. + +\documentclass[11pt,a4paper]{article} +\usepackage[hyperref]{tacl2018} % use ``nohyperref'' to disable hyperref +\usepackage{times,latexsym} +\usepackage{url} +\usepackage[T1]{fontenc} + +$for(header-includes)$ +$header-includes$ +$endfor$ + +$if(taclfinal)$ +\taclfinalcopy +$else$ +\taclfinalfalse +$endif$ + +\title{$title$} + +\author{ + $for(author)$ + $author.name$ \\ $author.affiliation$ \\ {\sf $author.email$} $sep$\And + $endfor$ +} + + % $author.name$ \\ $author.affiliation$ \\ {\tt {\normalsize $author.email$}} + +\date{} + +\begin{document} +\maketitle +\begin{abstract} +$abstract$ +\end{abstract} + +$body$ + +$for(include-after)$ +$include-after$ +$endfor$ + +\bibliographystyle{acl_natbib} + +\end{document} diff --git a/inst/rmarkdown/templates/opmi_article/resources/template.tex b/inst/rmarkdown/templates/opmi_article/resources/template.tex new file mode 100755 index 000000000..5941ca147 --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/resources/template.tex @@ -0,0 +1,85 @@ +\documentclass[$class_option$]{stjour} + +$if(journal_name)$\journalname{$journal_name$}$endif$ + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% For production only, not authors: +%%\documentclass[OpenMind,finalfonts]{stjour} + +%%%%%%%%%%% Please supply information %%%%%%%%%%%%%%%%%%%%%%%%% + +\supplementslinks{$supplements_links$} + +$if(conflicts_of_interest)$ +\conflictsofinterest{$conflicts_of_interest$} +$endif$ + +%%%%%%%%%%% to be supplied by MIT Press, only %%%%%%%%%%%%%%%%% + +\citation{CITATION} + +\received{RECEIVED} +\accepted{ACCEPTED} +\published{PUBLISHED} + +%% DOI address: +\setdoi{DOI} + +%%%%%%%% End MIT Press commands %%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% author definitions should be placed here: + +$for(header-includes)$ +$header-includes$ +$endfor$ + +\begin{document} + +\title[$short_title$]{$title$} +$if(subtitle)$ +\subtitle{$subtitle$} +$endif$ + +\author[$short_author$]{ + $for(author)$ + $author.name$\affil{$author.affiliation$}$sep$, + $endfor$ +} + +$for(affiliation)$ + \affiliation{$affiliation.code$}{$affiliation.address$} +$endfor$ + +\correspondingauthor{$corresponding_author.name$}{$corresponding_author.email$} + +\keywords{$for(keywords)$ $keywords$$sep$, $endfor$} + +\begin{abstract} +$abstract$ +\end{abstract} + +$body$ + +%%% End of Article + +$if(supportive_information)$ + \section{Supportive Information} + $supportive_information$ +$endif$ + +\acknowledgments +$acknowledgments$ + +\authorcontributions +$author_contributions$ + +\bibliography{$biblio$} + +\clearpage + +$for(include-after)$ + $include-after$ +$endfor$ + +\end{document} diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/CrossMark.eps b/inst/rmarkdown/templates/opmi_article/skeleton/CrossMark.eps new file mode 100755 index 000000000..2ec8525c5 --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/CrossMark.eps @@ -0,0 +1,8316 @@ +%!PS-Adobe-3.1 EPSF-3.0 +%ADO_DSC_Encoding: Windows Roman +%%Title: CrossMark.pdf +%%Creator: Adobe Acrobat 11.0.13 +%%For: AmyH +%%CreationDate: 4/8/2016, 7:19:24 PM +%%BoundingBox: 0 0 328 123 +%%HiResBoundingBox: 0 0 328 123 +%%CropBox: 0 0 328 123 +%%LanguageLevel: 2 +%%DocumentNeededResources: (atend) +%%DocumentSuppliedResources: (atend) +%%DocumentNeededFeatures: (atend) +%%DocumentSuppliedFeatures: (atend) +%%DocumentData: Clean7Bit +%%Pages: (atend) +%%DocumentProcessColors: Cyan Magenta Yellow Black +%%DocumentCustomColors: (atend) +%%EndComments +%%BeginDefaults +%%ViewingOrientation: 1 0 0 1 +%%EndDefaults +%%BeginProlog +%%BeginResource: procset Adobe_AGM_Utils 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{currentpacking true setpacking}if +userdict/Adobe_AGM_Utils 75 dict dup begin put +/bdf +{bind def}bind def +/nd{null def}bdf +/xdf +{exch def}bdf +/ldf +{load def}bdf +/ddf +{put}bdf +/xddf +{3 -1 roll put}bdf +/xpt +{exch put}bdf +/ndf +{ + exch dup where{ + pop pop pop + }{ + xdf + }ifelse +}def +/cdndf +{ + exch dup currentdict exch known{ + pop pop + }{ + exch def + }ifelse +}def +/gx +{get exec}bdf +/ps_level + /languagelevel where{ + pop systemdict/languagelevel gx + }{ + 1 + }ifelse +def +/level2 + ps_level 2 ge +def +/level3 + ps_level 3 ge +def +/ps_version + {version cvr}stopped{-1}if +def +/set_gvm +{currentglobal exch setglobal}bdf +/reset_gvm +{setglobal}bdf +/makereadonlyarray +{ + /packedarray where{pop packedarray + }{ + array astore readonly}ifelse +}bdf +/map_reserved_ink_name +{ + dup type/stringtype eq{ + dup/Red eq{ + pop(_Red_) + }{ + dup/Green eq{ + pop(_Green_) + }{ + dup/Blue eq{ + pop(_Blue_) + }{ + dup()cvn eq{ + pop(Process) + }if + }ifelse + }ifelse + }ifelse + }if +}bdf +/AGMUTIL_GSTATE 22 dict def +/get_gstate +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_clr_spc currentcolorspace def + /AGMUTIL_GSTATE_clr_indx 0 def + /AGMUTIL_GSTATE_clr_comps 12 array def + mark currentcolor counttomark + {AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 3 -1 roll put + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 add def}repeat pop + /AGMUTIL_GSTATE_fnt rootfont def + /AGMUTIL_GSTATE_lw currentlinewidth def + /AGMUTIL_GSTATE_lc currentlinecap def + /AGMUTIL_GSTATE_lj currentlinejoin def + /AGMUTIL_GSTATE_ml currentmiterlimit def + currentdash/AGMUTIL_GSTATE_do xdf/AGMUTIL_GSTATE_da xdf + /AGMUTIL_GSTATE_sa currentstrokeadjust def + /AGMUTIL_GSTATE_clr_rnd currentcolorrendering def + /AGMUTIL_GSTATE_op currentoverprint def + /AGMUTIL_GSTATE_bg currentblackgeneration cvlit def + /AGMUTIL_GSTATE_ucr currentundercolorremoval cvlit def + currentcolortransfer cvlit/AGMUTIL_GSTATE_gy_xfer xdf cvlit/AGMUTIL_GSTATE_b_xfer xdf + cvlit/AGMUTIL_GSTATE_g_xfer xdf cvlit/AGMUTIL_GSTATE_r_xfer xdf + /AGMUTIL_GSTATE_ht currenthalftone def + /AGMUTIL_GSTATE_flt currentflat def + end +}def +/set_gstate +{ + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_clr_spc setcolorspace + AGMUTIL_GSTATE_clr_indx{AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 1 sub get + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 sub def}repeat setcolor + AGMUTIL_GSTATE_fnt setfont + AGMUTIL_GSTATE_lw setlinewidth + AGMUTIL_GSTATE_lc setlinecap + AGMUTIL_GSTATE_lj setlinejoin + AGMUTIL_GSTATE_ml setmiterlimit + AGMUTIL_GSTATE_da AGMUTIL_GSTATE_do setdash + AGMUTIL_GSTATE_sa setstrokeadjust + AGMUTIL_GSTATE_clr_rnd setcolorrendering + AGMUTIL_GSTATE_op setoverprint + AGMUTIL_GSTATE_bg cvx setblackgeneration + AGMUTIL_GSTATE_ucr cvx setundercolorremoval + AGMUTIL_GSTATE_r_xfer cvx AGMUTIL_GSTATE_g_xfer cvx AGMUTIL_GSTATE_b_xfer cvx + AGMUTIL_GSTATE_gy_xfer cvx setcolortransfer + AGMUTIL_GSTATE_ht/HalftoneType get dup 9 eq exch 100 eq or + { + currenthalftone/HalftoneType get AGMUTIL_GSTATE_ht/HalftoneType get ne + { + mark AGMUTIL_GSTATE_ht{sethalftone}stopped cleartomark + }if + }{ + AGMUTIL_GSTATE_ht sethalftone + }ifelse + AGMUTIL_GSTATE_flt setflat + end +}def +/get_gstate_and_matrix +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_ctm matrix currentmatrix def + end + get_gstate +}def +/set_gstate_and_matrix +{ + set_gstate + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_ctm setmatrix + end +}def +/AGMUTIL_str256 256 string def +/AGMUTIL_src256 256 string def +/AGMUTIL_dst64 64 string def +/AGMUTIL_srcLen nd +/AGMUTIL_ndx nd +/AGMUTIL_cpd nd +/capture_cpd{ + //Adobe_AGM_Utils/AGMUTIL_cpd currentpagedevice ddf +}def +/thold_halftone +{ + level3 + {sethalftone currenthalftone} + { + dup/HalftoneType get 3 eq + { + sethalftone currenthalftone + }{ + begin + Width Height mul{ + Thresholds read{pop}if + }repeat + end + currenthalftone + }ifelse + }ifelse +}def +/rdcmntline +{ + currentfile AGMUTIL_str256 readline pop + (%)anchorsearch{pop}if +}bdf +/filter_cmyk +{ + dup type/filetype ne{ + exch()/SubFileDecode filter + }{ + exch pop + } + ifelse + [ + exch + { + AGMUTIL_src256 readstring pop + dup length/AGMUTIL_srcLen exch def + /AGMUTIL_ndx 0 def + AGMCORE_plate_ndx 4 AGMUTIL_srcLen 1 sub{ + 1 index exch get + AGMUTIL_dst64 AGMUTIL_ndx 3 -1 roll put + /AGMUTIL_ndx AGMUTIL_ndx 1 add def + }for + pop + AGMUTIL_dst64 0 AGMUTIL_ndx getinterval + } + bind + /exec cvx + ]cvx +}bdf +/filter_indexed_devn +{ + cvi Names length mul names_index add Lookup exch get +}bdf +/filter_devn +{ + 4 dict begin + /srcStr xdf + /dstStr xdf + dup type/filetype ne{ + 0()/SubFileDecode filter + }if + [ + exch + [ + /devicen_colorspace_dict/AGMCORE_gget cvx/begin cvx + currentdict/srcStr get/readstring cvx/pop cvx + /dup cvx/length cvx 0/gt cvx[ + Adobe_AGM_Utils/AGMUTIL_ndx 0/ddf cvx + names_index Names length currentdict/srcStr get length 1 sub{ + 1/index cvx/exch cvx/get cvx + currentdict/dstStr get/AGMUTIL_ndx/load cvx 3 -1/roll cvx/put cvx + Adobe_AGM_Utils/AGMUTIL_ndx/AGMUTIL_ndx/load cvx 1/add cvx/ddf cvx + }for + currentdict/dstStr get 0/AGMUTIL_ndx/load cvx/getinterval cvx + ]cvx/if cvx + /end cvx + ]cvx + bind + /exec cvx + ]cvx + end +}bdf +/AGMUTIL_imagefile nd +/read_image_file +{ + AGMUTIL_imagefile 0 setfileposition + 10 dict begin + /imageDict xdf + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + /imbufIdx 0 def + /origDataSource imageDict/DataSource get def + /origMultipleDataSources imageDict/MultipleDataSources get def + /origDecode imageDict/Decode get def + /dstDataStr imageDict/Width get colorSpaceElemCnt mul string def + imageDict/MultipleDataSources known{MultipleDataSources}{false}ifelse + { + /imbufCnt imageDict/DataSource get length def + /imbufs imbufCnt array def + 0 1 imbufCnt 1 sub{ + /imbufIdx xdf + imbufs imbufIdx imbufLen string put + imageDict/DataSource get imbufIdx[AGMUTIL_imagefile imbufs imbufIdx get/readstring cvx/pop cvx]cvx put + }for + DeviceN_PS2{ + imageDict begin + /DataSource[DataSource/devn_sep_datasource cvx]cvx def + /MultipleDataSources false def + /Decode[0 1]def + end + }if + }{ + /imbuf imbufLen string def + Indexed_DeviceN level3 not and DeviceN_NoneName or{ + /srcDataStrs[imageDict begin + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi string + }repeat + end]def + imageDict begin + /DataSource[AGMUTIL_imagefile Decode BitsPerComponent false 1/filter_indexed_devn load dstDataStr srcDataStrs devn_alt_datasource/exec cvx]cvx def + /Decode[0 1]def + end + }{ + imageDict/DataSource[1 string dup 0 AGMUTIL_imagefile Decode length 2 idiv string/readstring cvx/pop cvx names_index/get cvx/put cvx]cvx put + imageDict/Decode[0 1]put + }ifelse + }ifelse + imageDict exch + load exec + imageDict/DataSource origDataSource put + imageDict/MultipleDataSources origMultipleDataSources put + imageDict/Decode origDecode put + end +}bdf +/write_image_file +{ + begin + {(AGMUTIL_imagefile)(w+)file}stopped{ + false + }{ + Adobe_AGM_Utils/AGMUTIL_imagefile xddf + 2 dict begin + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + MultipleDataSources{DataSource 0 get}{DataSource}ifelse type/filetype eq{ + /imbuf imbufLen string def + }if + 1 1 Height MultipleDataSources not{Decode length 2 idiv mul}if{ + pop + MultipleDataSources{ + 0 1 DataSource length 1 sub{ + DataSource type dup + /arraytype eq{ + pop DataSource exch gx + }{ + /filetype eq{ + DataSource exch get imbuf readstring pop + }{ + DataSource exch get + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }for + }{ + DataSource type dup + /arraytype eq{ + pop DataSource exec + }{ + /filetype eq{ + DataSource imbuf readstring pop + }{ + DataSource + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }ifelse + }for + end + true + }ifelse + end +}bdf +/close_image_file +{ + AGMUTIL_imagefile closefile(AGMUTIL_imagefile)deletefile +}def +statusdict/product known userdict/AGMP_current_show known not and{ + /pstr statusdict/product get def + pstr(HP LaserJet 2200)eq + pstr(HP LaserJet 4000 Series)eq or + pstr(HP LaserJet 4050 Series )eq or + pstr(HP LaserJet 8000 Series)eq or + pstr(HP LaserJet 8100 Series)eq or + pstr(HP LaserJet 8150 Series)eq or + pstr(HP LaserJet 5000 Series)eq or + pstr(HP LaserJet 5100 Series)eq or + pstr(HP Color LaserJet 4500)eq or + pstr(HP Color LaserJet 4600)eq or + pstr(HP LaserJet 5Si)eq or + pstr(HP LaserJet 1200 Series)eq or + pstr(HP LaserJet 1300 Series)eq or + pstr(HP LaserJet 4100 Series)eq or + { + userdict/AGMP_current_show/show load put + userdict/show{ + currentcolorspace 0 get + /Pattern eq + {false charpath f} + {AGMP_current_show}ifelse + }put + }if + currentdict/pstr undef +}if +/consumeimagedata +{ + begin + AGMIMG_init_common + currentdict/MultipleDataSources known not + {/MultipleDataSources false def}if + MultipleDataSources + { + DataSource 0 get type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width cvi string def + 1 1 Height cvi + { + pop + 0 1 DataSource length 1 sub + { + DataSource exch get + flushbuffer readstring pop pop + }for + }for + end + }if + dup/arraytype eq exch/packedarraytype eq or DataSource 0 get xcheck and + { + Width Height mul cvi + { + 0 1 DataSource length 1 sub + {dup DataSource exch gx length exch 0 ne{pop}if}for + dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + } + { + /DataSource load type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width Decode length 2 idiv mul cvi string def + 1 1 Height{pop DataSource flushbuffer readstring pop pop}for + end + }if + dup/arraytype eq exch/packedarraytype eq or/DataSource load xcheck and + { + Height Width BitsPerComponent mul 8 BitsPerComponent sub add 8 idiv Decode length 2 idiv mul mul + { + DataSource length dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + }ifelse + end +}bdf +/addprocs +{ + 2{/exec load}repeat + 3 1 roll + [5 1 roll]bind cvx +}def +/modify_halftone_xfer +{ + currenthalftone dup length dict copy begin + currentdict 2 index known{ + 1 index load dup length dict copy begin + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end def + currentdict end sethalftone + }{ + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end sethalftone + pop + }ifelse +}def +/clonearray +{ + dup xcheck exch + dup length array exch + Adobe_AGM_Core/AGMCORE_tmp -1 ddf + { + Adobe_AGM_Core/AGMCORE_tmp 2 copy get 1 add ddf + dup type/dicttype eq + { + Adobe_AGM_Core/AGMCORE_tmp get + exch + clonedict + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + dup type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_tmp get exch + clonearray + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + exch dup + Adobe_AGM_Core/AGMCORE_tmp get 4 -1 roll put + }forall + exch{cvx}if +}bdf +/clonedict +{ + dup length dict + begin + { + dup type/dicttype eq + {clonedict}if + dup type/arraytype eq + {clonearray}if + def + }forall + currentdict + end +}bdf +/DeviceN_PS2 +{ + /currentcolorspace AGMCORE_gget 0 get/DeviceN eq level3 not and +}bdf +/Indexed_DeviceN +{ + /indexed_colorspace_dict AGMCORE_gget dup null ne{ + dup/CSDBase known{ + /CSDBase get/CSD get_res/Names known + }{ + pop false + }ifelse + }{ + pop false + }ifelse +}bdf +/DeviceN_NoneName +{ + /Names where{ + pop + false Names + { + (None)eq or + }forall + }{ + false + }ifelse +}bdf +/DeviceN_PS2_inRip_seps +{ + /AGMCORE_in_rip_sep where + { + pop dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/DeviceN eq level3 not and AGMCORE_in_rip_sep and + { + /currentcolorspace exch AGMCORE_gput + false + }{ + true + }ifelse + }{ + true + }ifelse + }{ + true + }ifelse +}bdf +/base_colorspace_type +{ + dup type/arraytype eq{0 get}if +}bdf +/currentdistillerparams where{pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse +{ + /pdfmark_5{cleartomark}bind def +}{ + /pdfmark_5{pdfmark}bind def +}ifelse +/ReadBypdfmark_5 +{ + currentfile exch 0 exch/SubFileDecode filter + /currentdistillerparams where + {pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse + {flushfile cleartomark} + {/PUT pdfmark}ifelse +}bdf +/ReadBypdfmark_5_string +{ + 2 dict begin + /makerString exch def string/tmpString exch def + { + currentfile tmpString readline not{pop exit}if + makerString anchorsearch + { + pop pop cleartomark exit + }{ + 3 copy/PUT pdfmark_5 pop 2 copy(\n)/PUT pdfmark_5 + }ifelse + }loop + end +}bdf +/xpdfm +{ + { + dup 0 get/Label eq + { + aload length[exch 1 add 1 roll/PAGELABEL + }{ + aload pop + [{ThisPage}<<5 -2 roll>>/PUT + }ifelse + pdfmark_5 + }forall +}bdf +/lmt{ + dup 2 index le{exch}if pop dup 2 index ge{exch}if pop +}bdf +/int{ + dup 2 index sub 3 index 5 index sub div 6 -2 roll sub mul exch pop add exch pop +}bdf +/ds{ + Adobe_AGM_Utils begin +}bdf +/dt{ + currentdict Adobe_AGM_Utils eq{ + end + }if +}bdf +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_AGM_Core 2.0 0 +%%Version: 2.0 0 +%%Copyright: Copyright(C)1997-2007 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Core 209 dict dup begin put +/Adobe_AGM_Core_Id/Adobe_AGM_Core_2.0_0 def +/AGMCORE_str256 256 string def +/AGMCORE_save nd +/AGMCORE_graphicsave nd +/AGMCORE_c 0 def +/AGMCORE_m 0 def +/AGMCORE_y 0 def +/AGMCORE_k 0 def +/AGMCORE_cmykbuf 4 array def +/AGMCORE_screen[currentscreen]cvx def +/AGMCORE_tmp 0 def +/AGMCORE_&setgray nd +/AGMCORE_&setcolor nd +/AGMCORE_&setcolorspace nd +/AGMCORE_&setcmykcolor nd +/AGMCORE_cyan_plate nd +/AGMCORE_magenta_plate nd +/AGMCORE_yellow_plate nd +/AGMCORE_black_plate nd +/AGMCORE_plate_ndx nd +/AGMCORE_get_ink_data nd +/AGMCORE_is_cmyk_sep nd +/AGMCORE_host_sep nd +/AGMCORE_avoid_L2_sep_space nd +/AGMCORE_distilling nd +/AGMCORE_composite_job nd +/AGMCORE_producing_seps nd +/AGMCORE_ps_level -1 def +/AGMCORE_ps_version -1 def +/AGMCORE_environ_ok nd +/AGMCORE_CSD_cache 0 dict def +/AGMCORE_currentoverprint false def +/AGMCORE_deltaX nd +/AGMCORE_deltaY nd +/AGMCORE_name nd +/AGMCORE_sep_special nd +/AGMCORE_err_strings 4 dict def +/AGMCORE_cur_err nd +/AGMCORE_current_spot_alias false def +/AGMCORE_inverting false def +/AGMCORE_feature_dictCount nd +/AGMCORE_feature_opCount nd +/AGMCORE_feature_ctm nd +/AGMCORE_ConvertToProcess false def +/AGMCORE_Default_CTM matrix def +/AGMCORE_Default_PageSize nd +/AGMCORE_Default_flatness nd +/AGMCORE_currentbg nd +/AGMCORE_currentucr nd +/AGMCORE_pattern_paint_type 0 def +/knockout_unitsq nd +currentglobal true setglobal +[/CSA/Gradient/Procedure] +{ + /Generic/Category findresource dup length dict copy/Category defineresource pop +}forall +setglobal +/AGMCORE_key_known +{ + where{ + /Adobe_AGM_Core_Id known + }{ + false + }ifelse +}ndf +/flushinput +{ + save + 2 dict begin + /CompareBuffer 3 -1 roll def + /readbuffer 256 string def + mark + { + currentfile readbuffer{readline}stopped + {cleartomark mark} + { + not + {pop exit} + if + CompareBuffer eq + {exit} + if + }ifelse + }loop + cleartomark + end + restore +}bdf +/getspotfunction +{ + AGMCORE_screen exch pop exch pop + dup type/dicttype eq{ + dup/HalftoneType get 1 eq{ + /SpotFunction get + }{ + dup/HalftoneType get 2 eq{ + /GraySpotFunction get + }{ + pop + { + abs exch abs 2 copy add 1 gt{ + 1 sub dup mul exch 1 sub dup mul add 1 sub + }{ + dup mul exch dup mul add 1 exch sub + }ifelse + }bind + }ifelse + }ifelse + }if +}def +/np +{newpath}bdf +/clp_npth +{clip np}def +/eoclp_npth +{eoclip np}def +/npth_clp +{np clip}def +/graphic_setup +{ + /AGMCORE_graphicsave save store + concat + 0 setgray + 0 setlinecap + 0 setlinejoin + 1 setlinewidth + []0 setdash + 10 setmiterlimit + np + false setoverprint + false setstrokeadjust + //Adobe_AGM_Core/spot_alias gx + /Adobe_AGM_Image where{ + pop + Adobe_AGM_Image/spot_alias 2 copy known{ + gx + }{ + pop pop + }ifelse + }if + /sep_colorspace_dict null AGMCORE_gput + 100 dict begin + /dictstackcount countdictstack def + /showpage{}def + mark +}def +/graphic_cleanup +{ + cleartomark + dictstackcount 1 countdictstack 1 sub{end}for + end + AGMCORE_graphicsave restore +}def +/compose_error_msg +{ + grestoreall initgraphics + /Helvetica findfont 10 scalefont setfont + /AGMCORE_deltaY 100 def + /AGMCORE_deltaX 310 def + clippath pathbbox np pop pop 36 add exch 36 add exch moveto + 0 AGMCORE_deltaY rlineto AGMCORE_deltaX 0 rlineto + 0 AGMCORE_deltaY neg rlineto AGMCORE_deltaX neg 0 rlineto closepath + 0 AGMCORE_&setgray + gsave 1 AGMCORE_&setgray fill grestore + 1 setlinewidth gsave stroke grestore + currentpoint AGMCORE_deltaY 15 sub add exch 8 add exch moveto + /AGMCORE_deltaY 12 def + /AGMCORE_tmp 0 def + AGMCORE_err_strings exch get + { + dup 32 eq + { + pop + AGMCORE_str256 0 AGMCORE_tmp getinterval + stringwidth pop currentpoint pop add AGMCORE_deltaX 28 add gt + { + currentpoint AGMCORE_deltaY sub exch pop + clippath pathbbox pop pop pop 44 add exch moveto + }if + AGMCORE_str256 0 AGMCORE_tmp getinterval show( )show + 0 1 AGMCORE_str256 length 1 sub + { + AGMCORE_str256 exch 0 put + }for + /AGMCORE_tmp 0 def + }{ + AGMCORE_str256 exch AGMCORE_tmp xpt + /AGMCORE_tmp AGMCORE_tmp 1 add def + }ifelse + }forall +}bdf +/AGMCORE_CMYKDeviceNColorspaces[ + [/Separation/None/DeviceCMYK{0 0 0}] + [/Separation(Black)/DeviceCMYK{0 0 0 4 -1 roll}bind] + [/Separation(Yellow)/DeviceCMYK{0 0 3 -1 roll 0}bind] + [/DeviceN[(Yellow)(Black)]/DeviceCMYK{0 0 4 2 roll}bind] + [/Separation(Magenta)/DeviceCMYK{0 exch 0 0}bind] + [/DeviceN[(Magenta)(Black)]/DeviceCMYK{0 3 1 roll 0 exch}bind] + [/DeviceN[(Magenta)(Yellow)]/DeviceCMYK{0 3 1 roll 0}bind] + [/DeviceN[(Magenta)(Yellow)(Black)]/DeviceCMYK{0 4 1 roll}bind] + [/Separation(Cyan)/DeviceCMYK{0 0 0}] + [/DeviceN[(Cyan)(Black)]/DeviceCMYK{0 0 3 -1 roll}bind] + [/DeviceN[(Cyan)(Yellow)]/DeviceCMYK{0 exch 0}bind] + [/DeviceN[(Cyan)(Yellow)(Black)]/DeviceCMYK{0 3 1 roll}bind] + [/DeviceN[(Cyan)(Magenta)]/DeviceCMYK{0 0}] + [/DeviceN[(Cyan)(Magenta)(Black)]/DeviceCMYK{0 exch}bind] + [/DeviceN[(Cyan)(Magenta)(Yellow)]/DeviceCMYK{0}] + [/DeviceCMYK] +]def +/ds{ + Adobe_AGM_Core begin + /currentdistillerparams where + { + pop currentdistillerparams/CoreDistVersion get 5000 lt + {<>setdistillerparams}if + }if + /AGMCORE_ps_version xdf + /AGMCORE_ps_level xdf + errordict/AGM_handleerror known not{ + errordict/AGM_handleerror errordict/handleerror get put + errordict/handleerror{ + Adobe_AGM_Core begin + $error/newerror get AGMCORE_cur_err null ne and{ + $error/newerror false put + AGMCORE_cur_err compose_error_msg + }if + $error/newerror true put + end + errordict/AGM_handleerror get exec + }bind put + }if + /AGMCORE_environ_ok + ps_level AGMCORE_ps_level ge + ps_version AGMCORE_ps_version ge and + AGMCORE_ps_level -1 eq or + def + AGMCORE_environ_ok not + {/AGMCORE_cur_err/AGMCORE_bad_environ def}if + /AGMCORE_&setgray systemdict/setgray get def + level2{ + /AGMCORE_&setcolor systemdict/setcolor get def + /AGMCORE_&setcolorspace systemdict/setcolorspace get def + }if + /AGMCORE_currentbg currentblackgeneration def + /AGMCORE_currentucr currentundercolorremoval def + /AGMCORE_Default_flatness currentflat def + /AGMCORE_distilling + /product where{ + pop systemdict/setdistillerparams known product(Adobe PostScript Parser)ne and + }{ + false + }ifelse + def + /AGMCORE_GSTATE AGMCORE_key_known not{ + /AGMCORE_GSTATE 21 dict def + /AGMCORE_tmpmatrix matrix def + /AGMCORE_gstack 32 array def + /AGMCORE_gstackptr 0 def + /AGMCORE_gstacksaveptr 0 def + /AGMCORE_gstackframekeys 14 def + /AGMCORE_&gsave/gsave ldf + /AGMCORE_&grestore/grestore ldf + /AGMCORE_&grestoreall/grestoreall ldf + /AGMCORE_&save/save ldf + /AGMCORE_&setoverprint/setoverprint ldf + /AGMCORE_gdictcopy{ + begin + {def}forall + end + }def + /AGMCORE_gput{ + AGMCORE_gstack AGMCORE_gstackptr get + 3 1 roll + put + }def + /AGMCORE_gget{ + AGMCORE_gstack AGMCORE_gstackptr get + exch + get + }def + /gsave{ + AGMCORE_&gsave + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /grestore{ + AGMCORE_&grestore + AGMCORE_gstackptr 1 sub + dup AGMCORE_gstacksaveptr lt{1 add}if + dup AGMCORE_gstack exch get dup/AGMCORE_currentoverprint known + {/AGMCORE_currentoverprint get setoverprint}{pop}ifelse + /AGMCORE_gstackptr exch store + }def + /grestoreall{ + AGMCORE_&grestoreall + /AGMCORE_gstackptr AGMCORE_gstacksaveptr store + }def + /save{ + AGMCORE_&save + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + /AGMCORE_gstacksaveptr AGMCORE_gstackptr store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /setoverprint{ + dup/AGMCORE_currentoverprint exch AGMCORE_gput AGMCORE_&setoverprint + }def + 0 1 AGMCORE_gstack length 1 sub{ + AGMCORE_gstack exch AGMCORE_gstackframekeys dict put + }for + }if + level3/AGMCORE_&sysshfill AGMCORE_key_known not and + { + /AGMCORE_&sysshfill systemdict/shfill get def + /AGMCORE_&sysmakepattern systemdict/makepattern get def + /AGMCORE_&usrmakepattern/makepattern load def + }if + /currentcmykcolor[0 0 0 0]AGMCORE_gput + /currentstrokeadjust false AGMCORE_gput + /currentcolorspace[/DeviceGray]AGMCORE_gput + /sep_tint 0 AGMCORE_gput + /devicen_tints[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]AGMCORE_gput + /sep_colorspace_dict null AGMCORE_gput + /devicen_colorspace_dict null AGMCORE_gput + /indexed_colorspace_dict null AGMCORE_gput + /currentcolor_intent()AGMCORE_gput + /customcolor_tint 1 AGMCORE_gput + /absolute_colorimetric_crd null AGMCORE_gput + /relative_colorimetric_crd null AGMCORE_gput + /saturation_crd null AGMCORE_gput + /perceptual_crd null AGMCORE_gput + currentcolortransfer cvlit/AGMCore_gray_xfer xdf cvlit/AGMCore_b_xfer xdf + cvlit/AGMCore_g_xfer xdf cvlit/AGMCore_r_xfer xdf + << + /MaxPatternItem currentsystemparams/MaxPatternCache get + >> + setuserparams + end +}def +/ps +{ + /setcmykcolor where{ + pop + Adobe_AGM_Core/AGMCORE_&setcmykcolor/setcmykcolor load put + }if + Adobe_AGM_Core begin + /setcmykcolor + { + 4 copy AGMCORE_cmykbuf astore/currentcmykcolor exch AGMCORE_gput + 1 sub 4 1 roll + 3{ + 3 index add neg dup 0 lt{ + pop 0 + }if + 3 1 roll + }repeat + setrgbcolor pop + }ndf + /currentcmykcolor + { + /currentcmykcolor AGMCORE_gget aload pop + }ndf + /setoverprint + {pop}ndf + /currentoverprint + {false}ndf + /AGMCORE_cyan_plate 1 0 0 0 test_cmyk_color_plate def + /AGMCORE_magenta_plate 0 1 0 0 test_cmyk_color_plate def + /AGMCORE_yellow_plate 0 0 1 0 test_cmyk_color_plate def + /AGMCORE_black_plate 0 0 0 1 test_cmyk_color_plate def + /AGMCORE_plate_ndx + AGMCORE_cyan_plate{ + 0 + }{ + AGMCORE_magenta_plate{ + 1 + }{ + AGMCORE_yellow_plate{ + 2 + }{ + AGMCORE_black_plate{ + 3 + }{ + 4 + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_have_reported_unsupported_color_space false def + /AGMCORE_report_unsupported_color_space + { + AGMCORE_have_reported_unsupported_color_space false eq + { + (Warning: Job contains content that cannot be separated with on-host methods. This content appears on the black plate, and knocks out all other plates.)== + Adobe_AGM_Core/AGMCORE_have_reported_unsupported_color_space true ddf + }if + }def + /AGMCORE_composite_job + AGMCORE_cyan_plate AGMCORE_magenta_plate and AGMCORE_yellow_plate and AGMCORE_black_plate and def + /AGMCORE_in_rip_sep + /AGMCORE_in_rip_sep where{ + pop AGMCORE_in_rip_sep + }{ + AGMCORE_distilling + { + false + }{ + userdict/Adobe_AGM_OnHost_Seps known{ + false + }{ + level2{ + currentpagedevice/Separations 2 copy known{ + get + }{ + pop pop false + }ifelse + }{ + false + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_producing_seps AGMCORE_composite_job not AGMCORE_in_rip_sep or def + /AGMCORE_host_sep AGMCORE_producing_seps AGMCORE_in_rip_sep not and def + /AGM_preserve_spots + /AGM_preserve_spots where{ + pop AGM_preserve_spots + }{ + AGMCORE_distilling AGMCORE_producing_seps or + }ifelse + def + /AGM_is_distiller_preserving_spotimages + { + currentdistillerparams/PreserveOverprintSettings known + { + currentdistillerparams/PreserveOverprintSettings get + { + currentdistillerparams/ColorConversionStrategy known + { + currentdistillerparams/ColorConversionStrategy get + /sRGB ne + }{ + true + }ifelse + }{ + false + }ifelse + }{ + false + }ifelse + }def + /convert_spot_to_process where{pop}{ + /convert_spot_to_process + { + //Adobe_AGM_Core begin + dup map_alias{ + /Name get exch pop + }if + dup dup(None)eq exch(All)eq or + { + pop false + }{ + AGMCORE_host_sep + { + gsave + 1 0 0 0 setcmykcolor currentgray 1 exch sub + 0 1 0 0 setcmykcolor currentgray 1 exch sub + 0 0 1 0 setcmykcolor currentgray 1 exch sub + 0 0 0 1 setcmykcolor currentgray 1 exch sub + add add add 0 eq + { + pop false + }{ + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + }ifelse + grestore + }{ + AGMCORE_distilling + { + pop AGM_is_distiller_preserving_spotimages not + }{ + //Adobe_AGM_Core/AGMCORE_name xddf + false + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 0 eq + AGMUTIL_cpd/OverrideSeparations known and + { + AGMUTIL_cpd/OverrideSeparations get + { + /HqnSpots/ProcSet resourcestatus + { + pop pop pop true + }if + }if + }if + { + AGMCORE_name/HqnSpots/ProcSet findresource/TestSpot gx not + }{ + gsave + [/Separation AGMCORE_name/DeviceGray{}]AGMCORE_&setcolorspace + false + AGMUTIL_cpd/SeparationColorNames 2 copy known + { + get + {AGMCORE_name eq or}forall + not + }{ + pop pop pop true + }ifelse + grestore + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + }ifelse + /convert_to_process where{pop}{ + /convert_to_process + { + dup length 0 eq + { + pop false + }{ + AGMCORE_host_sep + { + dup true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process and}ifelse + } + forall + { + true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + (Black)eq or and + }forall + not + }{pop false}ifelse + }{ + false exch + { + /PhotoshopDuotoneList where{pop false}{true}ifelse + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process or}ifelse + } + { + convert_spot_to_process or + } + ifelse + } + forall + }ifelse + }ifelse + }def + }ifelse + /AGMCORE_avoid_L2_sep_space + version cvr 2012 lt + level2 and + AGMCORE_producing_seps not and + def + /AGMCORE_is_cmyk_sep + AGMCORE_cyan_plate AGMCORE_magenta_plate or AGMCORE_yellow_plate or AGMCORE_black_plate or + def + /AGM_avoid_0_cmyk where{ + pop AGM_avoid_0_cmyk + }{ + AGM_preserve_spots + userdict/Adobe_AGM_OnHost_Seps known + userdict/Adobe_AGM_InRip_Seps known or + not and + }ifelse + { + /setcmykcolor[ + { + 4 copy add add add 0 eq currentoverprint and{ + pop 0.0005 + }if + }/exec cvx + /AGMCORE_&setcmykcolor load dup type/operatortype ne{ + /exec cvx + }if + ]cvx def + }if + /AGMCORE_IsSeparationAProcessColor + { + dup(Cyan)eq exch dup(Magenta)eq exch dup(Yellow)eq exch(Black)eq or or or + }def + AGMCORE_host_sep{ + /setcolortransfer + { + AGMCORE_cyan_plate{ + pop pop pop + }{ + AGMCORE_magenta_plate{ + 4 3 roll pop pop pop + }{ + AGMCORE_yellow_plate{ + 4 2 roll pop pop pop + }{ + 4 1 roll pop pop pop + }ifelse + }ifelse + }ifelse + settransfer + } + def + /AGMCORE_get_ink_data + AGMCORE_cyan_plate{ + {pop pop pop} + }{ + AGMCORE_magenta_plate{ + {4 3 roll pop pop pop} + }{ + AGMCORE_yellow_plate{ + {4 2 roll pop pop pop} + }{ + {4 1 roll pop pop pop} + }ifelse + }ifelse + }ifelse + def + /AGMCORE_RemoveProcessColorNames + { + 1 dict begin + /filtername + { + dup/Cyan eq 1 index(Cyan)eq or + {pop(_cyan_)}if + dup/Magenta eq 1 index(Magenta)eq or + {pop(_magenta_)}if + dup/Yellow eq 1 index(Yellow)eq or + {pop(_yellow_)}if + dup/Black eq 1 index(Black)eq or + {pop(_black_)}if + }def + dup type/arraytype eq + {[exch{filtername}forall]} + {filtername}ifelse + end + }def + level3{ + /AGMCORE_IsCurrentColor + { + dup AGMCORE_IsSeparationAProcessColor + { + AGMCORE_plate_ndx 0 eq + {dup(Cyan)eq exch/Cyan eq or}if + AGMCORE_plate_ndx 1 eq + {dup(Magenta)eq exch/Magenta eq or}if + AGMCORE_plate_ndx 2 eq + {dup(Yellow)eq exch/Yellow eq or}if + AGMCORE_plate_ndx 3 eq + {dup(Black)eq exch/Black eq or}if + AGMCORE_plate_ndx 4 eq + {pop false}if + }{ + gsave + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + grestore + }ifelse + }def + /AGMCORE_filter_functiondatasource + { + 5 dict begin + /data_in xdf + data_in type/stringtype eq + { + /ncomp xdf + /comp xdf + /string_out data_in length ncomp idiv string def + 0 ncomp data_in length 1 sub + { + string_out exch dup ncomp idiv exch data_in exch ncomp getinterval comp get 255 exch sub put + }for + string_out + }{ + string/string_in xdf + /string_out 1 string def + /component xdf + [ + data_in string_in/readstring cvx + [component/get cvx 255/exch cvx/sub cvx string_out/exch cvx 0/exch cvx/put cvx string_out]cvx + [/pop cvx()]cvx/ifelse cvx + ]cvx/ReusableStreamDecode filter + }ifelse + end + }def + /AGMCORE_separateShadingFunction + { + 2 dict begin + /paint? xdf + /channel xdf + dup type/dicttype eq + { + begin + FunctionType 0 eq + { + /DataSource channel Range length 2 idiv DataSource AGMCORE_filter_functiondatasource def + currentdict/Decode known + {/Decode Decode channel 2 mul 2 getinterval def}if + paint? not + {/Decode[1 1]def}if + }if + FunctionType 2 eq + { + paint? + { + /C0[C0 channel get 1 exch sub]def + /C1[C1 channel get 1 exch sub]def + }{ + /C0[1]def + /C1[1]def + }ifelse + }if + FunctionType 3 eq + { + /Functions[Functions{channel paint? AGMCORE_separateShadingFunction}forall]def + }if + currentdict/Range known + {/Range[0 1]def}if + currentdict + end}{ + channel get 0 paint? AGMCORE_separateShadingFunction + }ifelse + end + }def + /AGMCORE_separateShading + { + 3 -1 roll begin + currentdict/Function known + { + currentdict/Background known + {[1 index{Background 3 index get 1 exch sub}{1}ifelse]/Background xdf}if + Function 3 1 roll AGMCORE_separateShadingFunction/Function xdf + /ColorSpace[/DeviceGray]def + }{ + ColorSpace dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }{ + ColorSpace dup 1 get AGMCORE_RemoveProcessColorNames 1 exch put + }ifelse + ColorSpace 0 get/Separation eq + { + { + [1/exch cvx/sub cvx]cvx + }{ + [/pop cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll put + pop + }{ + { + [exch ColorSpace 1 get length 1 sub exch sub/index cvx 1/exch cvx/sub cvx ColorSpace 1 get length 1 add 1/roll cvx ColorSpace 1 get length{/pop cvx}repeat]cvx + }{ + pop[ColorSpace 1 get length{/pop cvx}repeat cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll bind put + }ifelse + ColorSpace 2/DeviceGray put + }ifelse + end + }def + /AGMCORE_separateShadingDict + { + dup/ColorSpace get + dup type/arraytype ne + {[exch]}if + dup 0 get/DeviceCMYK eq + { + exch begin + currentdict + AGMCORE_cyan_plate + {0 true}if + AGMCORE_magenta_plate + {1 true}if + AGMCORE_yellow_plate + {2 true}if + AGMCORE_black_plate + {3 true}if + AGMCORE_plate_ndx 4 eq + {0 false}if + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + currentdict + end exch + }if + dup 0 get/Separation eq + { + exch begin + ColorSpace 1 get dup/None ne exch/All ne and + { + ColorSpace 1 get AGMCORE_IsCurrentColor AGMCORE_plate_ndx 4 lt and ColorSpace 1 get AGMCORE_IsSeparationAProcessColor not and + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /Separation + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + }if + }ifelse + }{ + currentdict ColorSpace 1 get AGMCORE_IsCurrentColor + 0 exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + }if + currentdict + end exch + }if + dup 0 get/DeviceN eq + { + exch begin + ColorSpace 1 get convert_to_process + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /DeviceN + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + /ColorSpace[/DeviceGray]def + }if + }ifelse + }{ + currentdict + false -1 ColorSpace 1 get + { + AGMCORE_IsCurrentColor + { + 1 add + exch pop true exch exit + }if + 1 add + }forall + exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + currentdict + end exch + }if + dup 0 get dup/DeviceCMYK eq exch dup/Separation eq exch/DeviceN eq or or not + { + exch begin + ColorSpace dup type/arraytype eq + {0 get}if + /DeviceGray ne + { + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + ColorSpace 0 get/CIEBasedA eq + { + /ColorSpace[/Separation/_ciebaseda_/DeviceGray{}]def + }if + ColorSpace 0 get dup/CIEBasedABC eq exch dup/CIEBasedDEF eq exch/DeviceRGB eq or or + { + /ColorSpace[/DeviceN[/_red_/_green_/_blue_]/DeviceRGB{}]def + }if + ColorSpace 0 get/CIEBasedDEFG eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }if + currentdict 0 false AGMCORE_separateShading + }if + }if + currentdict + end exch + }if + pop + dup/AGMCORE_ignoreshade known + { + begin + /ColorSpace[/Separation(None)/DeviceGray{}]def + currentdict end + }if + }def + /shfill + { + AGMCORE_separateShadingDict + dup/AGMCORE_ignoreshade known + {pop} + {AGMCORE_&sysshfill}ifelse + }def + /makepattern + { + exch + dup/PatternType get 2 eq + { + clonedict + begin + /Shading Shading AGMCORE_separateShadingDict def + Shading/AGMCORE_ignoreshade known + currentdict end exch + {pop<>}if + exch AGMCORE_&sysmakepattern + }{ + exch AGMCORE_&usrmakepattern + }ifelse + }def + }if + }if + AGMCORE_in_rip_sep{ + /setcustomcolor + { + exch aload pop + dup 7 1 roll inRip_spot_has_ink not { + 4{4 index mul 4 1 roll} + repeat + /DeviceCMYK setcolorspace + 6 -2 roll pop pop + }{ + //Adobe_AGM_Core begin + /AGMCORE_k xdf/AGMCORE_y xdf/AGMCORE_m xdf/AGMCORE_c xdf + end + [/Separation 4 -1 roll/DeviceCMYK + {dup AGMCORE_c mul exch dup AGMCORE_m mul exch dup AGMCORE_y mul exch AGMCORE_k mul} + ] + setcolorspace + }ifelse + setcolor + }ndf + /setseparationgray + { + [/Separation(All)/DeviceGray{}]setcolorspace_opt + 1 exch sub setcolor + }ndf + }{ + /setseparationgray + { + AGMCORE_&setgray + }ndf + }ifelse + /findcmykcustomcolor + { + 5 makereadonlyarray + }ndf + /setcustomcolor + { + exch aload pop pop + 4{4 index mul 4 1 roll}repeat + setcmykcolor pop + }ndf + /has_color + /colorimage where{ + AGMCORE_producing_seps{ + pop true + }{ + systemdict eq + }ifelse + }{ + false + }ifelse + def + /map_index + { + 1 index mul exch getinterval{255 div}forall + }bdf + /map_indexed_devn + { + Lookup Names length 3 -1 roll cvi map_index + }bdf + /n_color_components + { + base_colorspace_type + dup/DeviceGray eq{ + pop 1 + }{ + /DeviceCMYK eq{ + 4 + }{ + 3 + }ifelse + }ifelse + }bdf + level2{ + /mo/moveto ldf + /li/lineto ldf + /cv/curveto ldf + /knockout_unitsq + { + 1 setgray + 0 0 1 1 rectfill + }def + level2/setcolorspace AGMCORE_key_known not and{ + /AGMCORE_&&&setcolorspace/setcolorspace ldf + /AGMCORE_ReplaceMappedColor + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + /AGMCORE_SpotAliasAry2 where{ + begin + dup 0 get dup/Separation eq + { + pop + dup length array copy + dup dup 1 get + current_spot_alias + { + dup map_alias + { + false set_spot_alias + dup 1 exch setsepcolorspace + true set_spot_alias + begin + /sep_colorspace_dict currentdict AGMCORE_gput + pop pop pop + [ + /Separation Name + CSA map_csa + MappedCSA + /sep_colorspace_proc load + ] + dup Name + end + }if + }if + map_reserved_ink_name 1 xpt + }{ + /DeviceN eq + { + dup length array copy + dup dup 1 get[ + exch{ + current_spot_alias{ + dup map_alias{ + /Name get exch pop + }if + }if + map_reserved_ink_name + }forall + ]1 xpt + }if + }ifelse + end + }if + }if + }def + /setcolorspace + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/Indexed eq + { + AGMCORE_distilling + { + /PhotoshopDuotoneList where + { + pop false + }{ + true + }ifelse + }{ + true + }ifelse + { + aload pop 3 -1 roll + AGMCORE_ReplaceMappedColor + 3 1 roll 4 array astore + }if + }{ + AGMCORE_ReplaceMappedColor + }ifelse + }if + DeviceN_PS2_inRip_seps{AGMCORE_&&&setcolorspace}if + }def + }if + }{ + /adj + { + currentstrokeadjust{ + transform + 0.25 sub round 0.25 add exch + 0.25 sub round 0.25 add exch + itransform + }if + }def + /mo{ + adj moveto + }def + /li{ + adj lineto + }def + /cv{ + 6 2 roll adj + 6 2 roll adj + 6 2 roll adj curveto + }def + /knockout_unitsq + { + 1 setgray + 8 8 1[8 0 0 8 0 0]{}image + }def + /currentstrokeadjust{ + /currentstrokeadjust AGMCORE_gget + }def + /setstrokeadjust{ + /currentstrokeadjust exch AGMCORE_gput + }def + /setcolorspace + { + /currentcolorspace exch AGMCORE_gput + }def + /currentcolorspace + { + /currentcolorspace AGMCORE_gget + }def + /setcolor_devicecolor + { + base_colorspace_type + dup/DeviceGray eq{ + pop setgray + }{ + /DeviceCMYK eq{ + setcmykcolor + }{ + setrgbcolor + }ifelse + }ifelse + }def + /setcolor + { + currentcolorspace 0 get + dup/DeviceGray ne{ + dup/DeviceCMYK ne{ + dup/DeviceRGB ne{ + dup/Separation eq{ + pop + currentcolorspace 3 gx + currentcolorspace 2 get + }{ + dup/Indexed eq{ + pop + currentcolorspace 3 get dup type/stringtype eq{ + currentcolorspace 1 get n_color_components + 3 -1 roll map_index + }{ + exec + }ifelse + currentcolorspace 1 get + }{ + /AGMCORE_cur_err/AGMCORE_invalid_color_space def + AGMCORE_invalid_color_space + }ifelse + }ifelse + }if + }if + }if + setcolor_devicecolor + }def + }ifelse + /sop/setoverprint ldf + /lw/setlinewidth ldf + /lc/setlinecap ldf + /lj/setlinejoin ldf + /ml/setmiterlimit ldf + /dsh/setdash ldf + /sadj/setstrokeadjust ldf + /gry/setgray ldf + /rgb/setrgbcolor ldf + /cmyk[ + /currentcolorspace[/DeviceCMYK]/AGMCORE_gput cvx + /setcmykcolor load dup type/operatortype ne{/exec cvx}if + ]cvx bdf + level3 AGMCORE_host_sep not and{ + /nzopmsc{ + 6 dict begin + /kk exch def + /yy exch def + /mm exch def + /cc exch def + /sum 0 def + cc 0 ne{/sum sum 2#1000 or def cc}if + mm 0 ne{/sum sum 2#0100 or def mm}if + yy 0 ne{/sum sum 2#0010 or def yy}if + kk 0 ne{/sum sum 2#0001 or def kk}if + AGMCORE_CMYKDeviceNColorspaces sum get setcolorspace + sum 0 eq{0}if + end + setcolor + }bdf + }{ + /nzopmsc/cmyk ldf + }ifelse + /sep/setsepcolor ldf + /devn/setdevicencolor ldf + /idx/setindexedcolor ldf + /colr/setcolor ldf + /csacrd/set_csa_crd ldf + /sepcs/setsepcolorspace ldf + /devncs/setdevicencolorspace ldf + /idxcs/setindexedcolorspace ldf + /cp/closepath ldf + /clp/clp_npth ldf + /eclp/eoclp_npth ldf + /f/fill ldf + /ef/eofill ldf + /@/stroke ldf + /nclp/npth_clp ldf + /gset/graphic_setup ldf + /gcln/graphic_cleanup ldf + /ct/concat ldf + /cf/currentfile ldf + /fl/filter ldf + /rs/readstring ldf + /AGMCORE_def_ht currenthalftone def + /clonedict Adobe_AGM_Utils begin/clonedict load end def + /clonearray Adobe_AGM_Utils begin/clonearray load end def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall + /getrampcolor + { + /indx exch def + 0 1 NumComp 1 sub + { + dup + Samples exch get + dup type/stringtype eq{indx get}if + exch + Scaling exch get aload pop + 3 1 roll + mul add + }for + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /sssetbackground{ + aload pop + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /RadialShade + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /r2 xdf + /c2y xdf + /c2x xdf + /r1 xdf + /c1y xdf + /c1x xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + c1x c2x eq + { + c1y c2y lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope c2y c1y sub c2x c1x sub div def + /theta slope 1 atan def + c2x c1x lt c2y c1y ge and{/theta theta 180 sub def}if + c2x c1x lt c2y c1y lt and{/theta theta 180 add def}if + }ifelse + gsave + clippath + c1x c1y translate + theta rotate + -90 rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax xdf + /xMax xdf + /yMin xdf + /xMin xdf + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + /max{2 copy gt{pop}{exch pop}ifelse}bdf + /min{2 copy lt{pop}{exch pop}ifelse}bdf + rampdict begin + 40 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + c1x c1y translate + theta rotate + -90 rotate + /c2y c1x c2x sub dup mul c1y c2y sub dup mul add sqrt def + /c1y 0 def + /c1x 0 def + /c2x 0 def + ext0 + { + 0 getrampcolor + c2y r2 add r1 sub 0.0001 lt + { + c1x c1y r1 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2y r1 add r2 le + { + c1x c1y r1 0 360 arc + fill + } + { + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r1 neg def + /p1y c1y def + /p2x r1 def + /p2y c1y def + p1x p1y moveto p2x p2y lineto p2x yMin lineto p1x yMin lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r1 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y p1x SS1 div neg def + /SS2 90 theta sub dup sin exch cos div def + /p2x r1 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y p2x SS2 div neg def + r1 r2 gt + { + /L1maxX p1x yMin p1y sub SS1 div add def + /L2maxX p2x yMin p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + c1x c2x sub dup mul + c1y c2y sub dup mul + add 0.5 exp + 0 dtransform + dup mul exch dup mul add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + /hires xdf + hires mul + /numpix xdf + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + /xInc c2x c1x sub numsteps div def + /yInc c2y c1y sub numsteps div def + /rInc r2 r1 sub numsteps div def + /cx c1x def + /cy c1y def + /radius r1 def + np + xInc 0 eq yInc 0 eq rInc 0 eq and and + { + 0 getrampcolor + cx cy radius 0 360 arc + stroke + NumSamples 1 sub getrampcolor + cx cy radius 72 hires div add 0 360 arc + 0 setlinewidth + stroke + }{ + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + cx cy radius 0 360 arc + /cx cx xInc add def + /cy cy yInc add def + /radius radius rInc add def + cx cy radius 360 0 arcn + eofill + rampIndxInc add + }repeat + pop + }ifelse + ext1 + { + c2y r2 add r1 lt + { + c2x c2y r2 0 360 arc + fill + }{ + c2y r1 add r2 sub 0.0001 le + { + c2x c2y r2 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r2 neg def + /p1y c2y def + /p2x r2 def + /p2y c2y def + p1x p1y moveto p2x p2y lineto p2x yMax lineto p1x yMax lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r2 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y c2y p1x SS1 div sub def + /SS2 90 theta sub dup sin exch cos div def + /p2x r2 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y c2y p2x SS2 div sub def + r1 r2 lt + { + /L1maxX p1x yMax p1y sub SS1 div add def + /L2maxX p2x yMax p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + grestore + grestore + end + end + end + }ifelse + }bdf + /GenStrips + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /y2 xdf + /x2 xdf + /y1 xdf + /x1 xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + x1 x2 eq + { + y1 y2 lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope y2 y1 sub x2 x1 sub div def + /theta slope 1 atan def + x2 x1 lt y2 y1 ge and{/theta theta 180 sub def}if + x2 x1 lt y2 y1 lt and{/theta theta 180 add def}if + } + ifelse + gsave + clippath + x1 y1 translate + theta rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax exch def + /xMax exch def + /yMin exch def + /xMin exch def + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + rampdict begin + 20 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + x1 y1 translate + theta rotate + /xStart 0 def + /xEnd x2 x1 sub dup mul y2 y1 sub dup mul add 0.5 exp def + /ySpan yMax yMin sub def + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + xStart 0 transform + xEnd 0 transform + 3 -1 roll + sub dup mul + 3 1 roll + sub dup mul + add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + mul + /numpix xdf + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + ext0 + { + 0 getrampcolor + xMin xStart lt + { + xMin yMin xMin neg ySpan rectfill + }if + }if + /xInc xEnd xStart sub numsteps div def + /x xStart def + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + x yMin xInc ySpan rectfill + /x x xInc add def + rampIndxInc add + }repeat + pop + ext1{ + xMax xEnd gt + { + xEnd yMin xMax xEnd sub ySpan rectfill + }if + }if + grestore + grestore + end + end + end + }ifelse + }bdf +}def +/pt +{ + end +}def +/dt{ +}def +/pgsv{ + //Adobe_AGM_Core/AGMCORE_save save put +}def +/pgrs{ + //Adobe_AGM_Core/AGMCORE_save get restore +}def +systemdict/findcolorrendering known{ + /findcolorrendering systemdict/findcolorrendering get def +}if +systemdict/setcolorrendering known{ + /setcolorrendering systemdict/setcolorrendering get def +}if +/test_cmyk_color_plate +{ + gsave + setcmykcolor currentgray 1 ne + grestore +}def +/inRip_spot_has_ink +{ + dup//Adobe_AGM_Core/AGMCORE_name xddf + convert_spot_to_process not +}def +/map255_to_range +{ + 1 index sub + 3 -1 roll 255 div mul add +}def +/set_csa_crd +{ + /sep_colorspace_dict null AGMCORE_gput + begin + CSA get_csa_by_name setcolorspace_opt + set_crd + end +} +def +/map_csa +{ + currentdict/MappedCSA known{MappedCSA null ne}{false}ifelse + {pop}{get_csa_by_name/MappedCSA xdf}ifelse +}def +/setsepcolor +{ + /sep_colorspace_dict AGMCORE_gget begin + dup/sep_tint exch AGMCORE_gput + TintProc + end +}def +/setdevicencolor +{ + /devicen_colorspace_dict AGMCORE_gget begin + Names length copy + Names length 1 sub -1 0 + { + /devicen_tints AGMCORE_gget 3 1 roll xpt + }for + TintProc + end +}def +/sep_colorspace_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + currentdict/Components known{ + Components aload pop + TintMethod/Lab eq{ + 2{AGMCORE_tmp mul NComponents 1 roll}repeat + LMax sub AGMCORE_tmp mul LMax add NComponents 1 roll + }{ + TintMethod/Subtractive eq{ + NComponents{ + AGMCORE_tmp mul NComponents 1 roll + }repeat + }{ + NComponents{ + 1 sub AGMCORE_tmp mul 1 add NComponents 1 roll + }repeat + }ifelse + }ifelse + }{ + ColorLookup AGMCORE_tmp ColorLookup length 1 sub mul round cvi get + aload pop + }ifelse + end +}def +/sep_colorspace_gray_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + GrayLookup AGMCORE_tmp GrayLookup length 1 sub mul round cvi get + end +}def +/sep_proc_name +{ + dup 0 get + dup/DeviceRGB eq exch/DeviceCMYK eq or level2 not and has_color not and{ + pop[/DeviceGray] + /sep_colorspace_gray_proc + }{ + /sep_colorspace_proc + }ifelse +}def +/setsepcolorspace +{ + current_spot_alias{ + dup begin + Name map_alias{ + exch pop + }if + end + }if + dup/sep_colorspace_dict exch AGMCORE_gput + begin + CSA map_csa + /AGMCORE_sep_special Name dup()eq exch(All)eq or store + AGMCORE_avoid_L2_sep_space{ + [/Indexed MappedCSA sep_proc_name 255 exch + {255 div}/exec cvx 3 -1 roll[4 1 roll load/exec cvx]cvx + ]setcolorspace_opt + /TintProc{ + 255 mul round cvi setcolor + }bdf + }{ + MappedCSA 0 get/DeviceCMYK eq + currentdict/Components known and + AGMCORE_sep_special not and{ + /TintProc[ + Components aload pop Name findcmykcustomcolor + /exch cvx/setcustomcolor cvx + ]cvx bdf + }{ + AGMCORE_host_sep Name(All)eq and{ + /TintProc{ + 1 exch sub setseparationgray + }bdf + }{ + AGMCORE_in_rip_sep MappedCSA 0 get/DeviceCMYK eq and + AGMCORE_host_sep or + Name()eq and{ + /TintProc[ + MappedCSA sep_proc_name exch 0 get/DeviceCMYK eq{ + cvx/setcmykcolor cvx + }{ + cvx/setgray cvx + }ifelse + ]cvx bdf + }{ + AGMCORE_producing_seps MappedCSA 0 get dup/DeviceCMYK eq exch/DeviceGray eq or and AGMCORE_sep_special not and{ + /TintProc[ + /dup cvx + MappedCSA sep_proc_name cvx exch + 0 get/DeviceGray eq{ + 1/exch cvx/sub cvx 0 0 0 4 -1/roll cvx + }if + /Name cvx/findcmykcustomcolor cvx/exch cvx + AGMCORE_host_sep{ + AGMCORE_is_cmyk_sep + /Name cvx + /AGMCORE_IsSeparationAProcessColor load/exec cvx + /not cvx/and cvx + }{ + Name inRip_spot_has_ink not + }ifelse + [ + /pop cvx 1 + ]cvx/if cvx + /setcustomcolor cvx + ]cvx bdf + }{ + /TintProc{setcolor}bdf + [/Separation Name MappedCSA sep_proc_name load]setcolorspace_opt + }ifelse + }ifelse + }ifelse + }ifelse + }ifelse + set_crd + setsepcolor + end +}def +/additive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 + 0 1 numarrays 1 sub + { + 1 exch add/index cvx + c1/get cvx/mul cvx + }for + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/subtractive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 1 + 0 1 numarrays 1 sub + { + 1 3 3 -1 roll add/index cvx + c1/get cvx/sub cvx/mul cvx + }for + /sub cvx + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/exec_tint_transform +{ + /TintProc[ + /TintTransform cvx/setcolor cvx + ]cvx bdf + MappedCSA setcolorspace_opt +}bdf +/devn_makecustomcolor +{ + 2 dict begin + /names_index xdf + /Names xdf + 1 1 1 1 Names names_index get findcmykcustomcolor + /devicen_tints AGMCORE_gget names_index get setcustomcolor + Names length{pop}repeat + end +}bdf +/setdevicencolorspace +{ + dup/AliasedColorants known{false}{true}ifelse + current_spot_alias and{ + 7 dict begin + /names_index 0 def + dup/names_len exch/Names get length def + /new_names names_len array def + /new_LookupTables names_len array def + /alias_cnt 0 def + dup/Names get + { + dup map_alias{ + exch pop + dup/ColorLookup known{ + dup begin + new_LookupTables names_index ColorLookup put + end + }{ + dup/Components known{ + dup begin + new_LookupTables names_index Components put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + new_names names_index 3 -1 roll/Name get put + /alias_cnt alias_cnt 1 add def + }{ + /name xdf + new_names names_index name put + dup/LookupTables known{ + dup begin + new_LookupTables names_index LookupTables names_index get put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + /names_index names_index 1 add def + }forall + alias_cnt 0 gt{ + /AliasedColorants true def + /lut_entry_len new_LookupTables 0 get dup length 256 ge{0 get length}{length}ifelse def + 0 1 names_len 1 sub{ + /names_index xdf + new_LookupTables names_index get dup length 256 ge{0 get length}{length}ifelse lut_entry_len ne{ + /AliasedColorants false def + exit + }{ + new_LookupTables names_index get 0 get null eq{ + dup/Names get names_index get/name xdf + name(Cyan)eq name(Magenta)eq name(Yellow)eq name(Black)eq + or or or not{ + /AliasedColorants false def + exit + }if + }if + }ifelse + }for + lut_entry_len 1 eq{ + /AliasedColorants false def + }if + AliasedColorants{ + dup begin + /Names new_names def + /LookupTables new_LookupTables def + /AliasedColorants true def + /NComponents lut_entry_len def + /TintMethod NComponents 4 eq{/Subtractive}{/Additive}ifelse def + /MappedCSA TintMethod/Additive eq{/DeviceRGB}{/DeviceCMYK}ifelse def + currentdict/TTTablesIdx known not{ + /TTTablesIdx -1 def + }if + end + }if + }if + end + }if + dup/devicen_colorspace_dict exch AGMCORE_gput + begin + currentdict/AliasedColorants known{ + AliasedColorants + }{ + false + }ifelse + dup not{ + CSA map_csa + }if + /TintTransform load type/nulltype eq or{ + /TintTransform[ + 0 1 Names length 1 sub + { + /TTTablesIdx TTTablesIdx 1 add def + dup LookupTables exch get dup 0 get null eq + { + 1 index + Names exch get + dup(Cyan)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0 0 0 + } + { + dup(Magenta)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0/exch cvx 0 0 + }{ + (Yellow)eq + { + exch + LookupTables length exch sub + /index cvx + 0 0 3 -1/roll cvx 0 + }{ + exch + LookupTables length exch sub + /index cvx + 0 0 0 4 -1/roll cvx + }ifelse + }ifelse + }ifelse + 5 -1/roll cvx/astore cvx + }{ + dup length 1 sub + LookupTables length 4 -1 roll sub 1 add + /index cvx/mul cvx/round cvx/cvi cvx/get cvx + }ifelse + Names length TTTablesIdx add 1 add 1/roll cvx + }for + Names length[/pop cvx]cvx/repeat cvx + NComponents Names length + TintMethod/Subtractive eq + { + subtractive_blend + }{ + additive_blend + }ifelse + ]cvx bdf + }if + AGMCORE_host_sep{ + Names convert_to_process{ + exec_tint_transform + } + { + currentdict/AliasedColorants known{ + AliasedColorants not + }{ + false + }ifelse + 5 dict begin + /AvoidAliasedColorants xdf + /painted? false def + /names_index 0 def + /names_len Names length def + AvoidAliasedColorants{ + /currentspotalias current_spot_alias def + false set_spot_alias + }if + Names{ + AGMCORE_is_cmyk_sep{ + dup(Cyan)eq AGMCORE_cyan_plate and exch + dup(Magenta)eq AGMCORE_magenta_plate and exch + dup(Yellow)eq AGMCORE_yellow_plate and exch + (Black)eq AGMCORE_black_plate and or or or{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + }if + painted?{exit}if + }{ + 0 0 0 0 5 -1 roll findcmykcustomcolor 1 setcustomcolor currentgray 0 eq{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + exit + }if + }ifelse + /names_index names_index 1 add def + }forall + AvoidAliasedColorants{ + currentspotalias set_spot_alias + }if + painted?{ + /devicen_colorspace_dict AGMCORE_gget/names_index names_index put + }{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + names_len[/pop cvx]cvx/repeat cvx 1/setseparationgray cvx + 0 0 0 0/setcmykcolor cvx + ]cvx ddf + }ifelse + end + }ifelse + } + { + AGMCORE_in_rip_sep{ + Names convert_to_process not + }{ + level3 + }ifelse + { + [/DeviceN Names MappedCSA/TintTransform load]setcolorspace_opt + /TintProc level3 not AGMCORE_in_rip_sep and{ + [ + Names/length cvx[/pop cvx]cvx/repeat cvx + ]cvx bdf + }{ + {setcolor}bdf + }ifelse + }{ + exec_tint_transform + }ifelse + }ifelse + set_crd + /AliasedColorants false def + end +}def +/setindexedcolorspace +{ + dup/indexed_colorspace_dict exch AGMCORE_gput + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + currentdict devncs + }{ + 1 currentdict sepcs + }ifelse + AGMCORE_host_sep{ + 4 dict begin + /compCnt/Names where{pop Names length}{1}ifelse def + /NewLookup HiVal 1 add string def + 0 1 HiVal{ + /tableIndex xdf + Lookup dup type/stringtype eq{ + compCnt tableIndex map_index + }{ + exec + }ifelse + /Names where{ + pop setdevicencolor + }{ + setsepcolor + }ifelse + currentgray + tableIndex exch + 255 mul cvi + NewLookup 3 1 roll put + }for + [/Indexed currentcolorspace HiVal NewLookup]setcolorspace_opt + end + }{ + level3 + { + currentdict/Names known{ + [/Indexed[/DeviceN Names MappedCSA/TintTransform load]HiVal Lookup]setcolorspace_opt + }{ + [/Indexed[/Separation Name MappedCSA sep_proc_name load]HiVal Lookup]setcolorspace_opt + }ifelse + }{ + [/Indexed MappedCSA HiVal + [ + currentdict/Names known{ + Lookup dup type/stringtype eq + {/exch cvx CSDBase/CSD get_res/Names get length dup/mul cvx exch/getinterval cvx{255 div}/forall cvx} + {/exec cvx}ifelse + /TintTransform load/exec cvx + }{ + Lookup dup type/stringtype eq + {/exch cvx/get cvx 255/div cvx} + {/exec cvx}ifelse + CSDBase/CSD get_res/MappedCSA get sep_proc_name exch pop/load cvx/exec cvx + }ifelse + ]cvx + ]setcolorspace_opt + }ifelse + }ifelse + end + set_crd + } + { + CSA map_csa + AGMCORE_host_sep level2 not and{ + 0 0 0 0 setcmykcolor + }{ + [/Indexed MappedCSA + level2 not has_color not and{ + dup 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or{ + pop[/DeviceGray] + }if + HiVal GrayLookup + }{ + HiVal + currentdict/RangeArray known{ + { + /indexed_colorspace_dict AGMCORE_gget begin + Lookup exch + dup HiVal gt{ + pop HiVal + }if + NComponents mul NComponents getinterval{}forall + NComponents 1 sub -1 0{ + RangeArray exch 2 mul 2 getinterval aload pop map255_to_range + NComponents 1 roll + }for + end + }bind + }{ + Lookup + }ifelse + }ifelse + ]setcolorspace_opt + set_crd + }ifelse + }ifelse + end +}def +/setindexedcolor +{ + AGMCORE_host_sep{ + /indexed_colorspace_dict AGMCORE_gget + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + map_indexed_devn + devn + } + { + Lookup 1 3 -1 roll map_index + sep + }ifelse + end + }{ + Lookup MappedCSA/DeviceCMYK eq{4}{1}ifelse 3 -1 roll + map_index + MappedCSA/DeviceCMYK eq{setcmykcolor}{setgray}ifelse + }ifelse + end + }{ + level3 not AGMCORE_in_rip_sep and/indexed_colorspace_dict AGMCORE_gget/CSDBase known and{ + /indexed_colorspace_dict AGMCORE_gget/CSDBase get/CSD get_res begin + map_indexed_devn + devn + end + } + { + setcolor + }ifelse + }ifelse +}def +/ignoreimagedata +{ + currentoverprint not{ + gsave + dup clonedict begin + 1 setgray + /Decode[0 1]def + /DataSourcedef + /MultipleDataSources false def + /BitsPerComponent 8 def + currentdict end + systemdict/image gx + grestore + }if + consumeimagedata +}def +/add_res +{ + dup/CSD eq{ + pop + //Adobe_AGM_Core begin + /AGMCORE_CSD_cache load 3 1 roll put + end + }{ + defineresource pop + }ifelse +}def +/del_res +{ + { + aload pop exch + dup/CSD eq{ + pop + {//Adobe_AGM_Core/AGMCORE_CSD_cache get exch undef}forall + }{ + exch + {1 index undefineresource}forall + pop + }ifelse + }forall +}def +/get_res +{ + dup/CSD eq{ + pop + dup type dup/nametype eq exch/stringtype eq or{ + AGMCORE_CSD_cache exch get + }if + }{ + findresource + }ifelse +}def +/get_csa_by_name +{ + dup type dup/nametype eq exch/stringtype eq or{ + /CSA get_res + }if +}def +/paintproc_buf_init +{ + /count get 0 0 put +}def +/paintproc_buf_next +{ + dup/count get dup 0 get + dup 3 1 roll + 1 add 0 xpt + get +}def +/cachepaintproc_compress +{ + 5 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + /string_size 16000 def + /readbuffer string_size string def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + /LZWFilter + { + exch + dup length 0 eq{ + pop + }{ + ppdict dup length 1 sub 3 -1 roll put + }ifelse + {string_size}{0}ifelse string + }/LZWEncode filter def + { + ReadFilter readbuffer readstring + exch LZWFilter exch writestring + not{exit}if + }loop + LZWFilter closefile + ppdict + end +}def +/cachepaintproc +{ + 2 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + { + ReadFilter 16000 string readstring exch + ppdict dup length 1 sub 3 -1 roll put + not{exit}if + }loop + ppdict dup dup length 1 sub()put + end +}def +/make_pattern +{ + exch clonedict exch + dup matrix currentmatrix matrix concatmatrix 0 0 3 2 roll itransform + exch 3 index/XStep get 1 index exch 2 copy div cvi mul sub sub + exch 3 index/YStep get 1 index exch 2 copy div cvi mul sub sub + matrix translate exch matrix concatmatrix + 1 index begin + BBox 0 get XStep div cvi XStep mul/xshift exch neg def + BBox 1 get YStep div cvi YStep mul/yshift exch neg def + BBox 0 get xshift add + BBox 1 get yshift add + BBox 2 get xshift add + BBox 3 get yshift add + 4 array astore + /BBox exch def + [xshift yshift/translate load null/exec load]dup + 3/PaintProc load put cvx/PaintProc exch def + end + gsave 0 setgray + makepattern + grestore +}def +/set_pattern +{ + dup/PatternType get 1 eq{ + dup/PaintType get 1 eq{ + currentoverprint sop[/DeviceGray]setcolorspace 0 setgray + }if + }if + setpattern +}def +/setcolorspace_opt +{ + dup currentcolorspace eq{pop}{setcolorspace}ifelse +}def +/updatecolorrendering +{ + currentcolorrendering/RenderingIntent known{ + currentcolorrendering/RenderingIntent get + } + { + Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/Saturation eq + { + /saturation_crd AGMCORE_gget dup null eq + } + { + /perceptual_crd AGMCORE_gget dup null eq + }ifelse + }ifelse + }ifelse + { + pop null + } + { + /RenderingIntent known{null}{Intent}ifelse + }ifelse + }ifelse + Intent ne{ + Intent/ColorRendering{findresource}stopped + { + pop pop systemdict/findcolorrendering known + { + Intent findcolorrendering + { + /ColorRendering findresource true exch + } + { + /ColorRendering findresource + product(Xerox Phaser 5400)ne + exch + }ifelse + dup Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd exch AGMCORE_gput + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd exch AGMCORE_gput + } + { + Intent/Saturation eq + { + /saturation_crd exch AGMCORE_gput + } + { + Intent/Perceptual eq + { + /perceptual_crd exch AGMCORE_gput + } + { + pop + }ifelse + }ifelse + }ifelse + }ifelse + 1 index{exch}{pop}ifelse + } + {false}ifelse + } + {true}ifelse + { + dup begin + currentdict/TransformPQR known{ + currentdict/TransformPQR get aload pop + 3{{}eq 3 1 roll}repeat or or + } + {true}ifelse + currentdict/MatrixPQR known{ + currentdict/MatrixPQR get aload pop + 1.0 eq 9 1 roll 0.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 1.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 0.0 eq 9 1 roll 1.0 eq + and and and and and and and and + } + {true}ifelse + end + or + { + clonedict begin + /TransformPQR[ + {4 -1 roll 3 get dup 3 1 roll sub 5 -1 roll 3 get 3 -1 roll sub div + 3 -1 roll 3 get 3 -1 roll 3 get dup 4 1 roll sub mul add}bind + {4 -1 roll 4 get dup 3 1 roll sub 5 -1 roll 4 get 3 -1 roll sub div + 3 -1 roll 4 get 3 -1 roll 4 get dup 4 1 roll sub mul add}bind + {4 -1 roll 5 get dup 3 1 roll sub 5 -1 roll 5 get 3 -1 roll sub div + 3 -1 roll 5 get 3 -1 roll 5 get dup 4 1 roll sub mul add}bind + ]def + /MatrixPQR[0.8951 -0.7502 0.0389 0.2664 1.7135 -0.0685 -0.1614 0.0367 1.0296]def + /RangePQR[-0.3227950745 2.3229645538 -1.5003771057 3.5003465881 -0.1369979095 2.136967392]def + currentdict end + }if + setcolorrendering_opt + }if + }if +}def +/set_crd +{ + AGMCORE_host_sep not level2 and{ + currentdict/ColorRendering known{ + ColorRendering/ColorRendering{findresource}stopped not{setcolorrendering_opt}if + }{ + currentdict/Intent known{ + updatecolorrendering + }if + }ifelse + currentcolorspace dup type/arraytype eq + {0 get}if + /DeviceRGB eq + { + currentdict/UCR known + {/UCR}{/AGMCORE_currentucr}ifelse + load setundercolorremoval + currentdict/BG known + {/BG}{/AGMCORE_currentbg}ifelse + load setblackgeneration + }if + }if +}def +/set_ucrbg +{ + dup null eq {pop /AGMCORE_currentbg load}{/Procedure get_res}ifelse + dup currentblackgeneration eq {pop}{setblackgeneration}ifelse + dup null eq {pop /AGMCORE_currentucr load}{/Procedure get_res}ifelse + dup currentundercolorremoval eq {pop}{setundercolorremoval}ifelse +}def +/setcolorrendering_opt +{ + dup currentcolorrendering eq{ + pop + }{ + product(HP Color LaserJet 2605)anchorsearch{ + pop pop pop + }{ + pop + clonedict + begin + /Intent Intent def + currentdict + end + setcolorrendering + }ifelse + }ifelse +}def +/cpaint_gcomp +{ + convert_to_process//Adobe_AGM_Core/AGMCORE_ConvertToProcess xddf + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get not + { + (%end_cpaint_gcomp)flushinput + }if +}def +/cpaint_gsep +{ + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get + { + (%end_cpaint_gsep)flushinput + }if +}def +/cpaint_gend +{np}def +/T1_path +{ + currentfile token pop currentfile token pop mo + { + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 exch rlineto + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 rlineto + }loop +}def +/T1_gsave + level3 + {/clipsave} + {/gsave}ifelse + load def +/T1_grestore + level3 + {/cliprestore} + {/grestore}ifelse + load def +/set_spot_alias_ary +{ + dup inherit_aliases + //Adobe_AGM_Core/AGMCORE_SpotAliasAry xddf +}def +/set_spot_normalization_ary +{ + dup inherit_aliases + dup length + /AGMCORE_SpotAliasAry where{pop AGMCORE_SpotAliasAry length add}if + array + //Adobe_AGM_Core/AGMCORE_SpotAliasAry2 xddf + /AGMCORE_SpotAliasAry where{ + pop + AGMCORE_SpotAliasAry2 0 AGMCORE_SpotAliasAry putinterval + AGMCORE_SpotAliasAry length + }{0}ifelse + AGMCORE_SpotAliasAry2 3 1 roll exch putinterval + true set_spot_alias +}def +/inherit_aliases +{ + {dup/Name get map_alias{/CSD put}{pop}ifelse}forall +}def +/set_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias 3 -1 roll put + }{ + pop + }ifelse +}def +/current_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias get + }{ + false + }ifelse +}def +/map_alias +{ + /AGMCORE_SpotAliasAry2 where{ + begin + /AGMCORE_name xdf + false + AGMCORE_SpotAliasAry2{ + dup/Name get AGMCORE_name eq{ + /CSD get/CSD get_res + exch pop true + exit + }{ + pop + }ifelse + }forall + end + }{ + pop false + }ifelse +}bdf +/spot_alias +{ + true set_spot_alias + /AGMCORE_&setcustomcolor AGMCORE_key_known not{ + //Adobe_AGM_Core/AGMCORE_&setcustomcolor/setcustomcolor load put + }if + /customcolor_tint 1 AGMCORE_gput + //Adobe_AGM_Core begin + /setcustomcolor + { + //Adobe_AGM_Core begin + dup/customcolor_tint exch AGMCORE_gput + 1 index aload pop pop 1 eq exch 1 eq and exch 1 eq and exch 1 eq and not + current_spot_alias and{1 index 4 get map_alias}{false}ifelse + { + false set_spot_alias + /sep_colorspace_dict AGMCORE_gget null ne + {/sep_colorspace_dict AGMCORE_gget/ForeignContent known not}{false}ifelse + 3 1 roll 2 index{ + exch pop/sep_tint AGMCORE_gget exch + }if + mark 3 1 roll + setsepcolorspace + counttomark 0 ne{ + setsepcolor + }if + pop + not{/sep_tint 1.0 AGMCORE_gput/sep_colorspace_dict AGMCORE_gget/ForeignContent true put}if + pop + true set_spot_alias + }{ + AGMCORE_&setcustomcolor + }ifelse + end + }bdf + end +}def +/begin_feature +{ + Adobe_AGM_Core/AGMCORE_feature_dictCount countdictstack put + count Adobe_AGM_Core/AGMCORE_feature_opCount 3 -1 roll put + {Adobe_AGM_Core/AGMCORE_feature_ctm matrix currentmatrix put}if +}def +/end_feature +{ + 2 dict begin + /spd/setpagedevice load def + /setpagedevice{get_gstate spd set_gstate}def + stopped{$error/newerror false put}if + end + count Adobe_AGM_Core/AGMCORE_feature_opCount get sub dup 0 gt{{pop}repeat}{pop}ifelse + countdictstack Adobe_AGM_Core/AGMCORE_feature_dictCount get sub dup 0 gt{{end}repeat}{pop}ifelse + {Adobe_AGM_Core/AGMCORE_feature_ctm get setmatrix}if +}def +/set_negative +{ + //Adobe_AGM_Core begin + /AGMCORE_inverting exch def + level2{ + currentpagedevice/NegativePrint known AGMCORE_distilling not and{ + currentpagedevice/NegativePrint get//Adobe_AGM_Core/AGMCORE_inverting get ne{ + true begin_feature true{ + <>setpagedevice + }end_feature + }if + /AGMCORE_inverting false def + }if + }if + AGMCORE_inverting{ + [{1 exch sub}/exec load dup currenttransfer exch]cvx bind settransfer + AGMCORE_distilling{ + erasepage + }{ + gsave np clippath 1/setseparationgray where{pop setseparationgray}{setgray}ifelse + /AGMIRS_&fill where{pop AGMIRS_&fill}{fill}ifelse grestore + }ifelse + }if + end +}def +/lw_save_restore_override{ + /md where{ + pop + md begin + initializepage + /initializepage{}def + /pmSVsetup{}def + /endp{}def + /pse{}def + /psb{}def + /orig_showpage where + {pop} + {/orig_showpage/showpage load def} + ifelse + /showpage{orig_showpage gR}def + end + }if +}def +/pscript_showpage_override{ + /NTPSOct95 where + { + begin + showpage + save + /showpage/restore load def + /restore{exch pop}def + end + }if +}def +/driver_media_override +{ + /md where{ + pop + md/initializepage known{ + md/initializepage{}put + }if + md/rC known{ + md/rC{4{pop}repeat}put + }if + }if + /mysetup where{ + /mysetup[1 0 0 1 0 0]put + }if + Adobe_AGM_Core/AGMCORE_Default_CTM matrix currentmatrix put + level2 + {Adobe_AGM_Core/AGMCORE_Default_PageSize currentpagedevice/PageSize get put}if +}def +/capture_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup Pscript_Win_Data/mysetup get put + }if + }if +}def +/restore_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup known{ + Pscript_Win_Data/mysetup Adobe_AGM_Core/save_mysetup get put + Adobe_AGM_Core/save_mysetup undef + }if + }if + }if +}def +/driver_check_media_override +{ + /PrepsDict where + {pop} + { + Adobe_AGM_Core/AGMCORE_Default_CTM get matrix currentmatrix ne + Adobe_AGM_Core/AGMCORE_Default_PageSize get type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_Default_PageSize get 0 get currentpagedevice/PageSize get 0 get eq and + Adobe_AGM_Core/AGMCORE_Default_PageSize get 1 get currentpagedevice/PageSize get 1 get eq and + }if + { + Adobe_AGM_Core/AGMCORE_Default_CTM get setmatrix + }if + }ifelse +}def +AGMCORE_err_strings begin + /AGMCORE_bad_environ(Environment not satisfactory for this job. Ensure that the PPD is correct or that the PostScript level requested is supported by this printer. )def + /AGMCORE_color_space_onhost_seps(This job contains colors that will not separate with on-host methods. )def + /AGMCORE_invalid_color_space(This job contains an invalid color space. )def +end +/set_def_ht +{AGMCORE_def_ht sethalftone}def +/set_def_flat +{AGMCORE_Default_flatness setflat}def +end +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_CoolType_Core 2.31 0 +%%Copyright: Copyright 1997-2006 Adobe Systems Incorporated. All Rights Reserved. +%%Version: 2.31 0 +10 dict begin +/Adobe_CoolType_Passthru currentdict def +/Adobe_CoolType_Core_Defined userdict/Adobe_CoolType_Core known def +Adobe_CoolType_Core_Defined + {/Adobe_CoolType_Core userdict/Adobe_CoolType_Core get def} +if +userdict/Adobe_CoolType_Core 70 dict dup begin put +/Adobe_CoolType_Version 2.31 def +/Level2? + systemdict/languagelevel known dup + {pop systemdict/languagelevel get 2 ge} + if def +Level2? not + { + /currentglobal false def + /setglobal/pop load def + /gcheck{pop false}bind def + /currentpacking false def + /setpacking/pop load def + /SharedFontDirectory 0 dict def + } +if +currentpacking +true setpacking +currentglobal false setglobal +userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} +if +get + begin + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + end +setglobal +currentglobal true setglobal +userdict/Adobe_CoolType_GVMFonts known not + {userdict/Adobe_CoolType_GVMFonts 10 dict put} +if +setglobal +currentglobal false setglobal +userdict/Adobe_CoolType_LVMFonts known not + {userdict/Adobe_CoolType_LVMFonts 10 dict put} +if +setglobal +/ct_VMDictPut + { + dup gcheck{Adobe_CoolType_GVMFonts}{Adobe_CoolType_LVMFonts}ifelse + 3 1 roll put + }bind def +/ct_VMDictUndef + { + dup Adobe_CoolType_GVMFonts exch known + {Adobe_CoolType_GVMFonts exch undef} + { + dup Adobe_CoolType_LVMFonts exch known + {Adobe_CoolType_LVMFonts exch undef} + {pop} + ifelse + }ifelse + }bind def +/ct_str1 1 string def +/ct_xshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_yshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 exch + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_xyshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + {_ct_na _ct_i 1 add get}stopped + {pop pop pop} + { + _ct_x _ct_y moveto + rmoveto + } + ifelse + } + ifelse + /_ct_i _ct_i 2 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/xsh{{@xshow}stopped{Adobe_CoolType_Data begin ct_xshow end}if}bind def +/ysh{{@yshow}stopped{Adobe_CoolType_Data begin ct_yshow end}if}bind def +/xysh{{@xyshow}stopped{Adobe_CoolType_Data begin ct_xyshow end}if}bind def +currentglobal true setglobal +/ct_T3Defs +{ +/BuildChar +{ + 1 index/Encoding get exch get + 1 index/BuildGlyph get exec +}bind def +/BuildGlyph +{ + exch begin + GlyphProcs exch get exec + end +}bind def +}bind def +setglobal +/@_SaveStackLevels + { + Adobe_CoolType_Data + begin + /@vmState currentglobal def false setglobal + @opStackCountByLevel + @opStackLevel + 2 copy known not + { + 2 copy + 3 dict dup/args + 7 index + 5 add array put + put get + } + { + get dup/args get dup length 3 index lt + { + dup length 5 add array exch + 1 index exch 0 exch putinterval + 1 index exch/args exch put + } + {pop} + ifelse + } + ifelse + begin + count 1 sub + 1 index lt + {pop count} + if + dup/argCount exch def + dup 0 gt + { + args exch 0 exch getinterval + astore pop + } + {pop} + ifelse + count + /restCount exch def + end + /@opStackLevel @opStackLevel 1 add def + countdictstack 1 sub + @dictStackCountByLevel exch @dictStackLevel exch put + /@dictStackLevel @dictStackLevel 1 add def + @vmState setglobal + end + }bind def +/@_RestoreStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + @opStackCountByLevel @opStackLevel get + begin + count restCount sub dup 0 gt + {{pop}repeat} + {pop} + ifelse + args 0 argCount getinterval{}forall + end + /@dictStackLevel @dictStackLevel 1 sub def + @dictStackCountByLevel @dictStackLevel get + end + countdictstack exch sub dup 0 gt + {{end}repeat} + {pop} + ifelse + }bind def +/@_PopStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + /@dictStackLevel @dictStackLevel 1 sub def + end + }bind def +/@Raise + { + exch cvx exch errordict exch get exec + stop + }bind def +/@ReRaise + { + cvx $error/errorname get errordict exch get exec + stop + }bind def +/@Stopped + { + 0 @#Stopped + }bind def +/@#Stopped + { + @_SaveStackLevels + stopped + {@_RestoreStackLevels true} + {@_PopStackLevels false} + ifelse + }bind def +/@Arg + { + Adobe_CoolType_Data + begin + @opStackCountByLevel @opStackLevel 1 sub get + begin + args exch + argCount 1 sub exch sub get + end + end + }bind def +currentglobal true setglobal +/CTHasResourceForAllBug + Level2? + { + 1 dict dup + /@shouldNotDisappearDictValue true def + Adobe_CoolType_Data exch/@shouldNotDisappearDict exch put + begin + count @_SaveStackLevels + {(*){pop stop}128 string/Category resourceforall} + stopped pop + @_RestoreStackLevels + currentdict Adobe_CoolType_Data/@shouldNotDisappearDict get dup 3 1 roll ne dup 3 1 roll + { + /@shouldNotDisappearDictValue known + { + { + end + currentdict 1 index eq + {pop exit} + if + } + loop + } + if + } + { + pop + end + } + ifelse + } + {false} + ifelse + def +true setglobal +/CTHasResourceStatusBug + Level2? + { + mark + {/steveamerige/Category resourcestatus} + stopped + {cleartomark true} + {cleartomark currentglobal not} + ifelse + } + {false} + ifelse + def +setglobal +/CTResourceStatus + { + mark 3 1 roll + /Category findresource + begin + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + end + }bind def +/CTWorkAroundBugs + { + Level2? + { + /cid_PreLoad/ProcSet resourcestatus + { + pop pop + currentglobal + mark + { + (*) + { + dup/CMap CTHasResourceStatusBug + {CTResourceStatus} + {resourcestatus} + ifelse + { + pop dup 0 eq exch 1 eq or + { + dup/CMap findresource gcheck setglobal + /CMap undefineresource + } + { + pop CTHasResourceForAllBug + {exit} + {stop} + ifelse + } + ifelse + } + {pop} + ifelse + } + 128 string/CMap resourceforall + } + stopped + {cleartomark} + stopped pop + setglobal + } + if + } + if + }bind def +/ds + { + Adobe_CoolType_Core + begin + CTWorkAroundBugs + /mo/moveto load def + /nf/newencodedfont load def + /msf{makefont setfont}bind def + /uf{dup undefinefont ct_VMDictUndef}bind def + /ur/undefineresource load def + /chp/charpath load def + /awsh/awidthshow load def + /wsh/widthshow load def + /ash/ashow load def + /@xshow/xshow load def + /@yshow/yshow load def + /@xyshow/xyshow load def + /@cshow/cshow load def + /sh/show load def + /rp/repeat load def + /.n/.notdef def + end + currentglobal false setglobal + userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} + if + get + begin + /AddWidths? false def + /CC 0 def + /charcode 2 string def + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + /InVMFontsByCMap 10 dict def + /InVMDeepCopiedFonts 10 dict def + end + setglobal + }bind def +/dt + { + currentdict Adobe_CoolType_Core eq + {end} + if + }bind def +/ps + { + Adobe_CoolType_Core begin + Adobe_CoolType_GVMFonts begin + Adobe_CoolType_LVMFonts begin + SharedFontDirectory begin + }bind def +/pt + { + end + end + end + end + }bind def +/unload + { + systemdict/languagelevel known + { + systemdict/languagelevel get 2 ge + { + userdict/Adobe_CoolType_Core 2 copy known + {undef} + {pop pop} + ifelse + } + if + } + if + }bind def +/ndf + { + 1 index where + {pop pop pop} + {dup xcheck{bind}if def} + ifelse + }def +/findfont systemdict + begin + userdict + begin + /globaldict where{/globaldict get begin}if + dup where pop exch get + /globaldict where{pop end}if + end + end +Adobe_CoolType_Core_Defined + {/systemfindfont exch def} + { + /findfont 1 index def + /systemfindfont exch def + } +ifelse +/undefinefont + {pop}ndf +/copyfont + { + currentglobal 3 1 roll + 1 index gcheck setglobal + dup null eq{0}{dup length}ifelse + 2 index length add 1 add dict + begin + exch + { + 1 index/FID eq + {pop pop} + {def} + ifelse + } + forall + dup null eq + {pop} + {{def}forall} + ifelse + currentdict + end + exch setglobal + }bind def +/copyarray + { + currentglobal exch + dup gcheck setglobal + dup length array copy + exch setglobal + }bind def +/newencodedfont + { + currentglobal + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + { + FontDirectory 3 index known + {FontDirectory 3 index get/FontReferenced known} + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + ifelse + } + ifelse + dup + { + 3 index findfont/FontReferenced get + 2 index dup type/nametype eq + {findfont} + if ne + {pop false} + if + } + if + dup + { + 1 index dup type/nametype eq + {findfont} + if + dup/CharStrings known + { + /CharStrings get length + 4 index findfont/CharStrings get length + ne + { + pop false + } + if + } + {pop} + ifelse + } + if + { + pop + 1 index findfont + /Encoding get exch + 0 1 255 + {2 copy get 3 index 3 1 roll put} + for + pop pop pop + } + { + currentglobal + 4 1 roll + dup type/nametype eq + {findfont} + if + dup gcheck setglobal + dup dup maxlength 2 add dict + begin + exch + { + 1 index/FID ne + 2 index/Encoding ne and + {def} + {pop pop} + ifelse + } + forall + /FontReferenced exch def + /Encoding exch dup length array copy def + /FontName 1 index dup type/stringtype eq{cvn}if def dup + currentdict + end + definefont ct_VMDictPut + setglobal + } + ifelse + }bind def +/SetSubstituteStrategy + { + $SubstituteFont + begin + dup type/dicttype ne + {0 dict} + if + currentdict/$Strategies known + { + exch $Strategies exch + 2 copy known + { + get + 2 copy maxlength exch maxlength add dict + begin + {def}forall + {def}forall + currentdict + dup/$Init known + {dup/$Init get exec} + if + end + /$Strategy exch def + } + {pop pop pop} + ifelse + } + {pop pop} + ifelse + end + }bind def +/scff + { + $SubstituteFont + begin + dup type/stringtype eq + {dup length exch} + {null} + ifelse + /$sname exch def + /$slen exch def + /$inVMIndex + $sname null eq + { + 1 index $str cvs + dup length $slen sub $slen getinterval cvn + } + {$sname} + ifelse def + end + {findfont} + @Stopped + { + dup length 8 add string exch + 1 index 0(BadFont:)putinterval + 1 index exch 8 exch dup length string cvs putinterval cvn + {findfont} + @Stopped + {pop/Courier findfont} + if + } + if + $SubstituteFont + begin + /$sname null def + /$slen 0 def + /$inVMIndex null def + end + }bind def +/isWidthsOnlyFont + { + dup/WidthsOnly known + {pop pop true} + { + dup/FDepVector known + {/FDepVector get{isWidthsOnlyFont dup{exit}if}forall} + { + dup/FDArray known + {/FDArray get{isWidthsOnlyFont dup{exit}if}forall} + {pop} + ifelse + } + ifelse + } + ifelse + }bind def +/ct_StyleDicts 4 dict dup begin + /Adobe-Japan1 4 dict dup begin + Level2? + { + /Serif + /HeiseiMin-W3-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMin-W3} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMin-W3/CIDFont resourcestatus + {pop pop/HeiseiMin-W3} + {/Ryumin-Light} + ifelse + } + {/Ryumin-Light} + ifelse + } + ifelse + def + /SansSerif + /HeiseiKakuGo-W5-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiKakuGo-W5} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiKakuGo-W5/CIDFont resourcestatus + {pop pop/HeiseiKakuGo-W5} + {/GothicBBB-Medium} + ifelse + } + {/GothicBBB-Medium} + ifelse + } + ifelse + def + /HeiseiMaruGo-W4-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMaruGo-W4/CIDFont resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + ifelse + /RoundSansSerif exch def + /Default Serif def + } + { + /Serif/Ryumin-Light def + /SansSerif/GothicBBB-Medium def + { + (fonts/Jun101-Light-83pv-RKSJ-H)status + }stopped + {pop}{ + {pop pop pop pop/Jun101-Light} + {SansSerif} + ifelse + /RoundSansSerif exch def + }ifelse + /Default Serif def + } + ifelse + end + def + /Adobe-Korea1 4 dict dup begin + /Serif/HYSMyeongJo-Medium def + /SansSerif/HYGoThic-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-GB1 4 dict dup begin + /Serif/STSong-Light def + /SansSerif/STHeiti-Regular def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-CNS1 4 dict dup begin + /Serif/MKai-Medium def + /SansSerif/MHei-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def +end +def +Level2?{currentglobal true setglobal}if +/ct_BoldRomanWidthProc + { + stringwidth 1 index 0 ne{exch .03 add exch}if setcharwidth + 0 0 + }bind def +/ct_Type0WidthProc + { + dup stringwidth 0 0 moveto + 2 index true charpath pathbbox + 0 -1 + 7 index 2 div .88 + setcachedevice2 + pop + 0 0 + }bind def +/ct_Type0WMode1WidthProc + { + dup stringwidth + pop 2 div neg -0.88 + 2 copy + moveto + 0 -1 + 5 -1 roll true charpath pathbbox + setcachedevice + }bind def +/cHexEncoding +[/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 +/c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 +/c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 +/c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B +/c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E +/c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 +/c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 +/c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 +/c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA +/cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD +/cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 +/cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 +/cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 +/cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def +/ct_BoldBaseFont + 11 dict begin + /FontType 3 def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /Encoding cHexEncoding def + /_setwidthProc/ct_BoldRomanWidthProc load def + /_bcstr1 1 string def + /BuildChar + { + exch begin + _basefont setfont + _bcstr1 dup 0 4 -1 roll put + dup + _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +systemdict/composefont known +{ +/ct_DefineIdentity-H +{ + /Identity-H/CMap resourcestatus + { + pop pop + } + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse +} +def +/ct_BoldBaseCIDFont + 11 dict begin + /CIDFontType 1 def + /CIDFontName/ct_BoldBaseCIDFont def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /_setwidthProc/ct_Type0WidthProc load def + /_bcstr2 2 string def + /BuildGlyph + { + exch begin + _basefont setfont + _bcstr2 1 2 index 256 mod put + _bcstr2 0 3 -1 roll 256 idiv put + _bcstr2 dup _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +}if +Level2?{setglobal}if +/ct_CopyFont{ + { + 1 index/FID ne 2 index/UniqueID ne and + {def}{pop pop}ifelse + }forall +}bind def +/ct_Type0CopyFont +{ + exch + dup length dict + begin + ct_CopyFont + [ + exch + FDepVector + { + dup/FontType get 0 eq + { + 1 index ct_Type0CopyFont + /_ctType0 exch definefont + } + { + /_ctBaseFont exch + 2 index exec + } + ifelse + exch + } + forall + pop + ] + /FDepVector exch def + currentdict + end +}bind def +/ct_MakeBoldFont +{ + dup/ct_SyntheticBold known + { + dup length 3 add dict begin + ct_CopyFont + /ct_StrokeWidth .03 0 FontMatrix idtransform pop def + /ct_SyntheticBold true def + currentdict + end + definefont + } + { + dup dup length 3 add dict + begin + ct_CopyFont + /PaintType 2 def + /StrokeWidth .03 0 FontMatrix idtransform pop def + /dummybold currentdict + end + definefont + dup/FontType get dup 9 ge exch 11 le and + { + ct_BoldBaseCIDFont + dup length 3 add dict copy begin + dup/CIDSystemInfo get/CIDSystemInfo exch def + ct_DefineIdentity-H + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefont exch def + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefonto exch def + currentdict + end + /CIDFont defineresource + } + { + ct_BoldBaseFont + dup length 3 add dict copy begin + /_basefont exch def + /_basefonto exch def + currentdict + end + definefont + } + ifelse + } + ifelse +}bind def +/ct_MakeBold{ + 1 index + 1 index + findfont + currentglobal 5 1 roll + dup gcheck setglobal + dup + /FontType get 0 eq + { + dup/WMode known{dup/WMode get 1 eq}{false}ifelse + version length 4 ge + and + {version 0 4 getinterval cvi 2015 ge} + {true} + ifelse + {/ct_Type0WidthProc} + {/ct_Type0WMode1WidthProc} + ifelse + ct_BoldBaseFont/_setwidthProc 3 -1 roll load put + {ct_MakeBoldFont}ct_Type0CopyFont definefont + } + { + dup/_fauxfont known not 1 index/SubstMaster known not and + { + ct_BoldBaseFont/_setwidthProc /ct_BoldRomanWidthProc load put + ct_MakeBoldFont + } + { + 2 index 2 index eq + {exch pop } + { + dup length dict begin + ct_CopyFont + currentdict + end + definefont + } + ifelse + } + ifelse + } + ifelse + pop pop pop + setglobal +}bind def +/?str1 256 string def +/?set + { + $SubstituteFont + begin + /$substituteFound false def + /$fontname 1 index def + /$doSmartSub false def + end + dup + findfont + $SubstituteFont + begin + $substituteFound + {false} + { + dup/FontName known + { + dup/FontName get $fontname eq + 1 index/DistillerFauxFont known not and + /currentdistillerparams where + {pop false 2 index isWidthsOnlyFont not and} + if + } + {false} + ifelse + } + ifelse + exch pop + /$doSmartSub true def + end + { + 5 1 roll pop pop pop pop + findfont + } + { + 1 index + findfont + dup/FontType get 3 eq + { + 6 1 roll pop pop pop pop pop false + } + {pop true} + ifelse + { + $SubstituteFont + begin + pop pop + /$styleArray 1 index def + /$regOrdering 2 index def + pop pop + 0 1 $styleArray length 1 sub + { + $styleArray exch get + ct_StyleDicts $regOrdering + 2 copy known + { + get + exch 2 copy known not + {pop/Default} + if + get + dup type/nametype eq + { + ?str1 cvs length dup 1 add exch + ?str1 exch(-)putinterval + exch dup length exch ?str1 exch 3 index exch putinterval + add ?str1 exch 0 exch getinterval cvn + } + { + pop pop/Unknown + } + ifelse + } + { + pop pop pop pop/Unknown + } + ifelse + } + for + end + findfont + }if + } + ifelse + currentglobal false setglobal 3 1 roll + null copyfont definefont pop + setglobal + }bind def +setpacking +userdict/$SubstituteFont 25 dict put +1 dict + begin + /SubstituteFont + dup $error exch 2 copy known + {get} + {pop pop{pop/Courier}bind} + ifelse def + /currentdistillerparams where dup + { + pop pop + currentdistillerparams/CannotEmbedFontPolicy 2 copy known + {get/Error eq} + {pop pop false} + ifelse + } + if not + { + countdictstack array dictstack 0 get + begin + userdict + begin + $SubstituteFont + begin + /$str 128 string def + /$fontpat 128 string def + /$slen 0 def + /$sname null def + /$match false def + /$fontname null def + /$substituteFound false def + /$inVMIndex null def + /$doSmartSub true def + /$depth 0 def + /$fontname null def + /$italicangle 26.5 def + /$dstack null def + /$Strategies 10 dict dup + begin + /$Type3Underprint + { + currentglobal exch false setglobal + 11 dict + begin + /UseFont exch + $WMode 0 ne + { + dup length dict copy + dup/WMode $WMode put + /UseFont exch definefont + } + if def + /FontName $fontname dup type/stringtype eq{cvn}if def + /FontType 3 def + /FontMatrix[.001 0 0 .001 0 0]def + /Encoding 256 array dup 0 1 255{/.notdef put dup}for pop def + /FontBBox[0 0 0 0]def + /CCInfo 7 dict dup + begin + /cc null def + /x 0 def + /y 0 def + end def + /BuildChar + { + exch + begin + CCInfo + begin + 1 string dup 0 3 index put exch pop + /cc exch def + UseFont 1000 scalefont setfont + cc stringwidth/y exch def/x exch def + x y setcharwidth + $SubstituteFont/$Strategy get/$Underprint get exec + 0 0 moveto cc show + x y moveto + end + end + }bind def + currentdict + end + exch setglobal + }bind def + /$GetaTint + 2 dict dup + begin + /$BuildFont + { + dup/WMode known + {dup/WMode get} + {0} + ifelse + /$WMode exch def + $fontname exch + dup/FontName known + { + dup/FontName get + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + exch + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index/FontName get known + { + pop + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index get + null copyfont + } + {$deepcopyfont} + ifelse + exch 1 index exch/FontBasedOn exch put + dup/FontName $fontname dup type/stringtype eq{cvn}if put + definefont + Adobe_CoolType_Data/InVMDeepCopiedFonts get + begin + dup/FontBasedOn get 1 index def + end + }bind def + /$Underprint + { + gsave + x abs y abs gt + {/y 1000 def} + {/x -1000 def 500 120 translate} + ifelse + Level2? + { + [/Separation(All)/DeviceCMYK{0 0 0 1 pop}] + setcolorspace + } + {0 setgray} + ifelse + 10 setlinewidth + x .8 mul + [7 3] + { + y mul 8 div 120 sub x 10 div exch moveto + 0 y 4 div neg rlineto + dup 0 rlineto + 0 y 4 div rlineto + closepath + gsave + Level2? + {.2 setcolor} + {.8 setgray} + ifelse + fill grestore + stroke + } + forall + pop + grestore + }bind def + end def + /$Oblique + 1 dict dup + begin + /$BuildFont + { + currentglobal exch dup gcheck setglobal + null copyfont + begin + /FontBasedOn + currentdict/FontName known + { + FontName + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + def + /FontName $fontname dup type/stringtype eq{cvn}if def + /currentdistillerparams where + {pop} + { + /FontInfo currentdict/FontInfo known + {FontInfo null copyfont} + {2 dict} + ifelse + dup + begin + /ItalicAngle $italicangle def + /FontMatrix FontMatrix + [1 0 ItalicAngle dup sin exch cos div 1 0 0] + matrix concatmatrix readonly + end + 4 2 roll def + def + } + ifelse + FontName currentdict + end + definefont + exch setglobal + }bind def + end def + /$None + 1 dict dup + begin + /$BuildFont{}bind def + end def + end def + /$Oblique SetSubstituteStrategy + /$findfontByEnum + { + dup type/stringtype eq{cvn}if + dup/$fontname exch def + $sname null eq + {$str cvs dup length $slen sub $slen getinterval} + {pop $sname} + ifelse + $fontpat dup 0(fonts/*)putinterval exch 7 exch putinterval + /$match false def + $SubstituteFont/$dstack countdictstack array dictstack put + mark + { + $fontpat 0 $slen 7 add getinterval + {/$match exch def exit} + $str filenameforall + } + stopped + { + cleardictstack + currentdict + true + $SubstituteFont/$dstack get + { + exch + { + 1 index eq + {pop false} + {true} + ifelse + } + {begin false} + ifelse + } + forall + pop + } + if + cleartomark + /$slen 0 def + $match false ne + {$match(fonts/)anchorsearch pop pop cvn} + {/Courier} + ifelse + }bind def + /$ROS 1 dict dup + begin + /Adobe 4 dict dup + begin + /Japan1 [/Ryumin-Light/HeiseiMin-W3 + /GothicBBB-Medium/HeiseiKakuGo-W5 + /HeiseiMaruGo-W4/Jun101-Light]def + /Korea1 [/HYSMyeongJo-Medium/HYGoThic-Medium]def + /GB1 [/STSong-Light/STHeiti-Regular]def + /CNS1 [/MKai-Medium/MHei-Medium]def + end def + end def + /$cmapname null def + /$deepcopyfont + { + dup/FontType get 0 eq + { + 1 dict dup/FontName/copied put copyfont + begin + /FDepVector FDepVector copyarray + 0 1 2 index length 1 sub + { + 2 copy get $deepcopyfont + dup/FontName/copied put + /copied exch definefont + 3 copy put pop pop + } + for + def + currentdict + end + } + {$Strategies/$Type3Underprint get exec} + ifelse + }bind def + /$buildfontname + { + dup/CIDFont findresource/CIDSystemInfo get + begin + Registry length Ordering length Supplement 8 string cvs + 3 copy length 2 add add add string + dup 5 1 roll dup 0 Registry putinterval + dup 4 index(-)putinterval + dup 4 index 1 add Ordering putinterval + 4 2 roll add 1 add 2 copy(-)putinterval + end + 1 add 2 copy 0 exch getinterval $cmapname $fontpat cvs exch + anchorsearch + {pop pop 3 2 roll putinterval cvn/$cmapname exch def} + {pop pop pop pop pop} + ifelse + length + $str 1 index(-)putinterval 1 add + $str 1 index $cmapname $fontpat cvs putinterval + $cmapname length add + $str exch 0 exch getinterval cvn + }bind def + /$findfontByROS + { + /$fontname exch def + $ROS Registry 2 copy known + { + get Ordering 2 copy known + {get} + {pop pop[]} + ifelse + } + {pop pop[]} + ifelse + false exch + { + dup/CIDFont resourcestatus + { + pop pop + save + 1 index/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get} + {false} + ifelse + exch pop + exch restore + {pop} + {exch pop true exit} + ifelse + } + {pop} + ifelse + } + forall + {$str cvs $buildfontname} + { + false(*) + { + save exch + dup/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get not} + {true} + ifelse + exch/CIDSystemInfo get + dup/Registry get Registry eq + exch/Ordering get Ordering eq and and + {exch restore exch pop true exit} + {pop restore} + ifelse + } + $str/CIDFont resourceforall + {$buildfontname} + {$fontname $findfontByEnum} + ifelse + } + ifelse + }bind def + end + end + currentdict/$error known currentdict/languagelevel known and dup + {pop $error/SubstituteFont known} + if + dup + {$error} + {Adobe_CoolType_Core} + ifelse + begin + { + /SubstituteFont + /CMap/Category resourcestatus + { + pop pop + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + { + $sname null eq + {dup $str cvs dup length $slen sub $slen getinterval cvn} + {$sname} + ifelse + Adobe_CoolType_Data/InVMFontsByCMap get + 1 index 2 copy known + { + get + false exch + { + pop + currentglobal + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + { + FontDirectory 1 index known + {exch pop true exit} + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + ifelse + } + ifelse + } + forall + } + {pop pop false} + ifelse + { + exch pop exch pop + } + { + dup/CMap resourcestatus + { + pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + } + { + 128 string cvs + dup(-)search + { + 3 1 roll search + { + 3 1 roll pop + {dup cvi} + stopped + {pop pop pop pop pop $findfontByEnum} + { + 4 2 roll pop pop + exch length + exch + 2 index length + 2 index + sub + exch 1 sub -1 0 + { + $str cvs dup length + 4 index + 0 + 4 index + 4 3 roll add + getinterval + exch 1 index exch 3 index exch + putinterval + dup/CMap resourcestatus + { + pop pop + 4 1 roll pop pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + true exit + } + {pop} + ifelse + } + for + dup type/booleantype eq + {pop} + {pop pop pop $findfontByEnum} + ifelse + } + ifelse + } + {pop pop pop $findfontByEnum} + ifelse + } + {pop pop $findfontByEnum} + ifelse + } + ifelse + } + ifelse + } + {//SubstituteFont exec} + ifelse + /$slen 0 def + end + } + } + { + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + {$findfontByEnum} + {//SubstituteFont exec} + ifelse + end + } + } + ifelse + bind readonly def + Adobe_CoolType_Core/scfindfont/systemfindfont load put + } + { + /scfindfont + { + $SubstituteFont + begin + dup systemfindfont + dup/FontName known + {dup/FontName get dup 3 index ne} + {/noname true} + ifelse + dup + { + /$origfontnamefound 2 index def + /$origfontname 4 index def/$substituteFound true def + } + if + exch pop + { + $slen 0 gt + $sname null ne + 3 index length $slen gt or and + { + pop dup $findfontByEnum findfont + dup maxlength 1 add dict + begin + {1 index/FID eq{pop pop}{def}ifelse} + forall + currentdict + end + definefont + dup/FontName known{dup/FontName get}{null}ifelse + $origfontnamefound ne + { + $origfontname $str cvs print + ( substitution revised, using )print + dup/FontName known + {dup/FontName get}{(unspecified font)} + ifelse + $str cvs print(.\n)print + } + if + } + {exch pop} + ifelse + } + {exch pop} + ifelse + end + }bind def + } + ifelse + end + end + Adobe_CoolType_Core_Defined not + { + Adobe_CoolType_Core/findfont + { + $SubstituteFont + begin + $depth 0 eq + { + /$fontname 1 index dup type/stringtype ne{$str cvs}if def + /$substituteFound false def + } + if + /$depth $depth 1 add def + end + scfindfont + $SubstituteFont + begin + /$depth $depth 1 sub def + $substituteFound $depth 0 eq and + { + $inVMIndex null ne + {dup $inVMIndex $AddInVMFont} + if + $doSmartSub + { + currentdict/$Strategy known + {$Strategy/$BuildFont get exec} + if + } + if + } + if + end + }bind put + } + if + } + if + end +/$AddInVMFont + { + exch/FontName 2 copy known + { + get + 1 dict dup begin exch 1 index gcheck def end exch + Adobe_CoolType_Data/InVMFontsByCMap get exch + $DictAdd + } + {pop pop pop} + ifelse + }bind def +/$DictAdd + { + 2 copy known not + {2 copy 4 index length dict put} + if + Level2? not + { + 2 copy get dup maxlength exch length 4 index length add lt + 2 copy get dup length 4 index length add exch maxlength 1 index lt + { + 2 mul dict + begin + 2 copy get{forall}def + 2 copy currentdict put + end + } + {pop} + ifelse + } + if + get + begin + {def} + forall + end + }bind def +end +end +%%EndResource +currentglobal true setglobal +%%BeginResource: procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%Copyright: Copyright 1987-2006 Adobe Systems Incorporated. +%%Version: 1.23 0 +systemdict/languagelevel known dup + {currentglobal false setglobal} + {false} +ifelse +exch +userdict/Adobe_CoolType_Utility 2 copy known + {2 copy get dup maxlength 27 add dict copy} + {27 dict} +ifelse put +Adobe_CoolType_Utility + begin + /@eexecStartData + def + /@recognizeCIDFont null def + /ct_Level2? exch def + /ct_Clone? 1183615869 internaldict dup + /CCRun known not + exch/eCCRun known not + ct_Level2? and or def +ct_Level2? + {globaldict begin currentglobal true setglobal} +if + /ct_AddStdCIDMap + ct_Level2? + {{ + mark + Adobe_CoolType_Utility/@recognizeCIDFont currentdict put + { + ((Hex)57 StartData + 0615 1e27 2c39 1c60 d8a8 cc31 fe2b f6e0 + 7aa3 e541 e21c 60d8 a8c9 c3d0 6d9e 1c60 + d8a8 c9c2 02d7 9a1c 60d8 a849 1c60 d8a8 + cc36 74f4 1144 b13b 77)0()/SubFileDecode filter cvx exec + } + stopped + { + cleartomark + Adobe_CoolType_Utility/@recognizeCIDFont get + countdictstack dup array dictstack + exch 1 sub -1 0 + { + 2 copy get 3 index eq + {1 index length exch sub 1 sub{end}repeat exit} + {pop} + ifelse + } + for + pop pop + Adobe_CoolType_Utility/@eexecStartData get eexec + } + {cleartomark} + ifelse + }} + {{ + Adobe_CoolType_Utility/@eexecStartData get eexec + }} + ifelse bind def +userdict/cid_extensions known +dup{cid_extensions/cid_UpdateDB known and}if + { + cid_extensions + begin + /cid_GetCIDSystemInfo + { + 1 index type/stringtype eq + {exch cvn exch} + if + cid_extensions + begin + dup load 2 index known + { + 2 copy + cid_GetStatusInfo + dup null ne + { + 1 index load + 3 index get + dup null eq + {pop pop cid_UpdateDB} + { + exch + 1 index/Created get eq + {exch pop exch pop} + {pop cid_UpdateDB} + ifelse + } + ifelse + } + {pop cid_UpdateDB} + ifelse + } + {cid_UpdateDB} + ifelse + end + }bind def + end + } +if +ct_Level2? + {end setglobal} +if + /ct_UseNativeCapability? systemdict/composefont known def + /ct_MakeOCF 35 dict def + /ct_Vars 25 dict def + /ct_GlyphDirProcs 6 dict def + /ct_BuildCharDict 15 dict dup + begin + /charcode 2 string def + /dst_string 1500 string def + /nullstring()def + /usewidths? true def + end def + ct_Level2?{setglobal}{pop}ifelse + ct_GlyphDirProcs + begin + /GetGlyphDirectory + { + systemdict/languagelevel known + {pop/CIDFont findresource/GlyphDirectory get} + { + 1 index/CIDFont findresource/GlyphDirectory + get dup type/dicttype eq + { + dup dup maxlength exch length sub 2 index lt + { + dup length 2 index add dict copy 2 index + /CIDFont findresource/GlyphDirectory 2 index put + } + if + } + if + exch pop exch pop + } + ifelse + + + }def + /+ + { + systemdict/languagelevel known + { + currentglobal false setglobal + 3 dict begin + /vm exch def + } + {1 dict begin} + ifelse + /$ exch def + systemdict/languagelevel known + { + vm setglobal + /gvm currentglobal def + $ gcheck setglobal + } + if + ?{$ begin}if + }def + /?{$ type/dicttype eq}def + /|{ + userdict/Adobe_CoolType_Data known + { + Adobe_CoolType_Data/AddWidths? known + { + currentdict Adobe_CoolType_Data + begin + begin + AddWidths? + { + Adobe_CoolType_Data/CC 3 index put + ?{def}{$ 3 1 roll put}ifelse + CC charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore + currentfont/Widths get exch CC exch put + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + end + end + } + {?{def}{$ 3 1 roll put}ifelse} ifelse + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + }def + /! + { + ?{end}if + systemdict/languagelevel known + {gvm setglobal} + if + end + }def + /:{string currentfile exch readstring pop}executeonly def + end + ct_MakeOCF + begin + /ct_cHexEncoding + [/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 + /c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 + /c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 + /c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B + /c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E + /c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 + /c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 + /c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 + /c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA + /cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD + /cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 + /cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 + /cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 + /cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def + /ct_CID_STR_SIZE 8000 def + /ct_mkocfStr100 100 string def + /ct_defaultFontMtx[.001 0 0 .001 0 0]def + /ct_1000Mtx[1000 0 0 1000 0 0]def + /ct_raise{exch cvx exch errordict exch get exec stop}bind def + /ct_reraise + {cvx $error/errorname get(Error: )print dup( )cvs print + errordict exch get exec stop + }bind def + /ct_cvnsi + { + 1 index add 1 sub 1 exch 0 4 1 roll + { + 2 index exch get + exch 8 bitshift + add + } + for + exch pop + }bind def + /ct_GetInterval + { + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /dst_index 0 def + dup dst_string length gt + {dup string/dst_string exch def} + if + 1 index ct_CID_STR_SIZE idiv + /arrayIndex exch def + 2 index arrayIndex get + 2 index + arrayIndex ct_CID_STR_SIZE mul + sub + { + dup 3 index add 2 index length le + { + 2 index getinterval + dst_string dst_index 2 index putinterval + length dst_index add/dst_index exch def + exit + } + { + 1 index length 1 index sub + dup 4 1 roll + getinterval + dst_string dst_index 2 index putinterval + pop dup dst_index add/dst_index exch def + sub + /arrayIndex arrayIndex 1 add def + 2 index dup length arrayIndex gt + {arrayIndex get} + { + pop + exit + } + ifelse + 0 + } + ifelse + } + loop + pop pop pop + dst_string 0 dst_index getinterval + end + }bind def + ct_Level2? + { + /ct_resourcestatus + currentglobal mark true setglobal + {/unknowninstancename/Category resourcestatus} + stopped + {cleartomark setglobal true} + {cleartomark currentglobal not exch setglobal} + ifelse + { + { + mark 3 1 roll/Category findresource + begin + ct_Vars/vm currentglobal put + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + ct_Vars/vm get setglobal + end + } + } + {{resourcestatus}} + ifelse bind def + /CIDFont/Category ct_resourcestatus + {pop pop} + { + currentglobal true setglobal + /Generic/Category findresource + dup length dict copy + dup/InstanceType/dicttype put + /CIDFont exch/Category defineresource pop + setglobal + } + ifelse + ct_UseNativeCapability? + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + if + } + { + /ct_Category 2 dict begin + /CIDFont 10 dict def + /ProcSet 2 dict def + currentdict + end + def + /defineresource + { + ct_Category 1 index 2 copy known + { + get + dup dup maxlength exch length eq + { + dup length 10 add dict copy + ct_Category 2 index 2 index put + } + if + 3 index 3 index put + pop exch pop + } + {pop pop/defineresource/undefined ct_raise} + ifelse + }bind def + /findresource + { + ct_Category 1 index 2 copy known + { + get + 2 index 2 copy known + {get 3 1 roll pop pop} + {pop pop/findresource/undefinedresource ct_raise} + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /resourcestatus + { + ct_Category 1 index 2 copy known + { + get + 2 index known + exch pop exch pop + { + 0 -1 true + } + { + false + } + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /ct_resourcestatus/resourcestatus load def + } + ifelse + /ct_CIDInit 2 dict + begin + /ct_cidfont_stream_init + { + { + dup(Binary)eq + { + pop + null + currentfile + ct_Level2? + { + {cid_BYTE_COUNT()/SubFileDecode filter} + stopped + {pop pop pop} + if + } + if + /readstring load + exit + } + if + dup(Hex)eq + { + pop + currentfile + ct_Level2? + { + {null exch/ASCIIHexDecode filter/readstring} + stopped + {pop exch pop(>)exch/readhexstring} + if + } + {(>)exch/readhexstring} + ifelse + load + exit + } + if + /StartData/typecheck ct_raise + } + loop + cid_BYTE_COUNT ct_CID_STR_SIZE le + { + 2 copy cid_BYTE_COUNT string exch exec + pop + 1 array dup + 3 -1 roll + 0 exch put + } + { + cid_BYTE_COUNT ct_CID_STR_SIZE div ceiling cvi + dup array exch 2 sub 0 exch 1 exch + { + 2 copy + 5 index + ct_CID_STR_SIZE + string + 6 index exec + pop + put + pop + } + for + 2 index + cid_BYTE_COUNT ct_CID_STR_SIZE mod string + 3 index exec + pop + 1 index exch + 1 index length 1 sub + exch put + } + ifelse + cid_CIDFONT exch/GlyphData exch put + 2 index null eq + { + pop pop pop + } + { + pop/readstring load + 1 string exch + { + 3 copy exec + pop + dup length 0 eq + { + pop pop pop pop pop + true exit + } + if + 4 index + eq + { + pop pop pop pop + false exit + } + if + } + loop + pop + } + ifelse + }bind def + /StartData + { + mark + { + currentdict + dup/FDArray get 0 get/FontMatrix get + 0 get 0.001 eq + { + dup/CDevProc known not + { + /CDevProc 1183615869 internaldict/stdCDevProc 2 copy known + {get} + { + pop pop + {pop pop pop pop pop 0 -1000 7 index 2 div 880} + } + ifelse + def + } + if + } + { + /CDevProc + { + pop pop pop pop pop + 0 + 1 cid_temp/cid_CIDFONT get + /FDArray get 0 get + /FontMatrix get 0 get div + 7 index 2 div + 1 index 0.88 mul + }def + } + ifelse + /cid_temp 15 dict def + cid_temp + begin + /cid_CIDFONT exch def + 3 copy pop + dup/cid_BYTE_COUNT exch def 0 gt + { + ct_cidfont_stream_init + FDArray + { + /Private get + dup/SubrMapOffset known + { + begin + /Subrs SubrCount array def + Subrs + SubrMapOffset + SubrCount + SDBytes + ct_Level2? + { + currentdict dup/SubrMapOffset undef + dup/SubrCount undef + /SDBytes undef + } + if + end + /cid_SD_BYTES exch def + /cid_SUBR_COUNT exch def + /cid_SUBR_MAP_OFFSET exch def + /cid_SUBRS exch def + cid_SUBR_COUNT 0 gt + { + GlyphData cid_SUBR_MAP_OFFSET cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + 0 1 cid_SUBR_COUNT 1 sub + { + exch 1 index + 1 add + cid_SD_BYTES mul cid_SUBR_MAP_OFFSET add + GlyphData exch cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + cid_SUBRS 4 2 roll + GlyphData exch + 4 index + 1 index + sub + ct_GetInterval + dup length string copy put + } + for + pop + } + if + } + {pop} + ifelse + } + forall + } + if + cleartomark pop pop + end + CIDFontName currentdict/CIDFont defineresource pop + end end + } + stopped + {cleartomark/StartData ct_reraise} + if + }bind def + currentdict + end def + /ct_saveCIDInit + { + /CIDInit/ProcSet ct_resourcestatus + {true} + {/CIDInitC/ProcSet ct_resourcestatus} + ifelse + { + pop pop + /CIDInit/ProcSet findresource + ct_UseNativeCapability? + {pop null} + {/CIDInit ct_CIDInit/ProcSet defineresource pop} + ifelse + } + {/CIDInit ct_CIDInit/ProcSet defineresource pop null} + ifelse + ct_Vars exch/ct_oldCIDInit exch put + }bind def + /ct_restoreCIDInit + { + ct_Vars/ct_oldCIDInit get dup null ne + {/CIDInit exch/ProcSet defineresource pop} + {pop} + ifelse + }bind def + /ct_BuildCharSetUp + { + 1 index + begin + CIDFont + begin + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /ct_dfCharCode exch def + /ct_dfDict exch def + CIDFirstByte ct_dfCharCode add + dup CIDCount ge + {pop 0} + if + /cid exch def + { + GlyphDirectory cid 2 copy known + {get} + {pop pop nullstring} + ifelse + dup length FDBytes sub 0 gt + { + dup + FDBytes 0 ne + {0 FDBytes ct_cvnsi} + {pop 0} + ifelse + /fdIndex exch def + dup length FDBytes sub FDBytes exch getinterval + /charstring exch def + exit + } + { + pop + cid 0 eq + {/charstring nullstring def exit} + if + /cid 0 def + } + ifelse + } + loop + }def + /ct_SetCacheDevice + { + 0 0 moveto + dup stringwidth + 3 -1 roll + true charpath + pathbbox + 0 -1000 + 7 index 2 div 880 + setcachedevice2 + 0 0 moveto + }def + /ct_CloneSetCacheProc + { + 1 eq + { + stringwidth + pop -2 div -880 + 0 -1000 setcharwidth + moveto + } + { + usewidths? + { + currentfont/Widths get cid + 2 copy known + {get exch pop aload pop} + {pop pop stringwidth} + ifelse + } + {stringwidth} + ifelse + setcharwidth + 0 0 moveto + } + ifelse + }def + /ct_Type3ShowCharString + { + ct_FDDict fdIndex 2 copy known + {get} + { + currentglobal 3 1 roll + 1 index gcheck setglobal + ct_Type1FontTemplate dup maxlength dict copy + begin + FDArray fdIndex get + dup/FontMatrix 2 copy known + {get} + {pop pop ct_defaultFontMtx} + ifelse + /FontMatrix exch dup length array copy def + /Private get + /Private exch def + /Widths rootfont/Widths get def + /CharStrings 1 dict dup/.notdef + dup length string copy put def + currentdict + end + /ct_Type1Font exch definefont + dup 5 1 roll put + setglobal + } + ifelse + dup/CharStrings get 1 index/Encoding get + ct_dfCharCode get charstring put + rootfont/WMode 2 copy known + {get} + {pop pop 0} + ifelse + exch + 1000 scalefont setfont + ct_str1 0 ct_dfCharCode put + ct_str1 exch ct_dfSetCacheProc + ct_SyntheticBold + { + currentpoint + ct_str1 show + newpath + moveto + ct_str1 true charpath + ct_StrokeWidth setlinewidth + stroke + } + {ct_str1 show} + ifelse + }def + /ct_Type4ShowCharString + { + ct_dfDict ct_dfCharCode charstring + FDArray fdIndex get + dup/FontMatrix get dup ct_defaultFontMtx ct_matrixeq not + {ct_1000Mtx matrix concatmatrix concat} + {pop} + ifelse + /Private get + Adobe_CoolType_Utility/ct_Level2? get not + { + ct_dfDict/Private + 3 -1 roll + {put} + 1183615869 internaldict/superexec get exec + } + if + 1183615869 internaldict + Adobe_CoolType_Utility/ct_Level2? get + {1 index} + {3 index/Private get mark 6 1 roll} + ifelse + dup/RunInt known + {/RunInt get} + {pop/CCRun} + ifelse + get exec + Adobe_CoolType_Utility/ct_Level2? get not + {cleartomark} + if + }bind def + /ct_BuildCharIncremental + { + { + Adobe_CoolType_Utility/ct_MakeOCF get begin + ct_BuildCharSetUp + ct_ShowCharString + } + stopped + {stop} + if + end + end + end + end + }bind def + /BaseFontNameStr(BF00)def + /ct_Type1FontTemplate 14 dict + begin + /FontType 1 def + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /PaintType 0 def + currentdict + end def + /BaseFontTemplate 11 dict + begin + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /BuildChar/ct_BuildCharIncremental load def + ct_Clone? + { + /FontType 3 def + /ct_ShowCharString/ct_Type3ShowCharString load def + /ct_dfSetCacheProc/ct_CloneSetCacheProc load def + /ct_SyntheticBold false def + /ct_StrokeWidth 1 def + } + { + /FontType 4 def + /Private 1 dict dup/lenIV 4 put def + /CharStrings 1 dict dup/.notdefput def + /PaintType 0 def + /ct_ShowCharString/ct_Type4ShowCharString load def + } + ifelse + /ct_str1 1 string def + currentdict + end def + /BaseFontDictSize BaseFontTemplate length 5 add def + /ct_matrixeq + { + true 0 1 5 + { + dup 4 index exch get exch 3 index exch get eq and + dup not + {exit} + if + } + for + exch pop exch pop + }bind def + /ct_makeocf + { + 15 dict + begin + exch/WMode exch def + exch/FontName exch def + /FontType 0 def + /FMapType 2 def + dup/FontMatrix known + {dup/FontMatrix get/FontMatrix exch def} + {/FontMatrix matrix def} + ifelse + /bfCount 1 index/CIDCount get 256 idiv 1 add + dup 256 gt{pop 256}if def + /Encoding + 256 array 0 1 bfCount 1 sub{2 copy dup put pop}for + bfCount 1 255{2 copy bfCount put pop}for + def + /FDepVector bfCount dup 256 lt{1 add}if array def + BaseFontTemplate BaseFontDictSize dict copy + begin + /CIDFont exch def + CIDFont/FontBBox known + {CIDFont/FontBBox get/FontBBox exch def} + if + CIDFont/CDevProc known + {CIDFont/CDevProc get/CDevProc exch def} + if + currentdict + end + BaseFontNameStr 3(0)putinterval + 0 1 bfCount dup 256 eq{1 sub}if + { + FDepVector exch + 2 index BaseFontDictSize dict copy + begin + dup/CIDFirstByte exch 256 mul def + FontType 3 eq + {/ct_FDDict 2 dict def} + if + currentdict + end + 1 index 16 + BaseFontNameStr 2 2 getinterval cvrs pop + BaseFontNameStr exch definefont + put + } + for + ct_Clone? + {/Widths 1 index/CIDFont get/GlyphDirectory get length dict def} + if + FontName + currentdict + end + definefont + ct_Clone? + { + gsave + dup 1000 scalefont setfont + ct_BuildCharDict + begin + /usewidths? false def + currentfont/Widths get + begin + exch/CIDFont get/GlyphDirectory get + { + pop + dup charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore def + } + forall + end + /usewidths? true def + end + grestore + } + {exch pop} + ifelse + }bind def + currentglobal true setglobal + /ct_ComposeFont + { + ct_UseNativeCapability? + { + 2 index/CMap ct_resourcestatus + {pop pop exch pop} + { + /CIDInit/ProcSet findresource + begin + 12 dict + begin + begincmap + /CMapName 3 index def + /CMapVersion 1.000 def + /CMapType 1 def + exch/WMode exch def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + { + dup length string copy + exch pop exch pop + } + {pop(Identity)} + ifelse + } + {pop (Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + 3 2 roll pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + setglobal + /ct_MakeIdentity + { + ct_UseNativeCapability? + { + 1 index/CMap ct_resourcestatus + {pop pop} + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CMapName 2 index def + /CMapVersion 1.000 def + /CMapType 1 def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + {dup length string copy exch pop exch pop} + {pop(Identity)} + ifelse + } + {pop(Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + exch pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + currentdict readonly pop + end + end +%%EndResource +setglobal +%%BeginResource: procset Adobe_CoolType_Utility_T42 1.0 0 +%%Copyright: Copyright 1987-2004 Adobe Systems Incorporated. +%%Version: 1.0 0 +userdict/ct_T42Dict 15 dict put +ct_T42Dict begin +/Is2015? +{ + version + cvi + 2015 + ge +}bind def +/AllocGlyphStorage +{ + Is2015? + { + pop + } + { + {string}forall + }ifelse +}bind def +/Type42DictBegin +{ +25 dict begin + /FontName exch def + /CharStrings 256 dict +begin + /.notdef 0 def + currentdict +end def + /Encoding exch def + /PaintType 0 def + /FontType 42 def + /FontMatrix[1 0 0 1 0 0]def + 4 array astore cvx/FontBBox exch def + /sfnts +}bind def +/Type42DictEnd +{ + currentdict dup/FontName get exch definefont end +ct_T42Dict exch +dup/FontName get exch put +}bind def +/RD{string currentfile exch readstring pop}executeonly def +/PrepFor2015 +{ +Is2015? +{ + /GlyphDirectory + 16 + dict def + sfnts 0 get + dup + 2 index + (glyx) + putinterval + 2 index + (locx) + putinterval + pop + pop +} +{ + pop + pop +}ifelse +}bind def +/AddT42Char +{ +Is2015? +{ + /GlyphDirectory get + begin + def + end + pop + pop +} +{ + /sfnts get + 4 index + get + 3 index + 2 index + putinterval + pop + pop + pop + pop +}ifelse +}bind def +/T0AddT42Mtx2 +{ +/CIDFont findresource/Metrics2 get begin def end +}bind def +end +%%EndResource +currentglobal true setglobal +%%BeginFile: MMFauxFont.prc +%%Copyright: Copyright 1987-2001 Adobe Systems Incorporated. +%%All Rights Reserved. +userdict /ct_EuroDict 10 dict put +ct_EuroDict begin +/ct_CopyFont +{ + { 1 index /FID ne {def} {pop pop} ifelse} forall +} def +/ct_GetGlyphOutline +{ + gsave + initmatrix newpath + exch findfont dup + length 1 add dict + begin + ct_CopyFont + /Encoding Encoding dup length array copy + dup + 4 -1 roll + 0 exch put + def + currentdict + end + /ct_EuroFont exch definefont + 1000 scalefont setfont + 0 0 moveto + [ + <00> stringwidth + <00> false charpath + pathbbox + [ + {/m cvx} {/l cvx} {/c cvx} {/cp cvx} pathforall + grestore + counttomark 8 add +} +def +/ct_MakeGlyphProc +{ + ] cvx + /ct_PSBuildGlyph cvx + ] cvx +} def +/ct_PSBuildGlyph +{ + gsave + 8 -1 roll pop + 7 1 roll + 6 -2 roll ct_FontMatrix transform 6 2 roll + 4 -2 roll ct_FontMatrix transform 4 2 roll + ct_FontMatrix transform + currentdict /PaintType 2 copy known {get 2 eq}{pop pop false} ifelse + dup 9 1 roll + { + currentdict /StrokeWidth 2 copy known + { + get 2 div + 0 ct_FontMatrix dtransform pop + 5 1 roll + 4 -1 roll 4 index sub + 4 1 roll + 3 -1 roll 4 index sub + 3 1 roll + exch 4 index add exch + 4 index add + 5 -1 roll pop + } + { + pop pop + } + ifelse + } + if + setcachedevice + ct_FontMatrix concat + ct_PSPathOps begin + exec + end + { + currentdict /StrokeWidth 2 copy known + { get } + { pop pop 0 } + ifelse + setlinewidth stroke + } + { + fill + } + ifelse + grestore +} def +/ct_PSPathOps 4 dict dup begin + /m {moveto} def + /l {lineto} def + /c {curveto} def + /cp {closepath} def +end +def +/ct_matrix1000 [1000 0 0 1000 0 0] def +/ct_AddGlyphProc +{ + 2 index findfont dup length 4 add dict + begin + ct_CopyFont + /CharStrings CharStrings dup length 1 add dict copy + begin + 3 1 roll def + currentdict + end + def + /ct_FontMatrix ct_matrix1000 FontMatrix matrix concatmatrix def + /ct_PSBuildGlyph /ct_PSBuildGlyph load def + /ct_PSPathOps /ct_PSPathOps load def + currentdict + end + definefont pop +} +def +systemdict /languagelevel known +{ + /ct_AddGlyphToPrinterFont { + 2 copy + ct_GetGlyphOutline 3 add -1 roll restore + ct_MakeGlyphProc + ct_AddGlyphProc + } def +} +{ + /ct_AddGlyphToPrinterFont { + pop pop restore + Adobe_CTFauxDict /$$$FONTNAME get + /Euro + Adobe_CTFauxDict /$$$SUBSTITUTEBASE get + ct_EuroDict exch get + ct_AddGlyphProc + } def +} ifelse +/AdobeSansMM +{ +556 0 24 -19 541 703 + { + 541 628 m + 510 669 442 703 354 703 c + 201 703 117 607 101 444 c + 50 444 l + 25 372 l + 97 372 l + 97 301 l + 49 301 l + 24 229 l + 103 229 l + 124 67 209 -19 350 -19 c + 435 -19 501 25 509 32 c + 509 131 l + 492 105 417 60 343 60 c + 267 60 204 127 197 229 c + 406 229 l + 430 301 l + 191 301 l + 191 372 l + 455 372 l + 479 444 l + 194 444 l + 201 531 245 624 348 624 c + 433 624 484 583 509 534 c + cp + 556 0 m + } +ct_PSBuildGlyph +} def +/AdobeSerifMM +{ +500 0 10 -12 484 692 + { + 347 298 m + 171 298 l + 170 310 170 322 170 335 c + 170 362 l + 362 362 l + 374 403 l + 172 403 l + 184 580 244 642 308 642 c + 380 642 434 574 457 457 c + 481 462 l + 474 691 l + 449 691 l + 433 670 429 657 410 657 c + 394 657 360 692 299 692 c + 204 692 94 604 73 403 c + 22 403 l + 10 362 l + 70 362 l + 69 352 69 341 69 330 c + 69 319 69 308 70 298 c + 22 298 l + 10 257 l + 73 257 l + 97 57 216 -12 295 -12 c + 364 -12 427 25 484 123 c + 458 142 l + 425 101 384 37 316 37 c + 256 37 189 84 173 257 c + 335 257 l + cp + 500 0 m + } +ct_PSBuildGlyph +} def +end +%%EndFile +setglobal +Adobe_CoolType_Core begin /$None SetSubstituteStrategy end +%%BeginResource: procset Adobe_AGM_Image 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Image 71 dict dup begin put +/Adobe_AGM_Image_Id/Adobe_AGM_Image_1.0_0 def +/nd{ + null def +}bind def +/AGMIMG_&image nd +/AGMIMG_&colorimage nd +/AGMIMG_&imagemask nd +/AGMIMG_mbuf()def +/AGMIMG_ybuf()def +/AGMIMG_kbuf()def +/AGMIMG_c 0 def +/AGMIMG_m 0 def +/AGMIMG_y 0 def +/AGMIMG_k 0 def +/AGMIMG_tmp nd +/AGMIMG_imagestring0 nd +/AGMIMG_imagestring1 nd +/AGMIMG_imagestring2 nd +/AGMIMG_imagestring3 nd +/AGMIMG_imagestring4 nd +/AGMIMG_imagestring5 nd +/AGMIMG_cnt nd +/AGMIMG_fsave nd +/AGMIMG_colorAry nd +/AGMIMG_override nd +/AGMIMG_name nd +/AGMIMG_maskSource nd +/AGMIMG_flushfilters nd +/invert_image_samples nd +/knockout_image_samples nd +/img nd +/sepimg nd +/devnimg nd +/idximg nd +/ds +{ + Adobe_AGM_Core begin + Adobe_AGM_Image begin + /AGMIMG_&image systemdict/image get def + /AGMIMG_&imagemask systemdict/imagemask get def + /colorimage where{ + pop + /AGMIMG_&colorimage/colorimage ldf + }if + end + end +}def +/ps +{ + Adobe_AGM_Image begin + /AGMIMG_ccimage_exists{/customcolorimage where + { + pop + /Adobe_AGM_OnHost_Seps where + { + pop false + }{ + /Adobe_AGM_InRip_Seps where + { + pop false + }{ + true + }ifelse + }ifelse + }{ + false + }ifelse + }bdf + level2{ + /invert_image_samples + { + Adobe_AGM_Image/AGMIMG_tmp Decode length ddf + /Decode[Decode 1 get Decode 0 get]def + }def + /knockout_image_samples + { + Operator/imagemask ne{ + /Decode[1 1]def + }if + }def + }{ + /invert_image_samples + { + {1 exch sub}currenttransfer addprocs settransfer + }def + /knockout_image_samples + { + {pop 1}currenttransfer addprocs settransfer + }def + }ifelse + /img/imageormask ldf + /sepimg/sep_imageormask ldf + /devnimg/devn_imageormask ldf + /idximg/indexed_imageormask ldf + /_ctype 7 def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall +}def +/pt +{ + end +}def +/dt +{ +}def +/AGMIMG_flushfilters +{ + dup type/arraytype ne + {1 array astore}if + dup 0 get currentfile ne + {dup 0 get flushfile}if + { + dup type/filetype eq + { + dup status 1 index currentfile ne and + {closefile} + {pop} + ifelse + }{pop}ifelse + }forall +}def +/AGMIMG_init_common +{ + currentdict/T known{/ImageType/T ldf currentdict/T undef}if + currentdict/W known{/Width/W ldf currentdict/W undef}if + currentdict/H known{/Height/H ldf currentdict/H undef}if + currentdict/M known{/ImageMatrix/M ldf currentdict/M undef}if + currentdict/BC known{/BitsPerComponent/BC ldf currentdict/BC undef}if + currentdict/D known{/Decode/D ldf currentdict/D undef}if + currentdict/DS known{/DataSource/DS ldf currentdict/DS undef}if + currentdict/O known{ + /Operator/O load 1 eq{ + /imagemask + }{ + /O load 2 eq{ + /image + }{ + /colorimage + }ifelse + }ifelse + def + currentdict/O undef + }if + currentdict/HSCI known{/HostSepColorImage/HSCI ldf currentdict/HSCI undef}if + currentdict/MD known{/MultipleDataSources/MD ldf currentdict/MD undef}if + currentdict/I known{/Interpolate/I ldf currentdict/I undef}if + currentdict/SI known{/SkipImageProc/SI ldf currentdict/SI undef}if + /DataSource load xcheck not{ + DataSource type/arraytype eq{ + DataSource 0 get type/filetype eq{ + /_Filters DataSource def + currentdict/MultipleDataSources known not{ + /DataSource DataSource dup length 1 sub get def + }if + }if + }if + currentdict/MultipleDataSources known not{ + /MultipleDataSources DataSource type/arraytype eq{ + DataSource length 1 gt + } + {false}ifelse def + }if + }if + /NComponents Decode length 2 div def + currentdict/SkipImageProc known not{/SkipImageProc{false}def}if +}bdf +/imageormask_sys +{ + begin + AGMIMG_init_common + save mark + level2{ + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + AGMIMG_&imagemask + }{ + BitsPerComponent ImageMatrix/DataSource load + AGMIMG_&image + }ifelse + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + cleartomark restore + end +}def +/overprint_plate +{ + currentoverprint{ + 0 get dup type/nametype eq{ + dup/DeviceGray eq{ + pop AGMCORE_black_plate not + }{ + /DeviceCMYK eq{ + AGMCORE_is_cmyk_sep not + }if + }ifelse + }{ + false exch + { + AGMOHS_sepink eq or + }forall + not + }ifelse + }{ + pop false + }ifelse +}def +/process_mask +{ + level3{ + dup begin + /ImageType 1 def + end + 4 dict begin + /DataDict exch def + /ImageType 3 def + /InterleaveType 3 def + /MaskDict 9 dict begin + /ImageType 1 def + /Width DataDict dup/MaskWidth known{/MaskWidth}{/Width}ifelse get def + /Height DataDict dup/MaskHeight known{/MaskHeight}{/Height}ifelse get def + /ImageMatrix[Width 0 0 Height neg 0 Height]def + /NComponents 1 def + /BitsPerComponent 1 def + /Decode DataDict dup/MaskD known{/MaskD}{[1 0]}ifelse get def + /DataSource Adobe_AGM_Core/AGMIMG_maskSource get def + currentdict end def + currentdict end + }if +}def +/use_mask +{ + dup/Mask known {dup/Mask get}{false}ifelse +}def +/imageormask +{ + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + } + { + save mark + level2 AGMCORE_host_sep not and{ + currentdict + Operator/imagemask eq DeviceN_PS2 not and{ + imagemask + }{ + AGMCORE_in_rip_sep currentoverprint and currentcolorspace 0 get/DeviceGray eq and{ + [/Separation/Black/DeviceGray{}]setcolorspace + /Decode[Decode 1 get Decode 0 get]def + }if + use_mask{ + process_mask image + }{ + DeviceN_NoneName DeviceN_PS2 Indexed_DeviceN level3 not and or or AGMCORE_in_rip_sep and + { + Names convert_to_process not{ + 2 dict begin + /imageDict xdf + /names_index 0 def + gsave + imageDict write_image_file{ + Names{ + dup(None)ne{ + [/Separation 3 -1 roll/DeviceGray{1 exch sub}]setcolorspace + Operator imageDict read_image_file + names_index 0 eq{true setoverprint}if + /names_index names_index 1 add def + }{ + pop + }ifelse + }forall + close_image_file + }if + grestore + end + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + /Adobe_AGM_OnHost_Seps where{ + pop imagemask + }{ + currentgray 1 ne{ + currentdict imageormask_sys + }{ + currentoverprint not{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }ifelse + }{ + BitsPerComponent ImageMatrix + MultipleDataSources{ + 0 1 NComponents 1 sub{ + DataSource exch get + }for + }{ + /DataSource load + }ifelse + Operator/colorimage eq{ + AGMCORE_host_sep{ + MultipleDataSources level2 or NComponents 4 eq and{ + AGMCORE_is_cmyk_sep{ + MultipleDataSources{ + /DataSource DataSource 0 get xcheck + { + [ + DataSource 0 get/exec cvx + DataSource 1 get/exec cvx + DataSource 2 get/exec cvx + DataSource 3 get/exec cvx + /AGMCORE_get_ink_data cvx + ]cvx + }{ + DataSource aload pop AGMCORE_get_ink_data + }ifelse def + }{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + /DataSource load + filter_cmyk 0()/SubFileDecode filter def + }ifelse + /Decode[Decode 0 get Decode 1 get]def + /MultipleDataSources false def + /NComponents 1 def + /Operator/image def + invert_image_samples + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }{ + MultipleDataSources NComponents AGMIMG_&colorimage + }ifelse + }{ + true NComponents colorimage + }ifelse + }{ + Operator/image eq{ + AGMCORE_host_sep{ + /DoImage true def + currentdict/HostSepColorImage known{HostSepColorImage not}{false}ifelse + { + AGMCORE_black_plate not Operator/imagemask ne and{ + /DoImage false def + currentdict ignoreimagedata + }if + }if + 1 AGMCORE_&setgray + DoImage + {currentdict imageormask_sys}if + }{ + use_mask{ + process_mask image + }{ + image + }ifelse + }ifelse + }{ + Operator/knockout eq{ + pop pop pop pop pop + currentcolorspace overprint_plate not{ + knockout_unitsq + }if + }if + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/sep_imageormask +{ + /sep_colorspace_dict AGMCORE_gget begin + CSA map_csa + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_avoid_L2_sep_space{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + }if + AGMIMG_ccimage_exists + MappedCSA 0 get/DeviceCMYK eq and + currentdict/Components known and + Name()ne and + Name(All)ne and + Operator/image eq and + AGMCORE_producing_seps not and + level2 not and + { + Width Height BitsPerComponent ImageMatrix + [ + /DataSource load/exec cvx + { + 0 1 2 index length 1 sub{ + 1 index exch + 2 copy get 255 xor put + }for + }/exec cvx + ]cvx bind + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Name findcmykcustomcolor + customcolorimage + }{ + AGMCORE_producing_seps not{ + level2{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne AGMCORE_avoid_L2_sep_space not and currentcolorspace 0 get/Separation ne and{ + [/Separation Name MappedCSA sep_proc_name exch dup 0 get 15 string cvs(/Device)anchorsearch{pop pop 0 get}{pop}ifelse exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + currentdict imageormask + }{ + currentdict + Operator/imagemask eq{ + imageormask + }{ + sep_imageormask_lev1 + }ifelse + }ifelse + }{ + AGMCORE_host_sep{ + Operator/knockout eq{ + currentdict/ImageMatrix get concat + knockout_unitsq + }{ + currentgray 1 ne{ + AGMCORE_is_cmyk_sep Name(All)ne and{ + level2{ + Name AGMCORE_IsSeparationAProcessColor + { + Operator/imagemask eq{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + /sep_tint AGMCORE_gget 1 exch sub AGMCORE_&setcolor + }if + }{ + invert_image_samples + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + [/Separation Name[/DeviceGray] + { + sep_colorspace_proc AGMCORE_get_ink_data + 1 exch sub + }bind + ]AGMCORE_&setcolorspace + /sep_tint AGMCORE_gget AGMCORE_&setcolor + }if + }ifelse + currentdict imageormask_sys + }{ + currentdict + Operator/imagemask eq{ + imageormask_sys + }{ + sep_image_lev1_sep + }ifelse + }ifelse + }{ + Operator/imagemask ne{ + invert_image_samples + }if + currentdict imageormask_sys + }ifelse + }{ + currentoverprint not Name(All)eq or Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + currentcolorspace 0 get/Separation ne{ + [/Separation Name MappedCSA sep_proc_name exch 0 get exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + }if + currentoverprint + MappedCSA 0 get/DeviceCMYK eq and + Name AGMCORE_IsSeparationAProcessColor not and + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{Name inRip_spot_has_ink not and}{false}ifelse + Name(All)ne and{ + imageormask_l2_overprint + }{ + currentdict imageormask + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end +}def +/colorSpaceElemCnt +{ + mark currentcolor counttomark dup 2 add 1 roll cleartomark +}bdf +/devn_sep_datasource +{ + 1 dict begin + /dataSource xdf + [ + 0 1 dataSource length 1 sub{ + dup currentdict/dataSource get/exch cvx/get cvx/exec cvx + /exch cvx names_index/ne cvx[/pop cvx]cvx/if cvx + }for + ]cvx bind + end +}bdf +/devn_alt_datasource +{ + 11 dict begin + /convProc xdf + /origcolorSpaceElemCnt xdf + /origMultipleDataSources xdf + /origBitsPerComponent xdf + /origDecode xdf + /origDataSource xdf + /dsCnt origMultipleDataSources{origDataSource length}{1}ifelse def + /DataSource origMultipleDataSources + { + [ + BitsPerComponent 8 idiv origDecode length 2 idiv mul string + 0 1 origDecode length 2 idiv 1 sub + { + dup 7 mul 1 add index exch dup BitsPerComponent 8 idiv mul exch + origDataSource exch get 0()/SubFileDecode filter + BitsPerComponent 8 idiv string/readstring cvx/pop cvx/putinterval cvx + }for + ]bind cvx + }{origDataSource}ifelse 0()/SubFileDecode filter def + [ + origcolorSpaceElemCnt string + 0 2 origDecode length 2 sub + { + dup origDecode exch get dup 3 -1 roll 1 add origDecode exch get exch sub 2 BitsPerComponent exp 1 sub div + 1 BitsPerComponent 8 idiv{DataSource/read cvx/not cvx{0}/if cvx/mul cvx}repeat/mul cvx/add cvx + }for + /convProc load/exec cvx + origcolorSpaceElemCnt 1 sub -1 0 + { + /dup cvx 2/add cvx/index cvx + 3 1/roll cvx/exch cvx 255/mul cvx/cvi cvx/put cvx + }for + ]bind cvx 0()/SubFileDecode filter + end +}bdf +/devn_imageormask +{ + /devicen_colorspace_dict AGMCORE_gget begin + CSA map_csa + 2 dict begin + dup + /srcDataStrs[3 -1 roll begin + AGMIMG_init_common + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi + { + dup 65535 gt{1 add 2 div cvi}{exit}ifelse + }loop + string + }repeat + end]def + /dstDataStr srcDataStrs 0 get length string def + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_producing_seps not{ + level3 not{ + Operator/imagemask ne{ + /DataSource[[ + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + colorSpaceElemCnt/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource 1/string cvx/readstring cvx/pop cvx]cvx colorSpaceElemCnt 1 sub{dup}repeat]def + /MultipleDataSources true def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + }if + }if + currentdict imageormask + }{ + AGMCORE_host_sep{ + Names convert_to_process{ + CSA get_csa_by_name 0 get/DeviceCMYK eq{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + 4/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + filter_cmyk 0()/SubFileDecode filter def + /MultipleDataSources false def + /Decode[1 0]def + /DeviceGray setcolorspace + currentdict imageormask_sys + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate{ + /DataSource + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + CSA get_csa_by_name 0 get/DeviceRGB eq{3}{1}ifelse/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + /MultipleDataSources false def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + currentdict imageormask_sys + }{ + gsave + knockout_unitsq + grestore + currentdict consumeimagedata + }ifelse + }ifelse + } + { + /devicen_colorspace_dict AGMCORE_gget/names_index known{ + Operator/imagemask ne{ + MultipleDataSources{ + /DataSource[DataSource devn_sep_datasource/exec cvx]cvx def + /MultipleDataSources false def + }{ + /DataSource/DataSource load dstDataStr srcDataStrs 0 get filter_devn def + }ifelse + invert_image_samples + }if + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + currentdict imageormask + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end + end +}def +/imageormask_l2_overprint +{ + currentdict + currentcmykcolor add add add 0 eq{ + currentdict consumeimagedata + }{ + level3{ + currentcmykcolor + /AGMIMG_k xdf + /AGMIMG_y xdf + /AGMIMG_m xdf + /AGMIMG_c xdf + Operator/imagemask eq{ + [/DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ]/DeviceCMYK{}]setcolorspace + AGMIMG_c 0 ne{AGMIMG_c}if + AGMIMG_m 0 ne{AGMIMG_m}if + AGMIMG_y 0 ne{AGMIMG_y}if + AGMIMG_k 0 ne{AGMIMG_k}if + setcolor + }{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + [/Indexed + [ + /DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ] + /DeviceCMYK{ + AGMIMG_k 0 eq{0}if + AGMIMG_y 0 eq{0 exch}if + AGMIMG_m 0 eq{0 3 1 roll}if + AGMIMG_c 0 eq{0 4 1 roll}if + } + ] + 255 + { + 255 div + mark exch + dup dup dup + AGMIMG_k 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 1 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_y 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 2 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_m 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 3 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_c 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + counttomark 1 add -1 roll pop + } + ]setcolorspace + }ifelse + imageormask_sys + }{ + write_image_file{ + currentcmykcolor + 0 ne{ + [/Separation/Black/DeviceGray{}]setcolorspace + gsave + /Black + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 1 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Yellow/DeviceGray{}]setcolorspace + gsave + /Yellow + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 2 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Magenta/DeviceGray{}]setcolorspace + gsave + /Magenta + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 3 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Cyan/DeviceGray{}]setcolorspace + gsave + /Cyan + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + close_image_file + }{ + imageormask + }ifelse + }ifelse + }ifelse +}def +/indexed_imageormask +{ + begin + AGMIMG_init_common + save mark + currentdict + AGMCORE_host_sep{ + Operator/knockout eq{ + /indexed_colorspace_dict AGMCORE_gget dup/CSA known{ + /CSA get get_csa_by_name + }{ + /Names get + }ifelse + overprint_plate not{ + knockout_unitsq + }if + }{ + Indexed_DeviceN{ + /devicen_colorspace_dict AGMCORE_gget dup/names_index known exch/Names get convert_to_process or{ + indexed_image_lev2_sep + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }{ + AGMCORE_is_cmyk_sep{ + Operator/imagemask eq{ + imageormask_sys + }{ + level2{ + indexed_image_lev2_sep + }{ + indexed_image_lev1_sep + }ifelse + }ifelse + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + level2{ + Indexed_DeviceN{ + /indexed_colorspace_dict AGMCORE_gget begin + }{ + /indexed_colorspace_dict AGMCORE_gget dup null ne + { + begin + currentdict/CSDBase known{CSDBase/CSD get_res/MappedCSA get}{CSA}ifelse + get_csa_by_name 0 get/DeviceCMYK eq ps_level 3 ge and ps_version 3015.007 lt and + AGMCORE_in_rip_sep and{ + [/Indexed[/DeviceN[/Cyan/Magenta/Yellow/Black]/DeviceCMYK{}]HiVal Lookup] + setcolorspace + }if + end + } + {pop}ifelse + }ifelse + imageormask + Indexed_DeviceN{ + end + }if + }{ + Operator/imagemask eq{ + imageormask + }{ + indexed_imageormask_lev1 + }ifelse + }ifelse + }ifelse + cleartomark restore + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/indexed_image_lev2_sep +{ + /indexed_colorspace_dict AGMCORE_gget begin + begin + Indexed_DeviceN not{ + currentcolorspace + dup 1/DeviceGray put + dup 3 + currentcolorspace 2 get 1 add string + 0 1 2 3 AGMCORE_get_ink_data 4 currentcolorspace 3 get length 1 sub + { + dup 4 idiv exch currentcolorspace 3 get exch get 255 exch sub 2 index 3 1 roll put + }for + put setcolorspace + }if + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + end end +}def + /OPIimage + { + dup type/dicttype ne{ + 10 dict begin + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /ImageType 1 def + /Decode[0 1 def] + currentdict + end + }if + dup begin + /NComponents 1 cdndf + /MultipleDataSources false cdndf + /SkipImageProc{false}cdndf + /Decode[ + 0 + currentcolorspace 0 get/Indexed eq{ + 2 BitsPerComponent exp 1 sub + }{ + 1 + }ifelse + ]cdndf + /Operator/image cdndf + end + /sep_colorspace_dict AGMCORE_gget null eq{ + imageormask + }{ + gsave + dup begin invert_image_samples end + sep_imageormask + grestore + }ifelse + }def +/cachemask_level2 +{ + 3 dict begin + /LZWEncode filter/WriteFilter xdf + /readBuffer 256 string def + /ReadFilter + currentfile + 0(%EndMask)/SubFileDecode filter + /ASCII85Decode filter + /RunLengthDecode filter + def + { + ReadFilter readBuffer readstring exch + WriteFilter exch writestring + not{exit}if + }loop + WriteFilter closefile + end +}def +/spot_alias +{ + /mapto_sep_imageormask + { + dup type/dicttype ne{ + 12 dict begin + /ImageType 1 def + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /MultipleDataSources false def + }{ + begin + }ifelse + /Decode[/customcolor_tint AGMCORE_gget 0]def + /Operator/image def + /SkipImageProc{false}def + currentdict + end + sep_imageormask + }bdf + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_colorAry xddf + /customcolor_tint AGMCORE_gget + << + /Name AGMIMG_colorAry 4 get + /CSA[/DeviceCMYK] + /TintMethod/Subtractive + /TintProc null + /MappedCSA null + /NComponents 4 + /Components[AGMIMG_colorAry aload pop pop] + >> + setsepcolorspace + mapto_sep_imageormask + }ndf + Adobe_AGM_Image/AGMIMG_&customcolorimage/customcolorimage load put + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_override false put + current_spot_alias{dup 4 get map_alias}{false}ifelse + { + false set_spot_alias + /customcolor_tint AGMCORE_gget exch setsepcolorspace + pop + mapto_sep_imageormask + true set_spot_alias + }{ + //Adobe_AGM_Image/AGMIMG_&customcolorimage get exec + }ifelse + }bdf +}def +/snap_to_device +{ + 6 dict begin + matrix currentmatrix + dup 0 get 0 eq 1 index 3 get 0 eq and + 1 index 1 get 0 eq 2 index 2 get 0 eq and or exch pop + { + 1 1 dtransform 0 gt exch 0 gt/AGMIMG_xSign? exch def/AGMIMG_ySign? exch def + 0 0 transform + AGMIMG_ySign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + AGMIMG_xSign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + itransform/AGMIMG_llY exch def/AGMIMG_llX exch def + 1 1 transform + AGMIMG_ySign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + AGMIMG_xSign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + itransform/AGMIMG_urY exch def/AGMIMG_urX exch def + [AGMIMG_urX AGMIMG_llX sub 0 0 AGMIMG_urY AGMIMG_llY sub AGMIMG_llX AGMIMG_llY]concat + }{ + }ifelse + end +}def +level2 not{ + /colorbuf + { + 0 1 2 index length 1 sub{ + dup 2 index exch get + 255 exch sub + 2 index + 3 1 roll + put + }for + }def + /tint_image_to_color + { + begin + Width Height BitsPerComponent ImageMatrix + /DataSource load + end + Adobe_AGM_Image begin + /AGMIMG_mbuf 0 string def + /AGMIMG_ybuf 0 string def + /AGMIMG_kbuf 0 string def + { + colorbuf dup length AGMIMG_mbuf length ne + { + dup length dup dup + /AGMIMG_mbuf exch string def + /AGMIMG_ybuf exch string def + /AGMIMG_kbuf exch string def + }if + dup AGMIMG_mbuf copy AGMIMG_ybuf copy AGMIMG_kbuf copy pop + } + addprocs + {AGMIMG_mbuf}{AGMIMG_ybuf}{AGMIMG_kbuf}true 4 colorimage + end + }def + /sep_imageormask_lev1 + { + begin + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + { + 255 mul round cvi GrayLookup exch get + }currenttransfer addprocs settransfer + currentdict imageormask + }{ + /sep_colorspace_dict AGMCORE_gget/Components known{ + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + AGMIMG_y 0.0 eq AGMIMG_m 0.0 eq and AGMIMG_c 0.0 eq and{ + {AGMIMG_k mul 1 exch sub}currenttransfer addprocs settransfer + currentdict imageormask + }{ + currentcolortransfer + {AGMIMG_k mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_y mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_m mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_c mul 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }{ + MappedCSA 0 get/DeviceGray eq{ + {255 mul round cvi ColorLookup exch get 0 get}currenttransfer addprocs settransfer + currentdict imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + /sep_image_lev1_sep + { + begin + /sep_colorspace_dict AGMCORE_gget/Components known{ + Components aload pop + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + {AGMIMG_c mul 1 exch sub} + {AGMIMG_m mul 1 exch sub} + {AGMIMG_y mul 1 exch sub} + {AGMIMG_k mul 1 exch sub} + }{ + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub} + }ifelse + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end + }def + /indexed_imageormask_lev1 + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + currentdict + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + {HiVal mul round cvi GrayLookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceGray eq{ + {HiVal mul round cvi Lookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 2 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 1 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi Lookup exch get HiVal div}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }ifelse + }ifelse + }ifelse + end end + }def + /indexed_image_lev1_sep + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub} + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end end + }def +}if +end +systemdict/setpacking known +{setpacking}if +%%EndResource +currentdict Adobe_AGM_Utils eq {end} if +%%EndProlog +%%BeginSetup +Adobe_AGM_Utils begin +2 2010 Adobe_AGM_Core/ds gx +Adobe_CoolType_Core/ds get exec +Adobe_AGM_Image/ds gx +[/NamespacePush pdfmark_5 +[/_objdef {Doc_Metadata} /type /stream /OBJ pdfmark_5 +[{Doc_Metadata} 848 (% &end XMP packet& %) ReadBypdfmark_5_string + + + + + + + + + + + + + + + + + + + + + + + + + +% &end XMP packet& % + +[{Doc_Metadata} 2 dict begin /Type /Metadata def /Subtype /XML def currentdict end /PUT pdfmark_5 +[/Document 1 dict begin /Metadata {Doc_Metadata} def currentdict end /BDC pdfmark_5 +[/NamespacePop pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +%%EndSetup +%%Page: 1 1 +%%EndPageComments +%%BeginPageSetup +Adobe_AGM_Utils begin +Adobe_AGM_Core/ps gx +Adobe_AGM_Core/capture_mysetup gx +Adobe_AGM_Utils/capture_cpd gx +Adobe_CoolType_Core/ps get exec +Adobe_AGM_Image/ps gx +Adobe_AGM_Core/ps gx +gsave +/0 +<< +/0 +[/DeviceCMYK] /CSA add_res +/CSA /0 get_csa_by_name +/MappedCSA null +/HiVal 255 +/Lookup <~ +&.8dE.Noo73WK+A)8FN#^TFHs1B7A'1aa^P'!]gb0)PYj4"i8fIVEL*]n6Ig\rpb\.J!KQDH^6H'FkNO +(D%&VN-9=a)UeWg;F!PK'+GB5i=e"fYV,o[d'%YTN97&@I9#6b51Q@F?8/cYhsf;Dt4A!O2U&Xo< +l8^#@?0`D"sXFjRi'n^`2Xl>$#><$oK=2(K1e%WlOf)kE#jT7V,5["0M)4"Vu`LNIe +],j>7;$[R4$8NJm48CQQa'6n9mgT,a8BQSM2&ISpG2#mS.75Zk$g9#?n,N\q5-m'H07DHhn\q(Oq@%*P'iEKd\"..@0JIV*'s+lWG+'r7`.0-MJ=Q[Np"/*-^ +A1hLA#ZBBW*Dd6TO:-C`?jL0GU49,=JCf3q-$3pb8C0"C;-QO**/bo>ceu2_&#QkA5:J>*q%HIHi$3U_ +:Q]&+]J89!5"B`#2G@Y@n]rn-Q@o,u&ae*H:ae=>u76jZL"p5&0'S($#]R^(`T6aEHOa(pg,1l;i&e#0 +K@Xj=T\paVZ^lBlH%L;#(' +4.pT^f&Ue^#G["8PD1&30FC8GZKkk<2JSoH@h5Z!A(C_#X_i#B5=@Pm_d@`]8Ea<,X?;45r>Y.Ec!t5D +7dACYE$j@"=>"D$]@80Ap<'inO+;l't7Q37+0-MbE+m/e3Z\hp+Nd,gmK5><7`120OOEu@'@8Bc%[td! +Ll+DS&S=63tiNdfF9KP67"s"BX'4=c>(_RJ^&IAmH9KYHTFk-Q4-.3<0"@2ZNe +7.ri?+2^p6W90569!k4M0!\T_ho',_jG7#Oa;3r-6+$+)\Nkc/gDVAR"^&HMM-R6+PHc +"#R(A3%ZQhU6o$k)>Y%Ti$#dia+W;:"6AN,b'FPHP0-hkEc(T,I)2`b@5;P%p +>> +/CSD add_res +grestore +Adobe_AGM_Core/pt gx +%%EndPageSetup +1 -1 scale 0 -123 translate +pgsv +[1 0 0 1 0 0 ]ct +gsave +np +gsave +0 0 mo +0 123 li +328 123 li +328 0 li +cp +clp +0 123 mo +328 123 li +328 0 li +0 0 li +cp +false sop +/1 +<< +/CSA /0 get_csa_by_name +/MappedCSA null +/HiVal 255 +/Lookup <~ +%giUC.3K]44Sf"2)Rd<\\uVaQ2Y$ei1F=LM&urbK1$noW3@ui`H=^[q[!MuWY_m$?.cp[ACKFU>'+G?M +((^rULN.;M(s;%E:H^oB&e,3K+4p;m$ts2PO`b(F6iI$PSVMhY[XJ\daI[TNFDH=="9JW)3VED!$3pb8 +_2gDX@o-&(5Vk4saId-*/*d-Gz-K+n3'o[_E]7h=-]o"-<)AXl>Af<.`gKI9,T7R$%=W^*7@gLt#6b51Oa;9u1&V%la.$EeA<*B:&=qNg*7F?[&\-Nq*Q#f!'b:`Ra-os +L[>\'%TRh)1)5j)-_NI"h%13=?*u5Oj=B&c2$T'(.(;eo0*#0%c%WH(])jZ3ZR=0#tX*Q)n3@lW[K5br +K,i/J,$[$Xn7lWI.9>n\-'6IgdaI[cZAT)Z"&.8dE3:m.q6SgItaImK@,2;r"-QX6-8$oWMY^$o_@$HQ +n,8qC!0dS%E(_I;Z]pNt3/a33JZ[a/!<^T1R>E+CUEfHqY.-(=:H=C7e+P,`\'qLiq/Kl5:P'Cpd.G<\ +i1LaenX,D9bCft!F9KP<9c),hm5PkC%#mUV6B2_e2-6*m'0C&QQa.-9Y#QkA59hARi%GL^\$3U\ +9Q%u/7Ht[7'"BDK&FCA_cZ_O+\?qsDr]Tm:j]9n+I6U"3E"p5&0'ROKnZZuTPQuu76N,rnS,L"I=&e#- +J@=!VBY]^!H[Y615%1!:@H9)no +t.Ts%X&9r'mFBDNECj;HoEEl`OJS8O$I;3X1adml_((ClV\Uk_#"VKh=@P[Y!Xo; +6_jY9t$O$n<=%,FU>tRWf;*[AH*uGjq6oHn&/g)MA+l*)&We4CiM0!eYIq`O(\W_8*N-9Ig>tn)pY(/M +9cDcA2S!9@LbbKGb8NA^0"rn9V'4"E7(_IA\&-r^F8if$6aIZiq2_-K\2_-BY*#07i,oIg*4T#.43qiS +'.rDZq2(0pS83&^2>.MOLG%"nd)PCIp/L4=Ut+403 +U#R(A3%Yp)F681G#=[bs`$#@3S+;l't6@l +>> +/CSD add_res +/1 /CSD get_res idxcs +gsave +clp +[1 0 0 -1 0 123 ]ct +[328 0 0 123 0 -7.62939e-6 ]ct +snap_to_device +<< +/T 1 +/W 328 +/H 123 +/M[328 0 0 -123 0 123 ] +/BC 8 +/D[0 255 ] +/DS cf /ASCII85Decode fl /RunLengthDecode filter +/O 2 +>> +%%BeginBinary: 1 +idximg +c2S(r,on"pLp$fO&,o?2%hr]QLc_%G,pgh9K)^Z,"XPH8nY?^72/R@?Vu==QM2;_!M'5M`j89)^`\2"] +*@3#&s+:9drs^7pnJ'd[r(2a0[pWUEp72Ynk?pjB%_KdW2,B#K-0kM^s+::Grsg=qLem?koJ;Y/dM$dX]11'+;#@90V@$2"0!]-rr$ha;-%u;Ms8;m%,os/i^.=f5`sW*BkDB!K*@9)4K)`1W"so`)a5s@.k6h>0Df>V]s)7]@mL'5* +SWXZ+nKj_*KE(08"so)k^.=e5ljEu8?8A&fX8$'*X.;"$?Kqn%1?T/7!$1;'K)_MD#ULK*gbZ!;$QAXF +#9"Kg)Kmm,?j.N_.kE5_qHF>=AXb5$B4jc9SR-76)Y+7@)K-E!a4D=X[JtjYf)Gq#*A:ocST"!9#&g%K +?n6eZo+q4-#%]>:BBL'dmMZ;#8@paJ-3&SsNW0/.R`;u&1Ai'`)?_f381Q7b>P_q)Rfk8m8=a)V)?hnZ +M/A%pbl<:p_uBldnMh]T?Lf!;Fu&5nJasTQ>P)J//8#bS!9itl"a6r!m2mXAs+::Hrrsd*D1em4kk5o" +kSeW8k::*ZoNM<,rNbr]rL3m?B<*fZ)@#E:(Zbk)-0,#Ws02M,-&;T0X*4*u!]&phqA/j1rNcDjs$ZVY +rC$UR"L9R:X3gG$"J#nSUa<5EK)b!5"XSs*]rQ>KkQB0J/,T8\qcir,!4)M_o-aM6r^6aUriuVWB:X5< +kQSPg$K@j-qYu0ISc8j>46qO"G4k&$\t)AnrYGN#:1BJcf]J_](`cG1.]mqr/MOX@Q?I>nj#J>I/m4C#Q+\t:Ak:n;u_:F>R2])>l0(^ ++fhC1\c`h_lT6EKs+:9crra?&;cA)q]*[d7f/&uj-j2:r,,?O#s+::/rrX;8]bgAj&u-8X47R"?D;l41@KSlD +#6t?*r)rh.r_3,&qeZ4Y!:]u[%Sfb$".rLB9-X2f!"TR1qC)7i".]ed4,a-*rraW$]B>s_-j6Tg4$05I +&Dc[,].6-A#6P'2&eb+9!>S<*'`uM!@K%VMHMe6NH4hQ5Ci"KHT7B[*QM^sQ&0I^#Sb4B5(Q$rgf)L@% +c2Rnm*soF'p*^Lh`#h(E%hI9/r(AR2:'V"+:&8#f')kT"(&2VDHk5`9T7B[*%`eB^h4TSV1G\YP"Jb/? +TI$?4KDtol!cbmipF$\((Cl8k<>5FH.KL`ZB*SNA&kl!r(&>rS@4!=IHMS*C,SP;0%=3=I@61fLi]&gI +T^gWucme`<"Xu26q3iVss+:9]rraX@'Bc.b.2##0T^a*e,D#%N=-NADl +%K1VP-4jToMekH9'46XKf.UfnlaP77.0CA0llEV9K)b9=".B7R6h`#Fcq#k\*u(O@*u*Q,@tUIL,SEcc +(!4Sr(&Q)T@4#D0rd+AL"Ebt8Mi7Q?rJUV"&9TgPDN[QtD0$4@03*h`X/#DK!d/XDrWrF['6T4kFYn5YP/I37.MQRJ03*fA +(\T9[S[J/3cMrLrgA_82gpbZ).1d<7naW8cnaVF=&,+et1UL<`9_T;"D#[rC-Mi&e%KCSLMthE!%;q?@ +quJJW'NJhu&0GSn6h`#4UZZ-_-(=jrrraVtM&.W9/ca64jV74b'Su:8+&u*Vgr8BW9I._g@JqPQ@K%VN +HN"BRFoN`_MuF"U64jJE#XQ\HX8uK8!3Zpb%j,ZOp+?G7P]7`)s+::3rrfMs4I%YbrrY@;8C7)`'^'?' +Y7Ii,nVA7e&3+#gH`[nd9MG-prbVRBr$M5crXJmMrepSp&N"WJbeO&V0Fn/e*tQtr+6+12/cu\q!%"lL +Sc8cIk:ur7!&RR!f?(aVuP0E!9a7Y!&FlHN"BIFTRJDMuF"^6MUm"6An-m^\e+9%ffV5Y5m/b*sSe>/ct4V +M!"^>h;p?or;Hnc)+ji_ro`hObPqPdqr[s9mf3.Hhu<]4rZV?-!ri0RlMgr4&%eG-/d3&$L`]Dmr>uBM + +aZV!HHN,>kHMnss0Fn.`r3$560;RU!pE0Q*ji/>3s8DruY6=k( +!L9k^rr_?cro^fk!$_@?!/^:H!&=HO!&<.+"#9fS1$eiA*I\>_p`Kc.8Zuf'YHRh'#QUM/ET.WfX_d`X +!%.\kr=/^JrepK.rs8?c$O@#r5mg0iD(lK6!;fb!F.`Lhb4m(]/n!H(n,EElQ2^a`Q*9i[!\s];k5Wp1 +!$_@?!!Mon!$_@?!&<.+"#9fS1&:kArrXPh@hJGX"KSD":S@L`$"t#+ET2X-5:#.Y63.6VrWW:8q]5aq +qAo^r1c5"0$oBdX1h6qb#m"4*TP43&"JBf9+rC(urZD:Z9+N?1\rW*/*oD\kHro^fk"![aD"TJB# +8bE#_)>sI61"cL.1&h/,m/I27&;_3&qB,r@6a]p-:\XnrBG;#T#)'BK%H%/CoSW\Tr'L/^"@<8Y"U4^9 +%NZ[*Bc(PM$:tP@0Me?Tq>^UnT\\f*+9P!=p)W]'!8[VQ!(lGT^Ae9Zrr.cRrW"\Grr_*Vr\=EO!&fZ]K0LW9oEbC^quuk0rWN@;Bcd!+#8eLJ$H3rraPFrr3-#rW)cfrrX/!^#.EpJ_<(M?".e +!;QU#BG=6"Eas_dMss(4"T`<@o4\=K*oPs5rnmc5r87l&5mkR;D(nbYB__W1%flNWpJ_2+';Y4!!3cA# +!/^[SnG`ng4I,n#s8T8prr*&rr;QdA9)SYhQ&5;9!jCbir;Hd9M>ie#1&LtR,6%TA +kPkG\)>F.6YQ"M=,6%QA1&:hNM+[dGrW33?YPS8-q;k6JrZ_CBM$3hW)?0X<1&h/,rVllnq(Vl+qYpTs +rLWd`"NnCXBP@,?$YU4cL6fg9Rs8Vcl!#be8!!M`i!$_=>!\s^Ir;HgCs8T9frr*5e +YQ+VH"TJB'q>C6pQ2^dErVm!l"TJD`rVltbrr.cQrre/]rr2$VrrjVGrrM>[>Q)?0X<1&h/,qu6aB"TB;5rrX9$$:FSf!>0eQBF1=G:KDog +M/\@irBgGgs$H\jrs8QioEG7]rrrC9q&ToX(hl9_'<-jC&"oThBE8c6pf%>m[g!lErr=eQrW"\>]s"XNP!/^XR"g8(.rWKG(rrYjlrYbV5"![aD8cJ_lM>mK:qu6bTrr+,=rrjVGrr<#S +rr)p$YPS8&jo56's!%IA!&=BN!!N<#!9a=\!/^^S!;ZNl!$_FA#NZ*fkmJl +pAY17EjtgC!`mMTM>mJS4So'X,6%QA9)ehmkPkJDqYpWrrqZQn"$HS^ +8c&Girr0,$s8Ds!,6%T@rr=eQrW)'VrriQ)Q2gk.rr)mPqu6furWGh;rVljArr)mAqu6X?r;HhUs8PZo +rVlsSrr+YNrr\,WrYbD/!q@IBpq-XMHh1nOTG.`/=onOEE!7<@*Zk5n!$;&Pq]>[nr\XT3ruV3ur\XBO +$8g[,P_@gO0Fnkjp1OJ&8GBb!(VZ[ko`+mh!9`qQq>UFLrr)p$YPS8%"TJB'YPJ1u1&h.Vq>^KXrr,%W +rrV$Urr)j!1&h18qu6`nrWN)t![@XCrr2sBrr)m#qu6kWrr.cSs!%IA!&=BN!Jr#srr=8BrW+5Cr;Qa@ +rVceRq#:FNrr+YOrr\,WrYbA.!i/C"pq-Vp_t.OJTG10UD$cMI"W74[o4e%Br8@Gnro!c4rrW3Wr\Os! +i'B/Pi]&V&'VP,4!PQYN]E<_M=UZJ,6%T?rrA>`rW%fQrrN?&"TJE$,6%QA1%P>E,6%QA,5_B?,6%QA4SSj^1&h/,s8RrTrYbA. +"!nK(J,?nX]E+V`o4SLG'MgE"$'oNeYi"@;!rb%U!rb%R!r_$TLAp*0!W_-ML't5?A2Anu3-,TETV2!l +!Js2=]E:O7.OFcf!WOnRrW"\Wrr@oSrW34ZYP%ns +,6%T?rr@oTrW"\OrrXJEroO.Z!$_FA!&='E!$_FA!$_=?!$_FA!$_1;#Vl>X1&pG9re^7H"!uP/6hn:p +@".]\$D=%&0T'5UE'bB_rb;$/q.]Y=rrr@8q&Tq%*Z3g$[FF2UEt8uWBE?dRpq-^O$MGM4rr>[jrW!)d +rrY"Tr\=6K!&=KP!$_:>rr2s$rr2os!)!1g!X'D:q>UFLr;Ha#4Pfc3![@XCr;Qa"rr)mArr3'TrWKG( +rr=8BrW"\Drr=8BrW"/>rr=8BrW"/:rs(:Xr\5;irWN3"pAY4@h3?(X]E0ZmMXmDF'Fu\ZWPia4r.a_C +!8mO*rW3)WnqIB[[:9D\Et8uWTE=,&/cNE\]E;$?D&r9K!9a=[!;Ys\"#9fS1&:hL1&h.PYP8%s1&h.T +h>dMY9)AMf0d?Mp!O"6SrW+bLq>UL?rr2lr!WV?^rWX8?s7uZnkPbD\,6%QA1%kPKY=UjArr)mAqu6X? +rr)mAp\t@Nrr*$'rr)m8oD\n=E=,S=/HSc]&+ZA$%o4\@ikKF9(uXLVf]rnd\WoS*UTL1IuqEcH.$ +:Cm(3!IeGO/H\jX#+G/`!!N<#!jC54Sf!W8H;B[rW)-Y +rrODDrql]q)?0U<);Y;k)>sL7,6%QA1&LtOq3CpX!sD6Zjo55Z,5_B?,6%QA,5;*@1&h/,s,$^R!(lk` +"!%D5;>DdEb.[Wcp_3uE:F\=.8U*(rr;ugPr8@<+rW3-X1]mV4o`>H(!^XMtEi*nR&+gP:p0dVH!asbE +oD\fIrVcf[rr;Zk!r4%rrr3'Trr+YJrrrW(dLrrV"="TA<"YPeD%,6%T= +rrCmSrWE?rrr1aOrr=8BrW"\Nrrq3]rWF,#!;ZWo!$_FA!$_=?!$_FA!$_1;"u6,V1&q7krr)p$q=agj +*UR63q(2WiKCKW^%o77+#"a%rL5,[/q_\-,n21,$rW3'Vq>ppZ6%d3uVK5NDoFq_ +rW)ccrrOqSkPkJ`1&h/,q>UGOrr)m8q#:=crr)m8rVu`o!O#,prW"/9rrLq1rr)mAr;QgBrr2co!)!1g +!&=BN!$_FA!&=EO!u_+;1&LtN,6%QA,5_B?,6%QA,5;*>1&h/,rr2sQrr)q`YPA,#ruLoC;>E-Ob(K7! +$4dYCF)c6>Gi,_BpkAe+quQlUie@aVL-^H,q5/3D&+gP:%q,/k">(5`M#[)H!;ZTm!UT$"TJB'q#:=3rr*'Fs8V9]1&:hT1&h18s8V9]1&:hO1&h.rr;QgBrr2co!$_@?!$_=?!$_FA +!&=EO!sJW&1&LtN,6%QA,5_B?,6%QA,5;*>1&h/,rr3#&Q2^a_1&(\M*HGObq)8>sKCT]h%hDHWVK*>p +Bs9ENi8>XtBc\>oC&D]?*WY-g*Y%&c*Zc.>5n5)f2009=o+V14pGW-cr.snC!/^[R!E-Ob(K0o#>]D\EYE\P +Yl,F4L&g,iL'Y#UBrkPkH)qYpjarr1aRs6'C\q>1*o)?0W=s8Ds!,6%T;rr@oTrW%fOrr=8BrW"\Nrr<3$ +rW"/@rrD6\rW"/>rr=8BrW"/:rrY"Tr\=?N!$_C@!/^OO"!.2F;>E-Ob(K0o$r:qaq%Iuo(]jaq1uRsH +!T5$mhuGV)i!>&o5n9uFVK5Q)%fp`ZpGW.]$&J'M!?q[FrWiWE8_sFH,3>*grW)-\rrY"Tr\=0I"o/<# +rWFGErrLr@rr)nSrVm#`rr*%Wr;Qjjrr*f7rrhNarWGgjrr\,Wr]L)X![@XCq#:BurWN&s!$_FA!&=EO +!#be8"p@%[k61berr)p9k5j`irr2sBrr)mAp\t=Mrr+YLrr@oSrW"/=rrX;/85]1A!Qr+F%gPmOVYPmi +h\c3E"9O=4hr"21l%].k#N%h(quJZr:\,(t`aJO"!asdQmf*?lk61AT!/^FKqYpTPQ2^aaPtEe1rW*-n +r;Qc[rVd!(4Qkmmrr)q`YQ"P%kPbAc"?bl1Q2^cJYQ"P%kP>)W,5hHBjo1,7rr=8;rWE3#Y6=_$!D;(c4O8quKi>:\,(tEY8(*"&WJ%RcseJ ++onh/rrDln,5D0@h'1\Ts84&@YP\>&h'1\Ts84)+rrCm@rrDlo+opHtrrMp>huEEM"!ogh;>F#i2dh+) +%gc$Q2$&AThlmq7p4iPJiJ%WBL-^Y&!EO8;o+(j+J,N4A:]jQc!?I*uXT&AKm"X!i/C"peUus +QMV3f%h)60F&i=>738Z7!]2b3i;XkpC%rbCi;XktBau1u*oPrn*c<-.D,t^R:\5.uK2MD?"'lC4-0kM^ +s3(EDLrWou:]XG%nP9H&F'D;(uT9T?Yrhb&G/a"&&A"C1`1uF!rOk[i8>Xti8?HMp,)^Lq_SB4i#_jT#rICp +DBWA(M$pJ;!a@u10bK)`7Y"!-\7;>Ro2#cD7*bc\nC&\A9"ncR2*Zf%n +*rTgN"Uf$Y"_g;@Q!JGst:]mZ*iZ6eRs!%%6!d92#!+rrGan`rG?("!oFL;Yc7Q +:k*][:BqFa0K:7F!jMWX!8mYTr&"!Hr87GSq_S]_!]1`NDO.8=qlm;0$!S1BDs8Ds$92#*S&-J^>M,O,-"/oV^47iITs8Q1f4nSa_#n@:ufrtEK9E5"m +9E"krp)sbM8Lj`H$NC&2*D&m)s8N*0$N<['s8OPl$49A.rr3-G+rpk\9Dnhi,5qNL!DEIm%neAr1C?bc +rVmT*%LP#F$46b4Y=gYY$6f-Crus6Tr_!M-s8N*C$49?8rr3-.%LNP9pJ@;L8sNV"G9' +0/.CI70OP-i;XksC%;H*"o`63"TUmg"oUao1^Iubgheo&0/*,4"P@DD8>uKS +$:tQW$46`*9E5"u$NC&3!=BtV+u;ml#n$\3!_EaPrr3$#%LW2.%K@mb%LF=81EHMq9+E-E$N0r(9E"l9 +#n$_4.LIsA#pM/8*WQ-?$6]]^+USPUs!f2F#mh(KpAZ$J>_0%SP[Yo`#"> +YCrMBN!6/OEY-)%p(.N`0QF0_"gBiAi;=YrC&A/3C&%r2B`\HPC&J286N%)e64)NTDO0'p2(C74q@Ed* +N=c#;qMbE4"+SWm-1h->=@,/6AbQ-*.LHCZrsc1*s%?#brs9&4ruEmerr39F!WNH5s8UaZg&1jN#n$Y2 +%ndBQs8NT:$31#u$;%H$YPeG#9E"kp#n$_4.LHL]rs1(]!WW0U8cSems8NE4q>UU.8cSf`9E"kl%gjfc +rrjDM#6-J'rVljId/O1gq2u0]4p5.$&.alr&.*D3ENDS7(^35mqa0o\r/::Tregc!rJUYt#rHccQDn^Y +0J>*U&-Sf]&;(Dd4p.`kr.t"F!Pht>4TRmbpAY.;1]%+U92#'DFo=H'JGT-Cf)>XK9D\Yp92#*V&-S)j&;a#27rrG\I$46g[rrX9YjUCoJ +"Uku[&Ak7<0*ZK$lQSba)#@tG"o^gg"o(F`#l$^d6MC`mM^1,)3gQa^2)'+K0*U!f&8`#%a%f62492#)s+Z%XJr;QjF:VM>R4pK`aLG)G_ +&,@j_F'@mE7>i#Y6N.5jMuEt^MuF"]Mu7_nMt_An%1"#$3gSQ<2)'+L0*b:4fIm_452,fr"'r=j-2df; +rrH4gr]L83pAY0p$7c#S$kNA29E5"u$NL.0$46\2#S6qA$NL.Z$;:;ArVlm)$I8YR +4*!k#pt>l[&TTP#NVP43F5;^g7>j#"6N%2hMtr;-FTm\GMfj0#rH7oF$@7#V-9@IJD)F"gr%A58O=tVd +55k\1-*=ak0.KL\!s%?#brs9&3rs)+&+tE:X9E,#!$NC&,fa?F2rrEE5rVm6+ +$:u`@+UYFQs%?#[rt,8=fd["q$4?h5.LJiB.L%[Prr4H@1BAs31C=Hgs%,!I.KL"d9E5#9$4/3UYQ#aQ +fd\HU%LN.Bg%Hlr1J-j2k5PN0f+)*\g')tQEtF>,qJufo_pD)F$GEs5@!UiU&2pY#a6b7gNpmf*@(J3EN(!O!sQ&+ff&*@`Q(rrO2j.e!B=Y::RjrrjkZ +.^(<4qZ$RFq>^IEq>UL,.^/gN"!&j@YPeD%.OqY"s3UcJ-/B&:pY#gLkDF>VRSWj&"u'(pa$g7Nq$$FX +"pbK\jQ(V4p^$eUr?V@f#<`MWQ="Jd0`H+t09(s4!U&_Ag&k4[lQ,?l!l/s/^&RU%!\+O,RfT=fP(ddV_bS@Jam<'aH!!3gQ`G2),#N"i?6pF+[Bb +g'#6"'5/]\s8Dru=OjMQ!\+O,i;^Cg"!&j7lM'!:l-"9l09*jIEs46T!FnPDoa(AO":]n0Ob*jjO\00+ +%lr,>scl*P)4)rrTA1YH.]lrraY<#.G$8,7m`b?ZQa; +UiUT20W"m#74&3;FT;mLFo;dHH3+h!9)BJ.Oa6G)q^28Ms(qTJ%sesOQjHfqL9&kl!r')l#Bk#qF%aLSibq2A5dY%2(^0[?edAXJp4@MK,NlFlEdJ-ThIWJaUo90aV$X*%_m[3?ZH25VDVCXr@e^b<`Z)T!r*'+Sr)sLdEG^0( +XOOup$I5nGr!*Cd#<(ufFS'>O>m^dl-0P;[s0DY.-1M!lIrt@!"a!XoGnNIB9FMO9Ts_gl,,tBT32TaT +>5g5S0`G5a4sZL=pm3-D>@ORKLm?"XP721[9)WCC(ql +e'ZSKO%i><$24f!r5d_SEH*l6>4aNK>5qY&V@`G%gCoFf*;)cj9h%@pKk;;"CB[46P5Lt!`;bGhci4.p +YO/`IqY=nC)eOfOO[eJ-7]h0YA,P`MpqjnDp^f,_nh:jk:Y6pn48jr_E\.TP1!oOT([_OJ#B, +VM]gG8/Y%Id5F]g[*d?7)uFCSF?GfB!%$7sK)`@\"XQ5icX;A'C]57aB%,.ip%Qk]Kp[J;mX'_++2S4G((sL!e:nPI/`dr>Y`O"g6#Y!?WV]s+C@;rrsdKlBC]#+b +B%)GO2UTp+e'hoEJiq6A[YJUHqHPfMe'n;Ms3q![r>PlTJl30m#O\XLLPMdJVYjU*21B;XLR,Au@-UYSqATZO\C8o\ +L!sZ4)[:(`[tNS+-+3c)s3puT*O"jekCRIg)eN^]df?oWB)!;OCP#GHctFVR+!nu-K)`L`#:1C`#)VM@ +C]7qo)u1EW)%jOg&03'Zs+::>rrsc2.f>MCK$##:K$+MS`eYqos+:9Hrs0nkYNli/b8D8_B'E?(1["2/!#sU'#gH6Zjh(="RO,?@ +K)`Rb#pgUf`r%!hbO3X3\-\O#cK>\8l_'[mr;VBKK)bB@$RHgL0*,PmP$h1>FQU(@R"A3J8A,]4.N]ZW +`W(PiV#LuPR]e4.j!!MTc9)uIbo=1AoXG!8FNoCF>s([>M%^(NBUU4nNrOb3f)H7,,os0B39#T7]aEq1 +bDlWD="'e*@9;:K)^Z,"XP1X*tKh,lhLis]9\;+^&Bet[CqE_]@m)dD;A!kRN3]F +s+:9]rs9tt*?@3`U_HTXr$i"+:D + +%%EndBinary +grestore +np +grestore +grestore +pgrs +%%PageTrailer +[ +[/CSA [/0 ]] +[/CSD [/0 /1 ]] +] del_res +Adobe_AGM_Image/pt gx +Adobe_CoolType_Core/pt get exec +Adobe_AGM_Core/restore_mysetup gx +Adobe_AGM_Core/pt gx +currentdict Adobe_AGM_Utils eq {end} if +%%Trailer +Adobe_AGM_Utils begin +[/EMC pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +Adobe_AGM_Image/dt get exec +Adobe_CoolType_Core/dt get exec +Adobe_AGM_Core/dt get exec +%%Pages: 1 +%%DocumentNeededResources: +%%DocumentSuppliedResources: procset Adobe_AGM_Image 1.0 0 +%%+ procset Adobe_CoolType_Utility_T42 1.0 0 +%%+ procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%+ procset Adobe_CoolType_Core 2.31 0 +%%+ procset Adobe_AGM_Core 2.0 0 +%%+ procset Adobe_AGM_Utils 1.0 0 +%%DocumentNeededFeatures: +%%DocumentSuppliedFeatures: +%%DocumentCustomColors: +%%CMYKCustomColor: +%%RGBCustomColor: +%%EOF diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/CrossMark.pdf b/inst/rmarkdown/templates/opmi_article/skeleton/CrossMark.pdf new file mode 100755 index 000000000..9b7b2a80c Binary files /dev/null and b/inst/rmarkdown/templates/opmi_article/skeleton/CrossMark.pdf differ diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/OPMI_logo.eps b/inst/rmarkdown/templates/opmi_article/skeleton/OPMI_logo.eps new file mode 100755 index 000000000..56ab564a5 --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/OPMI_logo.eps @@ -0,0 +1,12233 @@ +%!PS-Adobe-3.1 EPSF-3.0 +%ADO_DSC_Encoding: Windows Roman +%%Title: A9R1c34519_1e7x0gc_2ks.tmp.pdf +%%Creator: Adobe Acrobat 11.0.13 +%%For: AmyH +%%CreationDate: 4/8/2016, 7:20:54 PM +%%BoundingBox: 0 0 149 201 +%%HiResBoundingBox: 0 0 148.6800 200.8801 +%%CropBox: 0 0 148.6800 200.8801 +%%LanguageLevel: 2 +%%DocumentNeededResources: (atend) +%%DocumentSuppliedResources: (atend) +%%DocumentNeededFeatures: (atend) +%%DocumentSuppliedFeatures: (atend) +%%DocumentData: Clean7Bit +%%Pages: (atend) +%%DocumentProcessColors: Cyan Magenta Yellow Black +%%DocumentCustomColors: (atend) +%%EndComments +%%BeginDefaults +%%ViewingOrientation: 1 0 0 1 +%%EndDefaults +%%BeginProlog +%%BeginResource: procset Adobe_AGM_Utils 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{currentpacking true setpacking}if +userdict/Adobe_AGM_Utils 75 dict dup begin put +/bdf +{bind def}bind def +/nd{null def}bdf +/xdf +{exch def}bdf +/ldf +{load def}bdf +/ddf +{put}bdf +/xddf +{3 -1 roll put}bdf +/xpt +{exch put}bdf +/ndf +{ + exch dup where{ + pop pop pop + }{ + xdf + }ifelse +}def +/cdndf +{ + exch dup currentdict exch known{ + pop pop + }{ + exch def + }ifelse +}def +/gx +{get exec}bdf +/ps_level + /languagelevel where{ + pop systemdict/languagelevel gx + }{ + 1 + }ifelse +def +/level2 + ps_level 2 ge +def +/level3 + ps_level 3 ge +def +/ps_version + {version cvr}stopped{-1}if +def +/set_gvm +{currentglobal exch setglobal}bdf +/reset_gvm +{setglobal}bdf +/makereadonlyarray +{ + /packedarray where{pop packedarray + }{ + array astore readonly}ifelse +}bdf +/map_reserved_ink_name +{ + dup type/stringtype eq{ + dup/Red eq{ + pop(_Red_) + }{ + dup/Green eq{ + pop(_Green_) + }{ + dup/Blue eq{ + pop(_Blue_) + }{ + dup()cvn eq{ + pop(Process) + }if + }ifelse + }ifelse + }ifelse + }if +}bdf +/AGMUTIL_GSTATE 22 dict def +/get_gstate +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_clr_spc currentcolorspace def + /AGMUTIL_GSTATE_clr_indx 0 def + /AGMUTIL_GSTATE_clr_comps 12 array def + mark currentcolor counttomark + {AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 3 -1 roll put + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 add def}repeat pop + /AGMUTIL_GSTATE_fnt rootfont def + /AGMUTIL_GSTATE_lw currentlinewidth def + /AGMUTIL_GSTATE_lc currentlinecap def + /AGMUTIL_GSTATE_lj currentlinejoin def + /AGMUTIL_GSTATE_ml currentmiterlimit def + currentdash/AGMUTIL_GSTATE_do xdf/AGMUTIL_GSTATE_da xdf + /AGMUTIL_GSTATE_sa currentstrokeadjust def + /AGMUTIL_GSTATE_clr_rnd currentcolorrendering def + /AGMUTIL_GSTATE_op currentoverprint def + /AGMUTIL_GSTATE_bg currentblackgeneration cvlit def + /AGMUTIL_GSTATE_ucr currentundercolorremoval cvlit def + currentcolortransfer cvlit/AGMUTIL_GSTATE_gy_xfer xdf cvlit/AGMUTIL_GSTATE_b_xfer xdf + cvlit/AGMUTIL_GSTATE_g_xfer xdf cvlit/AGMUTIL_GSTATE_r_xfer xdf + /AGMUTIL_GSTATE_ht currenthalftone def + /AGMUTIL_GSTATE_flt currentflat def + end +}def +/set_gstate +{ + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_clr_spc setcolorspace + AGMUTIL_GSTATE_clr_indx{AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 1 sub get + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 sub def}repeat setcolor + AGMUTIL_GSTATE_fnt setfont + AGMUTIL_GSTATE_lw setlinewidth + AGMUTIL_GSTATE_lc setlinecap + AGMUTIL_GSTATE_lj setlinejoin + AGMUTIL_GSTATE_ml setmiterlimit + AGMUTIL_GSTATE_da AGMUTIL_GSTATE_do setdash + AGMUTIL_GSTATE_sa setstrokeadjust + AGMUTIL_GSTATE_clr_rnd setcolorrendering + AGMUTIL_GSTATE_op setoverprint + AGMUTIL_GSTATE_bg cvx setblackgeneration + AGMUTIL_GSTATE_ucr cvx setundercolorremoval + AGMUTIL_GSTATE_r_xfer cvx AGMUTIL_GSTATE_g_xfer cvx AGMUTIL_GSTATE_b_xfer cvx + AGMUTIL_GSTATE_gy_xfer cvx setcolortransfer + AGMUTIL_GSTATE_ht/HalftoneType get dup 9 eq exch 100 eq or + { + currenthalftone/HalftoneType get AGMUTIL_GSTATE_ht/HalftoneType get ne + { + mark AGMUTIL_GSTATE_ht{sethalftone}stopped cleartomark + }if + }{ + AGMUTIL_GSTATE_ht sethalftone + }ifelse + AGMUTIL_GSTATE_flt setflat + end +}def +/get_gstate_and_matrix +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_ctm matrix currentmatrix def + end + get_gstate +}def +/set_gstate_and_matrix +{ + set_gstate + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_ctm setmatrix + end +}def +/AGMUTIL_str256 256 string def +/AGMUTIL_src256 256 string def +/AGMUTIL_dst64 64 string def +/AGMUTIL_srcLen nd +/AGMUTIL_ndx nd +/AGMUTIL_cpd nd +/capture_cpd{ + //Adobe_AGM_Utils/AGMUTIL_cpd currentpagedevice ddf +}def +/thold_halftone +{ + level3 + {sethalftone currenthalftone} + { + dup/HalftoneType get 3 eq + { + sethalftone currenthalftone + }{ + begin + Width Height mul{ + Thresholds read{pop}if + }repeat + end + currenthalftone + }ifelse + }ifelse +}def +/rdcmntline +{ + currentfile AGMUTIL_str256 readline pop + (%)anchorsearch{pop}if +}bdf +/filter_cmyk +{ + dup type/filetype ne{ + exch()/SubFileDecode filter + }{ + exch pop + } + ifelse + [ + exch + { + AGMUTIL_src256 readstring pop + dup length/AGMUTIL_srcLen exch def + /AGMUTIL_ndx 0 def + AGMCORE_plate_ndx 4 AGMUTIL_srcLen 1 sub{ + 1 index exch get + AGMUTIL_dst64 AGMUTIL_ndx 3 -1 roll put + /AGMUTIL_ndx AGMUTIL_ndx 1 add def + }for + pop + AGMUTIL_dst64 0 AGMUTIL_ndx getinterval + } + bind + /exec cvx + ]cvx +}bdf +/filter_indexed_devn +{ + cvi Names length mul names_index add Lookup exch get +}bdf +/filter_devn +{ + 4 dict begin + /srcStr xdf + /dstStr xdf + dup type/filetype ne{ + 0()/SubFileDecode filter + }if + [ + exch + [ + /devicen_colorspace_dict/AGMCORE_gget cvx/begin cvx + currentdict/srcStr get/readstring cvx/pop cvx + /dup cvx/length cvx 0/gt cvx[ + Adobe_AGM_Utils/AGMUTIL_ndx 0/ddf cvx + names_index Names length currentdict/srcStr get length 1 sub{ + 1/index cvx/exch cvx/get cvx + currentdict/dstStr get/AGMUTIL_ndx/load cvx 3 -1/roll cvx/put cvx + Adobe_AGM_Utils/AGMUTIL_ndx/AGMUTIL_ndx/load cvx 1/add cvx/ddf cvx + }for + currentdict/dstStr get 0/AGMUTIL_ndx/load cvx/getinterval cvx + ]cvx/if cvx + /end cvx + ]cvx + bind + /exec cvx + ]cvx + end +}bdf +/AGMUTIL_imagefile nd +/read_image_file +{ + AGMUTIL_imagefile 0 setfileposition + 10 dict begin + /imageDict xdf + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + /imbufIdx 0 def + /origDataSource imageDict/DataSource get def + /origMultipleDataSources imageDict/MultipleDataSources get def + /origDecode imageDict/Decode get def + /dstDataStr imageDict/Width get colorSpaceElemCnt mul string def + imageDict/MultipleDataSources known{MultipleDataSources}{false}ifelse + { + /imbufCnt imageDict/DataSource get length def + /imbufs imbufCnt array def + 0 1 imbufCnt 1 sub{ + /imbufIdx xdf + imbufs imbufIdx imbufLen string put + imageDict/DataSource get imbufIdx[AGMUTIL_imagefile imbufs imbufIdx get/readstring cvx/pop cvx]cvx put + }for + DeviceN_PS2{ + imageDict begin + /DataSource[DataSource/devn_sep_datasource cvx]cvx def + /MultipleDataSources false def + /Decode[0 1]def + end + }if + }{ + /imbuf imbufLen string def + Indexed_DeviceN level3 not and DeviceN_NoneName or{ + /srcDataStrs[imageDict begin + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi string + }repeat + end]def + imageDict begin + /DataSource[AGMUTIL_imagefile Decode BitsPerComponent false 1/filter_indexed_devn load dstDataStr srcDataStrs devn_alt_datasource/exec cvx]cvx def + /Decode[0 1]def + end + }{ + imageDict/DataSource[1 string dup 0 AGMUTIL_imagefile Decode length 2 idiv string/readstring cvx/pop cvx names_index/get cvx/put cvx]cvx put + imageDict/Decode[0 1]put + }ifelse + }ifelse + imageDict exch + load exec + imageDict/DataSource origDataSource put + imageDict/MultipleDataSources origMultipleDataSources put + imageDict/Decode origDecode put + end +}bdf +/write_image_file +{ + begin + {(AGMUTIL_imagefile)(w+)file}stopped{ + false + }{ + Adobe_AGM_Utils/AGMUTIL_imagefile xddf + 2 dict begin + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + MultipleDataSources{DataSource 0 get}{DataSource}ifelse type/filetype eq{ + /imbuf imbufLen string def + }if + 1 1 Height MultipleDataSources not{Decode length 2 idiv mul}if{ + pop + MultipleDataSources{ + 0 1 DataSource length 1 sub{ + DataSource type dup + /arraytype eq{ + pop DataSource exch gx + }{ + /filetype eq{ + DataSource exch get imbuf readstring pop + }{ + DataSource exch get + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }for + }{ + DataSource type dup + /arraytype eq{ + pop DataSource exec + }{ + /filetype eq{ + DataSource imbuf readstring pop + }{ + DataSource + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }ifelse + }for + end + true + }ifelse + end +}bdf +/close_image_file +{ + AGMUTIL_imagefile closefile(AGMUTIL_imagefile)deletefile +}def +statusdict/product known userdict/AGMP_current_show known not and{ + /pstr statusdict/product get def + pstr(HP LaserJet 2200)eq + pstr(HP LaserJet 4000 Series)eq or + pstr(HP LaserJet 4050 Series )eq or + pstr(HP LaserJet 8000 Series)eq or + pstr(HP LaserJet 8100 Series)eq or + pstr(HP LaserJet 8150 Series)eq or + pstr(HP LaserJet 5000 Series)eq or + pstr(HP LaserJet 5100 Series)eq or + pstr(HP Color LaserJet 4500)eq or + pstr(HP Color LaserJet 4600)eq or + pstr(HP LaserJet 5Si)eq or + pstr(HP LaserJet 1200 Series)eq or + pstr(HP LaserJet 1300 Series)eq or + pstr(HP LaserJet 4100 Series)eq or + { + userdict/AGMP_current_show/show load put + userdict/show{ + currentcolorspace 0 get + /Pattern eq + {false charpath f} + {AGMP_current_show}ifelse + }put + }if + currentdict/pstr undef +}if +/consumeimagedata +{ + begin + AGMIMG_init_common + currentdict/MultipleDataSources known not + {/MultipleDataSources false def}if + MultipleDataSources + { + DataSource 0 get type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width cvi string def + 1 1 Height cvi + { + pop + 0 1 DataSource length 1 sub + { + DataSource exch get + flushbuffer readstring pop pop + }for + }for + end + }if + dup/arraytype eq exch/packedarraytype eq or DataSource 0 get xcheck and + { + Width Height mul cvi + { + 0 1 DataSource length 1 sub + {dup DataSource exch gx length exch 0 ne{pop}if}for + dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + } + { + /DataSource load type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width Decode length 2 idiv mul cvi string def + 1 1 Height{pop DataSource flushbuffer readstring pop pop}for + end + }if + dup/arraytype eq exch/packedarraytype eq or/DataSource load xcheck and + { + Height Width BitsPerComponent mul 8 BitsPerComponent sub add 8 idiv Decode length 2 idiv mul mul + { + DataSource length dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + }ifelse + end +}bdf +/addprocs +{ + 2{/exec load}repeat + 3 1 roll + [5 1 roll]bind cvx +}def +/modify_halftone_xfer +{ + currenthalftone dup length dict copy begin + currentdict 2 index known{ + 1 index load dup length dict copy begin + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end def + currentdict end sethalftone + }{ + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end sethalftone + pop + }ifelse +}def +/clonearray +{ + dup xcheck exch + dup length array exch + Adobe_AGM_Core/AGMCORE_tmp -1 ddf + { + Adobe_AGM_Core/AGMCORE_tmp 2 copy get 1 add ddf + dup type/dicttype eq + { + Adobe_AGM_Core/AGMCORE_tmp get + exch + clonedict + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + dup type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_tmp get exch + clonearray + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + exch dup + Adobe_AGM_Core/AGMCORE_tmp get 4 -1 roll put + }forall + exch{cvx}if +}bdf +/clonedict +{ + dup length dict + begin + { + dup type/dicttype eq + {clonedict}if + dup type/arraytype eq + {clonearray}if + def + }forall + currentdict + end +}bdf +/DeviceN_PS2 +{ + /currentcolorspace AGMCORE_gget 0 get/DeviceN eq level3 not and +}bdf +/Indexed_DeviceN +{ + /indexed_colorspace_dict AGMCORE_gget dup null ne{ + dup/CSDBase known{ + /CSDBase get/CSD get_res/Names known + }{ + pop false + }ifelse + }{ + pop false + }ifelse +}bdf +/DeviceN_NoneName +{ + /Names where{ + pop + false Names + { + (None)eq or + }forall + }{ + false + }ifelse +}bdf +/DeviceN_PS2_inRip_seps +{ + /AGMCORE_in_rip_sep where + { + pop dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/DeviceN eq level3 not and AGMCORE_in_rip_sep and + { + /currentcolorspace exch AGMCORE_gput + false + }{ + true + }ifelse + }{ + true + }ifelse + }{ + true + }ifelse +}bdf +/base_colorspace_type +{ + dup type/arraytype eq{0 get}if +}bdf +/currentdistillerparams where{pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse +{ + /pdfmark_5{cleartomark}bind def +}{ + /pdfmark_5{pdfmark}bind def +}ifelse +/ReadBypdfmark_5 +{ + currentfile exch 0 exch/SubFileDecode filter + /currentdistillerparams where + {pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse + {flushfile cleartomark} + {/PUT pdfmark}ifelse +}bdf +/ReadBypdfmark_5_string +{ + 2 dict begin + /makerString exch def string/tmpString exch def + { + currentfile tmpString readline not{pop exit}if + makerString anchorsearch + { + pop pop cleartomark exit + }{ + 3 copy/PUT pdfmark_5 pop 2 copy(\n)/PUT pdfmark_5 + }ifelse + }loop + end +}bdf +/xpdfm +{ + { + dup 0 get/Label eq + { + aload length[exch 1 add 1 roll/PAGELABEL + }{ + aload pop + [{ThisPage}<<5 -2 roll>>/PUT + }ifelse + pdfmark_5 + }forall +}bdf +/lmt{ + dup 2 index le{exch}if pop dup 2 index ge{exch}if pop +}bdf +/int{ + dup 2 index sub 3 index 5 index sub div 6 -2 roll sub mul exch pop add exch pop +}bdf +/ds{ + Adobe_AGM_Utils begin +}bdf +/dt{ + currentdict Adobe_AGM_Utils eq{ + end + }if +}bdf +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_AGM_Core 2.0 0 +%%Version: 2.0 0 +%%Copyright: Copyright(C)1997-2007 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Core 209 dict dup begin put +/Adobe_AGM_Core_Id/Adobe_AGM_Core_2.0_0 def +/AGMCORE_str256 256 string def +/AGMCORE_save nd +/AGMCORE_graphicsave nd +/AGMCORE_c 0 def +/AGMCORE_m 0 def +/AGMCORE_y 0 def +/AGMCORE_k 0 def +/AGMCORE_cmykbuf 4 array def +/AGMCORE_screen[currentscreen]cvx def +/AGMCORE_tmp 0 def +/AGMCORE_&setgray nd +/AGMCORE_&setcolor nd +/AGMCORE_&setcolorspace nd +/AGMCORE_&setcmykcolor nd +/AGMCORE_cyan_plate nd +/AGMCORE_magenta_plate nd +/AGMCORE_yellow_plate nd +/AGMCORE_black_plate nd +/AGMCORE_plate_ndx nd +/AGMCORE_get_ink_data nd +/AGMCORE_is_cmyk_sep nd +/AGMCORE_host_sep nd +/AGMCORE_avoid_L2_sep_space nd +/AGMCORE_distilling nd +/AGMCORE_composite_job nd +/AGMCORE_producing_seps nd +/AGMCORE_ps_level -1 def +/AGMCORE_ps_version -1 def +/AGMCORE_environ_ok nd +/AGMCORE_CSD_cache 0 dict def +/AGMCORE_currentoverprint false def +/AGMCORE_deltaX nd +/AGMCORE_deltaY nd +/AGMCORE_name nd +/AGMCORE_sep_special nd +/AGMCORE_err_strings 4 dict def +/AGMCORE_cur_err nd +/AGMCORE_current_spot_alias false def +/AGMCORE_inverting false def +/AGMCORE_feature_dictCount nd +/AGMCORE_feature_opCount nd +/AGMCORE_feature_ctm nd +/AGMCORE_ConvertToProcess false def +/AGMCORE_Default_CTM matrix def +/AGMCORE_Default_PageSize nd +/AGMCORE_Default_flatness nd +/AGMCORE_currentbg nd +/AGMCORE_currentucr nd +/AGMCORE_pattern_paint_type 0 def +/knockout_unitsq nd +currentglobal true setglobal +[/CSA/Gradient/Procedure] +{ + /Generic/Category findresource dup length dict copy/Category defineresource pop +}forall +setglobal +/AGMCORE_key_known +{ + where{ + /Adobe_AGM_Core_Id known + }{ + false + }ifelse +}ndf +/flushinput +{ + save + 2 dict begin + /CompareBuffer 3 -1 roll def + /readbuffer 256 string def + mark + { + currentfile readbuffer{readline}stopped + {cleartomark mark} + { + not + {pop exit} + if + CompareBuffer eq + {exit} + if + }ifelse + }loop + cleartomark + end + restore +}bdf +/getspotfunction +{ + AGMCORE_screen exch pop exch pop + dup type/dicttype eq{ + dup/HalftoneType get 1 eq{ + /SpotFunction get + }{ + dup/HalftoneType get 2 eq{ + /GraySpotFunction get + }{ + pop + { + abs exch abs 2 copy add 1 gt{ + 1 sub dup mul exch 1 sub dup mul add 1 sub + }{ + dup mul exch dup mul add 1 exch sub + }ifelse + }bind + }ifelse + }ifelse + }if +}def +/np +{newpath}bdf +/clp_npth +{clip np}def +/eoclp_npth +{eoclip np}def +/npth_clp +{np clip}def +/graphic_setup +{ + /AGMCORE_graphicsave save store + concat + 0 setgray + 0 setlinecap + 0 setlinejoin + 1 setlinewidth + []0 setdash + 10 setmiterlimit + np + false setoverprint + false setstrokeadjust + //Adobe_AGM_Core/spot_alias gx + /Adobe_AGM_Image where{ + pop + Adobe_AGM_Image/spot_alias 2 copy known{ + gx + }{ + pop pop + }ifelse + }if + /sep_colorspace_dict null AGMCORE_gput + 100 dict begin + /dictstackcount countdictstack def + /showpage{}def + mark +}def +/graphic_cleanup +{ + cleartomark + dictstackcount 1 countdictstack 1 sub{end}for + end + AGMCORE_graphicsave restore +}def +/compose_error_msg +{ + grestoreall initgraphics + /Helvetica findfont 10 scalefont setfont + /AGMCORE_deltaY 100 def + /AGMCORE_deltaX 310 def + clippath pathbbox np pop pop 36 add exch 36 add exch moveto + 0 AGMCORE_deltaY rlineto AGMCORE_deltaX 0 rlineto + 0 AGMCORE_deltaY neg rlineto AGMCORE_deltaX neg 0 rlineto closepath + 0 AGMCORE_&setgray + gsave 1 AGMCORE_&setgray fill grestore + 1 setlinewidth gsave stroke grestore + currentpoint AGMCORE_deltaY 15 sub add exch 8 add exch moveto + /AGMCORE_deltaY 12 def + /AGMCORE_tmp 0 def + AGMCORE_err_strings exch get + { + dup 32 eq + { + pop + AGMCORE_str256 0 AGMCORE_tmp getinterval + stringwidth pop currentpoint pop add AGMCORE_deltaX 28 add gt + { + currentpoint AGMCORE_deltaY sub exch pop + clippath pathbbox pop pop pop 44 add exch moveto + }if + AGMCORE_str256 0 AGMCORE_tmp getinterval show( )show + 0 1 AGMCORE_str256 length 1 sub + { + AGMCORE_str256 exch 0 put + }for + /AGMCORE_tmp 0 def + }{ + AGMCORE_str256 exch AGMCORE_tmp xpt + /AGMCORE_tmp AGMCORE_tmp 1 add def + }ifelse + }forall +}bdf +/AGMCORE_CMYKDeviceNColorspaces[ + [/Separation/None/DeviceCMYK{0 0 0}] + [/Separation(Black)/DeviceCMYK{0 0 0 4 -1 roll}bind] + [/Separation(Yellow)/DeviceCMYK{0 0 3 -1 roll 0}bind] + [/DeviceN[(Yellow)(Black)]/DeviceCMYK{0 0 4 2 roll}bind] + [/Separation(Magenta)/DeviceCMYK{0 exch 0 0}bind] + [/DeviceN[(Magenta)(Black)]/DeviceCMYK{0 3 1 roll 0 exch}bind] + [/DeviceN[(Magenta)(Yellow)]/DeviceCMYK{0 3 1 roll 0}bind] + [/DeviceN[(Magenta)(Yellow)(Black)]/DeviceCMYK{0 4 1 roll}bind] + [/Separation(Cyan)/DeviceCMYK{0 0 0}] + [/DeviceN[(Cyan)(Black)]/DeviceCMYK{0 0 3 -1 roll}bind] + [/DeviceN[(Cyan)(Yellow)]/DeviceCMYK{0 exch 0}bind] + [/DeviceN[(Cyan)(Yellow)(Black)]/DeviceCMYK{0 3 1 roll}bind] + [/DeviceN[(Cyan)(Magenta)]/DeviceCMYK{0 0}] + [/DeviceN[(Cyan)(Magenta)(Black)]/DeviceCMYK{0 exch}bind] + [/DeviceN[(Cyan)(Magenta)(Yellow)]/DeviceCMYK{0}] + [/DeviceCMYK] +]def +/ds{ + Adobe_AGM_Core begin + /currentdistillerparams where + { + pop currentdistillerparams/CoreDistVersion get 5000 lt + {<>setdistillerparams}if + }if + /AGMCORE_ps_version xdf + /AGMCORE_ps_level xdf + errordict/AGM_handleerror known not{ + errordict/AGM_handleerror errordict/handleerror get put + errordict/handleerror{ + Adobe_AGM_Core begin + $error/newerror get AGMCORE_cur_err null ne and{ + $error/newerror false put + AGMCORE_cur_err compose_error_msg + }if + $error/newerror true put + end + errordict/AGM_handleerror get exec + }bind put + }if + /AGMCORE_environ_ok + ps_level AGMCORE_ps_level ge + ps_version AGMCORE_ps_version ge and + AGMCORE_ps_level -1 eq or + def + AGMCORE_environ_ok not + {/AGMCORE_cur_err/AGMCORE_bad_environ def}if + /AGMCORE_&setgray systemdict/setgray get def + level2{ + /AGMCORE_&setcolor systemdict/setcolor get def + /AGMCORE_&setcolorspace systemdict/setcolorspace get def + }if + /AGMCORE_currentbg currentblackgeneration def + /AGMCORE_currentucr currentundercolorremoval def + /AGMCORE_Default_flatness currentflat def + /AGMCORE_distilling + /product where{ + pop systemdict/setdistillerparams known product(Adobe PostScript Parser)ne and + }{ + false + }ifelse + def + /AGMCORE_GSTATE AGMCORE_key_known not{ + /AGMCORE_GSTATE 21 dict def + /AGMCORE_tmpmatrix matrix def + /AGMCORE_gstack 32 array def + /AGMCORE_gstackptr 0 def + /AGMCORE_gstacksaveptr 0 def + /AGMCORE_gstackframekeys 14 def + /AGMCORE_&gsave/gsave ldf + /AGMCORE_&grestore/grestore ldf + /AGMCORE_&grestoreall/grestoreall ldf + /AGMCORE_&save/save ldf + /AGMCORE_&setoverprint/setoverprint ldf + /AGMCORE_gdictcopy{ + begin + {def}forall + end + }def + /AGMCORE_gput{ + AGMCORE_gstack AGMCORE_gstackptr get + 3 1 roll + put + }def + /AGMCORE_gget{ + AGMCORE_gstack AGMCORE_gstackptr get + exch + get + }def + /gsave{ + AGMCORE_&gsave + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /grestore{ + AGMCORE_&grestore + AGMCORE_gstackptr 1 sub + dup AGMCORE_gstacksaveptr lt{1 add}if + dup AGMCORE_gstack exch get dup/AGMCORE_currentoverprint known + {/AGMCORE_currentoverprint get setoverprint}{pop}ifelse + /AGMCORE_gstackptr exch store + }def + /grestoreall{ + AGMCORE_&grestoreall + /AGMCORE_gstackptr AGMCORE_gstacksaveptr store + }def + /save{ + AGMCORE_&save + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + /AGMCORE_gstacksaveptr AGMCORE_gstackptr store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /setoverprint{ + dup/AGMCORE_currentoverprint exch AGMCORE_gput AGMCORE_&setoverprint + }def + 0 1 AGMCORE_gstack length 1 sub{ + AGMCORE_gstack exch AGMCORE_gstackframekeys dict put + }for + }if + level3/AGMCORE_&sysshfill AGMCORE_key_known not and + { + /AGMCORE_&sysshfill systemdict/shfill get def + /AGMCORE_&sysmakepattern systemdict/makepattern get def + /AGMCORE_&usrmakepattern/makepattern load def + }if + /currentcmykcolor[0 0 0 0]AGMCORE_gput + /currentstrokeadjust false AGMCORE_gput + /currentcolorspace[/DeviceGray]AGMCORE_gput + /sep_tint 0 AGMCORE_gput + /devicen_tints[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]AGMCORE_gput + /sep_colorspace_dict null AGMCORE_gput + /devicen_colorspace_dict null AGMCORE_gput + /indexed_colorspace_dict null AGMCORE_gput + /currentcolor_intent()AGMCORE_gput + /customcolor_tint 1 AGMCORE_gput + /absolute_colorimetric_crd null AGMCORE_gput + /relative_colorimetric_crd null AGMCORE_gput + /saturation_crd null AGMCORE_gput + /perceptual_crd null AGMCORE_gput + currentcolortransfer cvlit/AGMCore_gray_xfer xdf cvlit/AGMCore_b_xfer xdf + cvlit/AGMCore_g_xfer xdf cvlit/AGMCore_r_xfer xdf + << + /MaxPatternItem currentsystemparams/MaxPatternCache get + >> + setuserparams + end +}def +/ps +{ + /setcmykcolor where{ + pop + Adobe_AGM_Core/AGMCORE_&setcmykcolor/setcmykcolor load put + }if + Adobe_AGM_Core begin + /setcmykcolor + { + 4 copy AGMCORE_cmykbuf astore/currentcmykcolor exch AGMCORE_gput + 1 sub 4 1 roll + 3{ + 3 index add neg dup 0 lt{ + pop 0 + }if + 3 1 roll + }repeat + setrgbcolor pop + }ndf + /currentcmykcolor + { + /currentcmykcolor AGMCORE_gget aload pop + }ndf + /setoverprint + {pop}ndf + /currentoverprint + {false}ndf + /AGMCORE_cyan_plate 1 0 0 0 test_cmyk_color_plate def + /AGMCORE_magenta_plate 0 1 0 0 test_cmyk_color_plate def + /AGMCORE_yellow_plate 0 0 1 0 test_cmyk_color_plate def + /AGMCORE_black_plate 0 0 0 1 test_cmyk_color_plate def + /AGMCORE_plate_ndx + AGMCORE_cyan_plate{ + 0 + }{ + AGMCORE_magenta_plate{ + 1 + }{ + AGMCORE_yellow_plate{ + 2 + }{ + AGMCORE_black_plate{ + 3 + }{ + 4 + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_have_reported_unsupported_color_space false def + /AGMCORE_report_unsupported_color_space + { + AGMCORE_have_reported_unsupported_color_space false eq + { + (Warning: Job contains content that cannot be separated with on-host methods. This content appears on the black plate, and knocks out all other plates.)== + Adobe_AGM_Core/AGMCORE_have_reported_unsupported_color_space true ddf + }if + }def + /AGMCORE_composite_job + AGMCORE_cyan_plate AGMCORE_magenta_plate and AGMCORE_yellow_plate and AGMCORE_black_plate and def + /AGMCORE_in_rip_sep + /AGMCORE_in_rip_sep where{ + pop AGMCORE_in_rip_sep + }{ + AGMCORE_distilling + { + false + }{ + userdict/Adobe_AGM_OnHost_Seps known{ + false + }{ + level2{ + currentpagedevice/Separations 2 copy known{ + get + }{ + pop pop false + }ifelse + }{ + false + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_producing_seps AGMCORE_composite_job not AGMCORE_in_rip_sep or def + /AGMCORE_host_sep AGMCORE_producing_seps AGMCORE_in_rip_sep not and def + /AGM_preserve_spots + /AGM_preserve_spots where{ + pop AGM_preserve_spots + }{ + AGMCORE_distilling AGMCORE_producing_seps or + }ifelse + def + /AGM_is_distiller_preserving_spotimages + { + currentdistillerparams/PreserveOverprintSettings known + { + currentdistillerparams/PreserveOverprintSettings get + { + currentdistillerparams/ColorConversionStrategy known + { + currentdistillerparams/ColorConversionStrategy get + /sRGB ne + }{ + true + }ifelse + }{ + false + }ifelse + }{ + false + }ifelse + }def + /convert_spot_to_process where{pop}{ + /convert_spot_to_process + { + //Adobe_AGM_Core begin + dup map_alias{ + /Name get exch pop + }if + dup dup(None)eq exch(All)eq or + { + pop false + }{ + AGMCORE_host_sep + { + gsave + 1 0 0 0 setcmykcolor currentgray 1 exch sub + 0 1 0 0 setcmykcolor currentgray 1 exch sub + 0 0 1 0 setcmykcolor currentgray 1 exch sub + 0 0 0 1 setcmykcolor currentgray 1 exch sub + add add add 0 eq + { + pop false + }{ + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + }ifelse + grestore + }{ + AGMCORE_distilling + { + pop AGM_is_distiller_preserving_spotimages not + }{ + //Adobe_AGM_Core/AGMCORE_name xddf + false + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 0 eq + AGMUTIL_cpd/OverrideSeparations known and + { + AGMUTIL_cpd/OverrideSeparations get + { + /HqnSpots/ProcSet resourcestatus + { + pop pop pop true + }if + }if + }if + { + AGMCORE_name/HqnSpots/ProcSet findresource/TestSpot gx not + }{ + gsave + [/Separation AGMCORE_name/DeviceGray{}]AGMCORE_&setcolorspace + false + AGMUTIL_cpd/SeparationColorNames 2 copy known + { + get + {AGMCORE_name eq or}forall + not + }{ + pop pop pop true + }ifelse + grestore + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + }ifelse + /convert_to_process where{pop}{ + /convert_to_process + { + dup length 0 eq + { + pop false + }{ + AGMCORE_host_sep + { + dup true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process and}ifelse + } + forall + { + true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + (Black)eq or and + }forall + not + }{pop false}ifelse + }{ + false exch + { + /PhotoshopDuotoneList where{pop false}{true}ifelse + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process or}ifelse + } + { + convert_spot_to_process or + } + ifelse + } + forall + }ifelse + }ifelse + }def + }ifelse + /AGMCORE_avoid_L2_sep_space + version cvr 2012 lt + level2 and + AGMCORE_producing_seps not and + def + /AGMCORE_is_cmyk_sep + AGMCORE_cyan_plate AGMCORE_magenta_plate or AGMCORE_yellow_plate or AGMCORE_black_plate or + def + /AGM_avoid_0_cmyk where{ + pop AGM_avoid_0_cmyk + }{ + AGM_preserve_spots + userdict/Adobe_AGM_OnHost_Seps known + userdict/Adobe_AGM_InRip_Seps known or + not and + }ifelse + { + /setcmykcolor[ + { + 4 copy add add add 0 eq currentoverprint and{ + pop 0.0005 + }if + }/exec cvx + /AGMCORE_&setcmykcolor load dup type/operatortype ne{ + /exec cvx + }if + ]cvx def + }if + /AGMCORE_IsSeparationAProcessColor + { + dup(Cyan)eq exch dup(Magenta)eq exch dup(Yellow)eq exch(Black)eq or or or + }def + AGMCORE_host_sep{ + /setcolortransfer + { + AGMCORE_cyan_plate{ + pop pop pop + }{ + AGMCORE_magenta_plate{ + 4 3 roll pop pop pop + }{ + AGMCORE_yellow_plate{ + 4 2 roll pop pop pop + }{ + 4 1 roll pop pop pop + }ifelse + }ifelse + }ifelse + settransfer + } + def + /AGMCORE_get_ink_data + AGMCORE_cyan_plate{ + {pop pop pop} + }{ + AGMCORE_magenta_plate{ + {4 3 roll pop pop pop} + }{ + AGMCORE_yellow_plate{ + {4 2 roll pop pop pop} + }{ + {4 1 roll pop pop pop} + }ifelse + }ifelse + }ifelse + def + /AGMCORE_RemoveProcessColorNames + { + 1 dict begin + /filtername + { + dup/Cyan eq 1 index(Cyan)eq or + {pop(_cyan_)}if + dup/Magenta eq 1 index(Magenta)eq or + {pop(_magenta_)}if + dup/Yellow eq 1 index(Yellow)eq or + {pop(_yellow_)}if + dup/Black eq 1 index(Black)eq or + {pop(_black_)}if + }def + dup type/arraytype eq + {[exch{filtername}forall]} + {filtername}ifelse + end + }def + level3{ + /AGMCORE_IsCurrentColor + { + dup AGMCORE_IsSeparationAProcessColor + { + AGMCORE_plate_ndx 0 eq + {dup(Cyan)eq exch/Cyan eq or}if + AGMCORE_plate_ndx 1 eq + {dup(Magenta)eq exch/Magenta eq or}if + AGMCORE_plate_ndx 2 eq + {dup(Yellow)eq exch/Yellow eq or}if + AGMCORE_plate_ndx 3 eq + {dup(Black)eq exch/Black eq or}if + AGMCORE_plate_ndx 4 eq + {pop false}if + }{ + gsave + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + grestore + }ifelse + }def + /AGMCORE_filter_functiondatasource + { + 5 dict begin + /data_in xdf + data_in type/stringtype eq + { + /ncomp xdf + /comp xdf + /string_out data_in length ncomp idiv string def + 0 ncomp data_in length 1 sub + { + string_out exch dup ncomp idiv exch data_in exch ncomp getinterval comp get 255 exch sub put + }for + string_out + }{ + string/string_in xdf + /string_out 1 string def + /component xdf + [ + data_in string_in/readstring cvx + [component/get cvx 255/exch cvx/sub cvx string_out/exch cvx 0/exch cvx/put cvx string_out]cvx + [/pop cvx()]cvx/ifelse cvx + ]cvx/ReusableStreamDecode filter + }ifelse + end + }def + /AGMCORE_separateShadingFunction + { + 2 dict begin + /paint? xdf + /channel xdf + dup type/dicttype eq + { + begin + FunctionType 0 eq + { + /DataSource channel Range length 2 idiv DataSource AGMCORE_filter_functiondatasource def + currentdict/Decode known + {/Decode Decode channel 2 mul 2 getinterval def}if + paint? not + {/Decode[1 1]def}if + }if + FunctionType 2 eq + { + paint? + { + /C0[C0 channel get 1 exch sub]def + /C1[C1 channel get 1 exch sub]def + }{ + /C0[1]def + /C1[1]def + }ifelse + }if + FunctionType 3 eq + { + /Functions[Functions{channel paint? AGMCORE_separateShadingFunction}forall]def + }if + currentdict/Range known + {/Range[0 1]def}if + currentdict + end}{ + channel get 0 paint? AGMCORE_separateShadingFunction + }ifelse + end + }def + /AGMCORE_separateShading + { + 3 -1 roll begin + currentdict/Function known + { + currentdict/Background known + {[1 index{Background 3 index get 1 exch sub}{1}ifelse]/Background xdf}if + Function 3 1 roll AGMCORE_separateShadingFunction/Function xdf + /ColorSpace[/DeviceGray]def + }{ + ColorSpace dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }{ + ColorSpace dup 1 get AGMCORE_RemoveProcessColorNames 1 exch put + }ifelse + ColorSpace 0 get/Separation eq + { + { + [1/exch cvx/sub cvx]cvx + }{ + [/pop cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll put + pop + }{ + { + [exch ColorSpace 1 get length 1 sub exch sub/index cvx 1/exch cvx/sub cvx ColorSpace 1 get length 1 add 1/roll cvx ColorSpace 1 get length{/pop cvx}repeat]cvx + }{ + pop[ColorSpace 1 get length{/pop cvx}repeat cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll bind put + }ifelse + ColorSpace 2/DeviceGray put + }ifelse + end + }def + /AGMCORE_separateShadingDict + { + dup/ColorSpace get + dup type/arraytype ne + {[exch]}if + dup 0 get/DeviceCMYK eq + { + exch begin + currentdict + AGMCORE_cyan_plate + {0 true}if + AGMCORE_magenta_plate + {1 true}if + AGMCORE_yellow_plate + {2 true}if + AGMCORE_black_plate + {3 true}if + AGMCORE_plate_ndx 4 eq + {0 false}if + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + currentdict + end exch + }if + dup 0 get/Separation eq + { + exch begin + ColorSpace 1 get dup/None ne exch/All ne and + { + ColorSpace 1 get AGMCORE_IsCurrentColor AGMCORE_plate_ndx 4 lt and ColorSpace 1 get AGMCORE_IsSeparationAProcessColor not and + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /Separation + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + }if + }ifelse + }{ + currentdict ColorSpace 1 get AGMCORE_IsCurrentColor + 0 exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + }if + currentdict + end exch + }if + dup 0 get/DeviceN eq + { + exch begin + ColorSpace 1 get convert_to_process + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /DeviceN + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + /ColorSpace[/DeviceGray]def + }if + }ifelse + }{ + currentdict + false -1 ColorSpace 1 get + { + AGMCORE_IsCurrentColor + { + 1 add + exch pop true exch exit + }if + 1 add + }forall + exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + currentdict + end exch + }if + dup 0 get dup/DeviceCMYK eq exch dup/Separation eq exch/DeviceN eq or or not + { + exch begin + ColorSpace dup type/arraytype eq + {0 get}if + /DeviceGray ne + { + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + ColorSpace 0 get/CIEBasedA eq + { + /ColorSpace[/Separation/_ciebaseda_/DeviceGray{}]def + }if + ColorSpace 0 get dup/CIEBasedABC eq exch dup/CIEBasedDEF eq exch/DeviceRGB eq or or + { + /ColorSpace[/DeviceN[/_red_/_green_/_blue_]/DeviceRGB{}]def + }if + ColorSpace 0 get/CIEBasedDEFG eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }if + currentdict 0 false AGMCORE_separateShading + }if + }if + currentdict + end exch + }if + pop + dup/AGMCORE_ignoreshade known + { + begin + /ColorSpace[/Separation(None)/DeviceGray{}]def + currentdict end + }if + }def + /shfill + { + AGMCORE_separateShadingDict + dup/AGMCORE_ignoreshade known + {pop} + {AGMCORE_&sysshfill}ifelse + }def + /makepattern + { + exch + dup/PatternType get 2 eq + { + clonedict + begin + /Shading Shading AGMCORE_separateShadingDict def + Shading/AGMCORE_ignoreshade known + currentdict end exch + {pop<>}if + exch AGMCORE_&sysmakepattern + }{ + exch AGMCORE_&usrmakepattern + }ifelse + }def + }if + }if + AGMCORE_in_rip_sep{ + /setcustomcolor + { + exch aload pop + dup 7 1 roll inRip_spot_has_ink not { + 4{4 index mul 4 1 roll} + repeat + /DeviceCMYK setcolorspace + 6 -2 roll pop pop + }{ + //Adobe_AGM_Core begin + /AGMCORE_k xdf/AGMCORE_y xdf/AGMCORE_m xdf/AGMCORE_c xdf + end + [/Separation 4 -1 roll/DeviceCMYK + {dup AGMCORE_c mul exch dup AGMCORE_m mul exch dup AGMCORE_y mul exch AGMCORE_k mul} + ] + setcolorspace + }ifelse + setcolor + }ndf + /setseparationgray + { + [/Separation(All)/DeviceGray{}]setcolorspace_opt + 1 exch sub setcolor + }ndf + }{ + /setseparationgray + { + AGMCORE_&setgray + }ndf + }ifelse + /findcmykcustomcolor + { + 5 makereadonlyarray + }ndf + /setcustomcolor + { + exch aload pop pop + 4{4 index mul 4 1 roll}repeat + setcmykcolor pop + }ndf + /has_color + /colorimage where{ + AGMCORE_producing_seps{ + pop true + }{ + systemdict eq + }ifelse + }{ + false + }ifelse + def + /map_index + { + 1 index mul exch getinterval{255 div}forall + }bdf + /map_indexed_devn + { + Lookup Names length 3 -1 roll cvi map_index + }bdf + /n_color_components + { + base_colorspace_type + dup/DeviceGray eq{ + pop 1 + }{ + /DeviceCMYK eq{ + 4 + }{ + 3 + }ifelse + }ifelse + }bdf + level2{ + /mo/moveto ldf + /li/lineto ldf + /cv/curveto ldf + /knockout_unitsq + { + 1 setgray + 0 0 1 1 rectfill + }def + level2/setcolorspace AGMCORE_key_known not and{ + /AGMCORE_&&&setcolorspace/setcolorspace ldf + /AGMCORE_ReplaceMappedColor + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + /AGMCORE_SpotAliasAry2 where{ + begin + dup 0 get dup/Separation eq + { + pop + dup length array copy + dup dup 1 get + current_spot_alias + { + dup map_alias + { + false set_spot_alias + dup 1 exch setsepcolorspace + true set_spot_alias + begin + /sep_colorspace_dict currentdict AGMCORE_gput + pop pop pop + [ + /Separation Name + CSA map_csa + MappedCSA + /sep_colorspace_proc load + ] + dup Name + end + }if + }if + map_reserved_ink_name 1 xpt + }{ + /DeviceN eq + { + dup length array copy + dup dup 1 get[ + exch{ + current_spot_alias{ + dup map_alias{ + /Name get exch pop + }if + }if + map_reserved_ink_name + }forall + ]1 xpt + }if + }ifelse + end + }if + }if + }def + /setcolorspace + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/Indexed eq + { + AGMCORE_distilling + { + /PhotoshopDuotoneList where + { + pop false + }{ + true + }ifelse + }{ + true + }ifelse + { + aload pop 3 -1 roll + AGMCORE_ReplaceMappedColor + 3 1 roll 4 array astore + }if + }{ + AGMCORE_ReplaceMappedColor + }ifelse + }if + DeviceN_PS2_inRip_seps{AGMCORE_&&&setcolorspace}if + }def + }if + }{ + /adj + { + currentstrokeadjust{ + transform + 0.25 sub round 0.25 add exch + 0.25 sub round 0.25 add exch + itransform + }if + }def + /mo{ + adj moveto + }def + /li{ + adj lineto + }def + /cv{ + 6 2 roll adj + 6 2 roll adj + 6 2 roll adj curveto + }def + /knockout_unitsq + { + 1 setgray + 8 8 1[8 0 0 8 0 0]{}image + }def + /currentstrokeadjust{ + /currentstrokeadjust AGMCORE_gget + }def + /setstrokeadjust{ + /currentstrokeadjust exch AGMCORE_gput + }def + /setcolorspace + { + /currentcolorspace exch AGMCORE_gput + }def + /currentcolorspace + { + /currentcolorspace AGMCORE_gget + }def + /setcolor_devicecolor + { + base_colorspace_type + dup/DeviceGray eq{ + pop setgray + }{ + /DeviceCMYK eq{ + setcmykcolor + }{ + setrgbcolor + }ifelse + }ifelse + }def + /setcolor + { + currentcolorspace 0 get + dup/DeviceGray ne{ + dup/DeviceCMYK ne{ + dup/DeviceRGB ne{ + dup/Separation eq{ + pop + currentcolorspace 3 gx + currentcolorspace 2 get + }{ + dup/Indexed eq{ + pop + currentcolorspace 3 get dup type/stringtype eq{ + currentcolorspace 1 get n_color_components + 3 -1 roll map_index + }{ + exec + }ifelse + currentcolorspace 1 get + }{ + /AGMCORE_cur_err/AGMCORE_invalid_color_space def + AGMCORE_invalid_color_space + }ifelse + }ifelse + }if + }if + }if + setcolor_devicecolor + }def + }ifelse + /sop/setoverprint ldf + /lw/setlinewidth ldf + /lc/setlinecap ldf + /lj/setlinejoin ldf + /ml/setmiterlimit ldf + /dsh/setdash ldf + /sadj/setstrokeadjust ldf + /gry/setgray ldf + /rgb/setrgbcolor ldf + /cmyk[ + /currentcolorspace[/DeviceCMYK]/AGMCORE_gput cvx + /setcmykcolor load dup type/operatortype ne{/exec cvx}if + ]cvx bdf + level3 AGMCORE_host_sep not and{ + /nzopmsc{ + 6 dict begin + /kk exch def + /yy exch def + /mm exch def + /cc exch def + /sum 0 def + cc 0 ne{/sum sum 2#1000 or def cc}if + mm 0 ne{/sum sum 2#0100 or def mm}if + yy 0 ne{/sum sum 2#0010 or def yy}if + kk 0 ne{/sum sum 2#0001 or def kk}if + AGMCORE_CMYKDeviceNColorspaces sum get setcolorspace + sum 0 eq{0}if + end + setcolor + }bdf + }{ + /nzopmsc/cmyk ldf + }ifelse + /sep/setsepcolor ldf + /devn/setdevicencolor ldf + /idx/setindexedcolor ldf + /colr/setcolor ldf + /csacrd/set_csa_crd ldf + /sepcs/setsepcolorspace ldf + /devncs/setdevicencolorspace ldf + /idxcs/setindexedcolorspace ldf + /cp/closepath ldf + /clp/clp_npth ldf + /eclp/eoclp_npth ldf + /f/fill ldf + /ef/eofill ldf + /@/stroke ldf + /nclp/npth_clp ldf + /gset/graphic_setup ldf + /gcln/graphic_cleanup ldf + /ct/concat ldf + /cf/currentfile ldf + /fl/filter ldf + /rs/readstring ldf + /AGMCORE_def_ht currenthalftone def + /clonedict Adobe_AGM_Utils begin/clonedict load end def + /clonearray Adobe_AGM_Utils begin/clonearray load end def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall + /getrampcolor + { + /indx exch def + 0 1 NumComp 1 sub + { + dup + Samples exch get + dup type/stringtype eq{indx get}if + exch + Scaling exch get aload pop + 3 1 roll + mul add + }for + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /sssetbackground{ + aload pop + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /RadialShade + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /r2 xdf + /c2y xdf + /c2x xdf + /r1 xdf + /c1y xdf + /c1x xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + c1x c2x eq + { + c1y c2y lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope c2y c1y sub c2x c1x sub div def + /theta slope 1 atan def + c2x c1x lt c2y c1y ge and{/theta theta 180 sub def}if + c2x c1x lt c2y c1y lt and{/theta theta 180 add def}if + }ifelse + gsave + clippath + c1x c1y translate + theta rotate + -90 rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax xdf + /xMax xdf + /yMin xdf + /xMin xdf + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + /max{2 copy gt{pop}{exch pop}ifelse}bdf + /min{2 copy lt{pop}{exch pop}ifelse}bdf + rampdict begin + 40 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + c1x c1y translate + theta rotate + -90 rotate + /c2y c1x c2x sub dup mul c1y c2y sub dup mul add sqrt def + /c1y 0 def + /c1x 0 def + /c2x 0 def + ext0 + { + 0 getrampcolor + c2y r2 add r1 sub 0.0001 lt + { + c1x c1y r1 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2y r1 add r2 le + { + c1x c1y r1 0 360 arc + fill + } + { + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r1 neg def + /p1y c1y def + /p2x r1 def + /p2y c1y def + p1x p1y moveto p2x p2y lineto p2x yMin lineto p1x yMin lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r1 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y p1x SS1 div neg def + /SS2 90 theta sub dup sin exch cos div def + /p2x r1 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y p2x SS2 div neg def + r1 r2 gt + { + /L1maxX p1x yMin p1y sub SS1 div add def + /L2maxX p2x yMin p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + c1x c2x sub dup mul + c1y c2y sub dup mul + add 0.5 exp + 0 dtransform + dup mul exch dup mul add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + /hires xdf + hires mul + /numpix xdf + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + /xInc c2x c1x sub numsteps div def + /yInc c2y c1y sub numsteps div def + /rInc r2 r1 sub numsteps div def + /cx c1x def + /cy c1y def + /radius r1 def + np + xInc 0 eq yInc 0 eq rInc 0 eq and and + { + 0 getrampcolor + cx cy radius 0 360 arc + stroke + NumSamples 1 sub getrampcolor + cx cy radius 72 hires div add 0 360 arc + 0 setlinewidth + stroke + }{ + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + cx cy radius 0 360 arc + /cx cx xInc add def + /cy cy yInc add def + /radius radius rInc add def + cx cy radius 360 0 arcn + eofill + rampIndxInc add + }repeat + pop + }ifelse + ext1 + { + c2y r2 add r1 lt + { + c2x c2y r2 0 360 arc + fill + }{ + c2y r1 add r2 sub 0.0001 le + { + c2x c2y r2 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r2 neg def + /p1y c2y def + /p2x r2 def + /p2y c2y def + p1x p1y moveto p2x p2y lineto p2x yMax lineto p1x yMax lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r2 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y c2y p1x SS1 div sub def + /SS2 90 theta sub dup sin exch cos div def + /p2x r2 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y c2y p2x SS2 div sub def + r1 r2 lt + { + /L1maxX p1x yMax p1y sub SS1 div add def + /L2maxX p2x yMax p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + grestore + grestore + end + end + end + }ifelse + }bdf + /GenStrips + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /y2 xdf + /x2 xdf + /y1 xdf + /x1 xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + x1 x2 eq + { + y1 y2 lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope y2 y1 sub x2 x1 sub div def + /theta slope 1 atan def + x2 x1 lt y2 y1 ge and{/theta theta 180 sub def}if + x2 x1 lt y2 y1 lt and{/theta theta 180 add def}if + } + ifelse + gsave + clippath + x1 y1 translate + theta rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax exch def + /xMax exch def + /yMin exch def + /xMin exch def + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + rampdict begin + 20 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + x1 y1 translate + theta rotate + /xStart 0 def + /xEnd x2 x1 sub dup mul y2 y1 sub dup mul add 0.5 exp def + /ySpan yMax yMin sub def + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + xStart 0 transform + xEnd 0 transform + 3 -1 roll + sub dup mul + 3 1 roll + sub dup mul + add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + mul + /numpix xdf + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + ext0 + { + 0 getrampcolor + xMin xStart lt + { + xMin yMin xMin neg ySpan rectfill + }if + }if + /xInc xEnd xStart sub numsteps div def + /x xStart def + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + x yMin xInc ySpan rectfill + /x x xInc add def + rampIndxInc add + }repeat + pop + ext1{ + xMax xEnd gt + { + xEnd yMin xMax xEnd sub ySpan rectfill + }if + }if + grestore + grestore + end + end + end + }ifelse + }bdf +}def +/pt +{ + end +}def +/dt{ +}def +/pgsv{ + //Adobe_AGM_Core/AGMCORE_save save put +}def +/pgrs{ + //Adobe_AGM_Core/AGMCORE_save get restore +}def +systemdict/findcolorrendering known{ + /findcolorrendering systemdict/findcolorrendering get def +}if +systemdict/setcolorrendering known{ + /setcolorrendering systemdict/setcolorrendering get def +}if +/test_cmyk_color_plate +{ + gsave + setcmykcolor currentgray 1 ne + grestore +}def +/inRip_spot_has_ink +{ + dup//Adobe_AGM_Core/AGMCORE_name xddf + convert_spot_to_process not +}def +/map255_to_range +{ + 1 index sub + 3 -1 roll 255 div mul add +}def +/set_csa_crd +{ + /sep_colorspace_dict null AGMCORE_gput + begin + CSA get_csa_by_name setcolorspace_opt + set_crd + end +} +def +/map_csa +{ + currentdict/MappedCSA known{MappedCSA null ne}{false}ifelse + {pop}{get_csa_by_name/MappedCSA xdf}ifelse +}def +/setsepcolor +{ + /sep_colorspace_dict AGMCORE_gget begin + dup/sep_tint exch AGMCORE_gput + TintProc + end +}def +/setdevicencolor +{ + /devicen_colorspace_dict AGMCORE_gget begin + Names length copy + Names length 1 sub -1 0 + { + /devicen_tints AGMCORE_gget 3 1 roll xpt + }for + TintProc + end +}def +/sep_colorspace_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + currentdict/Components known{ + Components aload pop + TintMethod/Lab eq{ + 2{AGMCORE_tmp mul NComponents 1 roll}repeat + LMax sub AGMCORE_tmp mul LMax add NComponents 1 roll + }{ + TintMethod/Subtractive eq{ + NComponents{ + AGMCORE_tmp mul NComponents 1 roll + }repeat + }{ + NComponents{ + 1 sub AGMCORE_tmp mul 1 add NComponents 1 roll + }repeat + }ifelse + }ifelse + }{ + ColorLookup AGMCORE_tmp ColorLookup length 1 sub mul round cvi get + aload pop + }ifelse + end +}def +/sep_colorspace_gray_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + GrayLookup AGMCORE_tmp GrayLookup length 1 sub mul round cvi get + end +}def +/sep_proc_name +{ + dup 0 get + dup/DeviceRGB eq exch/DeviceCMYK eq or level2 not and has_color not and{ + pop[/DeviceGray] + /sep_colorspace_gray_proc + }{ + /sep_colorspace_proc + }ifelse +}def +/setsepcolorspace +{ + current_spot_alias{ + dup begin + Name map_alias{ + exch pop + }if + end + }if + dup/sep_colorspace_dict exch AGMCORE_gput + begin + CSA map_csa + /AGMCORE_sep_special Name dup()eq exch(All)eq or store + AGMCORE_avoid_L2_sep_space{ + [/Indexed MappedCSA sep_proc_name 255 exch + {255 div}/exec cvx 3 -1 roll[4 1 roll load/exec cvx]cvx + ]setcolorspace_opt + /TintProc{ + 255 mul round cvi setcolor + }bdf + }{ + MappedCSA 0 get/DeviceCMYK eq + currentdict/Components known and + AGMCORE_sep_special not and{ + /TintProc[ + Components aload pop Name findcmykcustomcolor + /exch cvx/setcustomcolor cvx + ]cvx bdf + }{ + AGMCORE_host_sep Name(All)eq and{ + /TintProc{ + 1 exch sub setseparationgray + }bdf + }{ + AGMCORE_in_rip_sep MappedCSA 0 get/DeviceCMYK eq and + AGMCORE_host_sep or + Name()eq and{ + /TintProc[ + MappedCSA sep_proc_name exch 0 get/DeviceCMYK eq{ + cvx/setcmykcolor cvx + }{ + cvx/setgray cvx + }ifelse + ]cvx bdf + }{ + AGMCORE_producing_seps MappedCSA 0 get dup/DeviceCMYK eq exch/DeviceGray eq or and AGMCORE_sep_special not and{ + /TintProc[ + /dup cvx + MappedCSA sep_proc_name cvx exch + 0 get/DeviceGray eq{ + 1/exch cvx/sub cvx 0 0 0 4 -1/roll cvx + }if + /Name cvx/findcmykcustomcolor cvx/exch cvx + AGMCORE_host_sep{ + AGMCORE_is_cmyk_sep + /Name cvx + /AGMCORE_IsSeparationAProcessColor load/exec cvx + /not cvx/and cvx + }{ + Name inRip_spot_has_ink not + }ifelse + [ + /pop cvx 1 + ]cvx/if cvx + /setcustomcolor cvx + ]cvx bdf + }{ + /TintProc{setcolor}bdf + [/Separation Name MappedCSA sep_proc_name load]setcolorspace_opt + }ifelse + }ifelse + }ifelse + }ifelse + }ifelse + set_crd + setsepcolor + end +}def +/additive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 + 0 1 numarrays 1 sub + { + 1 exch add/index cvx + c1/get cvx/mul cvx + }for + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/subtractive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 1 + 0 1 numarrays 1 sub + { + 1 3 3 -1 roll add/index cvx + c1/get cvx/sub cvx/mul cvx + }for + /sub cvx + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/exec_tint_transform +{ + /TintProc[ + /TintTransform cvx/setcolor cvx + ]cvx bdf + MappedCSA setcolorspace_opt +}bdf +/devn_makecustomcolor +{ + 2 dict begin + /names_index xdf + /Names xdf + 1 1 1 1 Names names_index get findcmykcustomcolor + /devicen_tints AGMCORE_gget names_index get setcustomcolor + Names length{pop}repeat + end +}bdf +/setdevicencolorspace +{ + dup/AliasedColorants known{false}{true}ifelse + current_spot_alias and{ + 7 dict begin + /names_index 0 def + dup/names_len exch/Names get length def + /new_names names_len array def + /new_LookupTables names_len array def + /alias_cnt 0 def + dup/Names get + { + dup map_alias{ + exch pop + dup/ColorLookup known{ + dup begin + new_LookupTables names_index ColorLookup put + end + }{ + dup/Components known{ + dup begin + new_LookupTables names_index Components put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + new_names names_index 3 -1 roll/Name get put + /alias_cnt alias_cnt 1 add def + }{ + /name xdf + new_names names_index name put + dup/LookupTables known{ + dup begin + new_LookupTables names_index LookupTables names_index get put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + /names_index names_index 1 add def + }forall + alias_cnt 0 gt{ + /AliasedColorants true def + /lut_entry_len new_LookupTables 0 get dup length 256 ge{0 get length}{length}ifelse def + 0 1 names_len 1 sub{ + /names_index xdf + new_LookupTables names_index get dup length 256 ge{0 get length}{length}ifelse lut_entry_len ne{ + /AliasedColorants false def + exit + }{ + new_LookupTables names_index get 0 get null eq{ + dup/Names get names_index get/name xdf + name(Cyan)eq name(Magenta)eq name(Yellow)eq name(Black)eq + or or or not{ + /AliasedColorants false def + exit + }if + }if + }ifelse + }for + lut_entry_len 1 eq{ + /AliasedColorants false def + }if + AliasedColorants{ + dup begin + /Names new_names def + /LookupTables new_LookupTables def + /AliasedColorants true def + /NComponents lut_entry_len def + /TintMethod NComponents 4 eq{/Subtractive}{/Additive}ifelse def + /MappedCSA TintMethod/Additive eq{/DeviceRGB}{/DeviceCMYK}ifelse def + currentdict/TTTablesIdx known not{ + /TTTablesIdx -1 def + }if + end + }if + }if + end + }if + dup/devicen_colorspace_dict exch AGMCORE_gput + begin + currentdict/AliasedColorants known{ + AliasedColorants + }{ + false + }ifelse + dup not{ + CSA map_csa + }if + /TintTransform load type/nulltype eq or{ + /TintTransform[ + 0 1 Names length 1 sub + { + /TTTablesIdx TTTablesIdx 1 add def + dup LookupTables exch get dup 0 get null eq + { + 1 index + Names exch get + dup(Cyan)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0 0 0 + } + { + dup(Magenta)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0/exch cvx 0 0 + }{ + (Yellow)eq + { + exch + LookupTables length exch sub + /index cvx + 0 0 3 -1/roll cvx 0 + }{ + exch + LookupTables length exch sub + /index cvx + 0 0 0 4 -1/roll cvx + }ifelse + }ifelse + }ifelse + 5 -1/roll cvx/astore cvx + }{ + dup length 1 sub + LookupTables length 4 -1 roll sub 1 add + /index cvx/mul cvx/round cvx/cvi cvx/get cvx + }ifelse + Names length TTTablesIdx add 1 add 1/roll cvx + }for + Names length[/pop cvx]cvx/repeat cvx + NComponents Names length + TintMethod/Subtractive eq + { + subtractive_blend + }{ + additive_blend + }ifelse + ]cvx bdf + }if + AGMCORE_host_sep{ + Names convert_to_process{ + exec_tint_transform + } + { + currentdict/AliasedColorants known{ + AliasedColorants not + }{ + false + }ifelse + 5 dict begin + /AvoidAliasedColorants xdf + /painted? false def + /names_index 0 def + /names_len Names length def + AvoidAliasedColorants{ + /currentspotalias current_spot_alias def + false set_spot_alias + }if + Names{ + AGMCORE_is_cmyk_sep{ + dup(Cyan)eq AGMCORE_cyan_plate and exch + dup(Magenta)eq AGMCORE_magenta_plate and exch + dup(Yellow)eq AGMCORE_yellow_plate and exch + (Black)eq AGMCORE_black_plate and or or or{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + }if + painted?{exit}if + }{ + 0 0 0 0 5 -1 roll findcmykcustomcolor 1 setcustomcolor currentgray 0 eq{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + exit + }if + }ifelse + /names_index names_index 1 add def + }forall + AvoidAliasedColorants{ + currentspotalias set_spot_alias + }if + painted?{ + /devicen_colorspace_dict AGMCORE_gget/names_index names_index put + }{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + names_len[/pop cvx]cvx/repeat cvx 1/setseparationgray cvx + 0 0 0 0/setcmykcolor cvx + ]cvx ddf + }ifelse + end + }ifelse + } + { + AGMCORE_in_rip_sep{ + Names convert_to_process not + }{ + level3 + }ifelse + { + [/DeviceN Names MappedCSA/TintTransform load]setcolorspace_opt + /TintProc level3 not AGMCORE_in_rip_sep and{ + [ + Names/length cvx[/pop cvx]cvx/repeat cvx + ]cvx bdf + }{ + {setcolor}bdf + }ifelse + }{ + exec_tint_transform + }ifelse + }ifelse + set_crd + /AliasedColorants false def + end +}def +/setindexedcolorspace +{ + dup/indexed_colorspace_dict exch AGMCORE_gput + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + currentdict devncs + }{ + 1 currentdict sepcs + }ifelse + AGMCORE_host_sep{ + 4 dict begin + /compCnt/Names where{pop Names length}{1}ifelse def + /NewLookup HiVal 1 add string def + 0 1 HiVal{ + /tableIndex xdf + Lookup dup type/stringtype eq{ + compCnt tableIndex map_index + }{ + exec + }ifelse + /Names where{ + pop setdevicencolor + }{ + setsepcolor + }ifelse + currentgray + tableIndex exch + 255 mul cvi + NewLookup 3 1 roll put + }for + [/Indexed currentcolorspace HiVal NewLookup]setcolorspace_opt + end + }{ + level3 + { + currentdict/Names known{ + [/Indexed[/DeviceN Names MappedCSA/TintTransform load]HiVal Lookup]setcolorspace_opt + }{ + [/Indexed[/Separation Name MappedCSA sep_proc_name load]HiVal Lookup]setcolorspace_opt + }ifelse + }{ + [/Indexed MappedCSA HiVal + [ + currentdict/Names known{ + Lookup dup type/stringtype eq + {/exch cvx CSDBase/CSD get_res/Names get length dup/mul cvx exch/getinterval cvx{255 div}/forall cvx} + {/exec cvx}ifelse + /TintTransform load/exec cvx + }{ + Lookup dup type/stringtype eq + {/exch cvx/get cvx 255/div cvx} + {/exec cvx}ifelse + CSDBase/CSD get_res/MappedCSA get sep_proc_name exch pop/load cvx/exec cvx + }ifelse + ]cvx + ]setcolorspace_opt + }ifelse + }ifelse + end + set_crd + } + { + CSA map_csa + AGMCORE_host_sep level2 not and{ + 0 0 0 0 setcmykcolor + }{ + [/Indexed MappedCSA + level2 not has_color not and{ + dup 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or{ + pop[/DeviceGray] + }if + HiVal GrayLookup + }{ + HiVal + currentdict/RangeArray known{ + { + /indexed_colorspace_dict AGMCORE_gget begin + Lookup exch + dup HiVal gt{ + pop HiVal + }if + NComponents mul NComponents getinterval{}forall + NComponents 1 sub -1 0{ + RangeArray exch 2 mul 2 getinterval aload pop map255_to_range + NComponents 1 roll + }for + end + }bind + }{ + Lookup + }ifelse + }ifelse + ]setcolorspace_opt + set_crd + }ifelse + }ifelse + end +}def +/setindexedcolor +{ + AGMCORE_host_sep{ + /indexed_colorspace_dict AGMCORE_gget + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + map_indexed_devn + devn + } + { + Lookup 1 3 -1 roll map_index + sep + }ifelse + end + }{ + Lookup MappedCSA/DeviceCMYK eq{4}{1}ifelse 3 -1 roll + map_index + MappedCSA/DeviceCMYK eq{setcmykcolor}{setgray}ifelse + }ifelse + end + }{ + level3 not AGMCORE_in_rip_sep and/indexed_colorspace_dict AGMCORE_gget/CSDBase known and{ + /indexed_colorspace_dict AGMCORE_gget/CSDBase get/CSD get_res begin + map_indexed_devn + devn + end + } + { + setcolor + }ifelse + }ifelse +}def +/ignoreimagedata +{ + currentoverprint not{ + gsave + dup clonedict begin + 1 setgray + /Decode[0 1]def + /DataSourcedef + /MultipleDataSources false def + /BitsPerComponent 8 def + currentdict end + systemdict/image gx + grestore + }if + consumeimagedata +}def +/add_res +{ + dup/CSD eq{ + pop + //Adobe_AGM_Core begin + /AGMCORE_CSD_cache load 3 1 roll put + end + }{ + defineresource pop + }ifelse +}def +/del_res +{ + { + aload pop exch + dup/CSD eq{ + pop + {//Adobe_AGM_Core/AGMCORE_CSD_cache get exch undef}forall + }{ + exch + {1 index undefineresource}forall + pop + }ifelse + }forall +}def +/get_res +{ + dup/CSD eq{ + pop + dup type dup/nametype eq exch/stringtype eq or{ + AGMCORE_CSD_cache exch get + }if + }{ + findresource + }ifelse +}def +/get_csa_by_name +{ + dup type dup/nametype eq exch/stringtype eq or{ + /CSA get_res + }if +}def +/paintproc_buf_init +{ + /count get 0 0 put +}def +/paintproc_buf_next +{ + dup/count get dup 0 get + dup 3 1 roll + 1 add 0 xpt + get +}def +/cachepaintproc_compress +{ + 5 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + /string_size 16000 def + /readbuffer string_size string def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + /LZWFilter + { + exch + dup length 0 eq{ + pop + }{ + ppdict dup length 1 sub 3 -1 roll put + }ifelse + {string_size}{0}ifelse string + }/LZWEncode filter def + { + ReadFilter readbuffer readstring + exch LZWFilter exch writestring + not{exit}if + }loop + LZWFilter closefile + ppdict + end +}def +/cachepaintproc +{ + 2 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + { + ReadFilter 16000 string readstring exch + ppdict dup length 1 sub 3 -1 roll put + not{exit}if + }loop + ppdict dup dup length 1 sub()put + end +}def +/make_pattern +{ + exch clonedict exch + dup matrix currentmatrix matrix concatmatrix 0 0 3 2 roll itransform + exch 3 index/XStep get 1 index exch 2 copy div cvi mul sub sub + exch 3 index/YStep get 1 index exch 2 copy div cvi mul sub sub + matrix translate exch matrix concatmatrix + 1 index begin + BBox 0 get XStep div cvi XStep mul/xshift exch neg def + BBox 1 get YStep div cvi YStep mul/yshift exch neg def + BBox 0 get xshift add + BBox 1 get yshift add + BBox 2 get xshift add + BBox 3 get yshift add + 4 array astore + /BBox exch def + [xshift yshift/translate load null/exec load]dup + 3/PaintProc load put cvx/PaintProc exch def + end + gsave 0 setgray + makepattern + grestore +}def +/set_pattern +{ + dup/PatternType get 1 eq{ + dup/PaintType get 1 eq{ + currentoverprint sop[/DeviceGray]setcolorspace 0 setgray + }if + }if + setpattern +}def +/setcolorspace_opt +{ + dup currentcolorspace eq{pop}{setcolorspace}ifelse +}def +/updatecolorrendering +{ + currentcolorrendering/RenderingIntent known{ + currentcolorrendering/RenderingIntent get + } + { + Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/Saturation eq + { + /saturation_crd AGMCORE_gget dup null eq + } + { + /perceptual_crd AGMCORE_gget dup null eq + }ifelse + }ifelse + }ifelse + { + pop null + } + { + /RenderingIntent known{null}{Intent}ifelse + }ifelse + }ifelse + Intent ne{ + Intent/ColorRendering{findresource}stopped + { + pop pop systemdict/findcolorrendering known + { + Intent findcolorrendering + { + /ColorRendering findresource true exch + } + { + /ColorRendering findresource + product(Xerox Phaser 5400)ne + exch + }ifelse + dup Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd exch AGMCORE_gput + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd exch AGMCORE_gput + } + { + Intent/Saturation eq + { + /saturation_crd exch AGMCORE_gput + } + { + Intent/Perceptual eq + { + /perceptual_crd exch AGMCORE_gput + } + { + pop + }ifelse + }ifelse + }ifelse + }ifelse + 1 index{exch}{pop}ifelse + } + {false}ifelse + } + {true}ifelse + { + dup begin + currentdict/TransformPQR known{ + currentdict/TransformPQR get aload pop + 3{{}eq 3 1 roll}repeat or or + } + {true}ifelse + currentdict/MatrixPQR known{ + currentdict/MatrixPQR get aload pop + 1.0 eq 9 1 roll 0.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 1.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 0.0 eq 9 1 roll 1.0 eq + and and and and and and and and + } + {true}ifelse + end + or + { + clonedict begin + /TransformPQR[ + {4 -1 roll 3 get dup 3 1 roll sub 5 -1 roll 3 get 3 -1 roll sub div + 3 -1 roll 3 get 3 -1 roll 3 get dup 4 1 roll sub mul add}bind + {4 -1 roll 4 get dup 3 1 roll sub 5 -1 roll 4 get 3 -1 roll sub div + 3 -1 roll 4 get 3 -1 roll 4 get dup 4 1 roll sub mul add}bind + {4 -1 roll 5 get dup 3 1 roll sub 5 -1 roll 5 get 3 -1 roll sub div + 3 -1 roll 5 get 3 -1 roll 5 get dup 4 1 roll sub mul add}bind + ]def + /MatrixPQR[0.8951 -0.7502 0.0389 0.2664 1.7135 -0.0685 -0.1614 0.0367 1.0296]def + /RangePQR[-0.3227950745 2.3229645538 -1.5003771057 3.5003465881 -0.1369979095 2.136967392]def + currentdict end + }if + setcolorrendering_opt + }if + }if +}def +/set_crd +{ + AGMCORE_host_sep not level2 and{ + currentdict/ColorRendering known{ + ColorRendering/ColorRendering{findresource}stopped not{setcolorrendering_opt}if + }{ + currentdict/Intent known{ + updatecolorrendering + }if + }ifelse + currentcolorspace dup type/arraytype eq + {0 get}if + /DeviceRGB eq + { + currentdict/UCR known + {/UCR}{/AGMCORE_currentucr}ifelse + load setundercolorremoval + currentdict/BG known + {/BG}{/AGMCORE_currentbg}ifelse + load setblackgeneration + }if + }if +}def +/set_ucrbg +{ + dup null eq {pop /AGMCORE_currentbg load}{/Procedure get_res}ifelse + dup currentblackgeneration eq {pop}{setblackgeneration}ifelse + dup null eq {pop /AGMCORE_currentucr load}{/Procedure get_res}ifelse + dup currentundercolorremoval eq {pop}{setundercolorremoval}ifelse +}def +/setcolorrendering_opt +{ + dup currentcolorrendering eq{ + pop + }{ + product(HP Color LaserJet 2605)anchorsearch{ + pop pop pop + }{ + pop + clonedict + begin + /Intent Intent def + currentdict + end + setcolorrendering + }ifelse + }ifelse +}def +/cpaint_gcomp +{ + convert_to_process//Adobe_AGM_Core/AGMCORE_ConvertToProcess xddf + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get not + { + (%end_cpaint_gcomp)flushinput + }if +}def +/cpaint_gsep +{ + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get + { + (%end_cpaint_gsep)flushinput + }if +}def +/cpaint_gend +{np}def +/T1_path +{ + currentfile token pop currentfile token pop mo + { + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 exch rlineto + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 rlineto + }loop +}def +/T1_gsave + level3 + {/clipsave} + {/gsave}ifelse + load def +/T1_grestore + level3 + {/cliprestore} + {/grestore}ifelse + load def +/set_spot_alias_ary +{ + dup inherit_aliases + //Adobe_AGM_Core/AGMCORE_SpotAliasAry xddf +}def +/set_spot_normalization_ary +{ + dup inherit_aliases + dup length + /AGMCORE_SpotAliasAry where{pop AGMCORE_SpotAliasAry length add}if + array + //Adobe_AGM_Core/AGMCORE_SpotAliasAry2 xddf + /AGMCORE_SpotAliasAry where{ + pop + AGMCORE_SpotAliasAry2 0 AGMCORE_SpotAliasAry putinterval + AGMCORE_SpotAliasAry length + }{0}ifelse + AGMCORE_SpotAliasAry2 3 1 roll exch putinterval + true set_spot_alias +}def +/inherit_aliases +{ + {dup/Name get map_alias{/CSD put}{pop}ifelse}forall +}def +/set_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias 3 -1 roll put + }{ + pop + }ifelse +}def +/current_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias get + }{ + false + }ifelse +}def +/map_alias +{ + /AGMCORE_SpotAliasAry2 where{ + begin + /AGMCORE_name xdf + false + AGMCORE_SpotAliasAry2{ + dup/Name get AGMCORE_name eq{ + /CSD get/CSD get_res + exch pop true + exit + }{ + pop + }ifelse + }forall + end + }{ + pop false + }ifelse +}bdf +/spot_alias +{ + true set_spot_alias + /AGMCORE_&setcustomcolor AGMCORE_key_known not{ + //Adobe_AGM_Core/AGMCORE_&setcustomcolor/setcustomcolor load put + }if + /customcolor_tint 1 AGMCORE_gput + //Adobe_AGM_Core begin + /setcustomcolor + { + //Adobe_AGM_Core begin + dup/customcolor_tint exch AGMCORE_gput + 1 index aload pop pop 1 eq exch 1 eq and exch 1 eq and exch 1 eq and not + current_spot_alias and{1 index 4 get map_alias}{false}ifelse + { + false set_spot_alias + /sep_colorspace_dict AGMCORE_gget null ne + {/sep_colorspace_dict AGMCORE_gget/ForeignContent known not}{false}ifelse + 3 1 roll 2 index{ + exch pop/sep_tint AGMCORE_gget exch + }if + mark 3 1 roll + setsepcolorspace + counttomark 0 ne{ + setsepcolor + }if + pop + not{/sep_tint 1.0 AGMCORE_gput/sep_colorspace_dict AGMCORE_gget/ForeignContent true put}if + pop + true set_spot_alias + }{ + AGMCORE_&setcustomcolor + }ifelse + end + }bdf + end +}def +/begin_feature +{ + Adobe_AGM_Core/AGMCORE_feature_dictCount countdictstack put + count Adobe_AGM_Core/AGMCORE_feature_opCount 3 -1 roll put + {Adobe_AGM_Core/AGMCORE_feature_ctm matrix currentmatrix put}if +}def +/end_feature +{ + 2 dict begin + /spd/setpagedevice load def + /setpagedevice{get_gstate spd set_gstate}def + stopped{$error/newerror false put}if + end + count Adobe_AGM_Core/AGMCORE_feature_opCount get sub dup 0 gt{{pop}repeat}{pop}ifelse + countdictstack Adobe_AGM_Core/AGMCORE_feature_dictCount get sub dup 0 gt{{end}repeat}{pop}ifelse + {Adobe_AGM_Core/AGMCORE_feature_ctm get setmatrix}if +}def +/set_negative +{ + //Adobe_AGM_Core begin + /AGMCORE_inverting exch def + level2{ + currentpagedevice/NegativePrint known AGMCORE_distilling not and{ + currentpagedevice/NegativePrint get//Adobe_AGM_Core/AGMCORE_inverting get ne{ + true begin_feature true{ + <>setpagedevice + }end_feature + }if + /AGMCORE_inverting false def + }if + }if + AGMCORE_inverting{ + [{1 exch sub}/exec load dup currenttransfer exch]cvx bind settransfer + AGMCORE_distilling{ + erasepage + }{ + gsave np clippath 1/setseparationgray where{pop setseparationgray}{setgray}ifelse + /AGMIRS_&fill where{pop AGMIRS_&fill}{fill}ifelse grestore + }ifelse + }if + end +}def +/lw_save_restore_override{ + /md where{ + pop + md begin + initializepage + /initializepage{}def + /pmSVsetup{}def + /endp{}def + /pse{}def + /psb{}def + /orig_showpage where + {pop} + {/orig_showpage/showpage load def} + ifelse + /showpage{orig_showpage gR}def + end + }if +}def +/pscript_showpage_override{ + /NTPSOct95 where + { + begin + showpage + save + /showpage/restore load def + /restore{exch pop}def + end + }if +}def +/driver_media_override +{ + /md where{ + pop + md/initializepage known{ + md/initializepage{}put + }if + md/rC known{ + md/rC{4{pop}repeat}put + }if + }if + /mysetup where{ + /mysetup[1 0 0 1 0 0]put + }if + Adobe_AGM_Core/AGMCORE_Default_CTM matrix currentmatrix put + level2 + {Adobe_AGM_Core/AGMCORE_Default_PageSize currentpagedevice/PageSize get put}if +}def +/capture_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup Pscript_Win_Data/mysetup get put + }if + }if +}def +/restore_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup known{ + Pscript_Win_Data/mysetup Adobe_AGM_Core/save_mysetup get put + Adobe_AGM_Core/save_mysetup undef + }if + }if + }if +}def +/driver_check_media_override +{ + /PrepsDict where + {pop} + { + Adobe_AGM_Core/AGMCORE_Default_CTM get matrix currentmatrix ne + Adobe_AGM_Core/AGMCORE_Default_PageSize get type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_Default_PageSize get 0 get currentpagedevice/PageSize get 0 get eq and + Adobe_AGM_Core/AGMCORE_Default_PageSize get 1 get currentpagedevice/PageSize get 1 get eq and + }if + { + Adobe_AGM_Core/AGMCORE_Default_CTM get setmatrix + }if + }ifelse +}def +AGMCORE_err_strings begin + /AGMCORE_bad_environ(Environment not satisfactory for this job. Ensure that the PPD is correct or that the PostScript level requested is supported by this printer. )def + /AGMCORE_color_space_onhost_seps(This job contains colors that will not separate with on-host methods. )def + /AGMCORE_invalid_color_space(This job contains an invalid color space. )def +end +/set_def_ht +{AGMCORE_def_ht sethalftone}def +/set_def_flat +{AGMCORE_Default_flatness setflat}def +end +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_CoolType_Core 2.31 0 +%%Copyright: Copyright 1997-2006 Adobe Systems Incorporated. All Rights Reserved. +%%Version: 2.31 0 +10 dict begin +/Adobe_CoolType_Passthru currentdict def +/Adobe_CoolType_Core_Defined userdict/Adobe_CoolType_Core known def +Adobe_CoolType_Core_Defined + {/Adobe_CoolType_Core userdict/Adobe_CoolType_Core get def} +if +userdict/Adobe_CoolType_Core 70 dict dup begin put +/Adobe_CoolType_Version 2.31 def +/Level2? + systemdict/languagelevel known dup + {pop systemdict/languagelevel get 2 ge} + if def +Level2? not + { + /currentglobal false def + /setglobal/pop load def + /gcheck{pop false}bind def + /currentpacking false def + /setpacking/pop load def + /SharedFontDirectory 0 dict def + } +if +currentpacking +true setpacking +currentglobal false setglobal +userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} +if +get + begin + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + end +setglobal +currentglobal true setglobal +userdict/Adobe_CoolType_GVMFonts known not + {userdict/Adobe_CoolType_GVMFonts 10 dict put} +if +setglobal +currentglobal false setglobal +userdict/Adobe_CoolType_LVMFonts known not + {userdict/Adobe_CoolType_LVMFonts 10 dict put} +if +setglobal +/ct_VMDictPut + { + dup gcheck{Adobe_CoolType_GVMFonts}{Adobe_CoolType_LVMFonts}ifelse + 3 1 roll put + }bind def +/ct_VMDictUndef + { + dup Adobe_CoolType_GVMFonts exch known + {Adobe_CoolType_GVMFonts exch undef} + { + dup Adobe_CoolType_LVMFonts exch known + {Adobe_CoolType_LVMFonts exch undef} + {pop} + ifelse + }ifelse + }bind def +/ct_str1 1 string def +/ct_xshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_yshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 exch + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_xyshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + {_ct_na _ct_i 1 add get}stopped + {pop pop pop} + { + _ct_x _ct_y moveto + rmoveto + } + ifelse + } + ifelse + /_ct_i _ct_i 2 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/xsh{{@xshow}stopped{Adobe_CoolType_Data begin ct_xshow end}if}bind def +/ysh{{@yshow}stopped{Adobe_CoolType_Data begin ct_yshow end}if}bind def +/xysh{{@xyshow}stopped{Adobe_CoolType_Data begin ct_xyshow end}if}bind def +currentglobal true setglobal +/ct_T3Defs +{ +/BuildChar +{ + 1 index/Encoding get exch get + 1 index/BuildGlyph get exec +}bind def +/BuildGlyph +{ + exch begin + GlyphProcs exch get exec + end +}bind def +}bind def +setglobal +/@_SaveStackLevels + { + Adobe_CoolType_Data + begin + /@vmState currentglobal def false setglobal + @opStackCountByLevel + @opStackLevel + 2 copy known not + { + 2 copy + 3 dict dup/args + 7 index + 5 add array put + put get + } + { + get dup/args get dup length 3 index lt + { + dup length 5 add array exch + 1 index exch 0 exch putinterval + 1 index exch/args exch put + } + {pop} + ifelse + } + ifelse + begin + count 1 sub + 1 index lt + {pop count} + if + dup/argCount exch def + dup 0 gt + { + args exch 0 exch getinterval + astore pop + } + {pop} + ifelse + count + /restCount exch def + end + /@opStackLevel @opStackLevel 1 add def + countdictstack 1 sub + @dictStackCountByLevel exch @dictStackLevel exch put + /@dictStackLevel @dictStackLevel 1 add def + @vmState setglobal + end + }bind def +/@_RestoreStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + @opStackCountByLevel @opStackLevel get + begin + count restCount sub dup 0 gt + {{pop}repeat} + {pop} + ifelse + args 0 argCount getinterval{}forall + end + /@dictStackLevel @dictStackLevel 1 sub def + @dictStackCountByLevel @dictStackLevel get + end + countdictstack exch sub dup 0 gt + {{end}repeat} + {pop} + ifelse + }bind def +/@_PopStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + /@dictStackLevel @dictStackLevel 1 sub def + end + }bind def +/@Raise + { + exch cvx exch errordict exch get exec + stop + }bind def +/@ReRaise + { + cvx $error/errorname get errordict exch get exec + stop + }bind def +/@Stopped + { + 0 @#Stopped + }bind def +/@#Stopped + { + @_SaveStackLevels + stopped + {@_RestoreStackLevels true} + {@_PopStackLevels false} + ifelse + }bind def +/@Arg + { + Adobe_CoolType_Data + begin + @opStackCountByLevel @opStackLevel 1 sub get + begin + args exch + argCount 1 sub exch sub get + end + end + }bind def +currentglobal true setglobal +/CTHasResourceForAllBug + Level2? + { + 1 dict dup + /@shouldNotDisappearDictValue true def + Adobe_CoolType_Data exch/@shouldNotDisappearDict exch put + begin + count @_SaveStackLevels + {(*){pop stop}128 string/Category resourceforall} + stopped pop + @_RestoreStackLevels + currentdict Adobe_CoolType_Data/@shouldNotDisappearDict get dup 3 1 roll ne dup 3 1 roll + { + /@shouldNotDisappearDictValue known + { + { + end + currentdict 1 index eq + {pop exit} + if + } + loop + } + if + } + { + pop + end + } + ifelse + } + {false} + ifelse + def +true setglobal +/CTHasResourceStatusBug + Level2? + { + mark + {/steveamerige/Category resourcestatus} + stopped + {cleartomark true} + {cleartomark currentglobal not} + ifelse + } + {false} + ifelse + def +setglobal +/CTResourceStatus + { + mark 3 1 roll + /Category findresource + begin + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + end + }bind def +/CTWorkAroundBugs + { + Level2? + { + /cid_PreLoad/ProcSet resourcestatus + { + pop pop + currentglobal + mark + { + (*) + { + dup/CMap CTHasResourceStatusBug + {CTResourceStatus} + {resourcestatus} + ifelse + { + pop dup 0 eq exch 1 eq or + { + dup/CMap findresource gcheck setglobal + /CMap undefineresource + } + { + pop CTHasResourceForAllBug + {exit} + {stop} + ifelse + } + ifelse + } + {pop} + ifelse + } + 128 string/CMap resourceforall + } + stopped + {cleartomark} + stopped pop + setglobal + } + if + } + if + }bind def +/ds + { + Adobe_CoolType_Core + begin + CTWorkAroundBugs + /mo/moveto load def + /nf/newencodedfont load def + /msf{makefont setfont}bind def + /uf{dup undefinefont ct_VMDictUndef}bind def + /ur/undefineresource load def + /chp/charpath load def + /awsh/awidthshow load def + /wsh/widthshow load def + /ash/ashow load def + /@xshow/xshow load def + /@yshow/yshow load def + /@xyshow/xyshow load def + /@cshow/cshow load def + /sh/show load def + /rp/repeat load def + /.n/.notdef def + end + currentglobal false setglobal + userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} + if + get + begin + /AddWidths? false def + /CC 0 def + /charcode 2 string def + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + /InVMFontsByCMap 10 dict def + /InVMDeepCopiedFonts 10 dict def + end + setglobal + }bind def +/dt + { + currentdict Adobe_CoolType_Core eq + {end} + if + }bind def +/ps + { + Adobe_CoolType_Core begin + Adobe_CoolType_GVMFonts begin + Adobe_CoolType_LVMFonts begin + SharedFontDirectory begin + }bind def +/pt + { + end + end + end + end + }bind def +/unload + { + systemdict/languagelevel known + { + systemdict/languagelevel get 2 ge + { + userdict/Adobe_CoolType_Core 2 copy known + {undef} + {pop pop} + ifelse + } + if + } + if + }bind def +/ndf + { + 1 index where + {pop pop pop} + {dup xcheck{bind}if def} + ifelse + }def +/findfont systemdict + begin + userdict + begin + /globaldict where{/globaldict get begin}if + dup where pop exch get + /globaldict where{pop end}if + end + end +Adobe_CoolType_Core_Defined + {/systemfindfont exch def} + { + /findfont 1 index def + /systemfindfont exch def + } +ifelse +/undefinefont + {pop}ndf +/copyfont + { + currentglobal 3 1 roll + 1 index gcheck setglobal + dup null eq{0}{dup length}ifelse + 2 index length add 1 add dict + begin + exch + { + 1 index/FID eq + {pop pop} + {def} + ifelse + } + forall + dup null eq + {pop} + {{def}forall} + ifelse + currentdict + end + exch setglobal + }bind def +/copyarray + { + currentglobal exch + dup gcheck setglobal + dup length array copy + exch setglobal + }bind def +/newencodedfont + { + currentglobal + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + { + FontDirectory 3 index known + {FontDirectory 3 index get/FontReferenced known} + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + ifelse + } + ifelse + dup + { + 3 index findfont/FontReferenced get + 2 index dup type/nametype eq + {findfont} + if ne + {pop false} + if + } + if + dup + { + 1 index dup type/nametype eq + {findfont} + if + dup/CharStrings known + { + /CharStrings get length + 4 index findfont/CharStrings get length + ne + { + pop false + } + if + } + {pop} + ifelse + } + if + { + pop + 1 index findfont + /Encoding get exch + 0 1 255 + {2 copy get 3 index 3 1 roll put} + for + pop pop pop + } + { + currentglobal + 4 1 roll + dup type/nametype eq + {findfont} + if + dup gcheck setglobal + dup dup maxlength 2 add dict + begin + exch + { + 1 index/FID ne + 2 index/Encoding ne and + {def} + {pop pop} + ifelse + } + forall + /FontReferenced exch def + /Encoding exch dup length array copy def + /FontName 1 index dup type/stringtype eq{cvn}if def dup + currentdict + end + definefont ct_VMDictPut + setglobal + } + ifelse + }bind def +/SetSubstituteStrategy + { + $SubstituteFont + begin + dup type/dicttype ne + {0 dict} + if + currentdict/$Strategies known + { + exch $Strategies exch + 2 copy known + { + get + 2 copy maxlength exch maxlength add dict + begin + {def}forall + {def}forall + currentdict + dup/$Init known + {dup/$Init get exec} + if + end + /$Strategy exch def + } + {pop pop pop} + ifelse + } + {pop pop} + ifelse + end + }bind def +/scff + { + $SubstituteFont + begin + dup type/stringtype eq + {dup length exch} + {null} + ifelse + /$sname exch def + /$slen exch def + /$inVMIndex + $sname null eq + { + 1 index $str cvs + dup length $slen sub $slen getinterval cvn + } + {$sname} + ifelse def + end + {findfont} + @Stopped + { + dup length 8 add string exch + 1 index 0(BadFont:)putinterval + 1 index exch 8 exch dup length string cvs putinterval cvn + {findfont} + @Stopped + {pop/Courier findfont} + if + } + if + $SubstituteFont + begin + /$sname null def + /$slen 0 def + /$inVMIndex null def + end + }bind def +/isWidthsOnlyFont + { + dup/WidthsOnly known + {pop pop true} + { + dup/FDepVector known + {/FDepVector get{isWidthsOnlyFont dup{exit}if}forall} + { + dup/FDArray known + {/FDArray get{isWidthsOnlyFont dup{exit}if}forall} + {pop} + ifelse + } + ifelse + } + ifelse + }bind def +/ct_StyleDicts 4 dict dup begin + /Adobe-Japan1 4 dict dup begin + Level2? + { + /Serif + /HeiseiMin-W3-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMin-W3} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMin-W3/CIDFont resourcestatus + {pop pop/HeiseiMin-W3} + {/Ryumin-Light} + ifelse + } + {/Ryumin-Light} + ifelse + } + ifelse + def + /SansSerif + /HeiseiKakuGo-W5-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiKakuGo-W5} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiKakuGo-W5/CIDFont resourcestatus + {pop pop/HeiseiKakuGo-W5} + {/GothicBBB-Medium} + ifelse + } + {/GothicBBB-Medium} + ifelse + } + ifelse + def + /HeiseiMaruGo-W4-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMaruGo-W4/CIDFont resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + ifelse + /RoundSansSerif exch def + /Default Serif def + } + { + /Serif/Ryumin-Light def + /SansSerif/GothicBBB-Medium def + { + (fonts/Jun101-Light-83pv-RKSJ-H)status + }stopped + {pop}{ + {pop pop pop pop/Jun101-Light} + {SansSerif} + ifelse + /RoundSansSerif exch def + }ifelse + /Default Serif def + } + ifelse + end + def + /Adobe-Korea1 4 dict dup begin + /Serif/HYSMyeongJo-Medium def + /SansSerif/HYGoThic-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-GB1 4 dict dup begin + /Serif/STSong-Light def + /SansSerif/STHeiti-Regular def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-CNS1 4 dict dup begin + /Serif/MKai-Medium def + /SansSerif/MHei-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def +end +def +Level2?{currentglobal true setglobal}if +/ct_BoldRomanWidthProc + { + stringwidth 1 index 0 ne{exch .03 add exch}if setcharwidth + 0 0 + }bind def +/ct_Type0WidthProc + { + dup stringwidth 0 0 moveto + 2 index true charpath pathbbox + 0 -1 + 7 index 2 div .88 + setcachedevice2 + pop + 0 0 + }bind def +/ct_Type0WMode1WidthProc + { + dup stringwidth + pop 2 div neg -0.88 + 2 copy + moveto + 0 -1 + 5 -1 roll true charpath pathbbox + setcachedevice + }bind def +/cHexEncoding +[/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 +/c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 +/c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 +/c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B +/c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E +/c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 +/c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 +/c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 +/c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA +/cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD +/cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 +/cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 +/cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 +/cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def +/ct_BoldBaseFont + 11 dict begin + /FontType 3 def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /Encoding cHexEncoding def + /_setwidthProc/ct_BoldRomanWidthProc load def + /_bcstr1 1 string def + /BuildChar + { + exch begin + _basefont setfont + _bcstr1 dup 0 4 -1 roll put + dup + _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +systemdict/composefont known +{ +/ct_DefineIdentity-H +{ + /Identity-H/CMap resourcestatus + { + pop pop + } + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse +} +def +/ct_BoldBaseCIDFont + 11 dict begin + /CIDFontType 1 def + /CIDFontName/ct_BoldBaseCIDFont def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /_setwidthProc/ct_Type0WidthProc load def + /_bcstr2 2 string def + /BuildGlyph + { + exch begin + _basefont setfont + _bcstr2 1 2 index 256 mod put + _bcstr2 0 3 -1 roll 256 idiv put + _bcstr2 dup _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +}if +Level2?{setglobal}if +/ct_CopyFont{ + { + 1 index/FID ne 2 index/UniqueID ne and + {def}{pop pop}ifelse + }forall +}bind def +/ct_Type0CopyFont +{ + exch + dup length dict + begin + ct_CopyFont + [ + exch + FDepVector + { + dup/FontType get 0 eq + { + 1 index ct_Type0CopyFont + /_ctType0 exch definefont + } + { + /_ctBaseFont exch + 2 index exec + } + ifelse + exch + } + forall + pop + ] + /FDepVector exch def + currentdict + end +}bind def +/ct_MakeBoldFont +{ + dup/ct_SyntheticBold known + { + dup length 3 add dict begin + ct_CopyFont + /ct_StrokeWidth .03 0 FontMatrix idtransform pop def + /ct_SyntheticBold true def + currentdict + end + definefont + } + { + dup dup length 3 add dict + begin + ct_CopyFont + /PaintType 2 def + /StrokeWidth .03 0 FontMatrix idtransform pop def + /dummybold currentdict + end + definefont + dup/FontType get dup 9 ge exch 11 le and + { + ct_BoldBaseCIDFont + dup length 3 add dict copy begin + dup/CIDSystemInfo get/CIDSystemInfo exch def + ct_DefineIdentity-H + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefont exch def + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefonto exch def + currentdict + end + /CIDFont defineresource + } + { + ct_BoldBaseFont + dup length 3 add dict copy begin + /_basefont exch def + /_basefonto exch def + currentdict + end + definefont + } + ifelse + } + ifelse +}bind def +/ct_MakeBold{ + 1 index + 1 index + findfont + currentglobal 5 1 roll + dup gcheck setglobal + dup + /FontType get 0 eq + { + dup/WMode known{dup/WMode get 1 eq}{false}ifelse + version length 4 ge + and + {version 0 4 getinterval cvi 2015 ge} + {true} + ifelse + {/ct_Type0WidthProc} + {/ct_Type0WMode1WidthProc} + ifelse + ct_BoldBaseFont/_setwidthProc 3 -1 roll load put + {ct_MakeBoldFont}ct_Type0CopyFont definefont + } + { + dup/_fauxfont known not 1 index/SubstMaster known not and + { + ct_BoldBaseFont/_setwidthProc /ct_BoldRomanWidthProc load put + ct_MakeBoldFont + } + { + 2 index 2 index eq + {exch pop } + { + dup length dict begin + ct_CopyFont + currentdict + end + definefont + } + ifelse + } + ifelse + } + ifelse + pop pop pop + setglobal +}bind def +/?str1 256 string def +/?set + { + $SubstituteFont + begin + /$substituteFound false def + /$fontname 1 index def + /$doSmartSub false def + end + dup + findfont + $SubstituteFont + begin + $substituteFound + {false} + { + dup/FontName known + { + dup/FontName get $fontname eq + 1 index/DistillerFauxFont known not and + /currentdistillerparams where + {pop false 2 index isWidthsOnlyFont not and} + if + } + {false} + ifelse + } + ifelse + exch pop + /$doSmartSub true def + end + { + 5 1 roll pop pop pop pop + findfont + } + { + 1 index + findfont + dup/FontType get 3 eq + { + 6 1 roll pop pop pop pop pop false + } + {pop true} + ifelse + { + $SubstituteFont + begin + pop pop + /$styleArray 1 index def + /$regOrdering 2 index def + pop pop + 0 1 $styleArray length 1 sub + { + $styleArray exch get + ct_StyleDicts $regOrdering + 2 copy known + { + get + exch 2 copy known not + {pop/Default} + if + get + dup type/nametype eq + { + ?str1 cvs length dup 1 add exch + ?str1 exch(-)putinterval + exch dup length exch ?str1 exch 3 index exch putinterval + add ?str1 exch 0 exch getinterval cvn + } + { + pop pop/Unknown + } + ifelse + } + { + pop pop pop pop/Unknown + } + ifelse + } + for + end + findfont + }if + } + ifelse + currentglobal false setglobal 3 1 roll + null copyfont definefont pop + setglobal + }bind def +setpacking +userdict/$SubstituteFont 25 dict put +1 dict + begin + /SubstituteFont + dup $error exch 2 copy known + {get} + {pop pop{pop/Courier}bind} + ifelse def + /currentdistillerparams where dup + { + pop pop + currentdistillerparams/CannotEmbedFontPolicy 2 copy known + {get/Error eq} + {pop pop false} + ifelse + } + if not + { + countdictstack array dictstack 0 get + begin + userdict + begin + $SubstituteFont + begin + /$str 128 string def + /$fontpat 128 string def + /$slen 0 def + /$sname null def + /$match false def + /$fontname null def + /$substituteFound false def + /$inVMIndex null def + /$doSmartSub true def + /$depth 0 def + /$fontname null def + /$italicangle 26.5 def + /$dstack null def + /$Strategies 10 dict dup + begin + /$Type3Underprint + { + currentglobal exch false setglobal + 11 dict + begin + /UseFont exch + $WMode 0 ne + { + dup length dict copy + dup/WMode $WMode put + /UseFont exch definefont + } + if def + /FontName $fontname dup type/stringtype eq{cvn}if def + /FontType 3 def + /FontMatrix[.001 0 0 .001 0 0]def + /Encoding 256 array dup 0 1 255{/.notdef put dup}for pop def + /FontBBox[0 0 0 0]def + /CCInfo 7 dict dup + begin + /cc null def + /x 0 def + /y 0 def + end def + /BuildChar + { + exch + begin + CCInfo + begin + 1 string dup 0 3 index put exch pop + /cc exch def + UseFont 1000 scalefont setfont + cc stringwidth/y exch def/x exch def + x y setcharwidth + $SubstituteFont/$Strategy get/$Underprint get exec + 0 0 moveto cc show + x y moveto + end + end + }bind def + currentdict + end + exch setglobal + }bind def + /$GetaTint + 2 dict dup + begin + /$BuildFont + { + dup/WMode known + {dup/WMode get} + {0} + ifelse + /$WMode exch def + $fontname exch + dup/FontName known + { + dup/FontName get + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + exch + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index/FontName get known + { + pop + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index get + null copyfont + } + {$deepcopyfont} + ifelse + exch 1 index exch/FontBasedOn exch put + dup/FontName $fontname dup type/stringtype eq{cvn}if put + definefont + Adobe_CoolType_Data/InVMDeepCopiedFonts get + begin + dup/FontBasedOn get 1 index def + end + }bind def + /$Underprint + { + gsave + x abs y abs gt + {/y 1000 def} + {/x -1000 def 500 120 translate} + ifelse + Level2? + { + [/Separation(All)/DeviceCMYK{0 0 0 1 pop}] + setcolorspace + } + {0 setgray} + ifelse + 10 setlinewidth + x .8 mul + [7 3] + { + y mul 8 div 120 sub x 10 div exch moveto + 0 y 4 div neg rlineto + dup 0 rlineto + 0 y 4 div rlineto + closepath + gsave + Level2? + {.2 setcolor} + {.8 setgray} + ifelse + fill grestore + stroke + } + forall + pop + grestore + }bind def + end def + /$Oblique + 1 dict dup + begin + /$BuildFont + { + currentglobal exch dup gcheck setglobal + null copyfont + begin + /FontBasedOn + currentdict/FontName known + { + FontName + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + def + /FontName $fontname dup type/stringtype eq{cvn}if def + /currentdistillerparams where + {pop} + { + /FontInfo currentdict/FontInfo known + {FontInfo null copyfont} + {2 dict} + ifelse + dup + begin + /ItalicAngle $italicangle def + /FontMatrix FontMatrix + [1 0 ItalicAngle dup sin exch cos div 1 0 0] + matrix concatmatrix readonly + end + 4 2 roll def + def + } + ifelse + FontName currentdict + end + definefont + exch setglobal + }bind def + end def + /$None + 1 dict dup + begin + /$BuildFont{}bind def + end def + end def + /$Oblique SetSubstituteStrategy + /$findfontByEnum + { + dup type/stringtype eq{cvn}if + dup/$fontname exch def + $sname null eq + {$str cvs dup length $slen sub $slen getinterval} + {pop $sname} + ifelse + $fontpat dup 0(fonts/*)putinterval exch 7 exch putinterval + /$match false def + $SubstituteFont/$dstack countdictstack array dictstack put + mark + { + $fontpat 0 $slen 7 add getinterval + {/$match exch def exit} + $str filenameforall + } + stopped + { + cleardictstack + currentdict + true + $SubstituteFont/$dstack get + { + exch + { + 1 index eq + {pop false} + {true} + ifelse + } + {begin false} + ifelse + } + forall + pop + } + if + cleartomark + /$slen 0 def + $match false ne + {$match(fonts/)anchorsearch pop pop cvn} + {/Courier} + ifelse + }bind def + /$ROS 1 dict dup + begin + /Adobe 4 dict dup + begin + /Japan1 [/Ryumin-Light/HeiseiMin-W3 + /GothicBBB-Medium/HeiseiKakuGo-W5 + /HeiseiMaruGo-W4/Jun101-Light]def + /Korea1 [/HYSMyeongJo-Medium/HYGoThic-Medium]def + /GB1 [/STSong-Light/STHeiti-Regular]def + /CNS1 [/MKai-Medium/MHei-Medium]def + end def + end def + /$cmapname null def + /$deepcopyfont + { + dup/FontType get 0 eq + { + 1 dict dup/FontName/copied put copyfont + begin + /FDepVector FDepVector copyarray + 0 1 2 index length 1 sub + { + 2 copy get $deepcopyfont + dup/FontName/copied put + /copied exch definefont + 3 copy put pop pop + } + for + def + currentdict + end + } + {$Strategies/$Type3Underprint get exec} + ifelse + }bind def + /$buildfontname + { + dup/CIDFont findresource/CIDSystemInfo get + begin + Registry length Ordering length Supplement 8 string cvs + 3 copy length 2 add add add string + dup 5 1 roll dup 0 Registry putinterval + dup 4 index(-)putinterval + dup 4 index 1 add Ordering putinterval + 4 2 roll add 1 add 2 copy(-)putinterval + end + 1 add 2 copy 0 exch getinterval $cmapname $fontpat cvs exch + anchorsearch + {pop pop 3 2 roll putinterval cvn/$cmapname exch def} + {pop pop pop pop pop} + ifelse + length + $str 1 index(-)putinterval 1 add + $str 1 index $cmapname $fontpat cvs putinterval + $cmapname length add + $str exch 0 exch getinterval cvn + }bind def + /$findfontByROS + { + /$fontname exch def + $ROS Registry 2 copy known + { + get Ordering 2 copy known + {get} + {pop pop[]} + ifelse + } + {pop pop[]} + ifelse + false exch + { + dup/CIDFont resourcestatus + { + pop pop + save + 1 index/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get} + {false} + ifelse + exch pop + exch restore + {pop} + {exch pop true exit} + ifelse + } + {pop} + ifelse + } + forall + {$str cvs $buildfontname} + { + false(*) + { + save exch + dup/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get not} + {true} + ifelse + exch/CIDSystemInfo get + dup/Registry get Registry eq + exch/Ordering get Ordering eq and and + {exch restore exch pop true exit} + {pop restore} + ifelse + } + $str/CIDFont resourceforall + {$buildfontname} + {$fontname $findfontByEnum} + ifelse + } + ifelse + }bind def + end + end + currentdict/$error known currentdict/languagelevel known and dup + {pop $error/SubstituteFont known} + if + dup + {$error} + {Adobe_CoolType_Core} + ifelse + begin + { + /SubstituteFont + /CMap/Category resourcestatus + { + pop pop + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + { + $sname null eq + {dup $str cvs dup length $slen sub $slen getinterval cvn} + {$sname} + ifelse + Adobe_CoolType_Data/InVMFontsByCMap get + 1 index 2 copy known + { + get + false exch + { + pop + currentglobal + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + { + FontDirectory 1 index known + {exch pop true exit} + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + ifelse + } + ifelse + } + forall + } + {pop pop false} + ifelse + { + exch pop exch pop + } + { + dup/CMap resourcestatus + { + pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + } + { + 128 string cvs + dup(-)search + { + 3 1 roll search + { + 3 1 roll pop + {dup cvi} + stopped + {pop pop pop pop pop $findfontByEnum} + { + 4 2 roll pop pop + exch length + exch + 2 index length + 2 index + sub + exch 1 sub -1 0 + { + $str cvs dup length + 4 index + 0 + 4 index + 4 3 roll add + getinterval + exch 1 index exch 3 index exch + putinterval + dup/CMap resourcestatus + { + pop pop + 4 1 roll pop pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + true exit + } + {pop} + ifelse + } + for + dup type/booleantype eq + {pop} + {pop pop pop $findfontByEnum} + ifelse + } + ifelse + } + {pop pop pop $findfontByEnum} + ifelse + } + {pop pop $findfontByEnum} + ifelse + } + ifelse + } + ifelse + } + {//SubstituteFont exec} + ifelse + /$slen 0 def + end + } + } + { + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + {$findfontByEnum} + {//SubstituteFont exec} + ifelse + end + } + } + ifelse + bind readonly def + Adobe_CoolType_Core/scfindfont/systemfindfont load put + } + { + /scfindfont + { + $SubstituteFont + begin + dup systemfindfont + dup/FontName known + {dup/FontName get dup 3 index ne} + {/noname true} + ifelse + dup + { + /$origfontnamefound 2 index def + /$origfontname 4 index def/$substituteFound true def + } + if + exch pop + { + $slen 0 gt + $sname null ne + 3 index length $slen gt or and + { + pop dup $findfontByEnum findfont + dup maxlength 1 add dict + begin + {1 index/FID eq{pop pop}{def}ifelse} + forall + currentdict + end + definefont + dup/FontName known{dup/FontName get}{null}ifelse + $origfontnamefound ne + { + $origfontname $str cvs print + ( substitution revised, using )print + dup/FontName known + {dup/FontName get}{(unspecified font)} + ifelse + $str cvs print(.\n)print + } + if + } + {exch pop} + ifelse + } + {exch pop} + ifelse + end + }bind def + } + ifelse + end + end + Adobe_CoolType_Core_Defined not + { + Adobe_CoolType_Core/findfont + { + $SubstituteFont + begin + $depth 0 eq + { + /$fontname 1 index dup type/stringtype ne{$str cvs}if def + /$substituteFound false def + } + if + /$depth $depth 1 add def + end + scfindfont + $SubstituteFont + begin + /$depth $depth 1 sub def + $substituteFound $depth 0 eq and + { + $inVMIndex null ne + {dup $inVMIndex $AddInVMFont} + if + $doSmartSub + { + currentdict/$Strategy known + {$Strategy/$BuildFont get exec} + if + } + if + } + if + end + }bind put + } + if + } + if + end +/$AddInVMFont + { + exch/FontName 2 copy known + { + get + 1 dict dup begin exch 1 index gcheck def end exch + Adobe_CoolType_Data/InVMFontsByCMap get exch + $DictAdd + } + {pop pop pop} + ifelse + }bind def +/$DictAdd + { + 2 copy known not + {2 copy 4 index length dict put} + if + Level2? not + { + 2 copy get dup maxlength exch length 4 index length add lt + 2 copy get dup length 4 index length add exch maxlength 1 index lt + { + 2 mul dict + begin + 2 copy get{forall}def + 2 copy currentdict put + end + } + {pop} + ifelse + } + if + get + begin + {def} + forall + end + }bind def +end +end +%%EndResource +currentglobal true setglobal +%%BeginResource: procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%Copyright: Copyright 1987-2006 Adobe Systems Incorporated. +%%Version: 1.23 0 +systemdict/languagelevel known dup + {currentglobal false setglobal} + {false} +ifelse +exch +userdict/Adobe_CoolType_Utility 2 copy known + {2 copy get dup maxlength 27 add dict copy} + {27 dict} +ifelse put +Adobe_CoolType_Utility + begin + /@eexecStartData + def + /@recognizeCIDFont null def + /ct_Level2? exch def + /ct_Clone? 1183615869 internaldict dup + /CCRun known not + exch/eCCRun known not + ct_Level2? and or def +ct_Level2? + {globaldict begin currentglobal true setglobal} +if + /ct_AddStdCIDMap + ct_Level2? + {{ + mark + Adobe_CoolType_Utility/@recognizeCIDFont currentdict put + { + ((Hex)57 StartData + 0615 1e27 2c39 1c60 d8a8 cc31 fe2b f6e0 + 7aa3 e541 e21c 60d8 a8c9 c3d0 6d9e 1c60 + d8a8 c9c2 02d7 9a1c 60d8 a849 1c60 d8a8 + cc36 74f4 1144 b13b 77)0()/SubFileDecode filter cvx exec + } + stopped + { + cleartomark + Adobe_CoolType_Utility/@recognizeCIDFont get + countdictstack dup array dictstack + exch 1 sub -1 0 + { + 2 copy get 3 index eq + {1 index length exch sub 1 sub{end}repeat exit} + {pop} + ifelse + } + for + pop pop + Adobe_CoolType_Utility/@eexecStartData get eexec + } + {cleartomark} + ifelse + }} + {{ + Adobe_CoolType_Utility/@eexecStartData get eexec + }} + ifelse bind def +userdict/cid_extensions known +dup{cid_extensions/cid_UpdateDB known and}if + { + cid_extensions + begin + /cid_GetCIDSystemInfo + { + 1 index type/stringtype eq + {exch cvn exch} + if + cid_extensions + begin + dup load 2 index known + { + 2 copy + cid_GetStatusInfo + dup null ne + { + 1 index load + 3 index get + dup null eq + {pop pop cid_UpdateDB} + { + exch + 1 index/Created get eq + {exch pop exch pop} + {pop cid_UpdateDB} + ifelse + } + ifelse + } + {pop cid_UpdateDB} + ifelse + } + {cid_UpdateDB} + ifelse + end + }bind def + end + } +if +ct_Level2? + {end setglobal} +if + /ct_UseNativeCapability? systemdict/composefont known def + /ct_MakeOCF 35 dict def + /ct_Vars 25 dict def + /ct_GlyphDirProcs 6 dict def + /ct_BuildCharDict 15 dict dup + begin + /charcode 2 string def + /dst_string 1500 string def + /nullstring()def + /usewidths? true def + end def + ct_Level2?{setglobal}{pop}ifelse + ct_GlyphDirProcs + begin + /GetGlyphDirectory + { + systemdict/languagelevel known + {pop/CIDFont findresource/GlyphDirectory get} + { + 1 index/CIDFont findresource/GlyphDirectory + get dup type/dicttype eq + { + dup dup maxlength exch length sub 2 index lt + { + dup length 2 index add dict copy 2 index + /CIDFont findresource/GlyphDirectory 2 index put + } + if + } + if + exch pop exch pop + } + ifelse + + + }def + /+ + { + systemdict/languagelevel known + { + currentglobal false setglobal + 3 dict begin + /vm exch def + } + {1 dict begin} + ifelse + /$ exch def + systemdict/languagelevel known + { + vm setglobal + /gvm currentglobal def + $ gcheck setglobal + } + if + ?{$ begin}if + }def + /?{$ type/dicttype eq}def + /|{ + userdict/Adobe_CoolType_Data known + { + Adobe_CoolType_Data/AddWidths? known + { + currentdict Adobe_CoolType_Data + begin + begin + AddWidths? + { + Adobe_CoolType_Data/CC 3 index put + ?{def}{$ 3 1 roll put}ifelse + CC charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore + currentfont/Widths get exch CC exch put + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + end + end + } + {?{def}{$ 3 1 roll put}ifelse} ifelse + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + }def + /! + { + ?{end}if + systemdict/languagelevel known + {gvm setglobal} + if + end + }def + /:{string currentfile exch readstring pop}executeonly def + end + ct_MakeOCF + begin + /ct_cHexEncoding + [/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 + /c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 + /c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 + /c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B + /c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E + /c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 + /c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 + /c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 + /c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA + /cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD + /cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 + /cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 + /cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 + /cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def + /ct_CID_STR_SIZE 8000 def + /ct_mkocfStr100 100 string def + /ct_defaultFontMtx[.001 0 0 .001 0 0]def + /ct_1000Mtx[1000 0 0 1000 0 0]def + /ct_raise{exch cvx exch errordict exch get exec stop}bind def + /ct_reraise + {cvx $error/errorname get(Error: )print dup( )cvs print + errordict exch get exec stop + }bind def + /ct_cvnsi + { + 1 index add 1 sub 1 exch 0 4 1 roll + { + 2 index exch get + exch 8 bitshift + add + } + for + exch pop + }bind def + /ct_GetInterval + { + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /dst_index 0 def + dup dst_string length gt + {dup string/dst_string exch def} + if + 1 index ct_CID_STR_SIZE idiv + /arrayIndex exch def + 2 index arrayIndex get + 2 index + arrayIndex ct_CID_STR_SIZE mul + sub + { + dup 3 index add 2 index length le + { + 2 index getinterval + dst_string dst_index 2 index putinterval + length dst_index add/dst_index exch def + exit + } + { + 1 index length 1 index sub + dup 4 1 roll + getinterval + dst_string dst_index 2 index putinterval + pop dup dst_index add/dst_index exch def + sub + /arrayIndex arrayIndex 1 add def + 2 index dup length arrayIndex gt + {arrayIndex get} + { + pop + exit + } + ifelse + 0 + } + ifelse + } + loop + pop pop pop + dst_string 0 dst_index getinterval + end + }bind def + ct_Level2? + { + /ct_resourcestatus + currentglobal mark true setglobal + {/unknowninstancename/Category resourcestatus} + stopped + {cleartomark setglobal true} + {cleartomark currentglobal not exch setglobal} + ifelse + { + { + mark 3 1 roll/Category findresource + begin + ct_Vars/vm currentglobal put + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + ct_Vars/vm get setglobal + end + } + } + {{resourcestatus}} + ifelse bind def + /CIDFont/Category ct_resourcestatus + {pop pop} + { + currentglobal true setglobal + /Generic/Category findresource + dup length dict copy + dup/InstanceType/dicttype put + /CIDFont exch/Category defineresource pop + setglobal + } + ifelse + ct_UseNativeCapability? + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + if + } + { + /ct_Category 2 dict begin + /CIDFont 10 dict def + /ProcSet 2 dict def + currentdict + end + def + /defineresource + { + ct_Category 1 index 2 copy known + { + get + dup dup maxlength exch length eq + { + dup length 10 add dict copy + ct_Category 2 index 2 index put + } + if + 3 index 3 index put + pop exch pop + } + {pop pop/defineresource/undefined ct_raise} + ifelse + }bind def + /findresource + { + ct_Category 1 index 2 copy known + { + get + 2 index 2 copy known + {get 3 1 roll pop pop} + {pop pop/findresource/undefinedresource ct_raise} + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /resourcestatus + { + ct_Category 1 index 2 copy known + { + get + 2 index known + exch pop exch pop + { + 0 -1 true + } + { + false + } + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /ct_resourcestatus/resourcestatus load def + } + ifelse + /ct_CIDInit 2 dict + begin + /ct_cidfont_stream_init + { + { + dup(Binary)eq + { + pop + null + currentfile + ct_Level2? + { + {cid_BYTE_COUNT()/SubFileDecode filter} + stopped + {pop pop pop} + if + } + if + /readstring load + exit + } + if + dup(Hex)eq + { + pop + currentfile + ct_Level2? + { + {null exch/ASCIIHexDecode filter/readstring} + stopped + {pop exch pop(>)exch/readhexstring} + if + } + {(>)exch/readhexstring} + ifelse + load + exit + } + if + /StartData/typecheck ct_raise + } + loop + cid_BYTE_COUNT ct_CID_STR_SIZE le + { + 2 copy cid_BYTE_COUNT string exch exec + pop + 1 array dup + 3 -1 roll + 0 exch put + } + { + cid_BYTE_COUNT ct_CID_STR_SIZE div ceiling cvi + dup array exch 2 sub 0 exch 1 exch + { + 2 copy + 5 index + ct_CID_STR_SIZE + string + 6 index exec + pop + put + pop + } + for + 2 index + cid_BYTE_COUNT ct_CID_STR_SIZE mod string + 3 index exec + pop + 1 index exch + 1 index length 1 sub + exch put + } + ifelse + cid_CIDFONT exch/GlyphData exch put + 2 index null eq + { + pop pop pop + } + { + pop/readstring load + 1 string exch + { + 3 copy exec + pop + dup length 0 eq + { + pop pop pop pop pop + true exit + } + if + 4 index + eq + { + pop pop pop pop + false exit + } + if + } + loop + pop + } + ifelse + }bind def + /StartData + { + mark + { + currentdict + dup/FDArray get 0 get/FontMatrix get + 0 get 0.001 eq + { + dup/CDevProc known not + { + /CDevProc 1183615869 internaldict/stdCDevProc 2 copy known + {get} + { + pop pop + {pop pop pop pop pop 0 -1000 7 index 2 div 880} + } + ifelse + def + } + if + } + { + /CDevProc + { + pop pop pop pop pop + 0 + 1 cid_temp/cid_CIDFONT get + /FDArray get 0 get + /FontMatrix get 0 get div + 7 index 2 div + 1 index 0.88 mul + }def + } + ifelse + /cid_temp 15 dict def + cid_temp + begin + /cid_CIDFONT exch def + 3 copy pop + dup/cid_BYTE_COUNT exch def 0 gt + { + ct_cidfont_stream_init + FDArray + { + /Private get + dup/SubrMapOffset known + { + begin + /Subrs SubrCount array def + Subrs + SubrMapOffset + SubrCount + SDBytes + ct_Level2? + { + currentdict dup/SubrMapOffset undef + dup/SubrCount undef + /SDBytes undef + } + if + end + /cid_SD_BYTES exch def + /cid_SUBR_COUNT exch def + /cid_SUBR_MAP_OFFSET exch def + /cid_SUBRS exch def + cid_SUBR_COUNT 0 gt + { + GlyphData cid_SUBR_MAP_OFFSET cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + 0 1 cid_SUBR_COUNT 1 sub + { + exch 1 index + 1 add + cid_SD_BYTES mul cid_SUBR_MAP_OFFSET add + GlyphData exch cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + cid_SUBRS 4 2 roll + GlyphData exch + 4 index + 1 index + sub + ct_GetInterval + dup length string copy put + } + for + pop + } + if + } + {pop} + ifelse + } + forall + } + if + cleartomark pop pop + end + CIDFontName currentdict/CIDFont defineresource pop + end end + } + stopped + {cleartomark/StartData ct_reraise} + if + }bind def + currentdict + end def + /ct_saveCIDInit + { + /CIDInit/ProcSet ct_resourcestatus + {true} + {/CIDInitC/ProcSet ct_resourcestatus} + ifelse + { + pop pop + /CIDInit/ProcSet findresource + ct_UseNativeCapability? + {pop null} + {/CIDInit ct_CIDInit/ProcSet defineresource pop} + ifelse + } + {/CIDInit ct_CIDInit/ProcSet defineresource pop null} + ifelse + ct_Vars exch/ct_oldCIDInit exch put + }bind def + /ct_restoreCIDInit + { + ct_Vars/ct_oldCIDInit get dup null ne + {/CIDInit exch/ProcSet defineresource pop} + {pop} + ifelse + }bind def + /ct_BuildCharSetUp + { + 1 index + begin + CIDFont + begin + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /ct_dfCharCode exch def + /ct_dfDict exch def + CIDFirstByte ct_dfCharCode add + dup CIDCount ge + {pop 0} + if + /cid exch def + { + GlyphDirectory cid 2 copy known + {get} + {pop pop nullstring} + ifelse + dup length FDBytes sub 0 gt + { + dup + FDBytes 0 ne + {0 FDBytes ct_cvnsi} + {pop 0} + ifelse + /fdIndex exch def + dup length FDBytes sub FDBytes exch getinterval + /charstring exch def + exit + } + { + pop + cid 0 eq + {/charstring nullstring def exit} + if + /cid 0 def + } + ifelse + } + loop + }def + /ct_SetCacheDevice + { + 0 0 moveto + dup stringwidth + 3 -1 roll + true charpath + pathbbox + 0 -1000 + 7 index 2 div 880 + setcachedevice2 + 0 0 moveto + }def + /ct_CloneSetCacheProc + { + 1 eq + { + stringwidth + pop -2 div -880 + 0 -1000 setcharwidth + moveto + } + { + usewidths? + { + currentfont/Widths get cid + 2 copy known + {get exch pop aload pop} + {pop pop stringwidth} + ifelse + } + {stringwidth} + ifelse + setcharwidth + 0 0 moveto + } + ifelse + }def + /ct_Type3ShowCharString + { + ct_FDDict fdIndex 2 copy known + {get} + { + currentglobal 3 1 roll + 1 index gcheck setglobal + ct_Type1FontTemplate dup maxlength dict copy + begin + FDArray fdIndex get + dup/FontMatrix 2 copy known + {get} + {pop pop ct_defaultFontMtx} + ifelse + /FontMatrix exch dup length array copy def + /Private get + /Private exch def + /Widths rootfont/Widths get def + /CharStrings 1 dict dup/.notdef + dup length string copy put def + currentdict + end + /ct_Type1Font exch definefont + dup 5 1 roll put + setglobal + } + ifelse + dup/CharStrings get 1 index/Encoding get + ct_dfCharCode get charstring put + rootfont/WMode 2 copy known + {get} + {pop pop 0} + ifelse + exch + 1000 scalefont setfont + ct_str1 0 ct_dfCharCode put + ct_str1 exch ct_dfSetCacheProc + ct_SyntheticBold + { + currentpoint + ct_str1 show + newpath + moveto + ct_str1 true charpath + ct_StrokeWidth setlinewidth + stroke + } + {ct_str1 show} + ifelse + }def + /ct_Type4ShowCharString + { + ct_dfDict ct_dfCharCode charstring + FDArray fdIndex get + dup/FontMatrix get dup ct_defaultFontMtx ct_matrixeq not + {ct_1000Mtx matrix concatmatrix concat} + {pop} + ifelse + /Private get + Adobe_CoolType_Utility/ct_Level2? get not + { + ct_dfDict/Private + 3 -1 roll + {put} + 1183615869 internaldict/superexec get exec + } + if + 1183615869 internaldict + Adobe_CoolType_Utility/ct_Level2? get + {1 index} + {3 index/Private get mark 6 1 roll} + ifelse + dup/RunInt known + {/RunInt get} + {pop/CCRun} + ifelse + get exec + Adobe_CoolType_Utility/ct_Level2? get not + {cleartomark} + if + }bind def + /ct_BuildCharIncremental + { + { + Adobe_CoolType_Utility/ct_MakeOCF get begin + ct_BuildCharSetUp + ct_ShowCharString + } + stopped + {stop} + if + end + end + end + end + }bind def + /BaseFontNameStr(BF00)def + /ct_Type1FontTemplate 14 dict + begin + /FontType 1 def + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /PaintType 0 def + currentdict + end def + /BaseFontTemplate 11 dict + begin + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /BuildChar/ct_BuildCharIncremental load def + ct_Clone? + { + /FontType 3 def + /ct_ShowCharString/ct_Type3ShowCharString load def + /ct_dfSetCacheProc/ct_CloneSetCacheProc load def + /ct_SyntheticBold false def + /ct_StrokeWidth 1 def + } + { + /FontType 4 def + /Private 1 dict dup/lenIV 4 put def + /CharStrings 1 dict dup/.notdefput def + /PaintType 0 def + /ct_ShowCharString/ct_Type4ShowCharString load def + } + ifelse + /ct_str1 1 string def + currentdict + end def + /BaseFontDictSize BaseFontTemplate length 5 add def + /ct_matrixeq + { + true 0 1 5 + { + dup 4 index exch get exch 3 index exch get eq and + dup not + {exit} + if + } + for + exch pop exch pop + }bind def + /ct_makeocf + { + 15 dict + begin + exch/WMode exch def + exch/FontName exch def + /FontType 0 def + /FMapType 2 def + dup/FontMatrix known + {dup/FontMatrix get/FontMatrix exch def} + {/FontMatrix matrix def} + ifelse + /bfCount 1 index/CIDCount get 256 idiv 1 add + dup 256 gt{pop 256}if def + /Encoding + 256 array 0 1 bfCount 1 sub{2 copy dup put pop}for + bfCount 1 255{2 copy bfCount put pop}for + def + /FDepVector bfCount dup 256 lt{1 add}if array def + BaseFontTemplate BaseFontDictSize dict copy + begin + /CIDFont exch def + CIDFont/FontBBox known + {CIDFont/FontBBox get/FontBBox exch def} + if + CIDFont/CDevProc known + {CIDFont/CDevProc get/CDevProc exch def} + if + currentdict + end + BaseFontNameStr 3(0)putinterval + 0 1 bfCount dup 256 eq{1 sub}if + { + FDepVector exch + 2 index BaseFontDictSize dict copy + begin + dup/CIDFirstByte exch 256 mul def + FontType 3 eq + {/ct_FDDict 2 dict def} + if + currentdict + end + 1 index 16 + BaseFontNameStr 2 2 getinterval cvrs pop + BaseFontNameStr exch definefont + put + } + for + ct_Clone? + {/Widths 1 index/CIDFont get/GlyphDirectory get length dict def} + if + FontName + currentdict + end + definefont + ct_Clone? + { + gsave + dup 1000 scalefont setfont + ct_BuildCharDict + begin + /usewidths? false def + currentfont/Widths get + begin + exch/CIDFont get/GlyphDirectory get + { + pop + dup charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore def + } + forall + end + /usewidths? true def + end + grestore + } + {exch pop} + ifelse + }bind def + currentglobal true setglobal + /ct_ComposeFont + { + ct_UseNativeCapability? + { + 2 index/CMap ct_resourcestatus + {pop pop exch pop} + { + /CIDInit/ProcSet findresource + begin + 12 dict + begin + begincmap + /CMapName 3 index def + /CMapVersion 1.000 def + /CMapType 1 def + exch/WMode exch def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + { + dup length string copy + exch pop exch pop + } + {pop(Identity)} + ifelse + } + {pop (Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + 3 2 roll pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + setglobal + /ct_MakeIdentity + { + ct_UseNativeCapability? + { + 1 index/CMap ct_resourcestatus + {pop pop} + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CMapName 2 index def + /CMapVersion 1.000 def + /CMapType 1 def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + {dup length string copy exch pop exch pop} + {pop(Identity)} + ifelse + } + {pop(Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + exch pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + currentdict readonly pop + end + end +%%EndResource +setglobal +%%BeginResource: procset Adobe_CoolType_Utility_T42 1.0 0 +%%Copyright: Copyright 1987-2004 Adobe Systems Incorporated. +%%Version: 1.0 0 +userdict/ct_T42Dict 15 dict put +ct_T42Dict begin +/Is2015? +{ + version + cvi + 2015 + ge +}bind def +/AllocGlyphStorage +{ + Is2015? + { + pop + } + { + {string}forall + }ifelse +}bind def +/Type42DictBegin +{ +25 dict begin + /FontName exch def + /CharStrings 256 dict +begin + /.notdef 0 def + currentdict +end def + /Encoding exch def + /PaintType 0 def + /FontType 42 def + /FontMatrix[1 0 0 1 0 0]def + 4 array astore cvx/FontBBox exch def + /sfnts +}bind def +/Type42DictEnd +{ + currentdict dup/FontName get exch definefont end +ct_T42Dict exch +dup/FontName get exch put +}bind def +/RD{string currentfile exch readstring pop}executeonly def +/PrepFor2015 +{ +Is2015? +{ + /GlyphDirectory + 16 + dict def + sfnts 0 get + dup + 2 index + (glyx) + putinterval + 2 index + (locx) + putinterval + pop + pop +} +{ + pop + pop +}ifelse +}bind def +/AddT42Char +{ +Is2015? +{ + /GlyphDirectory get + begin + def + end + pop + pop +} +{ + /sfnts get + 4 index + get + 3 index + 2 index + putinterval + pop + pop + pop + pop +}ifelse +}bind def +/T0AddT42Mtx2 +{ +/CIDFont findresource/Metrics2 get begin def end +}bind def +end +%%EndResource +currentglobal true setglobal +%%BeginFile: MMFauxFont.prc +%%Copyright: Copyright 1987-2001 Adobe Systems Incorporated. +%%All Rights Reserved. +userdict /ct_EuroDict 10 dict put +ct_EuroDict begin +/ct_CopyFont +{ + { 1 index /FID ne {def} {pop pop} ifelse} forall +} def +/ct_GetGlyphOutline +{ + gsave + initmatrix newpath + exch findfont dup + length 1 add dict + begin + ct_CopyFont + /Encoding Encoding dup length array copy + dup + 4 -1 roll + 0 exch put + def + currentdict + end + /ct_EuroFont exch definefont + 1000 scalefont setfont + 0 0 moveto + [ + <00> stringwidth + <00> false charpath + pathbbox + [ + {/m cvx} {/l cvx} {/c cvx} {/cp cvx} pathforall + grestore + counttomark 8 add +} +def +/ct_MakeGlyphProc +{ + ] cvx + /ct_PSBuildGlyph cvx + ] cvx +} def +/ct_PSBuildGlyph +{ + gsave + 8 -1 roll pop + 7 1 roll + 6 -2 roll ct_FontMatrix transform 6 2 roll + 4 -2 roll ct_FontMatrix transform 4 2 roll + ct_FontMatrix transform + currentdict /PaintType 2 copy known {get 2 eq}{pop pop false} ifelse + dup 9 1 roll + { + currentdict /StrokeWidth 2 copy known + { + get 2 div + 0 ct_FontMatrix dtransform pop + 5 1 roll + 4 -1 roll 4 index sub + 4 1 roll + 3 -1 roll 4 index sub + 3 1 roll + exch 4 index add exch + 4 index add + 5 -1 roll pop + } + { + pop pop + } + ifelse + } + if + setcachedevice + ct_FontMatrix concat + ct_PSPathOps begin + exec + end + { + currentdict /StrokeWidth 2 copy known + { get } + { pop pop 0 } + ifelse + setlinewidth stroke + } + { + fill + } + ifelse + grestore +} def +/ct_PSPathOps 4 dict dup begin + /m {moveto} def + /l {lineto} def + /c {curveto} def + /cp {closepath} def +end +def +/ct_matrix1000 [1000 0 0 1000 0 0] def +/ct_AddGlyphProc +{ + 2 index findfont dup length 4 add dict + begin + ct_CopyFont + /CharStrings CharStrings dup length 1 add dict copy + begin + 3 1 roll def + currentdict + end + def + /ct_FontMatrix ct_matrix1000 FontMatrix matrix concatmatrix def + /ct_PSBuildGlyph /ct_PSBuildGlyph load def + /ct_PSPathOps /ct_PSPathOps load def + currentdict + end + definefont pop +} +def +systemdict /languagelevel known +{ + /ct_AddGlyphToPrinterFont { + 2 copy + ct_GetGlyphOutline 3 add -1 roll restore + ct_MakeGlyphProc + ct_AddGlyphProc + } def +} +{ + /ct_AddGlyphToPrinterFont { + pop pop restore + Adobe_CTFauxDict /$$$FONTNAME get + /Euro + Adobe_CTFauxDict /$$$SUBSTITUTEBASE get + ct_EuroDict exch get + ct_AddGlyphProc + } def +} ifelse +/AdobeSansMM +{ +556 0 24 -19 541 703 + { + 541 628 m + 510 669 442 703 354 703 c + 201 703 117 607 101 444 c + 50 444 l + 25 372 l + 97 372 l + 97 301 l + 49 301 l + 24 229 l + 103 229 l + 124 67 209 -19 350 -19 c + 435 -19 501 25 509 32 c + 509 131 l + 492 105 417 60 343 60 c + 267 60 204 127 197 229 c + 406 229 l + 430 301 l + 191 301 l + 191 372 l + 455 372 l + 479 444 l + 194 444 l + 201 531 245 624 348 624 c + 433 624 484 583 509 534 c + cp + 556 0 m + } +ct_PSBuildGlyph +} def +/AdobeSerifMM +{ +500 0 10 -12 484 692 + { + 347 298 m + 171 298 l + 170 310 170 322 170 335 c + 170 362 l + 362 362 l + 374 403 l + 172 403 l + 184 580 244 642 308 642 c + 380 642 434 574 457 457 c + 481 462 l + 474 691 l + 449 691 l + 433 670 429 657 410 657 c + 394 657 360 692 299 692 c + 204 692 94 604 73 403 c + 22 403 l + 10 362 l + 70 362 l + 69 352 69 341 69 330 c + 69 319 69 308 70 298 c + 22 298 l + 10 257 l + 73 257 l + 97 57 216 -12 295 -12 c + 364 -12 427 25 484 123 c + 458 142 l + 425 101 384 37 316 37 c + 256 37 189 84 173 257 c + 335 257 l + cp + 500 0 m + } +ct_PSBuildGlyph +} def +end +%%EndFile +setglobal +Adobe_CoolType_Core begin /$None SetSubstituteStrategy end +%%BeginResource: procset Adobe_AGM_Image 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Image 71 dict dup begin put +/Adobe_AGM_Image_Id/Adobe_AGM_Image_1.0_0 def +/nd{ + null def +}bind def +/AGMIMG_&image nd +/AGMIMG_&colorimage nd +/AGMIMG_&imagemask nd +/AGMIMG_mbuf()def +/AGMIMG_ybuf()def +/AGMIMG_kbuf()def +/AGMIMG_c 0 def +/AGMIMG_m 0 def +/AGMIMG_y 0 def +/AGMIMG_k 0 def +/AGMIMG_tmp nd +/AGMIMG_imagestring0 nd +/AGMIMG_imagestring1 nd +/AGMIMG_imagestring2 nd +/AGMIMG_imagestring3 nd +/AGMIMG_imagestring4 nd +/AGMIMG_imagestring5 nd +/AGMIMG_cnt nd +/AGMIMG_fsave nd +/AGMIMG_colorAry nd +/AGMIMG_override nd +/AGMIMG_name nd +/AGMIMG_maskSource nd +/AGMIMG_flushfilters nd +/invert_image_samples nd +/knockout_image_samples nd +/img nd +/sepimg nd +/devnimg nd +/idximg nd +/ds +{ + Adobe_AGM_Core begin + Adobe_AGM_Image begin + /AGMIMG_&image systemdict/image get def + /AGMIMG_&imagemask systemdict/imagemask get def + /colorimage where{ + pop + /AGMIMG_&colorimage/colorimage ldf + }if + end + end +}def +/ps +{ + Adobe_AGM_Image begin + /AGMIMG_ccimage_exists{/customcolorimage where + { + pop + /Adobe_AGM_OnHost_Seps where + { + pop false + }{ + /Adobe_AGM_InRip_Seps where + { + pop false + }{ + true + }ifelse + }ifelse + }{ + false + }ifelse + }bdf + level2{ + /invert_image_samples + { + Adobe_AGM_Image/AGMIMG_tmp Decode length ddf + /Decode[Decode 1 get Decode 0 get]def + }def + /knockout_image_samples + { + Operator/imagemask ne{ + /Decode[1 1]def + }if + }def + }{ + /invert_image_samples + { + {1 exch sub}currenttransfer addprocs settransfer + }def + /knockout_image_samples + { + {pop 1}currenttransfer addprocs settransfer + }def + }ifelse + /img/imageormask ldf + /sepimg/sep_imageormask ldf + /devnimg/devn_imageormask ldf + /idximg/indexed_imageormask ldf + /_ctype 7 def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall +}def +/pt +{ + end +}def +/dt +{ +}def +/AGMIMG_flushfilters +{ + dup type/arraytype ne + {1 array astore}if + dup 0 get currentfile ne + {dup 0 get flushfile}if + { + dup type/filetype eq + { + dup status 1 index currentfile ne and + {closefile} + {pop} + ifelse + }{pop}ifelse + }forall +}def +/AGMIMG_init_common +{ + currentdict/T known{/ImageType/T ldf currentdict/T undef}if + currentdict/W known{/Width/W ldf currentdict/W undef}if + currentdict/H known{/Height/H ldf currentdict/H undef}if + currentdict/M known{/ImageMatrix/M ldf currentdict/M undef}if + currentdict/BC known{/BitsPerComponent/BC ldf currentdict/BC undef}if + currentdict/D known{/Decode/D ldf currentdict/D undef}if + currentdict/DS known{/DataSource/DS ldf currentdict/DS undef}if + currentdict/O known{ + /Operator/O load 1 eq{ + /imagemask + }{ + /O load 2 eq{ + /image + }{ + /colorimage + }ifelse + }ifelse + def + currentdict/O undef + }if + currentdict/HSCI known{/HostSepColorImage/HSCI ldf currentdict/HSCI undef}if + currentdict/MD known{/MultipleDataSources/MD ldf currentdict/MD undef}if + currentdict/I known{/Interpolate/I ldf currentdict/I undef}if + currentdict/SI known{/SkipImageProc/SI ldf currentdict/SI undef}if + /DataSource load xcheck not{ + DataSource type/arraytype eq{ + DataSource 0 get type/filetype eq{ + /_Filters DataSource def + currentdict/MultipleDataSources known not{ + /DataSource DataSource dup length 1 sub get def + }if + }if + }if + currentdict/MultipleDataSources known not{ + /MultipleDataSources DataSource type/arraytype eq{ + DataSource length 1 gt + } + {false}ifelse def + }if + }if + /NComponents Decode length 2 div def + currentdict/SkipImageProc known not{/SkipImageProc{false}def}if +}bdf +/imageormask_sys +{ + begin + AGMIMG_init_common + save mark + level2{ + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + AGMIMG_&imagemask + }{ + BitsPerComponent ImageMatrix/DataSource load + AGMIMG_&image + }ifelse + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + cleartomark restore + end +}def +/overprint_plate +{ + currentoverprint{ + 0 get dup type/nametype eq{ + dup/DeviceGray eq{ + pop AGMCORE_black_plate not + }{ + /DeviceCMYK eq{ + AGMCORE_is_cmyk_sep not + }if + }ifelse + }{ + false exch + { + AGMOHS_sepink eq or + }forall + not + }ifelse + }{ + pop false + }ifelse +}def +/process_mask +{ + level3{ + dup begin + /ImageType 1 def + end + 4 dict begin + /DataDict exch def + /ImageType 3 def + /InterleaveType 3 def + /MaskDict 9 dict begin + /ImageType 1 def + /Width DataDict dup/MaskWidth known{/MaskWidth}{/Width}ifelse get def + /Height DataDict dup/MaskHeight known{/MaskHeight}{/Height}ifelse get def + /ImageMatrix[Width 0 0 Height neg 0 Height]def + /NComponents 1 def + /BitsPerComponent 1 def + /Decode DataDict dup/MaskD known{/MaskD}{[1 0]}ifelse get def + /DataSource Adobe_AGM_Core/AGMIMG_maskSource get def + currentdict end def + currentdict end + }if +}def +/use_mask +{ + dup/Mask known {dup/Mask get}{false}ifelse +}def +/imageormask +{ + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + } + { + save mark + level2 AGMCORE_host_sep not and{ + currentdict + Operator/imagemask eq DeviceN_PS2 not and{ + imagemask + }{ + AGMCORE_in_rip_sep currentoverprint and currentcolorspace 0 get/DeviceGray eq and{ + [/Separation/Black/DeviceGray{}]setcolorspace + /Decode[Decode 1 get Decode 0 get]def + }if + use_mask{ + process_mask image + }{ + DeviceN_NoneName DeviceN_PS2 Indexed_DeviceN level3 not and or or AGMCORE_in_rip_sep and + { + Names convert_to_process not{ + 2 dict begin + /imageDict xdf + /names_index 0 def + gsave + imageDict write_image_file{ + Names{ + dup(None)ne{ + [/Separation 3 -1 roll/DeviceGray{1 exch sub}]setcolorspace + Operator imageDict read_image_file + names_index 0 eq{true setoverprint}if + /names_index names_index 1 add def + }{ + pop + }ifelse + }forall + close_image_file + }if + grestore + end + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + /Adobe_AGM_OnHost_Seps where{ + pop imagemask + }{ + currentgray 1 ne{ + currentdict imageormask_sys + }{ + currentoverprint not{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }ifelse + }{ + BitsPerComponent ImageMatrix + MultipleDataSources{ + 0 1 NComponents 1 sub{ + DataSource exch get + }for + }{ + /DataSource load + }ifelse + Operator/colorimage eq{ + AGMCORE_host_sep{ + MultipleDataSources level2 or NComponents 4 eq and{ + AGMCORE_is_cmyk_sep{ + MultipleDataSources{ + /DataSource DataSource 0 get xcheck + { + [ + DataSource 0 get/exec cvx + DataSource 1 get/exec cvx + DataSource 2 get/exec cvx + DataSource 3 get/exec cvx + /AGMCORE_get_ink_data cvx + ]cvx + }{ + DataSource aload pop AGMCORE_get_ink_data + }ifelse def + }{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + /DataSource load + filter_cmyk 0()/SubFileDecode filter def + }ifelse + /Decode[Decode 0 get Decode 1 get]def + /MultipleDataSources false def + /NComponents 1 def + /Operator/image def + invert_image_samples + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }{ + MultipleDataSources NComponents AGMIMG_&colorimage + }ifelse + }{ + true NComponents colorimage + }ifelse + }{ + Operator/image eq{ + AGMCORE_host_sep{ + /DoImage true def + currentdict/HostSepColorImage known{HostSepColorImage not}{false}ifelse + { + AGMCORE_black_plate not Operator/imagemask ne and{ + /DoImage false def + currentdict ignoreimagedata + }if + }if + 1 AGMCORE_&setgray + DoImage + {currentdict imageormask_sys}if + }{ + use_mask{ + process_mask image + }{ + image + }ifelse + }ifelse + }{ + Operator/knockout eq{ + pop pop pop pop pop + currentcolorspace overprint_plate not{ + knockout_unitsq + }if + }if + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/sep_imageormask +{ + /sep_colorspace_dict AGMCORE_gget begin + CSA map_csa + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_avoid_L2_sep_space{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + }if + AGMIMG_ccimage_exists + MappedCSA 0 get/DeviceCMYK eq and + currentdict/Components known and + Name()ne and + Name(All)ne and + Operator/image eq and + AGMCORE_producing_seps not and + level2 not and + { + Width Height BitsPerComponent ImageMatrix + [ + /DataSource load/exec cvx + { + 0 1 2 index length 1 sub{ + 1 index exch + 2 copy get 255 xor put + }for + }/exec cvx + ]cvx bind + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Name findcmykcustomcolor + customcolorimage + }{ + AGMCORE_producing_seps not{ + level2{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne AGMCORE_avoid_L2_sep_space not and currentcolorspace 0 get/Separation ne and{ + [/Separation Name MappedCSA sep_proc_name exch dup 0 get 15 string cvs(/Device)anchorsearch{pop pop 0 get}{pop}ifelse exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + currentdict imageormask + }{ + currentdict + Operator/imagemask eq{ + imageormask + }{ + sep_imageormask_lev1 + }ifelse + }ifelse + }{ + AGMCORE_host_sep{ + Operator/knockout eq{ + currentdict/ImageMatrix get concat + knockout_unitsq + }{ + currentgray 1 ne{ + AGMCORE_is_cmyk_sep Name(All)ne and{ + level2{ + Name AGMCORE_IsSeparationAProcessColor + { + Operator/imagemask eq{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + /sep_tint AGMCORE_gget 1 exch sub AGMCORE_&setcolor + }if + }{ + invert_image_samples + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + [/Separation Name[/DeviceGray] + { + sep_colorspace_proc AGMCORE_get_ink_data + 1 exch sub + }bind + ]AGMCORE_&setcolorspace + /sep_tint AGMCORE_gget AGMCORE_&setcolor + }if + }ifelse + currentdict imageormask_sys + }{ + currentdict + Operator/imagemask eq{ + imageormask_sys + }{ + sep_image_lev1_sep + }ifelse + }ifelse + }{ + Operator/imagemask ne{ + invert_image_samples + }if + currentdict imageormask_sys + }ifelse + }{ + currentoverprint not Name(All)eq or Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + currentcolorspace 0 get/Separation ne{ + [/Separation Name MappedCSA sep_proc_name exch 0 get exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + }if + currentoverprint + MappedCSA 0 get/DeviceCMYK eq and + Name AGMCORE_IsSeparationAProcessColor not and + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{Name inRip_spot_has_ink not and}{false}ifelse + Name(All)ne and{ + imageormask_l2_overprint + }{ + currentdict imageormask + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end +}def +/colorSpaceElemCnt +{ + mark currentcolor counttomark dup 2 add 1 roll cleartomark +}bdf +/devn_sep_datasource +{ + 1 dict begin + /dataSource xdf + [ + 0 1 dataSource length 1 sub{ + dup currentdict/dataSource get/exch cvx/get cvx/exec cvx + /exch cvx names_index/ne cvx[/pop cvx]cvx/if cvx + }for + ]cvx bind + end +}bdf +/devn_alt_datasource +{ + 11 dict begin + /convProc xdf + /origcolorSpaceElemCnt xdf + /origMultipleDataSources xdf + /origBitsPerComponent xdf + /origDecode xdf + /origDataSource xdf + /dsCnt origMultipleDataSources{origDataSource length}{1}ifelse def + /DataSource origMultipleDataSources + { + [ + BitsPerComponent 8 idiv origDecode length 2 idiv mul string + 0 1 origDecode length 2 idiv 1 sub + { + dup 7 mul 1 add index exch dup BitsPerComponent 8 idiv mul exch + origDataSource exch get 0()/SubFileDecode filter + BitsPerComponent 8 idiv string/readstring cvx/pop cvx/putinterval cvx + }for + ]bind cvx + }{origDataSource}ifelse 0()/SubFileDecode filter def + [ + origcolorSpaceElemCnt string + 0 2 origDecode length 2 sub + { + dup origDecode exch get dup 3 -1 roll 1 add origDecode exch get exch sub 2 BitsPerComponent exp 1 sub div + 1 BitsPerComponent 8 idiv{DataSource/read cvx/not cvx{0}/if cvx/mul cvx}repeat/mul cvx/add cvx + }for + /convProc load/exec cvx + origcolorSpaceElemCnt 1 sub -1 0 + { + /dup cvx 2/add cvx/index cvx + 3 1/roll cvx/exch cvx 255/mul cvx/cvi cvx/put cvx + }for + ]bind cvx 0()/SubFileDecode filter + end +}bdf +/devn_imageormask +{ + /devicen_colorspace_dict AGMCORE_gget begin + CSA map_csa + 2 dict begin + dup + /srcDataStrs[3 -1 roll begin + AGMIMG_init_common + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi + { + dup 65535 gt{1 add 2 div cvi}{exit}ifelse + }loop + string + }repeat + end]def + /dstDataStr srcDataStrs 0 get length string def + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_producing_seps not{ + level3 not{ + Operator/imagemask ne{ + /DataSource[[ + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + colorSpaceElemCnt/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource 1/string cvx/readstring cvx/pop cvx]cvx colorSpaceElemCnt 1 sub{dup}repeat]def + /MultipleDataSources true def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + }if + }if + currentdict imageormask + }{ + AGMCORE_host_sep{ + Names convert_to_process{ + CSA get_csa_by_name 0 get/DeviceCMYK eq{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + 4/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + filter_cmyk 0()/SubFileDecode filter def + /MultipleDataSources false def + /Decode[1 0]def + /DeviceGray setcolorspace + currentdict imageormask_sys + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate{ + /DataSource + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + CSA get_csa_by_name 0 get/DeviceRGB eq{3}{1}ifelse/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + /MultipleDataSources false def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + currentdict imageormask_sys + }{ + gsave + knockout_unitsq + grestore + currentdict consumeimagedata + }ifelse + }ifelse + } + { + /devicen_colorspace_dict AGMCORE_gget/names_index known{ + Operator/imagemask ne{ + MultipleDataSources{ + /DataSource[DataSource devn_sep_datasource/exec cvx]cvx def + /MultipleDataSources false def + }{ + /DataSource/DataSource load dstDataStr srcDataStrs 0 get filter_devn def + }ifelse + invert_image_samples + }if + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + currentdict imageormask + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end + end +}def +/imageormask_l2_overprint +{ + currentdict + currentcmykcolor add add add 0 eq{ + currentdict consumeimagedata + }{ + level3{ + currentcmykcolor + /AGMIMG_k xdf + /AGMIMG_y xdf + /AGMIMG_m xdf + /AGMIMG_c xdf + Operator/imagemask eq{ + [/DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ]/DeviceCMYK{}]setcolorspace + AGMIMG_c 0 ne{AGMIMG_c}if + AGMIMG_m 0 ne{AGMIMG_m}if + AGMIMG_y 0 ne{AGMIMG_y}if + AGMIMG_k 0 ne{AGMIMG_k}if + setcolor + }{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + [/Indexed + [ + /DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ] + /DeviceCMYK{ + AGMIMG_k 0 eq{0}if + AGMIMG_y 0 eq{0 exch}if + AGMIMG_m 0 eq{0 3 1 roll}if + AGMIMG_c 0 eq{0 4 1 roll}if + } + ] + 255 + { + 255 div + mark exch + dup dup dup + AGMIMG_k 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 1 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_y 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 2 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_m 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 3 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_c 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + counttomark 1 add -1 roll pop + } + ]setcolorspace + }ifelse + imageormask_sys + }{ + write_image_file{ + currentcmykcolor + 0 ne{ + [/Separation/Black/DeviceGray{}]setcolorspace + gsave + /Black + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 1 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Yellow/DeviceGray{}]setcolorspace + gsave + /Yellow + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 2 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Magenta/DeviceGray{}]setcolorspace + gsave + /Magenta + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 3 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Cyan/DeviceGray{}]setcolorspace + gsave + /Cyan + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + close_image_file + }{ + imageormask + }ifelse + }ifelse + }ifelse +}def +/indexed_imageormask +{ + begin + AGMIMG_init_common + save mark + currentdict + AGMCORE_host_sep{ + Operator/knockout eq{ + /indexed_colorspace_dict AGMCORE_gget dup/CSA known{ + /CSA get get_csa_by_name + }{ + /Names get + }ifelse + overprint_plate not{ + knockout_unitsq + }if + }{ + Indexed_DeviceN{ + /devicen_colorspace_dict AGMCORE_gget dup/names_index known exch/Names get convert_to_process or{ + indexed_image_lev2_sep + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }{ + AGMCORE_is_cmyk_sep{ + Operator/imagemask eq{ + imageormask_sys + }{ + level2{ + indexed_image_lev2_sep + }{ + indexed_image_lev1_sep + }ifelse + }ifelse + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + level2{ + Indexed_DeviceN{ + /indexed_colorspace_dict AGMCORE_gget begin + }{ + /indexed_colorspace_dict AGMCORE_gget dup null ne + { + begin + currentdict/CSDBase known{CSDBase/CSD get_res/MappedCSA get}{CSA}ifelse + get_csa_by_name 0 get/DeviceCMYK eq ps_level 3 ge and ps_version 3015.007 lt and + AGMCORE_in_rip_sep and{ + [/Indexed[/DeviceN[/Cyan/Magenta/Yellow/Black]/DeviceCMYK{}]HiVal Lookup] + setcolorspace + }if + end + } + {pop}ifelse + }ifelse + imageormask + Indexed_DeviceN{ + end + }if + }{ + Operator/imagemask eq{ + imageormask + }{ + indexed_imageormask_lev1 + }ifelse + }ifelse + }ifelse + cleartomark restore + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/indexed_image_lev2_sep +{ + /indexed_colorspace_dict AGMCORE_gget begin + begin + Indexed_DeviceN not{ + currentcolorspace + dup 1/DeviceGray put + dup 3 + currentcolorspace 2 get 1 add string + 0 1 2 3 AGMCORE_get_ink_data 4 currentcolorspace 3 get length 1 sub + { + dup 4 idiv exch currentcolorspace 3 get exch get 255 exch sub 2 index 3 1 roll put + }for + put setcolorspace + }if + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + end end +}def + /OPIimage + { + dup type/dicttype ne{ + 10 dict begin + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /ImageType 1 def + /Decode[0 1 def] + currentdict + end + }if + dup begin + /NComponents 1 cdndf + /MultipleDataSources false cdndf + /SkipImageProc{false}cdndf + /Decode[ + 0 + currentcolorspace 0 get/Indexed eq{ + 2 BitsPerComponent exp 1 sub + }{ + 1 + }ifelse + ]cdndf + /Operator/image cdndf + end + /sep_colorspace_dict AGMCORE_gget null eq{ + imageormask + }{ + gsave + dup begin invert_image_samples end + sep_imageormask + grestore + }ifelse + }def +/cachemask_level2 +{ + 3 dict begin + /LZWEncode filter/WriteFilter xdf + /readBuffer 256 string def + /ReadFilter + currentfile + 0(%EndMask)/SubFileDecode filter + /ASCII85Decode filter + /RunLengthDecode filter + def + { + ReadFilter readBuffer readstring exch + WriteFilter exch writestring + not{exit}if + }loop + WriteFilter closefile + end +}def +/spot_alias +{ + /mapto_sep_imageormask + { + dup type/dicttype ne{ + 12 dict begin + /ImageType 1 def + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /MultipleDataSources false def + }{ + begin + }ifelse + /Decode[/customcolor_tint AGMCORE_gget 0]def + /Operator/image def + /SkipImageProc{false}def + currentdict + end + sep_imageormask + }bdf + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_colorAry xddf + /customcolor_tint AGMCORE_gget + << + /Name AGMIMG_colorAry 4 get + /CSA[/DeviceCMYK] + /TintMethod/Subtractive + /TintProc null + /MappedCSA null + /NComponents 4 + /Components[AGMIMG_colorAry aload pop pop] + >> + setsepcolorspace + mapto_sep_imageormask + }ndf + Adobe_AGM_Image/AGMIMG_&customcolorimage/customcolorimage load put + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_override false put + current_spot_alias{dup 4 get map_alias}{false}ifelse + { + false set_spot_alias + /customcolor_tint AGMCORE_gget exch setsepcolorspace + pop + mapto_sep_imageormask + true set_spot_alias + }{ + //Adobe_AGM_Image/AGMIMG_&customcolorimage get exec + }ifelse + }bdf +}def +/snap_to_device +{ + 6 dict begin + matrix currentmatrix + dup 0 get 0 eq 1 index 3 get 0 eq and + 1 index 1 get 0 eq 2 index 2 get 0 eq and or exch pop + { + 1 1 dtransform 0 gt exch 0 gt/AGMIMG_xSign? exch def/AGMIMG_ySign? exch def + 0 0 transform + AGMIMG_ySign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + AGMIMG_xSign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + itransform/AGMIMG_llY exch def/AGMIMG_llX exch def + 1 1 transform + AGMIMG_ySign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + AGMIMG_xSign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + itransform/AGMIMG_urY exch def/AGMIMG_urX exch def + [AGMIMG_urX AGMIMG_llX sub 0 0 AGMIMG_urY AGMIMG_llY sub AGMIMG_llX AGMIMG_llY]concat + }{ + }ifelse + end +}def +level2 not{ + /colorbuf + { + 0 1 2 index length 1 sub{ + dup 2 index exch get + 255 exch sub + 2 index + 3 1 roll + put + }for + }def + /tint_image_to_color + { + begin + Width Height BitsPerComponent ImageMatrix + /DataSource load + end + Adobe_AGM_Image begin + /AGMIMG_mbuf 0 string def + /AGMIMG_ybuf 0 string def + /AGMIMG_kbuf 0 string def + { + colorbuf dup length AGMIMG_mbuf length ne + { + dup length dup dup + /AGMIMG_mbuf exch string def + /AGMIMG_ybuf exch string def + /AGMIMG_kbuf exch string def + }if + dup AGMIMG_mbuf copy AGMIMG_ybuf copy AGMIMG_kbuf copy pop + } + addprocs + {AGMIMG_mbuf}{AGMIMG_ybuf}{AGMIMG_kbuf}true 4 colorimage + end + }def + /sep_imageormask_lev1 + { + begin + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + { + 255 mul round cvi GrayLookup exch get + }currenttransfer addprocs settransfer + currentdict imageormask + }{ + /sep_colorspace_dict AGMCORE_gget/Components known{ + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + AGMIMG_y 0.0 eq AGMIMG_m 0.0 eq and AGMIMG_c 0.0 eq and{ + {AGMIMG_k mul 1 exch sub}currenttransfer addprocs settransfer + currentdict imageormask + }{ + currentcolortransfer + {AGMIMG_k mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_y mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_m mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_c mul 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }{ + MappedCSA 0 get/DeviceGray eq{ + {255 mul round cvi ColorLookup exch get 0 get}currenttransfer addprocs settransfer + currentdict imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + /sep_image_lev1_sep + { + begin + /sep_colorspace_dict AGMCORE_gget/Components known{ + Components aload pop + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + {AGMIMG_c mul 1 exch sub} + {AGMIMG_m mul 1 exch sub} + {AGMIMG_y mul 1 exch sub} + {AGMIMG_k mul 1 exch sub} + }{ + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub} + }ifelse + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end + }def + /indexed_imageormask_lev1 + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + currentdict + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + {HiVal mul round cvi GrayLookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceGray eq{ + {HiVal mul round cvi Lookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 2 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 1 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi Lookup exch get HiVal div}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }ifelse + }ifelse + }ifelse + end end + }def + /indexed_image_lev1_sep + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub} + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end end + }def +}if +end +systemdict/setpacking known +{setpacking}if +%%EndResource +currentdict Adobe_AGM_Utils eq {end} if +%%EndProlog +%%BeginSetup +Adobe_AGM_Utils begin +2 2010 Adobe_AGM_Core/ds gx +Adobe_CoolType_Core/ds get exec +Adobe_AGM_Image/ds gx +[/NamespacePush pdfmark_5 +[/_objdef {Doc_Metadata} /type /stream /OBJ pdfmark_5 +[{Doc_Metadata} 848 (% &end XMP packet& %) ReadBypdfmark_5_string + + + + + + + + + + + + + + + + + + + + + + + + + +% &end XMP packet& % + +[{Doc_Metadata} 2 dict begin /Type /Metadata def /Subtype /XML def currentdict end /PUT pdfmark_5 +[/Document 1 dict begin /Metadata {Doc_Metadata} def currentdict end /BDC pdfmark_5 +[/NamespacePop pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +%%EndSetup +%%Page: 1 1 +%%EndPageComments +%%BeginPageSetup +Adobe_AGM_Utils begin +Adobe_AGM_Core/ps gx +Adobe_AGM_Core/capture_mysetup gx +Adobe_AGM_Utils/capture_cpd gx +Adobe_CoolType_Core/ps get exec +Adobe_AGM_Image/ps gx +Adobe_AGM_Core/ps gx +gsave +/0 +[/DeviceCMYK] /CSA add_res +grestore +Adobe_AGM_Core/pt gx +%%EndPageSetup +1 -1 scale 0 -200.88 translate +pgsv +[1 0 0 1 0 0 ]ct +gsave +np +gsave +0 0 mo +0 200.88 li +148.68 200.88 li +148.68 0 li +cp +clp +0 200.88 mo +148.68 200.88 li +148.68 0 li +0 0 li +cp +false sop +/0 /CSA get_res setcolorspace +gsave +clp +[1 0 0 -1 0 200.88 ]ct +[148.68 0 0 200.88 0 -1.83582e-5 ]ct +snap_to_device +Adobe_AGM_Image/AGMIMG_fl cf /ASCII85Decode fl /RunLengthDecode filter ddf +<< +/T 1 +/W 413 +/H 558 +/M[413 0 0 -558 0 558 ] +/BC 8 +/D[0 1 0 1 0 1 0 1 ] +/DS [ +[AGMIMG_fl 413 string /rs cvx /pop cvx] cvx +[AGMIMG_fl 413 string /rs cvx /pop cvx] cvx +[AGMIMG_fl 413 string /rs cvx /pop cvx] cvx +[AGMIMG_fl 413 string /rs cvx /pop cvx] cvx +] +/O 3 +>> +%%BeginBinary: 1 +img +cf>Pkb08&Qbf\+Z<)?Fl;>GB?!mP>&S#<[@UDSt8P;]I7lie"6Tmg364H4H69mn)5s[k(6:!gb +q'"iC!$_@b"$#$:?!LZ20/>3@1>FYb1]9'2 +1GLF,rZM:b,5r_m+sA*P+X&$R+X&&g+UoP=+YGuG5s[h'6UF+*pHf!H5!_M#$TpL791qlM8kMQaA,TjC +@q&nS?R[BJ2RT'b.%M0*Z&iN0<3CNp3q)T$G2`Wo[4$#A`4#o8\ +3@#g+*WdE(*W@)_*?H4B*W@2p*?H@J*?lj[.kND..kWJYH\$b6J,k&tJ-^aXIXcp!IV:V?0JU9qs"F=) +">MPW+GZ2>oE62[Z)U!s'#O)#b<=((1oo()Ic$(Dn#*(BpK4[f?F: +2Z5Q;2E*QW4T7JD4PN"!4jW0jgrmk>bQlD8a%]N2R+J<>$40F0JDHAgG00n1GU^A1c$pE1bgO.rZ_=b"!Ss5,5r_c,2XOL+<_pQ,;hbR6N'1O6:+!663BS= +4$X0:6Tmn.:I[lL85?tQA?!c;lhQR$aY5YX?X.u5QR$sJ2QC:b`%h93^%M'4+5W8^, +3Vb]H3&ir[4ZY\d3]f>].3'BLi#_n=q]5b[,5`Ss*ZlOT0.ee//2/b1/P1);It<1;J.-pYIY!'#J:E-$ +Gulg'1,6Hr$nj7f0J>+50/,+4-R8U2!$;+[!ZiC'rZ2+]*ZsJbr>l7g*?H1>/3,gT3W;)A4?>S"3Y+5< +4Zbbi58Fe=&.8pV'6F,@$^dBOSY**qZE1.5ZeVeF4o@GC55dVO4#o8Y2E*QQ2E(u7!!WrM'c@i((@DqG +'c@`'(`!o&(`!\aT`DM$!#tkq$T9q&3B0,a5!1qk5MeR'4jij>Mt>[(H;>$>;4>QnD21GU^?__V-F#W"7l1,C^?.O4j7ruh7`"s>'4+sA*Rh'!"U5XI_&5XIg: +5lj;ln>=>l7md?/VphY->+3ricL$T:2,GRLkjZ;A'TO +%M8mW2aTJ^4[(dt3W_E*48q8F3BB;`,Tn9,*p=XN*?Q=D*?6(?,5<;`+sA9\r@S:20eb:]It?m8%tT7^ +J:`8uJ:E)uB/M@s0B4bA0F0D??=3\<"(5SIA,TjIA6h`!84cHI8OYm*6:*h!q*GTX5sdn(6U4")69m1I,Tn5g+TN_a+T`c0,5r`" ++/i5:<5Zq;q>j>N(?$G68>$49J1+k45`%q3F!&OU0#;\+j1G^a:-N,(i+@U`bO?2\(1?!dJ8i*G181,(C;0M6M*Y'>8*ZZmo3]T5_3]oJc3W1u=48h2B5\Sc+u\R$sS8b0.r,;Gg7d;Ya,t;,L.c:Jana;*lf`.fLsW.KD!u.KCps.KD!t.M=6d2a'Gj5XIn. +5X.J8O/&DCU&:\RUC*ikUS=BUUSX#Q5lO(M5.NlX5lO"J5lNtN2_?L0/,C^t.k<(ui@5*`.4Zks1IY): +r_NYl:f70f!)`_l%oQ5";G^B+ai_fMbf\)Pi:H"0j4r_qjPaAP?X6oB?!grH@U`hXrF-:E@RrsZ8P)TG +9K5=&6:=*7646.J69mh'6U4!s,U310h]W%F+X%sO+X/-T+X/'Q-S7&01,C[<0/G@=4],?c=^>69>[1K< +moop#>Zb<;r`TM-2D[$<2)3$)qD&%,r\=j;1,:XA1c$mB.jH8:+oEMd+X80Rh]W=O+sA?p5XRk)5sbB7 +!'pNM#XC[A6:!e#7RmAK#"hQ\?=IDRraQ1B@UNPL?!Ue6?/JrHYR@Y=['Hp9V4a9GR$di@&#)i-'FbN^ +#8.8!697(e3;GTC4$,Ja4$#Ga4"q]rr?:,@"s4m,*ZZ:C(EFP;*ZZ:D,:G,u/i5:A1,LdC6Z[s5K`6K( +JUr?&mskn!It3#sIt<2i5qt&I1,$Kur%J+(r\+j;0JG.70J>+6.3T]R+!)L$*$G*5>[:Q<>jbf*?!LN:>['lW0JG:<1GQQu!&OU0rA+F/ +r\Fd71,C[:,9\9.+l4@E+sS6TrZM7or]pQM6iKCJ64uOJ5!)+r9M.cK7n?*=8RQ%<@fBjD@UieT@prYI +>[6&i!+"Kd"gYD7V4X.SRM;6[R[BP4<"9EM&J,J,t.NrdY9*J71Al1,1I9_D(j@!&+=*%l#^l0/,%6 +0eb:7/ghea*S;DD*?H7A*?,qI3BK;`4#oAaqDo6N5XRXs0*iC)%2'0a$P%NNR%"#A$C[?OQ^FMO\?rNH +rNP4ah`V*+4?PYar\b!?3B&lT2`;#n!6tQQ#Sn0m()[i&(`=)))"/4F'c@f&(Dmnhg]2p+pAb:<2E!Mn +2@;B$2)R9Q4Ztni528H^(TVJ9TTqCPD%&BVmUnX>f5t!n%5=#<97(GPZ5S?:G5X7Lt5X7Cf/Lr;#.k<(u.HN&V.LR[U.4Zku +.mQm,:J^d_!Duep;@?I@bfn>UcHFDTbM`3W!9;Sij';ss?!LZA?=7/MA,]pQJ&6r`]A-mop9,?!CQ: +>Wjeq1,C^D/hspm&i2=#1G^jD1,:XA1,:XA0I\4krZV7a!$L5D"@?;ns'=Tf#I1M7WM?,TR/WNTR%+)D&!p9+$PEsZ$lTWa00DH] +3;GW73s7Q(4"MEO*X!W/+sA,g*X!K(*ZZ7@*ZZ:C-7pr,0.e_-/M8b30KWd"I"-WsKRn])Jc:0"Ja\+! +JUW-#IX+R?1+k:70JG<$0_[750/5.80eb=90JP:70JP:5-6`@0"!8U+*T.tL*??1B*?H4B)_=$43BB5` +q`5cQ!9="<%c,=Pb0%uPbf\)M +>uaa!q+q&hr_Nhh/M&A$/1W4K/,CaU.KV.W4T7SV56raH@J?V*m[84uNI8k;K:4[/p1q*G'Lr^$cJ,pFNU+o?bE;>@(H8>$G7q>74V?;(j^\1G^dA1G]%d1V5CJ1G^dB1GU^A1]B-01]9'41Fsjs ++X5kgr?24d+X6k-"sY*%M'6a&-iRS4$YSbq)SL(30J>(5/hf$Y0Ej0\,97gGhAub>*?H7" ++U/l(,W.\F3VkcK4$5>b5^'G1W`%MB!9O4@s5X+>#NOX_ +bKJ&PbPoWhbG\66:JXe_r_NSmr_N_n2C^1,ngaA`!%[jp!%Iao(Fq!g3^,ho5=.V"5XI_#5=/1sU8=W[ +UAL\cU@t>_Un[j`%&'GkU7n?XUS4HPDF+7e"$]%75l5XPE8!'^BK"[FU_ ++Wqok+o`ba+TN_c+UTD;+X/'Q,9\Nk2?#B11CGrl1,CU?:g@1+>[7/1!F/k->QA",>T-gN>$P99>[(E; +>[(B;=^"or0/PIA1,CX@1AN[+1GSY\rA"@/oeHe-1,LgC1,C^Ar\OO/%Pomr1,C[A0etL?1,:XApbMh) +s"aO/r\=j;1c.!D1GL@*+sA0.+U'&5+X/'RrZM7coHF&S/Ku>^+X%sO+sJa.5sdk(5s[h(5=%V%5!_k7 +91_]G9h.oJ@prhVAR].[@:E^F@00nG?iF@1?34DDVYQ_/5ZF.$A$*LP;VkBNJS=#Q;RLPgY<"BHK +%i#Hb%grUrr&Op?3BK8!3WpcL*[)]k*WdE(*W-rf*??1B*??1A*ZlFI.kglU!])Par\4[40/>Y#J:`<& +pji+91bpod1B]Ba0J5'Q0E!R)0E*X*0)@7'/1iLQ0Ej*] +0J>79r\+g6/MJk3/h\k30J>+60/<5Ur\=F,s"XO,r\+R30JG480eXpf+<;LD*ZlIF*ZZ=D*?Q:B*Zc?i +*YBJ7*ZZ:D+X.pI/NPmQ3BB/\r]1o\2EWu:#R1_S%Li^Y&JB,SR[B;-R$OA2Rf8fbR\$F]ZEUL5Y->.5 +k-4likrfD94[)+q4Zu"m3]Aqq2Z5T62?Plt2%$blo)Jmr()I]&p_NfF!#GMM!u;^h)#P-T(D[c$(D[i# +!P&2s!!sZ(2`lA!mJp2rlYtr<)6Cg:Jjq`;,L.d7k?/>.Om"1 +.KCpq.LRaV.Ouu#1HIcd5!B$45X>94$:-jPJYAp8TV8'RqkF.coqVP]s.fRf';M=sU8+KA:d@905t!q& +5n1+F +?XI&D?=.)L@:E\UAH$$mlmihHL$6gZ;+sA'P+sA*R +rZMIj+Wi*d1Gf"c&2Q*t1,C[?0f)U0>$G9<>?q&0s'5P-r`oA*)Hp[(B8>?b?;>?b#^/i,@>0JYF> +1GU^Br\=U41GU^ApbDq+1,:Z\1&s$40f(RA1,Sk`"Z%nh1GUc`1'09f1B'*&1B''<1,:XA1,C^A1,C^A +1B''>1,1F1+X&$Q+X/'R+X&&m+TN_c+U0&4+<_pX48qMQ6:*t)5X7Y"4%i9e6qL$C8PMoP88)IA@q9%X +A7/nV@:!1G`4?P\^*Zc:B*[9hi"!&C'*W@)_*?H7B+8m5s+XJWn0eP(40ek@90/,(54CiqnJ:;rsq1&Hrrdb!! +rdY9+Jq8K'JV/N)r.#60Da6*80/,.;1c$sE1C5op0JG47/hf"6q(i+.1G^l_1BKY'.tml +1GCO;0e=k01G1:6/heq31%d4D0eY160J>(50eY470/#"30ek=80.J1e*uuCD*?H4C+!'bjrZ2%]rZ21_ ++!)IHrZ3U1+uMGB3BB2]3]fDa6Tu1n'b1T`(CU][%r7W&S!KM3QCaJ4S=H%6R\?[]rNH@+Ycd&kkWSf, +#Wt..2`MO(]"mJ(^ZK.\,ZjU2`[CiJ@Us!J@K9p6@N&``7ncNI +92/)N8Oc<558+<_pO+t><#0`Eg>1G:O@1bgd@4AT6g>[(E<>?^K" +!aT#7r`g=C=&rI/>@(K"/M]+80/57>1,C[A1bpjD2>o?42)G%`r\OR0s"j[1rA+X61,:X@1Gf"cr%e^9 +1c.!D1bpgB1GU`]1\id+1\rm,1\NR.1GU[7+X&&k+T`i2,5iYb,5r_h+sA-S0gb_&"$]"28HVOX8k8kR +$r'Ad?XdJQ@preT@UoCH#\.CU@UWYN?![G9j'ClQ$F6n;Z*^[0SXPk3rgEhSqjJ%dR[?kb$471Q%0mCS +%LP*(6p3[q4ZPSe4Zau1*ZZ?_*rd8W*ZH+@+=Jfr1,(=70ek=90eY777W3a,JUi9%It@*>!eGoQrIGZ9 +LP:G4It)cJ2)@'G0eY78/ho%7">MSb.kLWL!A#_r0`E^//hSk50J<8V"YMD\/h\mW0E[(H;r`fG, +mp#`q!+#S/%U3+@>?kB.1bp^>1,1I+X&'R+X6n/![8d1m3)HRp`Tba+X&9trB^`V5XR_% +927tU8IJ0a9hS)hARJkS@:8q@#\7IU@UWYN?![J:rETD0k[!AU#-tVCXeD,Lrg*PP!1<\Q*1`OgRRIbs +$kEgY$P3dY&fj)#4?GYe4?YJC*ZtA&!?E9P*qp]i*?Q@E*?H:C*?Q=H.PNS30/54;0E*X80/#(RDLR+e +J:W6%JV&L@J,k&tJ.IBgK7e])BKS"(0JG780e`J[$SX7h0JbOA1c-sD2#&X2/1`A*/1`D*/1`D+/-[[Y +0.ek20`E^?0eP(3/1`;)/h]%<0/#"90/5+40JDTCs"F@*#;7ec0JP!u*W@)[*W@)[*UFgJ+!(>%$6L<2 +*ZcCD*?HC`rAk-E4#T,9&-`^\%hB-]%1a'W;N[HCQ^OG3QiYR(D[c()#bSb["(C+Wqp,+T`c0,3'gW+sA-R-nmG51,LX?1c$d;&MGjo/jNEA +>?tTA?!CK;>[:Y*>Q.kO?!LW=>?tK=?X#]I1GU[@1,C[>1bga@1GL[?.O$)`+rhEl('5?p,lT)-/i,=> +1,LgC1,LdB1G^dB1GUd@2)I-G1G\qc#;S(j1,C^A1]K9#1&s-*1B0001(Z8t1,Lg>-6XQV+X/'Q+sA/o ++XA6U+WqpN+?2n6q?0JL!ZF$p= +TpV.7R$di@!1^*r[0$*[N?j0eb:9 +0/,%61GLO:1K&IKJ:N&sJV&H(J:N+=JGt*"J,Om=I=ZouGYBhH/i,490eP481,C^C1,La:+!2UI(_RMU +&crac+9!A`/2-uVr%K*F0J>(30/5(5.P*)#/MAe20eY.60JG470JP:8n1Xhqpb2_'0DmL6/het0+WVRE +*ZZ7B*?H6b*YKJ6*[)^N+W_XU4ZGM`4$bP,%hT-^%1j3d&e56Y<195LQ^XM6r0d\SR[F)C"eVTjYd1S5 +YlCljYin4Q5!2"k3W(f62ZPi62Zbls!VHH*!"08R()If()&O,+()QHUrYP\Q()Qrc!uMgk'(GsR!7q2f +#ra\#2)dHN2E*NQ2`N`S2`EWS4$5Yi53"fdjR2(IdEBeYbKS/RbKA&PbEZ(';Gp";/1N,"/1E+2.OQYp +.4Znu.k3>=5X%@r5X7Y(5s[_#5#6bfe,Rb08)Sc-+8^jQ$4"!9;Sis5`BL#$bGA@UW_UnR[1S6>6%pq>8LIJ>?Y08 +?:cn.1GgmD1,C@$*u,P!$4,Vk#Qb;<$5XI$+tijN$T'[r1,CaC2)6pD1B''11,JkaoJ-e11,C[A1GUaA +1GUcc1&s-01&s-/1'TQk1,Ld=.-VlT,5iYb,5iYd+<_p,+=SHY,s=O\5s..u8P_fN84uTL:.[u^@UWYR +@UW_S@UikV@q9(Y@UikV!FT6m?0JKs['HR"S=5i8RNJ1F$4dj^%1WsY#T!pS1d!c[4>\0%*ZZCJ+(50/,%50E*X* +0E*X*0E!R/0ek@90.S@I*WR;M*WR5Z*X<],*ZlFE+!1D)/05fQ+?)AE4%(A&'a>-Y%h0'_%M94/R[Kb6 +R[f_7R[BP4S!]\6R[BP7UT=Bus0CdkkWK#35!(b'2Y&d-2E0(bhuF8g'GqT&'GqT%(`!o&()@bW('PKi +'c%Q%rY>PO(BVn_JcPQG('6EO2`3NP1H%0M2`E`V3B&iS2`NfZr]U9Fjuq,Q%cbdWbKJ&ObK.rPbKJ#? +#>\/n3[uU..fLq#.Ochtk:-]c.Ochs/2]Wj58ujP5!VA"5)g&MHd$Q9s92F'Jl5m=P=?=IGR@KC"Lo3rYK?V=$` +7n?3D78HKL845U,6:*@M+WqpP,9nDn+TNY`+Tio<1,Ahb)_s0*1G:L=1GLsb>?kH=>$P?;>?kB:>$P38 +>5hb+>khM;>?b?:>?tH9>?kE44u"`8,8([s#1!8\"pbkV+t>B(1c$mD1c$pC1Ais.1B'*'1'BBh1,:Z` +1B'*-1(>uo1G^dB1GU^B1+t%"rZM7cjWP<\+X/'O+l\0pYR%M=WLB-CSX>f?Rf8lWRM;-V&.K*^$P!RP$kWgX&Ks(o4=M9I*WmE' +*ZsJb'-/,8+=Acq0/#%6/hf"70JG476kO![J:<'#J:W<&J:E0#JUi<&nUL^mJ:W:NJ.$pZE(D`B-mTWE +#m8KR#mLYL'dG4c1GCK]0Ej0a/1`G+r\+:*!\Z2]p+QV&0/,(5r%S+'qCiF50eb=:/hf"6/L;DY+!2Ne +*[_sL*ul=B*ZZCI*ZZ:S4$5D<&./j\%1aiqrNb0.uMbKS,QbmVTh8hV\G.kle;?raH(@@V0+[@Uo@Gs'tt9!aS>irC@>i78$9G92.Z:4XM?rrZDFh+WhmQ+X&)o ++TNYa+U0DP1GUaA1AWdA00iWF>[(?7>[1H:?!:K<>$>0:?!R#+r`]b8?!LT=?)]!!ET<'I#71 +1B9<31]9'11Ggr]1'BBh1,:ZY1As!/1A`j31,:X>.Noqt+UB88+sA-R+sJ0/+W;II.m>sa84lHE8khiJ +91MQG9O_LBA78qU?iFL9A7B$I@gQUR@:3MP?eb6,r3bKBe,!m\pI +r8[k7h;n*3$!pnC>[(H=?=%%;@K9s7@MWK`@Us"VARo7>7nHEK8P2WH8PM`E9a3!k+X%sP+S6iW +,5iYi+sA-R+sA*Rr?3(%+X&$Q.Pik91c$mD0ebC;0/>FW='Ad3>?_#1r*8br#@(J<>Zt?9?2\"1>?a>t +lN#31%KQnO+tbZ-0f1[A1,C^@rA+@.!\uPgr\O@*s"jC)&i2:!1GUaA1G^dA0e"7i+<_mPr#l.d+X/*3 ++X&'"+WhmO+s%sO*?Zt/8k;HE8P)HE91hcN8n)7<@:3\S@Uo+@$Y3^U?sm;I?!LZ@?L(neYR[h?ZF%'I +YcOgtR[Te9RK/`NRNIocR[BJ5PFQ"l&ePW]%Ls0`%h/mU$8rkG*?cCG*?4\nruM%Z-64-J*ZZ=D*??4B ++!)IF*?QR\0/,+80JG:;0/>793F@,bIt3'#rdaotnULUjrdY$#J-gaUJUi<%J:h)9\,[!>$5Xp?0ek12 +0/,1=1c#"`r\"=,0/3AYr\FO.r\FU00/*2Vr@e^90J>(50eb=:0JG.,*[(G'!$2"Z#9Os-*??1C*Ut0m +)BBh>*[)XT-P$[t(Ch#e$P!OQ%M8npQ_0VJ] +2`N`T3;GK=3&`cU3&NQS'"IuF!YQ:a('#0L(Ao$>('#3K('bWm()Ri'(BLQ:QN.::2)mBP3AriWq)8C6 +2`E](2`N`V4?Yhk5!;%mlojUo!9&.4UOqbK:79 +bKA&Nai_fPbKA`&r8[k>?[(E;pfd`(r`]Y3>?kN>>?OT1l2\m*#m1_V-SdG31bpla1'06e1]B-61GU[?1GU``1\ig*1]K<21C5fl +1bpgC0dn7jr?2=e+sA*R+T`i2,OQ]q+!DaM+sICS7n?BD8kV]E84cQH87>t7@UNYT?t8q?raQ%>@UNOA +>m"D=?!Q`%nZWJ0Ycb.7Ycat$S=5e7RfAcORNRudSWoG1S=c'C$krsX%MoN`%gNXV&c`[d)^-@L*uuR$ +*rd8[*X!K(*uuC$*WR;]*W7#t*?H7L0ek=90JP:;0eY472c+C@Jq/<"JUi7JJGt-!J-:FSJ:N4GJ-17M +J:RuUJ:<$!JqReWYlG+5&Jl]K1GUX<0/3AX">DMa0JEDZ$Sa=j1G:F<0eY+10E!U'0`Eg,0`Ed50J5%5 +/hnq(*Zb5$#9P!-*Zc=D*UXsj*?l^I+!MgG%KI1R"rIUT#Rh4R%hoCdR\H%$I)#b9R(`4#()#+jS +(DR]%'c%Q&()I_hWW8=b#So(&K`\D5Wh:r5X.Iu56[`!%[ss"=kuO.P($=%P0+\.Oltu.Aa>\aiqoOrlYPhc-4ASg>q;njT"93jPf1i>n:1H?!^fC?XI5O +A7K(X@qGIF*arGg@:Zr?;.arZM:c+T?P'5q-*i(qca/->?bA3>6%q,>74_@>[1E9=&^=C!!::CjT$+u$lC,U""%*Zc=D*r[/]*ZcEk*Xr7n!T`;>j93WJaihp-b7Dh?ahb?iZ)90+.4Qhu/M-<>&M#=[.Ochs.4Qu55X.S"5<_@356=Pu +Q2RHYTq_I[!McC[UBI+r+<_pO+XA]s +1,(I>1,LdB1,qg.>$G69?!R>4!a8f5q-*i(rEBh<>?b?:>?tK<>?k98>?kB:r`K7M"NLN#!#PeL*%j$% +1G^dC1GUaB0f:[A1GU^B1GUc\1(lB!1,:XA1,La@1,C[@2)@$@-N5.i+<_s,+TNYS+UT89+s7pN+<)aT +,SNC:7S$'C8P2TJ92f8,@:ESQ@q54ArF6+B@:$P?>r*9;/nm1di%'?b>ZEC$pQ^X5+R%"#ArL*_R +rL+FkR%U"7Q];RZ%M0?Z%M0$Z$NU5-#lk,D*?H+B+X8!&*WR5T*WdE)*W@)q*?H7G/MSq70J>%40/,(@ +=*9(EJUi4IJ,k/pJ,k0!J/*WcIt<*!JUr?%JV8T(J:NB*KnVVlk5`9t$Ngt]0/P=:0.nq30)dL+0J+q2 +r\+F-/h\jP0`Ng+0`Ng*0F9Bd0.nq40ek+%r#Pn^*utD(+!9tn#9>$1*$H=E+oMBS"UPeP&.T3Z$k!Fb +S=?.;TUM7;p6trI#b%9UVma1DYcd>snN@.A4[)%m3]JuUr\ad92ZG]62[_T(2`#n\()7Z$'c@i(()Rf('c%Pe)&=#)L&eU]"#`"r2?#K63VGE12?l)u3''2c53tH4 +4m_50j7)+0j8S*Dj5f7]hTO(@b7`%CbKJ&@YHb@9XXbqP.P!)$..f"g.ip,h.k3#!.4Znu00)6^5X@_' +5!MA,CQ>-aTqeBVTDYGaUAptSUB%%fUBmTeUSO][T5bI?!;c`t#okc#56a;;5X7Lr5lEnM5X7Lt54:]< +5X.Fsr]giU5X77Z.Olqu.P!%;.NL)k.Olr".4VO+Za$dOb0J,Oc-"8Rbff&-j5f:]o]4ojnQc-&r`o_8 +@:EbWA7YIE!+c%;*arMa@q&nS8OuEE7nZKI7n,9X.3TrX+<_pR+5>PEe?2e%/?X3S7rESqu!aJr7r*'P6>[(N>>$G6;?T\Rh!;um!"r/Na1'TQk1GU[@1]B-4 +1G^dB1%6su1]B0/1C5fm1FjXn+X&$Rr?2.bnKAqp+<_pO,Tn,MhR$=%T%LWaW&e,5-O*W@,b*ZZ=C*ZlCB+!;UK.k`V20JP@:0/GRcDLd:eJ:N,tJUi?(Jae0kJUi=MJ.-pYJUi5u +It2usIp!6!!8RV^"rA^E1GCF90eY0Y/I*sc1Gga;0/)fK">;J`/hm8Z%PTUl.3KWP*uu@D+!)IDn/_cW +)]U"@*#JMQ&c`=N$OR=U&.B$[KV4a*S=l"8opYlI#F_$ITWbl8ZKnab4U+)55!:qb2>oE62`UXm$TL(( +2E!NS2`%d +r\b!?2E!KT4Zu!p4mV//j8%d2jT"9>j;R(>f#l4[bg"ASbf@2rZ`g[>XXbnQ.Ouu#/b1A".4cqu.k3&# +.4dJE5lNtQ69db-C58LXrh9IhU8%X^"eq`dTq\:LUB%%fUB%%fUBIBhU7lo6,Q%NA!MKJt"VrOP5Yd1g]bfe8Sbf\,Ph;mVW +jQ"_M!9ETS"(#AGA,]s;Ab9FR?XRAN@prnM7S??H:.n,N5U[d!-mp>i*[;aL+[1G2>l@k0>[(E8>4>`,>[1K;>[1K;>[(B:>?aQ.UB()i"p5DY1GUaAr\aO.!&XI+ +(Gdg%1G^dA1G^jD0f(U@1,C^A0f(R7,5iYb+RUBS*[)a++VtV3-m'QZ*\BiS8l&&P84c?[@:EVR?X`V: +!+Q"=qdK\9?<^W=ls9(a%BQFoQ'\&1QBmu1R[TfCRLl$_R%fb3S2h&j$ka$[%1WjD!!aeh*?cRG,967q +"s"d,*?Q=E%j2l8.krb30/,+70K2jAIf4d)JUi9&J:N-"J:E*#n:2%#JU`3$JU`3$J:`E'K45e;!8.>Z +!tcY41Ggd>0/"pU1]oBc0JG%7TSXl,@RKB%LS,A]YSY2sj[^>D*ml^h:4#f&Q3;kc<3&`cUqDS[<2)dEQ1,M#n +o)R5>!qjQ"\Ls5`]U"C#/>@q>%;'OtKX@:*PQ +A55]e85DfN83A@H-7Jj:#Ugc;*[)RJ,U3%-!$_7_!$M1_%j3>V1GUR91,:dT:L...>5hb1?!:H;>Zpu/ +!*TG->[7&."'f&8>kVA)?!LQ1&>B0t!"8l=+#5T-1Gq$G1Ggrf1\id31GU^A1GU^A1As!/1B''91,CaB +1G^a6+X$_,!$^nU*$ZRM+WV[D-RL5e+XSTb5XnI?8k;KGbLqdKb;@:EVN>[6W$nZW8, +XeV8LQ^XK9RLkjZSsc78TS=0k$4mUU#n%"6!!aJe+;u:B)'/Mo!$2"ZrZ;ms*ZlCC*Zc[^0/5.80ebI` +B7PPbJV!fN"bD2SIXm%KJ-(:QJG4QrJUi<&p4*9qJ;%q`TE+]d%fm4a1G^a=0/,4>0eb140DR:90/,(5 +0/,(50J>(60/,+60eb770`E^-,p+0LrZ;+\nK%oZ)^-+?+<_Bn!!EQ=%gi[C%0\ANQCFG8pR2)LrL3\R +#+h?RSuK!%rNbpsn3$t;3ArcQ2E:7d#<"J!1c@0L.a\7j!"K/K()I`'()@]%()I`$(]"mI(\eaJ(`!r* +p(d`H()R=l!.k4E!!NB\2`3QQpGW(3pbr@72E*ZZ4T.J54mM).jmhC9j5f7\jQ,1sb7)V=b07W*ZEUU= +Yd1S?Y#6]"/13)%n1#,&.Olqt0Kq]f5sR_2DMY'_U7n?Xrh0OjUS=KXUS@X\!huEbnY6)[q4dtN38OYB +!"8oD/jMWd5(nQcB(?=IDS@U`sJ@fBm4@LujT?=.8N?V4!^8P;ZI2(BjM,RYq@+Y"BW*Zl[J +*?t/"!$_:`(F(%M0et@71GLdU:0Uq/?!UZ??=$l@?2\%*>Q.n!>7=b@?!CN<>[(E;=]-7=!;HNo!M09! +!=pD21,LaC1GUaBq_J+**&BB+1,C^A1,C[A1GU^B1,C[A1,CaB1bU1!+X6:s*?67G*[)4=+=JZ`,p=]` +3(le88PMfO@U`hX?".=>@KC%MqdKe?@UEJN@UEC->l\1#YQqV9R['82R[!c>rg$M2r@e@//1iM-pb3(/0/,(50/,(70JP<]0Focj0JP790eb:2+W_[F*Zskm"rng* ++WqsIp](d1&.f_*."r7sk(Ddo)(`4&)(Ddo*(\ngH)"SLN(`!u)()Rl(()Rbm^&W`boDf(F2DdBN1HG4h!&j^5 +r&+R83qto24k\m2j5f7]j5ee7bKS/Rah=s_Yd:U?ZEX\@Y[8b,/gi5%mj\bt.P*SI6pa:@FciDnU?J?W +U8+KZUSFQWrhBOgTq_O]#Ge)iUnOHC1>Mr7!!rfH2*jGl5X.FrqEFsDks#865X..-.k19D!%Iao)_!6e +/1N/#/1Q+RYd(I;Yd(C9ZG=Z-bK\8Rh#?@7j6l".j6,Ls>m=P[q,L?Xm,. +91qlM75,o0,U+BZ,p=H['I=nJ,9A!,+T`i2,5rbb+qu1E+sA-R*[)^\/hJ_/2b6tT>?bA.>68&6>lIq- +>khM?>[(E;>?b?;>?b98=^53<>$YB=>?kH/+oMD&!!`T=.5We:1c,"arA"@/r%e:.q(hb%"Yhhh.O-)8 ++U0,6+X/'Q,5`Sg+sA-T*[)X)+;be;-R9oc-6XZ]-T=Ui8PMiM?t!MS@V9-<@LQXRA7AqR?Bh()Qrc%2]ls()Rl()&=&*(`3OJ!1!Te#W=P#r\jC-rAP!?2)dKR2``u`rB1-Co0)L%!9#kU!2A_Q!huHaoV2\d +U8+HVN]I.@]E$4W$OJ(?5!_Ct5X.Lu55[VF54h)85QsG<5=%Fer[Imsr[J^7.4Qet.4Qer.k)tu.P*%u +/r?j:Z*LS7Yd484%'dIdbf\/Pc/[mFjQ"_MpK[u1??kG3>6%pm>68&6>lIq/>[(M4>68&7>Q.k0 +>$FlCg&S8U$jIY'0f:^B1GUdB0f/ea"uA"i1GU^Aq(hb%">hkh1b\nXrZM:b,4m#Z+!LV+"!J`r-N58( +,paf`,UO`h6qp3D7S7,u@UNYQmUH0*$"@7K?J +$OR:M&IoYHT9l.JMlPB:3!Z2[hr>#YU(`!o'(`!noRK/QP!]E"qni-D(r\ap>3''2b54C_fj8e6>j;Zgpbfe2L +['-^>Z`p[>YctF;Z!Ab,0.AA#.4P-D%P'"Y.k<(u.Om#?t!JM84uQH674!%-RL,e-R:#g +#:(N3+X%mN,5EA^,5r_q+!DdM+X&'b6:t3]?!^b6>kM;$>lIq/>[(J.>Q.k=>?b?:?!UW;>@(Q?>Zk3+ +*8(=m!"Au>-8[G41G^dB1,C[@q_R^s"#D\f1BfQj/Ku>^q]Pqaq]Q%d+s8!,+rMI4-6jc],:4Z]+X8BZ +/Oi6'7SR?#@pWYUnR;urOR$O,.R[3i>p6l;WTV%`@$4mUX +#4qm$()[u5(`=>3*W-r^*?Q=D+]*XPP()Zrbr>#kZ(Dmo'(`!o*()7Q$()d)g!!ntmP5kb!1c@9N2YK*-2Zbls2uY]@2`E]W +4?bnk54^r4j94N'jQ,@\jSm=1begZjZ*:I;Z*:O>rild5>:VEV0InY*.JYG&/1rM(.Q(jtTVJ6SUSRma +rh9IhUS@%KrM'@er1a=fT;)=["/)?K4I-!3!!*&Lp4(gZ*:J3YmdqAY-b[VbK\/Uj5f7kjPf1q?2n:2>m"D@@q,FIs'l"?kH<=pS;9>?kH=>?b;+>6%q" +>7t1F>?kH=>[(E=>?tN>>ZtE-)7BOe!!NKG1,C^Ar\FX31GU`a1[d(+1GU^A1GU^9+X&'/+U0,6+X8-R +,Q8ho+p(8o)K't%h/pjT:).7SFN$JR/WQRQjB.PT;T!#Ycb;(Yk^Ef5!1qj4ZPGZ2uY`8 +2ubf42u#<71c@0I0@g+(#o3CS!>cLM(B53D('#3C('#3N((D&s(`!l('GhQ&(`!tpo`0RDZN(+d3]8cP +nM^G+r\sg7#WF\%3^,_j4[/O%!'T#r*ol>Bj5%r'ahkBhZE^X=Yd(F:ZEg^>Y[/h/.Oco!q'lFr/M-lN +#YgPXV5'f^USQkD#,@rfU8+KXrhBaqUnaWYTq[Z2PlTqH"p#`'5'.UfOYYn4.EYHY47Z*L[Qai_fajQ#:mjP]+p>l\72>Q\>@@V"_4*a`Jh +?=->s7QVe>,q:,a-71#c-6ace+r;FF,U"?^#j%U<4C?!CN: +>$P69=^4]?r;Zfu\cB\L"VrUD1G^fc1BKBg2#]<$1(Q2s1,C[A1GU^;,9S3T+X$b-!$hFc$QpT9*$-:H +&g\kO,S;:K,:4`],U=Q],X+^f8RZ%8mpZ9,raH4E@q&nX@UWSK?=3;0q61+*Z*^d7SsPc-RL#ORQD[[n +'ak'7!!iQ))'0n9)&O[s*rd8[*tTJ6*]S7jJq/E'Jq8H'J:N43J.R3[JUi9#J:N6$JUW0'KQJfr!2TZ! +(G%0l0eWGYr\+C.0/)iL"#2D^0cMf"0eb:3+WMOD*?H:D*?H:C*ZcIK)^QUH+W'\L#Qb;F%qCs!R[ru; +!1'bqQ$()I`% +(DRc%(`!qooDjICZ2b"@1H.6PnM^G+r\k3C2E*QQ2)mZ\4[)('4o[[tj::52j3,Wj][1TB@:E_UA*RMA@q&hU92&&8,U=Q[-7:2e-6a]^-7:)Y,9J'-+oWVZ+V#eF6=!i# +>$P<<>[CZ=?N+12>?Y4p>7XqD>[:Q=>[(E9>[(E872:scj8]Pu-S[D41bpmC1GUf^1A+>p0n5:@q&hQ?=*5/q61.3 +['$=!R[BP2lC%pHQC`mA#SHP+#8\L*)B'J:)u:Td*uuCB,?KGIIt<-#It3#t#_@GSIt3'#JV*-:rdb6' +J:W6&L&Q`,JRg"2!5nj?&1K@k1]9!-0D7*q0+Tcj0JP:80JP78/g_Y]*Zb/"ruM(["X+j0,Tmj"!;6Bt +"V)=hR[B;/l'_jCQ("DFXKJl$Yk^Ef4?Pbf3&WZR2X34'3AWTEmJuSR"9BAW'c-cb#8S-l()I`%(]G0M +([2\?)&O5,()Rf'r>5PM!mq""!7CiL2E!BMkr/i*1c@?V4?Yn#4lYPqj9O>\ah"^\YHRo/&[JaKZ*L[? +ZEPi-.4ltu.kE.K.fCe!/LjJ[UAgnlU8+Q[Tq\7[UB70bU?83NUAgnfUAgnmUnXQ',ldoGq>^KtqZ)3J +#n/CM5=%M!5X.O'56*tJ56*nH570Y?5!M%Z.Olqu/,h",.4Qkt/1N,#.UfQdYl:m;Yd1O=YHtU?Yd1IG +bKJ_ij8e9:>mOV>?t*PS@U`j4@N]2h@TuGn/g_he,9nKY,UFc`-7:/c,U+?T+s.sP+s8$,+oWSn+!E18 +>?b99>ZtE;>[753!a8f3kZe!i$=-nA?!LW==^+'#OT=>?$4.n31,LaB1GUdCnM1P11,:X@1,C[A1GUa< +,PiQ-+sA-R+@f'X7A,Kd>@:E_S?=*5/q61.6YGRk\ +R$sJ2qjIMUnX9WITTh_N%IX9%+Vkh8)]Bb>r>kqZrZ2Ll*]\=lJ:W9%It<-!J,k)uJ-(:PJ`_IkIt3$" +J:E-$JqSb\)ts=4!PAEK!"'#W1GCO;0ek@90CCM+0.nq30JP450.S1e*ZlFF*Zk;$#9k32)B9h?*W6!0 +!!NuE@%*dTnX9WPR[BJ2Sc5&]S=5h=WNPisq)o!F4?GM\2E*QQq_nL7nM^P.2_tU*!:0[n%2BWo(`!i( +()@]$i"cJ2()If((]G6Q()I"u!.k3u!!Z*:F5X7Ih.OcnH.Kq=P.P<5%r@/SeZ`p[=Z*(@9YHb=7Z*:L=YIi$&j5]4]!9<\3s5`u] +$!U_E@UEMPARo$>-5 +r`oA*r`fJ.>jP\o>Q7t,>6J59=?$JG!8[\]"!'-Q1GUaA1\!4#1]9'E1GU^A1,:XB0I\.f,9\3S+sA*P ++!;a*+r2OM,UX`\.3g2e,U=`c+=8?\0M=oG?1h\'@fKs:@L$:K@:NbR?=*80q6116WLoNJTUM(1R/WNS +R.$IHQ_/=,%IO3#(a:CR+rMEs*XWo0=Fl$TJUi<'K(OQnJa.afJ:W9$rdY-&J9OcuNW@u;#Ql"u0/5(4 +/hc`K!&+:)#qmtd0eb:90J4^M*X`u/+!)RH+W;@=)BA/F!u)]8U[srRRLbsXR$a>5R[TnBS<]P@XK;&u +pcSmD3&NQP2`3KOr\jg8ml(;(3ZQlS%07=^(Dmo'(Ddf%(D[eb('GEi()@bO('52Dd]++=/6Z,UFc_-70ue-R0od'-JA>,97mN+!;[M+<_mH.SsAS +>?kK??1M5">l%Y6>[(E8=Bo'6>?kH<>@%54#?k>61G^dB1,C[@1G^dA +1G\_]$o0Uo1G^d@/gDP`+=$k/"VkBQMStM[GnX9iLR%9e8Ss,h?QR*",!"/lP+fq@ +*[(G'#p:sAIt3'#Isuk+70eb70*Zb,!";P+%^8Re<*MSt,eK$D4)l +XL#49Xg#+6r3-/br]LWO4Zu"j2`b@acUSOZZUS@@T!2B7`'r%FtTqA*U +US=NYTqS3UTqe[E7=fro=.BjQ#Re!9(6/heLl+8m5d ++!)ID+!)RK!UTjo&oa)(SXP_4QCaEARe3$ZS!o_2R[p.LWj/e3Xg#%8r35u["unP!2E!ENof!@@3B&lT +3&WcT3Ai`S2@S@@#SImj()[l(()QQX!>QIG('G?g(D[b`('59f('PHj()@\fL]EP;"rK9X3&``Tq)A"+ +%llR,2)[ES4$5_j5!D+m55[S&j8e6:j:((hZ)tC:YctF=Z*CP4YlM!,YnjXKZ?IfK.k3&"/Li2$.P!E0 +Tq\S3k6\c;a7,Q9q55<_=r5ZE^^?Z*:I;ZEUOBc/[jFj4E?"?X6rD?!UfF@:E_VraGk[1K;>$G8$>Ph\)>8(7H>?b?: +>$G69>Zt<9>$5!.0*TArRK*Tq)`'9,1GgsGr\FO2rA"@/q_J.+">_eg1Getb!Ac8(+TWf2rZWO0+Wq4A +.3^,g*[N-[,pjob-6t#a+XnZc9j_@=?Y<_T?t8S5"(PeL@JsL7?!^fAr*9]4Yd1F9Yc=ChR[BKARK/`G +RL5L]To+o$Q("7k"RH+#)''kB)]9eD)BBqA+!kNKJ:[]L!J#akJ,k)rJc:0&IY!$"J,OltJ,Y!'KS"o2 +Hq+S-!.k4H!"/lK1bUI5.kE2&/M[/W!&=7&">MSa0/*;Y">2DX*Zt>%!$D1\"!/X0$L@a!&X&KLSW0A4 +Ss\o6$^dKRT;eonYd1F9[/I32YWb36r]LEI3B/rU2Z>W83:Sp52E#8tM]PU%>&TUB.*arM'4b"eq`dV4sX]UBRBe +U7lrrrVup!W;sC-#7N1L5manG@U`hXA7K(YA+3q=?t*MK?t!P8.j6)],U4`a-2](o,UFTW-R9uT,o.IC ++X80N+WhgL+Y?l%=Bf!7>[(E;>4Ges>l._3>[1K;>[(B:?!I84"C"u5730>IQN.*o+uD+T1^Pon1,:XA +1,C[@rA4C.$o0Ro1,C^A1,LaB0I-N>%O3/A+X/*R&g/DG*?lgVq'HV$-6XZ]+X^-!?=I2J@:Nm=@KU+L +@V#II#@q1M?%//hAS.1GgpE1c$i]0,QAs +0/,+80JG480eOUk*ZcCE*??4B*?GjZ!!k9FUn+QXR@'<1RKJqGR[F)C#ah?^WNrn8Y-S&2!jJmkrB16F +4#]+s2?Gfq2Xr^21Gq'L3&3BGh#Icr'c%N"(`4#((_uTW!>QIM'akcm(`4&(()@]&()Hfb!YuUSK`I,5 +#6?hD3&roS2Z5T,2Zkrs2`Udq#WOe*3^,_j4[/d,iT((%j5g1!+47BsZa-j?Yd(L>Z*L[?Z*:IfDae3jQ,@ujPf/#?!mS:!FK:7@fKs;@K9p3 +@fL!<@PMJ%@p`VO@8JBq,TeNZ-RL,e-7(#d-6slb,pjc`+ZtB;=^>65<`UpZ!!/kq[K$[A-SdP71G^jC1,1Q`1\id,1G\nb#r4:l1G^jC-Qs]1+U'). ++X%sO![B!?q'H+d-N51r.3gSsCkk!"p.i+WM@C+s%aG*`@T>J:<'"JaIsgIt@TLs+10""FbiLIY%KK#(_;ZL4)Jt_>ol%"pl_7 +0JG.3r\+I./ho(6r%S+(!A?/+0,$&o0eP+60JFao*?H:D+!2OE*ZsYI#=auJUmI7?QKahCR@C%W[]lp: +r3-Ag5!;(l3]R*ts#0j8!&jO0s#C$;#<"M!2Dd9M1>Mp7(DR`&()@bS(',-erYGMNrY>bU(`*r'(Ddf( +rY>JGhuJ?/XoJV-2DmHO2Wm"#1c[Vq4TI\E4TIY(j=]KRjQ#=^eZl?bZ*CL=ZEpgAZ*CU>Z*:I;ZEg^= +U*hBB/1E,".4I$,USFQZU?\KRU@b2eU8+NZUnMZW!!%TNdf9Od2aKYn4oR\J5<_@'56=#662j+S5Zk>&>PMD&>l._7>[1H9>?kE9=Bep44W0mmZN(.>.l9"; +0`Ej11,:X@pbNgD1GUaA1,CaD1GgmE/0Q2\+sA0U+sA'F,pWL9-ho#",UOf[+!i0_,:Z`(A7&kT@-_8+ +@:3ST?s[.+40ek@:0J>+-*ZZ=Cr>kt[)sI>,B:+sTOJ&34 +RL#IQS=>e2TW,6rY5GL(4T7JH3]K&X3:&R02`EKO2DmHM!oEtY"W-;:!>QIK('PNl()7T%rYGVR()Pg- +JcMkP":mCK1c"AU#WOb$2)I3M3^3F(s#o?%!TW8?isXPEZELF9YctF9Yd!u/$aR(CYd(HT/hJV)/cI4, +7ZjI=USOZ[TqeC^U@=oZU8+I^UB@j[B?g[1H:>$P;1>jkl#>[(E;>[@>5$"%%D?1,:XB2#&g=1GU^A1,:XB1,C^A1GLX<,9eB0+U/Q'-mU#_,lK&',pjra ++sn]`+!i0T+mn$FY,@q_R[p"dCF1b^O5/M8_5q(NI80JG.60J>+6 +0eY480/+t!*?H=$*<@5arW)9b"b)Z+R[]f3RK]7LR[]qIq615j5!:qc2E!NS2`EY^2[)&p2)dB"kQ(AX +":Z4`(`3,d!uMgi([r1P'c7Z$(`4,+()7Z''c@`'(^.GNJcO!p"WK9X2`3Va2ZPc72[)&s2`3QUq*!`u +%HQR1jQ"q!['6j@ZEU\6YkbO6YHb=;Z:6;m/Lr8"10C4KUB.*^rM'@em@sZUqkFIlUS=KXUSZ`s;2&$iOHZ*LR>Z*:F;[GU'+j4r]#jBPqr?t*PQraH"? +@q9(Zn6ur8@UNPC+seT\,:t#`,UXrbq'Hh),:OfZ*?lUG+X/'I4Bl#q>?kK>>l7e.>[(E;nll9&>[(H; +>lIq3>[(H;:bN(M!.k3t!!<9+;,kE+Wr'+-4_CF +-71#c-6a``,plf)?X`kAo3r/=@UikV?t*VT@piSI?Mn(5['[!0Q^jTFRKT"FQC+'/RKTFWTUf3K!#Z^q +*$-"B*[X4+J:E0$IY!'#J:E*"JUi9%qgeKm&:]7^J:W6%It3$!J:W2l71PdeYQ+t3*A]?$.k<2(1\ia( +0*!^*0*Z5 +2X`R,3&`]#kQ(AX&/Q)u(D[f((`!l%()@`&()ZWY%M]ft()Rf('c%N#()Rbn\H%3]aoDM`2``kb2[qZ( +2E*TS2`W`R2`j,dr&k,BjQ$7#!9+s\Zd-78[:q'HUu,U+KX,UX6I)^-=J,995P>Qn>:>[(E;oih`+>$5'6>$5'7>lIq8=^#$5>$bH; +=\p^Wp],mGblA.Y.krk91,C^A1,LaBp+lD!!AZ2(+UB27*ZupR-71#6-5%RL,pjuf-6sf_-m`&(@:`eT +AIN9[A7AqS@Uj"[@q&sD@LQXO?t*SQ?R[B>,R$sE"2`Udp">r.p2$i+?#m(qZ(`!r*()@b[('>Bj()IT"(`!o)()7T# +(`!r+'c7]$(($6+JcP'9$61cY2`3TS3AriTr\k!=2`?q)1!*]>*!*T;*r`fk9>[(H?>$P68<_k=Ue,Y(#li7,'1,1Zb1B''11,J\\r%es@ +1GUdC1FjUl,9\6T$R7#E+Xm(3!@9#j-5RjK,9e?]@prnZ?t*SU@U`k[A7AtU@Uo1B!b#GEraH%R4Z;Un*sCS!o`?RK/ZQRLY^RSY)^FR\u^IQBm`#=m#bl*#0A4+<;kMJ:<+GJ-1@QJUdWK#D.JXJ:`H, +KDC$'It`H*JqeG='_DBW!6bEP(Gd^"/het30/#%60/!&S$o'Ii0eY460JG49.3JO1!Z`*hk5Y^)R@';5 +SXKnQSXPh,QC=>6R[El='V(_aR[9SAXg513[]V_P2)[?Q2`UUl!&jg8%Q67*3&`fU3AifU2DmE!huE`a +rYPAG!uMdj(&\mO(D[f&(`!2i(D[ha(B,-Q()ReoP5p17kPtl-1cREQ3AriVrAFd;2E!KPpbr^A2)[?M +3'',b4[)%mjQ#;"j8e6/j8e6>j8e6>j9F2?Z*LX@ZMLg+ZMUm3ZE^X?ZEUSl#V.AS.n>o"Tq_:V!MlIc +UB%%dUBITC$LMZ="d/O)Kc5!_Fu"$f+85k@2M5X.Iu5!V4^.4Zl!7^9/eZ2V$6Y-P:< +Yd`HKro=7Cj5f7]j6Pb+j8@sC?XR8N@q&nWpgOY>@UW\T@q&tU@UWhW$".4O;BmG2,U+]6-3,@h-3>PA +-iP;.+W_mO+X&45>[:T=>?kB:>[1K<>?tH<>?bA0>6nJ<>?tK<>Zt>1>6J297kY1s!.k49!"8rR1,C^@ +1c-sD1GUc]1)2T#1G^dB1GUdB1G9sr+X/'L,:"Q[pa,tir?`@-,pFWa+X89Y>[CoK@pibW?t!AM@U`bQ +p0n>:@UiqX@:!2F?jU(EVkBWMR$sJ2q3hndSt2CAR$a5+R$sA(Q_9n<:?DN^)]0_>+#J+jIf=j;JUi9% +JUi<%JU`6$J:W6&Jq/?$JUi9#J:N3&Jc:0&JUhT-(%M?V!6P9M"!]KQ0/>79/h\q32#&a:0/,%40JP47 +0J5(3+WVXC+rTMC"DFTrSXSR$O25Up7)'[&aKn2`EWQ2`#GO('O%*JcLW-"qimP +2Dd?K"Z84s3&ikq3;>EB2E!KP2E*TT4?Ykl4QPPgj9+H'j5^."#ijC:Z`LL;ZEX&-!4)U/&?r@BYH`m9 +/M&DWR\HIKUn[XZ!2B:a"JVT_U7r$jUS=NWTq\?WH9r:*!3-#"'KQ+V"@,4:5X+^&$p[!B5=%Id.k*,$ +V6C!+YkYI'Yl1j+Z4X=GZE^^=ZJ4F#j5]4]j5f:]kMum.?sd>P@U`d@@M`H]@q&hR@U`bU>[q/N?sZSS +-6ji`-R\U7!%%Uk#:(Q:.k(oN*XWr32-4$h>[(H;>lIqJ>[(H;>?kB:>[(H;?!^iA>[1K:>?b?8>[(B% ++UG4NM?!\f/MmA]!AlY81,CZ[1);Z$1GU^A1,L^B1Ggg5+XS6Q'e(FT,kNE%,pa`^+!MpR+sgK'@U.60eX[l'I4j`!"`"rSY)@AQ'mo/SXc.7QBdd3RL>LMR[TV2R\$R_Y-A&.2`:Rm!B2q32uY`7 +2[VN'2E!NQ2`n3A`cT2`:Ol!Al_12\%`(2`EWQ2`Ef]4Zkjfj7)+5j5]4\jQ$7#$KC1.d'Km[['$[?os"M&rim$= +Za-jA7k-&>@\]fpTr+TZpnIh`rM'UlUSFQYU8+CgTqJ*RUS3c[0*dF9VuR)).R--`4[;4smlph<5Q3nO +4u4Z>.UW4\s02$u$F6k?Z*:L<[+43ur8Zl!mUH*&%U`dU@pN\X9dM>4,:=TXod0Ybr[%gp-7:,e*$Yb1 +,!K46?!LT;>kqS*>[(J3>Q.n,>7+V??X-i>>>R9q!iuBX!!NBG1,:[B!];bipbDh*q(_t-1B''81+4=j ++Vc.I,P3;_./kP*,U4Q],U+H\<*j6I?t!AK@q,FF!b#PJoO8)9@U`bP?]J"dkRGQ(aEC +Kd,UY$6g9.*D:p9IXZp#pj`EsIt@TL&V#@_J:N3$IXcj#KS>&#:Ep"d!.k46!!rZL1G1:0/1iM2q(Me% +pFuS$"YM)@)&jOV!"V,YNgcN)U7dmBStM[IR[a&?#b@NTR$sJ9XK_l4W&Q^72ZPi32Zblr2uGQ<1,LsI +2)d&C!!X2T(D[i'(\ngJ(_mne('PEi(`*r(rYGGL!>c+-!.k3)!!33U2$,]o1As-12Zbrt3VPH>3&iiT +2`MraQ"? +@Uo1B(1:HUA7]7YA6rYO@U)AM-m1/c,UXugo-P%s-6XT[%ili;7U02&>$P99>52;'>[(J3>Q7t.>Q.b. +=C"$4$\n_[!!`lc1,LaA1Ge_[&Ml0u1,C[A1,CaC1,CC'+RWAo!!!uXp+R(30J>+50J>+50ek@8+WV^L!Ta:k*/C2XPbO_;Q'7N( +R[964RKB%LS,SiZQ)1XcV#3+P3&`kn2\%`)2`5PN(rQE+!2KT#,<%J=2DmBL2#]E52>9$93&ruX2`ro=IIf>k/#Yck:: +Z)t>+Yl_59ZMq--YR!rQ22%d#V5'gbUA(D_UAL\jU7nEVTR0E[irFZ2`;g&C.6p-_5k$uK5X.P!5X7P! +6oHJF?a$`=p9=\'Yd+23$F-k=YHk@;Z*qa/"68D%j6,J+j5f61A+O.G@preR@U`_OAn5C[<^A,_+sSH_ ++XSK\pa-%g-7Ad>%jWMQ*YonD:0Lk.>?kH=?1qJ(>[(J4>6S;:>?P9&!@\P4!2TZ!!?X*R1,JDT$SsOq +1,C^A1b^I*)Zpa'+=[(4s![gm%OWSI,9\BZ,:+Qc7pKD0r*TM6raY\3s'tt9$=dOO?XK1fR[TS0pR2PY +S=H(8R\$=>PF.Cq%cdTk+!)j;C4^tfJ:W0"IY.?F"+PlPJc:0)IXd-)Jmge]U]?)K!WaDs!\Z5^n1Xhs +r\+U40eb:7-5@X9g()[#d"W%ml'c@(i!.k3F!!EZj1cI;k2ZPi:2?5`32ubf62Zbfr3<;/un`0]1 +ro=(>ro=XNjPJ/%['HsAYck=:ZEUU>rNQ@.q6:F8Yd1Kk.l<9\V5'cZTqhU]nY65ZO*+;/i;eH0_>jZP +3^>mu56X;:5['HsAZEpd>[fab!i8a(_s5X+>!9qE?kE;>$G2+>7=b@>?kE;>?k9/7Q(J.!.k3h +!!<]`1GSY[oeQV*1&Wm2.jQ;R,5*>b-RL2>,n)%D+sJ9X+s8-Y.7Ho3?smOD@fBa8@JF=2A,Tj>?t3SP +@JuYoQh[!XUn!d:R\$(=US)04"loXj$l^I)KR8<#J:<%JJbag+JUi9%JUi9%HuE=W#ljsW!2KSt%kKFj +1\ia#0+9Qg0/5.40ek=5.39H/"69Fb%k)OhQ2R-RTUqaFpmV2LrL*kYR%C(@r\jg8r\aI0$90q$1c@9P +2DmE,hZ*Z_(]tNi'c6ib!#PDG$5aNo(`4#((_[2VScF?B_#OWY2)[BP2Z5Q72Y]612Z>WD2DmBO3AfgW +jQ#=]j7hU7j8S*Gj5]4Zd`fh?Z*4M;Yck:9Z*:L=q6:R9Z*CO?kE;>?Y50>lIq<>[(E;>?Y-6<),k@0/4RMhZ/6._>jlE-8RD51,C[A +1\NU'1D)H"1GU^A2D?6n*?umX-m^;ipEftf-71/?-3PV?,Ub2J85E8p@pijH@N&T_@UiqY@U`hV@UrqW +AnGL^?Ya+]?^mLQSGnrZS!TS2rgaLeR\?49TVA'@QZ=Da#ibmk+?"IrI>!0%It7NL"b;/SJ:W:NJ.7-` +KRn>W=[4\q+TVQCJcMMF%0J"5/h\n30JkUB0JG-U0`Ed30JP47/1iA#!?W0=!%JKa15qKiR$X84TUM=: +QCFG9S!on8R[TD(R[Bh,R[0j32E*NQ2E!QQ2uP]C2`E`S2E*TV1G^'.!!*QF";Maj()?fa#T+ro=RNjQ#=^ +j5f1Lbg";>Z*=85ricO1Z*:L=q6:F6ZEggAZ*:O@?ppBXU87d`"/;QbU&C_bUCisk&0@UikW?sd;P@U`n\raZ[S?t!PS?"@GK92%r0,p=HV-6sl8-3,Fg-42"B-7C2g,9[aO +?2e+.>6J,6>[1S6>lIq9?_hh1G\qc%kfao +1bKsd.4-Af,Ub#j./>1p,UOc`,pXf`rZhmr/PSc2?=@AR@Us"\raQOOAnGR\@UNVR@:*JS@UE>J@geip +Q^+&5SsZ(;QB_B7$^@EPR%:+9H7faA$KD*q)Du\eKR/<%J:W6$IX_0E%"E_HA5u#Q/i>@>0Fuq=JcNUe +#8]3Q0J>%30)dO,0/#"6r\+g:0/,%50/#%71,:^?)[GC'-k-^o7uES#Q^F/(S!]S/P`_9+R\$%?S=l=: +Q_:LOQoHu]1c70M3&pmrr\b$@3ANKP2_cKWh>dZk()Rc'q\B8M(D[hd('GHj$j6V'!.k3&!8[\q"Y)Dh +2)mQQ3ArcS2`3KQ2`EWS2E!KP2)[HQ2ZDb1j9O`*jQ#=]hUMMI!4i'4!jAi4r367-q6:F6YHkF=Yd(Bs +8tDQNTV36uU8+KXU8+KZU6gj_B37Je4[;4r5X.Lg"e5RE!!`K($p6d>5X5$/pHK-O6U3h#4YNkAZEpmB +YI*l*%C37BYd1I=]ZeXFajo;Jj8e67j8e6>jT"9?b33=^:r1'j=jI>?P34Y*[E!Z-6XQ(-3knF,:+]c-8,9l#"Vj*?t<\RraH%>@UikVAH$!B +@U`kW@:*DM)I]/&R\-7>PF%Z&PF%f4TUh=FPFH)6$kI +r[n=,1GgK^g]2p+^AnNG0JP.2/h\q5q_8=/0J>+60/,*Z0*O$d/2T(2j8_( +S!o\-T:D=0U7e0L2DmBP2`3EL2E!EM2E*NN1H@#AMrY>PG#m'JpJcLB& +gAi/n)*'N52`qlp., +q6:C4ZELL;Yd(9@U8"?UUC3ikUnX6:Km$p.77I2D#sgjA69RLt58;dYI!]&'=+mHYct:7[D9u1bKS2Xgu.8Sj8J$?j5]4tisXr.jQ#=Z@p`MN@U]7D'ObBW?XdMT +@UND:8khlK9/S.F+sd78.Jb@k-2Al7+X/6Y,:+NN0OA*g?!gfA?!LK/9Lh<4/h\k30JPC?1,C[B1G]l[ +!.k4,!"K&R1,:XB1c$pC1G^dA1]B-01]B-@1GUaC1GgmB1*.\c.j-#a,4[&n-RL5a+seEY3(lq892/8h +>[V">@LcgT@U`bO?XdDK?XdDT?lEEZQ(=V;R[g%BS"-(ASXPq2TPR14$k3p]$fV.-7X]W@I!9pdJUhr] +B3Inr1GU[?1,(F90.JM*/Mn@"!.k3a!"K&N0J"k00JP:90/5.70E*X*0E*X30/+t.0eP%.1EGTXr;[-3 +&ekrd+BO/fSGnrgR@0M7S>2^ITVe9ETTP_;L(Z=#2)[BO2`ETP2`ETQ2DdK3"ks"c(`+#)'bqN&((UZR +!QY7m!.k4H!#Q(e2`j8e6>j:pY6hqHAubKA)QaihE%Z*L^? +Za$b)Yl_)4Yl:pBKU\'aKm.ZH=AM=L5<_A"6p.91+k77/h\k3/h8J)/h[UC +!.k4+!!O,l0eP=:pb3430/,%40JG(1/hf(61FsO+!#u(N%M0'Y$jn"IF-W&TTVIg=R\6+7R%Bb;TUhSa +$oKq"2)R9M2`ENL3&W3!"k`kZ'F4pK!!6pj?@5m9J<5!VFurBLQN5sRS!0a[UT +JcM8?$4JmZ5!M4r5[_)K@qK1W?t*SW>\IPT8X>s?S=#Y.O*kqN +4WY+F((gu]$kWsWq>fa[*ZHpd1bgL02D[!A0eb:70eY4:0/5.80J5(4/MJFS\H%3]g&N0#/Mo49/ho%6 +0ek@80J>+50eY461GCC70J>+7.Lb>;)?gHV$Q'He'FbBZ,XGROJ!cIeSXZ(:Oen))",[=A2uY]>2)I'5 +)[lh1!.k3&!:Tsq":Z:n2E*KM2)dGm2$,Q`!!(OJecjOIb0.rNrQ5Dic-=JUb0.uIril[5ZE^U:Yd",3 +"0f&8ZMCaEZE^a?YC&Z%5Xe+*5X@V"5Yd(F9%^<.BZ,Xu2bf\,ObKS5TrlYJhbKA/]f)F2/ +cH=AQbZ@qL=]J0e8kAqR&kGPd;,'VR84c?<-R'r_,UP#bq'H(fq'I"%,9\6W)DO')/1`M40/GF?1,C[@ +1G^a@1G\q_r\+C.)Zp!=!!2orJcM8?"9Bi*1c"tbs"aU1rA+@."#V\d1(#fi0JY7"+X/-X-i#(h-i>;, +,paua-7'o_,:+d*7nZKE;Fj;N9hS"U8L$bq93#(q=BJ6n9h%i.1,Uj5&IT!V$jm=N%1W[R&J#<]&-V"n +#o>*E-oNt=/hnsW0F0Be0JP:90JP9\0a0^s*-obrlZ/$ +bfe2RbKS)Ob0.uN`j2kRZ`^U?Z*:L;qlp.,q6:1.Za$a06pO-=56XD@6U3q*rBLQR6:!n%5X><5!^T'h +eGt1$\Gup:,sX^[5X7Ou5kmPR5X7P!5XRb#5!D?/Y-YA+YmIY=Z*CU>Z*LU?!3lI-4Ku68b/qiMc-4AT +bKS2RaiqrOb0/#ObKS,Qb0460/3>\$ns@i1bpmD1,C[B1D9?\JcM/Z*CP4YmmqCYctF8Yd'of5"%Rtq`bZV5X@Y'6:!k$5sIY$6UF"!$e56/ +!4Dk3'L+cI4[24+56*tJ5Q3ne5sRb"6_gikZ*:O=YctC:ZEUU>Z*:F:Z*LX>!3lI-$*ph?]$/=@bKJ-. +bPo]fb0/#OrlYJfbK\5Qb83cA7Rp*E84ZHJ846$?8P;WD7S?)u,U!(1s!7Oi"XPKA-R^GC-4M7J,q18j +-6a`T1bUI9r\OO/$SsUr0eY470f(RA1B'!11,:Hfdf=t"\,Z^C1,:^B1,SnbrA"L31c$mBr\GEH1GCO: +(apXV-R:)f,UOic-7C/e-R^;g-2f/I-71#_,;)PY91hfL8P;]K9he2M91_ZG9hRrI9h\)M$kEaZ&.K0^ +$4@@X'b:fd%N#fk&EMVe0*q.LJcM/<"qNC?0.\_.r%A@1 +1G^^<0J>+60aBEf0J>+30G!1D)%d5f$4ICS$O[@O$53jV&If6W$P3dY#Rq3Z!.k3&!20B2c-"5RcH=DV +bKJ/Sbf\/Rb/qoN[^**?ZE^\6YQ1s.ZMq-/ZMq*>YctC;ZEU[>Z'7I<5s7P"q`bWW5ZE^[=Z*CO1&a!/1B''71,:XA0f(U@r\F[60JXsZdf=t"[K$C80etTb1BoTj1,C^A1B'*0 +1As!A0JPF@/h\"h,paoc,:+Ta,pjl7-3,=i-8[%p,UFig,r87a84cKL8OuBD9hJ&L8P2HD8kV`G8PMbl +&do0]$OmUX$k*RT%h90^#RUq!!$)V,1G(.0/MAb51G:C50JG470JP:90eY161,C<_o)O@BQ2hR(1,(=6 +/MA_00J>(51GLU;0JG-d0ek=91+Y"20acq@(_I2d%LNd[&.fEa$kNsd$4m^V&.TBf$4k#SJcLB&TE#>C +b0%oObKS/Rb0'_,$I$Z8bKIT'ZE^[?rilL.Z3@M=YHb@_?7%h0'S$ks3^%h8gQ$P!OR$4dRO$Om:`U&]cFJcNUe)pZXMc-+;Qb0.uNbg">Tb0.uF +Yd:OSB-5e'R-70u^,9e?X,:4QZ-Rg&V0fCaB1,UgB +rA+F/q_JL51,LdB1Ggj*YQ07Te,TpY,;V)21GU^A1GUaC1\`^@1G^d@0esLj,U4QY,pFZ^,:4]],U=c9 +-3,@k-6"'Q,:+O%84cBG91V]I6qBm@8l/,H91hfJ9LfaZ&J#9\%h9'Y#7M%Q%hB-\$5*L&!"^2,.l&\/ +/Mf(60ek=80/5-Z0aKHc0JP150JaZp!.k3X!"ArS0eP+20J4q10JP77pb2n/0.nh9//@OPp])*8$PO$\ +&e,3\'+Y`g$j6nR&dfNf$5,e&!.k3&!5JRPb0A,Rb08&Qb08#Obfe2Rb/^cjYck=;Z*F;4!jT#9rNZ@+ +&@/LDYHb=:V,'NJ5"%Y#5X>32!^An7r'(?M4[;4s'T`Z*:I;Z*:I9r36=/Yd+23%C*1BZH:>6bKS2QbK\3.bQ,c`b8\[I_G!Kp7nZ6C9Lh]H7S-e,8VLT/i#+71,Uoa1B0001'TNj0f(R@%^5qb!7:cP)`0?+1GgpE +1]&s-1]B-F.l&n40f:^X-Q=6X,U+N[,pji^-RC#8-3,@j-5dsO,UFU&91MQH91hcK7SQBI8O?*B91qiI +'1#,!%29?e%LO-]&JPfb$k<[V"loXh+>,Q)0J>+20`Em.0`Ej/0e`M["tq\_0f(WsciAXtYlG.O0eG"7 +0J4q10JG-Y0`Ng*0F0Ne1c.0@-r;J`!;6C.%hKEb%Li^S'G:`j$l'Qa%graW$6D!T!.k3U0e,-R:&d-m9i\+t314 +$6^W@,:"Q`:In2Qr^n8(91i&T7nH?F92%f74?sGc%LNUU'+5*X&.K$Z&eGKC!:p1"&LB7h-T*\50Jb%0 +0JEAY$SO1f0eb=90JP=:&?Z"b!7:cR(Gmj&0.eb/0J>*T0FBZd0Inh70O&WU&`j!,#S.=Q$k*IQ%L`^N +'Ftfg%LNk'63'3%!.k3;!!**4mJu/F#g:B5bKJ,Qbf]n-$-LH6\ZiVbg/d778JcP6>!tI+B2#]95 +1bpgBq_Ag>0/YO91,U^Q=BHsg)C-OR,UOc8,l/i@,U=ZY-7'r`-RCT?84uKE8P)NG7SHHL8k;K94[D7t +$O[F[&IoKb$4[IO%MTN`o)SC_$iq(i/LNA32)$I9.PUiTr\+^50ek:60ek@:0JnY!#D3MbK@uO +b08,RbKA#Qb.b*cZ*1C;ZMq*8ZEga>Z*:L;Z*O;4$*J"m1-S&j69[g:56++G56jG=5r36F0ZE^[=YmdnBZEg[=YHtF;YJn`bb6#i1bPo^3bKS/M +MG[/F;c,YK:.e2Q852`I8OuEH82qk:,U4K\,pXfa,q&U;![K$;rZ`"%-5[[E,W%/11,1I=2)6a=1A`j6 +1,:[B1,C[B/dCVAJcLl4"q<4@1c.!EqD&a?1+tF91bgg@1-/WC;C*Cp+Wr!VrZ_Lg,UXo8-7gGm+XeQZ ++XJBu8P)TJ84uQL8P;TK8jb[.6U*k)0c(-V%J'G:oc%h]63!"KVb*%%4/-_%5JcP6>"qE=@/hS_/pb3141b:.0.krhKK8!ta*tdZ9'F#3]$4IFS$k!XW&.]*b4?#)^3B,pt +JcLB&[K$@F(^SIg'`_'>VT?p'b0%rOb0%rO_Qg>MYd(J4YTL-UYd(I;Z*:R>YctC9Z`J@"/hKFV5X[e$ +6:!n(5X,-2"$f(85lNtN5X.Li"j6mt!3Q;+#s1F=5uD;c6Il;GoeA2+9u+:.RrJ84H0C4!l*r,Uao^ +-71/f.4?Sj-mTiX,pX][-5@.:*@*0h2)$jE0eb:92)I'E1,:XA1,C[@1G^dC-NiZ7JcLf2$O/4?1bpgC +1G^dC1&`pD1GUa=0/PC;5$M5s<@&P''-/DK+s\N7+u1Sn,pXla-m'fZ,V'o]-6bcG91_cL852cI8OYa1 +4$Gto5X7Cr0+SO&"qM:U%2'<_!U'Lu()nJ>2)-X8.4d))/hS\(0J>+60eWhe0eb:70.nq-",m53!:9b. +"tq\c0J5%40/,(51G^^>0JP790eb@NK7eSl-6F68kPu8#$kNp\&.8mR$kjF.4@;4n5!(jd!.k3&!4;h+ +(B=fj!"o83;,C%hQG^khbfe,Obf@)pZ2CgCZ*COZ*CL:ZEUU3F=\mn/36-a6iK@L5lj26rBCWQ +5X.M!5sRY"0`oMuJcMkP":7.T5=,33)*U;L5+40eb=:r@e7#!U0T9!0.$e"tqY_0J>+60/"q4'J_?p +0JP:;0JG+:K8,,,C`X]8+Vj5A&d]9`&ekcj&K3De4Zkni3]fA`_>o/fJcO@%!#PVM!!^gN*`Gm2Z*U^@Z)t::#-bA;XaNbnr[J%'4?u%rpHJ^E5.85ViMA!.k3p!"oT" +5X.Fs5X.M!5L-6:!k)5s.7q9h@uK-mg8d,psr_,U=T_-mL,d+s.pV+;YV/+!`$R+Y>K,r\FL0rA"F11Go%d +r\Od60f1[6!m(Fo!3?/2"th_g1,C^A1GgjC1,1R>r\=a81,E6@>@:Z)rZDOl+rUe,+=&*V-RTiY+t"Q] +,:Fi]-R'ld,V;Y\8kV<+5=7b(6UO0;64>t>2+9\h3[YpT&Io06!#Z(`*u>q<+Y,B$/Mf190/,1<0J>(5 +0/#%7r@e@+0JP!Xkl?;8MuX.g0/,%30/5.60GlJu/hJ_00JG+40J@m*L3S,O+X%mL)BKCS!"9;I$5+C1 +4?tea4ZbV#3l:rL!.k4$!!O2T)&33.R#jQ4?PbZ+snKY+sS?Z-79u\.3KiX +,9d^2*$HOM+[1Q;>sBJY ++!DdM+rh.*)C>G,rZi=-,psuc.jcD^-7L&m5W1kk4[M:q4Zttsr'CfX3BT;i4Zl2*1+OIKmf3t)&Ki8< ++!DdJ)_Eis/28b10/3>\!\c>^r\4C+r%J.(.)l7=!3?/0"t22[/heq20/#%7/hd,V&hYn`JV8N(J574( +-lisE)B'+ir;cEh$jn"83'Kbu4?>nn4#d'uU&]cFJcPKE"VDRg(D[h8!!ZD!;,gFm9`@j)<(A<)@>KZ6 +W2?PlVPU/_NdkJ".P<5$r[\1).P!GFr]gQQ5!D7-5Q="I56O295;<4p!.k49!!i]`5=%Iu5q_AR91,C^A1,C^A1bpBYVZ;;K +aoDbM-SdM51bpmE1Getbs"jX01Jh=Z>$P353[,I]+2(gL90`+70eb:70E*X+-iq?gJcMeN&-=:70JY=7/heq3/ho%60e`M['5W;SKmnT+6Q.0m+WVRH+s.jH&0M>q +!X8`,!<`K)!"BP[*$[I&4ZYSd3''&Y4utbd3BKA4?c"q6:4$656X;:5X7Ou"@#.91BWC4JcP!7#Qc\E5X%Ct5=#*1 +r]r;(Lnp]=TVA0V6RjN9/h&>$.P*5(.5!)$.k3)"/Lr>#/1W/!1f."G;,:+k;G^:g:f@9h%Rr`L6UO%# +5XrA+X51GUaA-N^1GJcNjl"T]o* +1GU`a1BB6er\FI-'f&Nd?s?r?=^3L%+s@pN,pFNU*?QI'+;l@G+X/$O,9\0S+s]KA5t""'5=%V"6:*k& +'LG,L5!V1b4@MCp5W9o1+X7mC)BJf#'HJ,;)''b5*?cFF*ZH4F*[)sa.l.)\!&=7&$8F1g0eb770eb$X +`rL\kVuR2+-8.2./hJY.0/,'W0GH8rD2!7cHA$rr2&mAU,81q5*$$7F*?-+E*$H:D*[;gO'-\S7)C[d2 +5;t\h7m]7#2EEu"3e@?`!1*Zj"rA'k'c%Q!oDmhM02PPH<`Dpo:KUCL/hJV(.k3&$/L`2!.4Znu/MAY* +/Li.t/h/A)5<_A"5!;+q5lEnV5!M7s5!D4s581,LaB1H#%b"#D_g1&`s01,T(g-\MJO!9aCa!@BT$1GpmD1,C[A1GU^> +0/#h#?<^T:?WU8V+sA'N+64Gh>4@MLm68M+f +.30EKr?27b+,qUZ*0.AG*0.d&U$na4e0eP+60eY490e&muJcNjl70+em +0.eb+/hSe20/#"51,1LhIsZ^"JpNH+0H;#T+!DUD,9A!R)'KtE*#otB+<_mG)':"B/3Z*X5W:em3]K#Y +4$#D&3eIEa!1!Tj!>cLe(`!o*&bZ4_!"`./;,C(d:fC4Y.Ouu!.P*+L.MXH_.P*,$-n6\q.P!&!.P3,% +69mh$r]gNQ5=5-0!'pKI!^SL@j8ac3LB%GY0gIof#=(O?5X.M"62j)'5]!9lVP9l\UnWr-/Lr>&/h/A' +/1E2$.P*%u/1N,"0.JV)-n?i<;,:1h:f:1j:f70f#sCL?6:+%+5<^t(+9Nc0,U!(1*$Z^P+07>$G6: +:amM0+sA$O+3j!6,!G!@TWQ/hSe20eb9Y0JbF\ +JUN9$JqJN$F$P99=^=]D,9e-P+sS9T+!DjQq&p1k+sA-Q+XB0;5<_7q55IS[3BTAc +3B]Jc2]`t[*ZZ7C*?H4B*r[/l)]9V7*#]_5+sA!J)^m3e0JNJ\&MGdk/ho"60eb=80JG.40/+dS!J:B( +!9F1o0/,"40/#"81GCL90J4qFJUi<&rdYN1IUXE;*$6%<*ZQ1=+<;Ku*XEW'*?u^J+ZMR_497T-qE!U9 +JcLB&[/^LM()[l'(D[c&"5!Sb!)Z]o:f(%h:GF:J.4Zhu.K1dt.k16C!%Ijs"=Z>o5sY*-"?o"65X534 +!Aahp!.k3I!!NWi5?kG3>6A,8?9nH4"Wnp4+%30/GC;r\,0B/jb)= +K7JH%J:W/u:)tAo*?H4@*uZ4Ap`9_[*$-7H*uu[i3W;,A3BR+!irFZ2JcN.X#o49o()7T#(`!q@!"],1 +:Jt(f:f1(Q.Olqt.k3"B.KD!u.L.IR.Ouu!2*g[r!'pKI"$f(*!l=qh!2BMt#Wk785!]'2!'pNM!^rfX +rhBmrUSFHWUJ`Nm-nHl#"=brP.P(3B#qIMU.P+%d:f($b:^fWT5XRk&5;FB*,9\<2+U'&5+sJ0Rr$)+` +!?r]d+9O)M1,J\\%5Taq1,:X@1,C[A1F<.[(E>>?`j*+oWSc ++Wqm/+<_m&+U]J;+&/H-[t*?H7B*ZZ:B*?H:$*pH$.kJcLB&eGoUc(]5$N(Ddo(fDl@X;Gp=e:eN5f.k)ns.JG=h.f_++.4Zl&5X.Lt +5l!VE55dbD563J?TE'QD_Z0iG4?c"p5lEnb6:*t'RA6ONUS4HVUS=HR6RjQ9.4Het.4Om=$S*YV.P"7j +:JXe_:]4)r:d[K56:!n!+X?h,q'#e^r#c:h+j`)?!CT?>?G00r#kn[ +q'#_[!?iZc+93qi63'7J64Q+>4?>Vc+<_gK*ZlFD*r$`d+X%mI*ZZCI*$Hsg0J>+9r\+m:0J>+50eY.4 +0ek@70/,$`^&W`bUAu2=1GLL<0J>(20f1a@D1R7eJUW,uIt3'#E[gl/rZV(YrZM:`*W@2`+"'2M3r_>? +3hcV+!.k4D!!W]G(`!r((B,*O'c@A4!!#dn;$0TT.P1NJ!\#WKpaQ7mq^Me!.QTgZ5=,$.!^Jt8rBCBL +5pp +r\FI/(c!s;>[1K=>[:W>=^>699-,6"+!MgO+!UM(!$M4arZMLk+uheR5XRg863on;4$5Sd.NTf5*Wd?& ++8m2[*rR,Y*Xs,1*ZZ:C*%c4d*[2XH1d!f^4$3@$UB#lGJcPEC%074]'c@c)(D[`''c$o+!"Vq& +;,Kq7.Ouu!.4H_r.k19D!\>iPr@/%&2a9Sl5s@R/57'S>5X.M!5fMr@/%'.OcoC:f($d:_H,\6UEpZ+s8$R+<_pQ,9S0S+oNVa ++Tir4+X.18+>#B,0f1XApbMY$!Ak%Q!.k3c!#c;%1GgmC1G^dA01B,N>?kH<>[(E;>?tJq*r[;b+?G07>Zb9:=^>39>q@0A+oWVZ+TNYa+p&o2,Q8kh+Y,iEqEc5_3]fGJ*[)[I*$-.A+!)FC +*Zc=C*??1A*Zc=C*?GJ4/2/\20/517r%S+'!&4C,">DMa0b9cSJcNOc$QUuW.kE8*1GgjVIf=lsJI[-Z +JUW0#JMA2g*?cCG*V^]T*=Eo/*ZZ7B*@O!23]R(!!'5`4JcM#8%2K]o(D[i&(Ddi'()@ed!8mh^:JakN +.4?\tn1"Vm.Olks00];!p-/dI56r%n+'#;\+k1,:X@'`.l^!.k4,!"g2+1,LaA1bpa>?!(E: +>[(H5sgp6U8+IXUB.$=r[S%".Ojm;"Y2,R.POWq:^Kon6:*gZ+X8-Sn0%cUrZM:d0)IHs1'Bl@k,>l@k1>tH1_*?t;&!$_1]"X"s3+t,_S64#qD3]oDC+!)IDnK%lV +*?Q=C+>!IGs"F(""uA%j1c$p-q#H!HJcOX-%07k50JG461bgb/JUi=LJ,k0!J,t+1rZ;1^*Zb,!!$1hU +"X,'2*?dE?3r_5"!.k3&!42_.%i?'!r"]8Lr"]87hZ*o^:Jiu!/1;tunL=Mfr@.h+5k$uA5X%Fu4tsMI +JcM>A%KSXV5+6DLd7dJ:[KG$%GVh +*ZuLE*?QC&*V:BZ*??Rl2`j)]3]c:$JcLB&ZN(.7()I`%(\ngI(DYj.#64a#5qFQ9/ab(j.k3#)m6:_> +586oJ)>khM+>[:D[+p&l1+RgNf+s8$P,!&(W6:*t( +4"qa#+(M6SpOER$IX3^h*ZcCE+8m5\ ++8?lc*??:I*Zm4!3BB2_42LuL!.k4#!!E_bg/I&]bJcM8?!t@(B2#]666WmYt?!R//!a],1"!&O/,5`Sa,4Zlf+t5fF6U=%* +3?B1b+WVUEnK%oW*?H=U0eb?[0`Ea$0Ea*`1bK!b!.k3&!;Z[(%PTRk1GCLTJ:W0"Jbag"Jq&8j+!:J& +!$D1]!$1eT#9=m,+rq^L3W;,?3l:rL!.k4!!!F#R'c.__('>Bj((/t""?7h[.P'm9"=Yi[5sFa%r]gH! +QiM^<\GusV5X%Ct5Y\&IUn[UY"/;NcC&KL]/+Y4t.k<)".k3#6:Jajn:f&bf+WqmO,4H`Z+s8*^2)4h] +q(hq*!"cX?JcM2=$5G?P1GgdF?!:K?tJ7>!Da*!$_.\!$hFc#9kEN0/,%?JUW1FJ-CLSIXm#Gr>kq\rZ2%[p)XS`*ZlID*A'944$#Es +!.k3&!:p0l)&*q_(',6frYOJm"XtrN.k<(:.L%CZ5X.Iu5k.&?5X-7]!.k3&!8.>Z.7$3`6pIB>U8+IY +UB[NeU8+MU/+4qf/,^q".kFIlr_N\?,9S-.+TN_T+TNti1]'!%1'06e'p\iO!4`(:+#Gc/0Jcs>>$G8. +>6\>8?X$Z=/ajh`+s[(2"sG095X@_'#XTIO*[)UG*Za_k"s5*F0/#%7r%Iat!\lJI[K(mZR/dL82)-d? +07SG%pj`KuJU`0"!eE9Pn/_TN*rR)`*Zd@(4?>Nu!.k3&!:g*j()Q]\"W/!l'bqVF!!=]".kBs9"Y;f% +5:0^t,>lIt->lIq2??LhIrZ_"YrZVOi+sA-^6U1rE +667-g+!)ID*Ut0P*?Qm40EA5l3bH2?MA.JcLB&p](L( +4?u(uFJAK(&#,epUSFQ+/1rD&.Olqu/Fb1j.7aA6n0.fUq]Q%o1GUcZ1B''51,C^A.KT/AJcLB&fDl0\ +0/G=:86K2$pfe&2>[(H;>XBPO,5`Sa+Sd2V+oriJr^-)qruLtX"Y;;\0ebZLhp_ErK()Rki()?r2 +!:_NF.4Zht.4Qht1d:4i!!q'SJcLB&p&G@469deGTqeBWpnRh_$)=8g9e7bF-nHh9.Kh7X:esmW+TW]1 +r?2Cj+Y#6&1GUcW1'9.C>$G36q-*i&r`fV2>@9*)+oWVX+o!5]./lO$*Wd?( +*W@)`,q^l)0JE/S!&OR-""u>a"dK(>!4Dk5%l?(!97h\IK_^,uJbss%3?K:a*$63q*r-fX*$RKE4+mTc +!0I6_()@b](B53M('#64!:MBF.k<)".5!eL5.4Zkt.IS_f78Z5;+TN_a+U05I1bpjB1\WX01GggA1GUa!dK"k!JcPKE!uWjJ2"OoO>5hb4 +>?)gi*?cLJ,5<>W+p9&42aT7g*Xj&2+!)LE+>5E&0eb?V0F'El1,CX@1_]E[JcLB&ec5ps1H%@GIt31H +JGt-!J-^3D*?Q:C*ZZ9s*qpZV1Hd>L!.k3&!3uS,()7T$p_F&M()Rf'((B:)!!)F:#:h8S.QKaZ55mhA +56a;95sIP!.C&r*!1!Ti">E20S>)dQpS7b_rhB^mE%3Cd.Out;.Kh7R0MX.g+Tio4+X?t0#V@hg0f1[B +1,J_]"u.ki1,1U-dK"k!JcPEC"=5`T>$CZ)%U*(A>$P68>=9VW+ +0ek=80ek@8q(N".1GLR:2'DGiJcLB&eGogU-8dN(JV8[OJ.7'[J:W9$Jq$fB*uc4BpE',N"U]7(f +UC!ZiU,aYP.P!,#nL=Ym.OdM1nKA)\+sA*R+=mFI!&FO0!AZJ,1'TNi1c$s;!jM`W!1!Th"thZ.>?P,( +>6A,8>?V/7>[(G]rZM:e+S[,U+p9&3+#"i-*Y083*ZcFF-8@/,0JP:80JE5U"tqS_0/+jWd/\auJcPHD +"pQ_5C4LtkpOENuJq8K'Jq,G%V!.k3&!7CiL"r7sjp_F)N()I`'()IbJ!:VHA +.4Zht/3a%t"@,1:5!\m-"[G=;5!K=8!.k3X!!3m!DYBh8TqeEYUS=HWVd1`#.k<4?.KV%K.f_*i+V#\= +,9S-R0f(R?1bpjB1\`^/1c$mB1Bk#`JcM#8"V3=X>$G/*>6A,7>$;)6?!LQ848g<&*;C]Q+p9&4+sS9$ +*WR5[*WmK,0/*8X!\l;^pb2k(0.nk1"jm=%!.k4B!!NohsWq1&s)J:`?(IXcp$7NEKk+!LD#q&KSZ +*??1C_Z58gJcO0u!s'5S(\\[I(D[f'rYFSqlm`0!5*`LUS@LX#bn#f +US=KXHo:mP!&!^i!@oW#-n=R,!A-))1BTBg1,J_]rA+EfYlK@UOoPV,4^),ppKIW'$X?e;?ZRH('bWk'c%W%('?b?:?WJg*+Wqp&+o*;a+l7-!:_NI/1E[;:s5mW!.k35!!3IGK_9llJ,qPZrZ2%[q&]/KJcLB&OoPIfneV0>!#ObtmOAN$5X7P!5:.Pik91bpjBr\OR0r\Fd71,LdD1GfO-!.k3&!7:cJ +/m;NY>Q7t&>6J,65VjYY+nQuS*WR5V*X!K(-o!IU0Ej0b0/5+6$SX4e0f(U>/LrD,%#t=>!3lM*7YQEl +JH(2pJ-:@P8hVLa*q^NR*J4?D!0@3\)#Y6M)#G*I(',-cjoFs%"=koO/3rnn$:$g>5!_Cu5X.L]blE=q +JcP9?![aP6n"U&:69QhK/*nb]+o`bc+o`bc+T`oF1]9'?1GUaA1GUaA1,1U@1c.!F*pirZ!.k3t!![784r`o/$"\pa*+X%s)+TWc1oHO)PruM([#9=g,*?Q@X0E!R-0/,%50+0Hg1G1=<1GCL70HZ;TJcN"T +!uulBJc:3!JbXa#Jq.>d/fu,Wq]5bY*qgWS*J=EE!07*]'c._d(B,0L(AnpL(D[/:!:_ND.k*ME5>?kG*>6S(\2(0Ujr?24d+sHP%n/`Ad.kr\20eY470/,"30JP77 +/MAb30/,'F!.k3&!71]GK)U<&J:W:EJ-:@F0JFsT*sE]-*uu@Do,ZfjJcLB&YQ+kF(Dmu)(`;o]!>Q./ +!!!#h.L%:U5sIV!55[VI5!M7sr]^QO5X.Iu'!)(b!0@0\HM"!2UB[HeUJjBC/G^gr/+Y7]+U0,5-oEb9 +1]9'=1GU^A1,C[A1GgmD1,BB`!.k3&!:Kmg86l-u"'f)8>k_G0>Zs*C0d7bb+X/-/+nQuL*X<]*,;:f+ +0/!5X%PKLg0/,+7/M/S.0/GEoli;V;JcO*s!F^QYJ-1@RJ:[KG%tT7^4teT4*ZZ:B*?H7D*qUK5!.k3& +!3ZA'!Z:nP!uMjj)#+jJ(D[eN!<3&j.Kq=Q.R$'^ofi[H5!D+p5sQp$!.k37!!!'!!!,B]p7qM["eqc4 +5!V('.KD!j.eFka,5r_e0etTb1(Z5s1,C[@1GUaB1,LdD1c$8S!.k35!!";C>lS%.>l.b(>6nJ;756SM ++sJ3/+oieX,4loZ*?Q@E0DmL80/,(50JG.60/5"..Pbk[o,Y[JJcLB&cN*n\rtbVOobIN.kQ(-&!&jgA!^Aq8q*4jC"[5+85[722!*oG+r*'A1>>Zt-1FDo@oHNfH#:D2[ +0eb:90E!R)0E!R//h8G)0JBh(DZ-6paQ7or@.gs2Xs!85X7P"5;)."mJmM17Wt/nY.(pMrjW3B\$Mg&FBU#j!.k4!!"/i.!+qt# +St`$RU8%=U"DU4f5;iEi!\5`No.'PZ#9k<7+sA-Q.e5>!1,C^A1bp<+!!Nuo@=sQ1q5=IlNK%F=*Q\;5 +!3ZA.2d9Kn>Zb98>kqS4?!CT>5qb#M.O$#Z,Q8kZ+oih_*X<]-*ZZ:B*[pP4"Z.kd0f(**!!O#q@tBQ, +q5"7fMi2"9*pEZV!07*c:P47HJ;8`-If4fqJ-g^UIt:EN0/"[nr>kt]*qUJT!!WZa9Rsgj]DfMJ]tL(4 +8d:(OJcP0lMq*?Tq8!P8+$B? +!!AmfStQ(V!*AXi"ZiBPTVS:TUCErmU8*?,5=%I`.OchtngaDX!?r]d+oriAo.p8""#2Vf"5!Se3I%7! +X/rD'X/rD*X0/P)X/rD'ri?4!K16.%!!")4NU)Q+H=8fHhZ*^!NKF'tqiKZo!fW+Tnc8Ld"`00ZNK#pI +!!A1>OHBI$!(QGX"WCNL>?b5$>6eG-0f(I<+X6n/oHO;Zp`9GV*r[/\+#!.<"Z%hc0f&pa!!53*RJETZ +Tqe=VUB@*=7gSM_mf3>0hMVJ\@QG1[!!47#MYrD0MX68mMZScoD!M')Cl=+-M`K8e",`"nMZ/M68+6K_ +.tiA$JqSmVJGap,K7JN&AM>bl/fu)S*ZsqnYlFnLKtY+3p:C=ba8kf4VmJmD+(DRc&)>Y-J('GEh(Dd2< +!;J#D.K1h!.QKca56O585sH@C!"p`=YHkL>ZEgaAZ*CXAZEpgAYlV/8riuU1ZEaD8!L644!!#"WZiIE0 +ZN.B3Z2h0%Z44.HZEpjBZa7$F[&\d+iW'*@[Bd-Fs0Vd2!3t@crNcKulMq-_Za-sGZR43&#.V"FZa@'G +!-Rc2"V@B%U84LVUC3flU8+;K6:*pp.4Oa9q&o_^rZM@g+tYV@1'BBf2)5m/!;$6p++'ldY-.c*#-G&2 +Xf\\-rN$C0XKS_.XKJV,X+`Rj!!"SJXSo1"Xm`>#Y,eY+XK8J'XK/FqC``NTjo>N8X/rA)r2]n$h5ga[ +X0&F^lMq-KX/rD&UE/b&kPtjdX/rJ*X/ob!!!EL0?!:M+>6J25>$G//0*a9_+<_mP+X-J%q&Tb]*?Q@E +*@il80Ej-e0/,0tg&MC$G+PJ&TqeBWr1O^tTq\#MQ(Dmo#klCN/"t;&P.P*8=mlpn>5;r]"!!>6T[']h<%(!7EZ*^dA['I'F['L:KZa-pBZEggB +ZELR>['!Qi!!"tWZ2h0.Z3IS>ZE^[?Z1tX&Zi76Z*^4j!!f7*ZEgjDV$toT!OT-1Z2q:Tmf3NGU84QZT_G2]V#I+nV-ubY5!CLc.eb(h+sA-W1[d($ +1GUH^kQ(8U""fM6Y5YL&Xo>C%Y5PF,Y,eY)XKJY,ri?+&qlBgg8)O@I/,lUMY554&Y-+k/YPG9tY5YL) +Y-"e-qlBjk7KDNM#:usZYHFt/X8]1&XfSV)iN*0bY,n^alMppErN$($RL/H`k5YOaY5PF&Y$pc!"\Ds( +>?tM->7Oh@>[0QK0JYC.+X/'R+nQuS*X3W,*?H=J1%I"&0JG:;0J!:\!!=j3US7[^"eh]cU7n=\UB%"d +UC!WhTq\^MRrM'FgOpT\>!Mc@eUB.&umf3N-KRnZ)IJ87&L4b/.JOqUP/hS1d*?H4B +p)X/R[K$>#^](nd^:Ctg\\G\g]t:ti]t:ti]=GJa]t:tk\@oMfIdmF+!<'P.]`G[Wr4Da;r4DsA$G3g] +\[fDc\\5b,iW'G$\\5Pc\\#Je]=GPe]C!<(]`YaS^Imel##)_B]>(mfeGoT_rjr9G]=S=:!!NKB(`!u( +r"f2G";r!m()Z99paQCq.k3&1m6:V:&)@4)2k[RbZa-pDZEggBZE^^@Za-sE['R'EZEppCrNca7Za-pD +[&dF$!:^$i3O8Xj"L>A?ZEsP9!jf2;pp0Y#s0D[2rNZO3[B2FN!!kQkZ*:O?ZEpn8Z2h5sZM1X-Z*LXA +U$D[`TsCr/Za-p'ec5`XZ2V$1Z*\WA!!Q2nUS=HVqP3t`%&0MkJO)Lc5;jr>.Ojs=p`TV[rZM7om4n\u +$Jb[h/!$a3Y,ne.XK8Q%X9Pi/XKAY+X:VG6X/rD'XfJS*Y,ne,XIr)C!!+[QriQC*Y-+k/ri?1'XK2,t +q5sn'Y,n_,Y5PF(X/haAjo>N8XKJ\,"0S`+Y5G@$X5Bu[Y,mWK!!eLbY,n\*X+]%(!N`I'XT,F'@.4.% +!@LuR>ZtK=>kqS7>$G09>#@"11GUF'+SC^&GVD\`(4)\\>Vf9(;oY!!c-0]=khi\MD_9#JIa_]t:ni +#4;Hq()Rf%)&=(b('PNl()IYflMpnbpaQFr.k32;5k$u>5sHsX!"93dZEggDZEggBYd1M2Z37M>ZEpn9 +ZN%91ZMq-/ZMq04Z*L)@o`4I]!&sk_#ILkDZa-mCZMq01ZM:d+ZMh*6ZEppEZEph7ZN[Y@['br%kPtiJ +Z`p[>Za6t:YlM)oZhC^.['?mAU$D[aU9q23['@!EG1Q]q['I%;Z2q=Smf3M3Tq\9WU&1V`UB.0brhBdb +69me#5:e66/+Y7d+Tru3,9\?31\!4%1bp93!"9*KXK8S-XK8J(XfSZ&X9G`-XKJ_-ri?:*XfSV-Y5PF+ +Y-"k.XGmhQ!!FgTY,e`)X9bu1XK/G*X0/Q"Xob`,XSo12XK/G'XK/G*X0&M*X/r@I#Nu-i/ZZ"U"0AZ+ +XT#@&XT#?\Xoti-Y,mWK!!nRcY-+k/XK,d]!!97'Y5YL'XC1Js"U\C;>[:Y0>7Oe@>[C];0/GC>1F+(d ++nHoR*WR5[*WmT@0e`&N!\lARjoG2W#R>1@US4BVUS@OY"JMTcTqVF[$)!ueUS4BUU8+L_T`_$aM\>(N +">$7?US7[^!29@d"/2K`U\LPZUC!ZiU8+KXTq\6SrhBOiGR*F4!A:,GUB7-aU]-qeUY_[IUS=HWMsC?K +Mkcr=US4HWA+9Q^!!8pjU&C_d@IF1"(5.?kJU[?D%Y]FaIt)Mm0/5.6+!)LGo,ZikfDlNr]=tnj]=YVe +]Xthg]=khi\\7sR$GF-e\@K5`]t:hcrjr^dp]skVe\\5NYf)Pfarjr9G]=eF:!!F&S()[q_('PNk +(`4%uli@%cq'lRt.k2u/5X=d&!Bp\d!!!&[!!5*[Zi%*5Za-pCZa$h8ZNIM?[C-"@#.:kG['R*Dqm-4- +"L>>?YZgc$mf3MN['I$EZMq2tZ2h61Z4O:IZEpgAZa-mAZa7$E[&#,6!"LupZ*CUAZa-mC['R'DZgG'k +Z37PAZEp:k!!/h#rNZO3ZFENZ!!fp;Za6sD[<:m;!LBM[UAUeaUCO#mTqe?kE>?2Ik)>7OhB>?kGn1GUdD/0Q2\+nQuR*X*W,*\9$#mk=bt"5a(\/=E3* +rM'CeU]$kgUS4EUrM0@g!2KOg!huB^qkFCiTqJ0UTq4mj]=YVa]=khi]"GVd]=l%k]=GVgrOW9E]=>Pd +]q"*_%_]Qf]=khg\\#Je]=YbgoXt7:rk/cO\\>Vb]t:tk\[f>e])fTTk5Yh#\\#Je\%TJe^&>S#]`PgV +9^;ZZ9tC8:"1u+W^@2-d!!g-L]=GVc]a!m)"VDRe()Rqa('PKi(D[c(l2^Q."=Z#i5="a'!^ApmhZ*ao +[Bd(9Z2h0/ZNmkE[B>I43%=Y'',WZ@MQ=(j[C!9GZ*CU>ZEggGO6-EC33iCe!42[1"1,;=YlV/:oWeh1 +Za$jBZ*CXAZ*F;7#-tM>Z*L\^l2V8OZ`pdAZEpjCZa[EOZf&+l\$NBGU%&-[!!T(%Yd(O?rNcJNf`28d +Za-pD['OrD!!6f.U]."_UCNunU8"EWHTse]5[%&0rEBb8>?k?9=\UY.1bpj3+X-G$q&Tb]*ZcO[0JP6N0EEmHhZ*a\USFO]U]$ncUBI$. +A1\r$!#5J6&hI%*R%^:MTqS6TTqeE6U&:YcU&LejTqeBVUS7=TrLjCiTV8$PUA^biUS=NX +US/^n!!=dIUS.aaUS7[^s/"SI!2][i!/p.C!fNhKrh0IhTqe8%f`22PTqePD\K^,8rOWHN +]t:ni]t:tk]=kiK^&GVK\\#>_\@];^rOW'?"2;=ZU?DRY]=PQM]DoSE]AL:(]=kgKlMq5`]tCnf]t(be +T^i*G!!g3L]=GPe]*I^'"W&!m()@_^('YKj(D[c$!p]j^.Kq=O.lop\pHJgH53kPtTAriu[5ZEplMr&="%&NE=(R'X0,Z*UaCZEpjA +ZEGYA!!G9fZEgh9Z34f!2E<\Q2Ztrr2EZ#Ih%FZa-jAFm]560VP56V50j\ +UCZt96?2e(*>Pq_4=#2Ea1GUF& ++X-J%rZ;([rZ24b*Zlpf1&!@-1c$pC0J4q00])j2GbY22$DO;hU7n?WV34gmmf3J'780Ie4e*qUJe!"L3`]=GVc]t:hg +]=kmf!V?Bg!!iX;]=kbe]=GWS])o[V9'-*Y]=Ybe]t:lXjo>kq1SDLr\[fDe]=GVc];"Ni"1u1Y]*#aY +]`PtL!)!7(rOW-@]4KXq#/.X^]=khi!!_fj"W/'l(`+"`('PNj(`*qulN$]0"Y;;l5ZF%*.o)RtS#Ih%FZa-jAFm]56".#^VUSFRXUB%"eUBmT#5sIS! +5V";T.ek.h+s]!#r\O=)!&=I.s"a[4&`#Hk/1XK8In#4)[(E;pfe,0?<^W>>X'kt1,C`c+n[#Z,5<2`+ZEppIFnGat!!g!>ZEpjAZ?>O7!,qk3!29+]!29@d#_5-*5X@Un/M$HCrZM7c +q]Q+s1,LaA1\`^.1GL[A1''0]huEq+X/iD)Y5YL)Y,d0djT#`&KWD2TY,ne/XfJOk#O29p/$,nTXfeb+ +/c5V2!"1BIX/rA(YH4h-X+Ta=#V<-[XK/G(W@Q!hq>^MTr2^+*XK8J(W+"E\#H4f,Y,ne-@I4$t5$V;p +?1qJ&?2[t5:bj[[0/G1'+nd,[,5rV`*W@)c+!)LS0JG+50DI4*1bpmB0J>!8!"=+IUS4HVUSFQWUOj-? +!!*acrhBLfU]-qhUSEqVquH0c#V;aEUS4BVUFY:'!@s?4UB[EcUSFNXK'WI$G37>;7ig +1bga0,P3/i*?H7D*Zc=E*[E?m0eY9U0Ej0b0eY4:!"\#g!-\=9#,7ldUSFD?i;`p?Stl1V!i)H?l2V)@ +US4HXTqe;3qZ,^X!dLK8rh0IhUS=JQm/R/=U&:YdV(TafqZ$VSrM'IhUS4C[UB!=0!!f?oUS4HVULNTj +"=o%PJUdHF%tT7]JV&B'HSI0.0eY."*q^NR*Ph^_+M#+t]sk\c]=X`n!!&\k]*>gX]tM%i2>[CB!!'_3 +])o[X\_[;d+oT"U]t(he\a'5"]=Ybg]t:o#AMrY>SQ'c.PM!;\/M.k3SF5X.P"pcesJ5!V=t5V:pp$WaX?ZE^^@Za$j($gn#c!"01-Za$g@Z*U^@ +Z@hHC#WK)qZa-mCZ8CD<$KZa-k>Za-mD2S]:mU&;2%Z*L^@Za6sD-f"b+\$NBH +ZEXG9FmT/4"eq]cU8%IY%\f_mUnaZZULHMT4[;=lo.'PZ"sPZU1GUdCpbE%01,C^C1EtfY$ii`!XK8S+ +XK/G)JdC66":0seXK;B'!j&J?lMq2@Y,n\*XKAQUh>dRHX95N*XKMQ(!N-1j!!FjUXK8K%X8j`c!!&#T +X9Pi1Xfeb#*qoZt!!fI*XKJY-XC:Jr"Tr"6>?k>,>7XnA>?kH=>?a9J0ekL<.O"F.qAok`*@rp"0JPUb#`>COU]$kfUSD\l!!+XErM'FfUFQ0AirBEWUSFNXTqeBW +T*Oca!A1#BUAugb!;ZZqMu9=UU8+EUTV8-S+5Ho%V4jZXUS4Glm/R:lJ:2ruK_^-$JUi<&J,Xs'9//+P +0JOssp)X/R_#OYP]=YVc^&GPB1>Mp;8@uFG\[f>a]tG'W!:Bgk]=khg]t(l4!!p9M\\#Je]=Fa(!!^'I +]t:ti^ZGOM!!#Xj]a;GO>G: +34#orZa-mE39:.q!!&_kZ37M?ZEpn:Z3%A3$f1jg\$NBHZE^]Xli7-.Tqe@ZU\^_nU8"EXLHn0j5X[ge +oIBY["t)/_1,C^CpbMe(!]2Y=iW'<+W335'Y,n\)XF'75nGiQ:rN$1)Xfnh-3:$VN/$,hTXK8S*0&6L6 +$^WXK)H)XK*nf!!&#WX9>]/XKJ`*X9,Gh#i5OcW335)XKJW)@I4$t!Bs^k>kD5. +?!LT<;D9j]1G(@*oHO,Q!?EB`0`Nm%0Es0`0eY7;$/tpb*XS[:USFNXU8+K-gAh4trM0@c!huGMli7;B +USFNXUS4D5h#IIWU'IHgTVA-TU1EZl!A1#BUAum]!!%rUUBI9aUS4C\UB70R#kn>_!!f?oUS4HVULNQi +!aC;2pOEBuJ:`<#rdY5g0/5.81,'gB*T@(X!<'M5]tLtg]cl,1#pI'q]=kbc]t(oC!!'_3])o[Z\bZ/d-1Ggm3iW';iQE76jXf\\*W(-(Qmf3K: +X/rG,ri?1%V?lPh#V3!XX0/P,X=i9.$&>R_Y-+k/XelBm!!=dTXK2Q*XK8HQ^]4@or2^4-XK8S+XKJY+ +KAHS3W335)XKDT*@I*sr*a;iRpfe86>?b?;>?b?;1GL[A0/>$L,5N>`*@WZq0D$q$/ho%5,N8\'"ppHf +Tq\6SUSFYUf`2/"USFKUrM'Cb#jhTl/H2CITqe6poFP"Y,qW$!+Fab#H4f, +Y,ne-@I*ss"Bnr5>l7h*>7XtD>?kE:>[1E$2(pa@1,/>E#ot'-*Zc=D+YPPK1%m:)1G^j?/d^M;$"B[' +Tqe%40(^1&!!*;;#J%CW\\#Jf#M/q^ ++hPFu]tM%i\M`^R#/.X^]=khig&MDQ]t(bg\@oKUmJmI']=khi]=krZ!)!7(rk&3Drjr#GO()H9;r$hau.6$f^##H4f,Y,ne-@I*sq!B43Z>6%q$>6e4_1GLR;1FW5G![Jp4q]Z"\rZ2.^ ++!)m)0F9Nk0J+e00JG=.iW'#oTqVI\"/)EaG3K"o!""7PUS4BVUS4G5mJmMDUS4HVTqeA5gAh7DU&C_f +TqRYoHJ:mfN!.jio#_HtK +/M8Y-0-gH;!ZrI)q]3TT!5/WL]t:nd]>#E;!!kHq]t(\e]=GQ?!!^-K]t:ti^"WMn!!'XE]t:ne]k-U3 +!kZ.XrOorG&5'RH]tM%k&q%=%]=GYd]=I_;k5Yb#]=khi]=eF6!!3rP(]>*L)"n^G(CTX2!\,ZMr[Imu +nNR4A5!_Ct$io;f"J2p*ZEaD7!Mg+R!!s"6Za7$FZa-m5mJmMOZEpjCZEghpquGUS#ck8;Za-jAZPi64 +"$!WmZi762[5Z,+q>_/&ZEUU>['F]uYI(U@Z*CU?Y9r3.#Ih%FZa-jAFmB#018CS;nY6DbUJ='@5XR^u +/,1Rq.OlY>+n@Am1GgjD1,90q!!JCbY,nf*X9"[oeGop]TW>,pY-+k0R/l[U#V3!ZXKJb.X=i3,#b\9$ +XfS\/XV1+'""^LVY5YL'X"3?5g&M57XKAZ)X9)oTVZ*Y#Y-+k-V]F^r#H4f,Y,ne-@I!mq'j4dEr`f#! +$=-pr0JPC=1,0pqrZ_@cr#u1_*ZtA&!$Che#W".d.kWP41C<%@"GrnIUS7[^!K[T;!!rmtUS=NWTqerhBXjTqeBT*oR)( +V4jZXUS4GllMq#2IXZtJJG+L#IXa=//hSk2/KZ&5*WI2Y*Q8!Z9"k59"22=[?fqFV!!n.f\\5Ve]tIqC +!!^-K]t:ti^"EAjI_E;&]=GVcmJm@$]t:uW]tXOR9YJ*N]=kf\!1s2'"M).X];"3`#/.X^]=khi!!_]g +!#=r-cZEaY?Z*L^B.FS8#2n-0"Za0S:!*\gk#WK&qZEpjBZo-S< +!Z*L^7$i9qf!!g!>ZEpjAZ?>F4!Loh_ +UB%%[UCNuF5WqP"5sR(Q.k3&!.JtXr+X$b-![9*Mo.gJ*1c-sC,5qT(!!t-UXK8S-XKJTGdf9\)W3!)' +XKJV)8FHNa/$,nTY-4q.0)GY,!!-'"riQ@)Y,kUl!!=dQYHIl+!NR`j!;c`rNW$!bXK5q42lNgZriQ@) +Xd07P!!fI*XKJY-XC:Ao"B\o5>[784!*o5%%U;U^1+k=81F+.f+X80Rr?;7d+8m5^*@EN50F'Bf/LrM/ +1F(lZ!%\&D"ehWbTq`aZ!"(9RUSFNXTqeAT!:Tso/>Jo6TqS6V/(st( +ZZa^r#_KFiZEpgB[&rcs#WK&qZEpjBZo-V=$31&D['HsCZ*CU%n,NPMZa-q:Z2q?l^]4G0Za'M8%CC9Y +!-Y]SZE^[?ZEoqr!9X=e\$NBHZE^]Xli7.h!,&%%r1a7dp7i(kS3fJ-5^SVX02E&$t0,9@BHW4Y-+k-X+TC3#H4f,Y,ne-@Hmgp3*]Zlr`oG,!*o;'$=-gh1bUU<0e=Im +r?;.as!%@^!Zs$Ioe6V,0J+k00f'-q!!nLWUS=HWU8)5G!!$j7UBI9aTV7eB!!k-NTqe1[b;F]=kiT^#T1K!#%u:]=kni^BX`=#J%O]\\#Pg\MN4F#JIa_]=khi#3c*h()Ibc(]YZ*SZR!"#+!Za-mAZEpr^irB:mZa-pCZ*F@Pl2Ul/USRFT%AKVk +C-Y!O5!V=c.P*%F.f:Fi..Ato1GUa0iW'*$X0&M*"0AZ,T[3ZF$Dsl,XKSb-X"*T=#V3!ZXKJb.X=i6- +#ljskXKAS*Y,n;c!!=dQYHIl+!NR`d!!eLbXfeb.X()&.$&#C\XK8S+X/f\,!9aCfW335)XKJX5l2V&$ +>$YB;>?kG,>7XtD>sU;&0ekI?,U"?S+sHk."Wea,+!)[$0EVb +]n+K0#bJZ=]=kbg^B!^&#/.X^]=khifDl.d^:Cqj\\3O^!!9dG]D]G)!8@JT9"hn9])W*8!!tQo\\#Pc +]=GT[irB=t]=khi]=eF5!!O/U(`!l(!#YAE!>l^C!<+GN.k*PE54:]9$fV-dMuL$cZ*UaB>35hM!!.5K +rNZL2[$^=_#WK&qZEpjBZo-M:!fjUlriu[3YlFb)o)JkPZa-q:Z2q?l^]4J1Z`p_6ZN,.I!"'(0Za$jB +ZE^aB8)sXR\$NBHZEXG9Fm8r-!K[,Q!2B4_$`0PkN^,oq5sIRm.K1jp.Kq"?+X%s^m4nYIiW'(-X0/Q- +XKJY*8C%8;A?2p5X9,N*L@>0K/$,nTY-4q.0&-I+!!dbLY-4q.Y,q*m""^LVY5YL'X"1sc!fa@briQ:& +@K$66#F_]pY-4q.X/e5Z!9X=eW335)XKJX5kl:f^>[1M4>kVA3?!LN/1G:OA1,:@&,9\6-+pT,/*ZlFS +0Jde)US4BV +US4FO!!=gJTqVF[!%c.jq>^STTqhU\!Ma-'!"&soU8"?TUS=NY3TL/FV4jZXUS4Glkl:g*IY!%KJH12n +J-CCTE\oL(r\+I(*ZcCFr>knY`rH>e]=YVa]=ki%!!`b@]t:ni\\.u#mf3R*]=khi]=lhs#9^Xj]tM%i +\aKM"]=kiT^#f=K!!5d)]`#GB#5nN-A\#@`]t:he]Aikr]t:ti]t:r^kl:hl()Rf(!Z2ahpD*iJ()@5G +!!Fc$.k3+<564#-i;`n^Z2V$1Z*ga_!!!'!!!s(;['?pCZa-tWnGihRZEpjCZEghpf`2.g['?pCriuMN +nGiYNZa-q:Z2q?ljT+'9#GJK/ZEggCFo;:@-a3NU"gYG@Z`bh>!!g!>ZEpjAZ?>C3!)EEdp7i(mUS=J[ +5`!2oar!NVdP!:'Uk$)FZ*XKJ_-WtY"'#V3!ZXKJb.X=i0+#ZRn. +XKA\-X<$g2">$UWY,h`,XK*ke!!eLaY,n_,X(D50"khM+>$YB;1B''31,C[2r?;(_"s+g-*Zm$gpb2\(r\4=-!\c8Ui;`nNUAgnhU8+1&!!rt)US4HVTqe@s +nGihGUS4HVTqeA5gAhQ\!*,efUS+]t(hg]=kiF +!!^-K]t:ti^%q`d!!`P<]=k_f]=[M3!kZ.XrOp/MqZ$jn]=Ybi\[_tC!!o70]=GVe]t:$"!!g3L]t:ti +]a![#!#PSLrYYDG!u2Uf(\%J*!<"AI3:9!35SN,W#Zn@>Z*Ua@\7s1f#BmS^Za6sBZiFk2!!kNhZa-pC +ZEuLB!!kNiZ*CXAZEcFZ!!>3eZEsP9!OXlK!8@JYTsCo-ZE^]Vqu@'m['R-EZEggDV$uJd#Ih%FZa-jA +Fm/l+')\L)U@t>lV5'fZI6Bt_5R`Y,ne-XoYV4kl:nl>[(H<>?h)3pfe)1>?XZX0f(RA1FiAIq]Z"\rZ2(i0D@.#1]B*-1BK6`$fV-h +8#)cPUB@9bV,kh@!b8(%rLj7e=7H7r/>Jo6TqS6V/)1.(!!"SLT`h-aTqa1/!!=gJTqVF[!%bnc#E,@P +Tqe6kkU8+EWSjbq2r]^EI/,:[o+TiiA +1Gee]r\OO/!])V^i;a.?_/6?!@&.r`fk9 +="c6a1GUa<+X&$Qr#u=d*ZZ:T0e`;U#V@V]/hAP*0e;2_#_8\FTqeBWUBfi[l2V)'US=HWUS=HCnGihG +US4HVTqeA5f`2:.US4HVUSFY9nGiSAU&LhdUAug[!!A.SUS7[^!-nA@!+Z#'"eh]bTqd5%!!]9nUS4HV +UB"ce!!ct_JUW-%KRWZG%Y9(ZHSR6/0/,%3+!)FDr#NiY"Z*j(]=bfX\\6/d#J[g[]tLti@dj@%]t:ti +]t:u3!<)s&_7@1g]=kiF!!^'I]t:ti]tXOP9"hpM]t:m#qZ%!/]t:kj]=GPc1]RO>!!g3L]t:ti]a![# +#QbhY(D[f((Dli^!uMdh'(Gu$.g%Rk5="p,#!P7:5!M7PqZ,dZ#HkD=Za$jCQcf@7WO&n:Z*CO=$1\'% +2mTcqZa-mD2>[C2!!5*aZMq03['qs`!!G9fZEgh9Z2cc%!;ca$TsCu1ZE^a0q>^hhZE^^?Z*LaDFlr`0 +\$NBHZE^]XkPt`JU84NYrhB+]%&'GlC-Y'L5X.Ld.kLTJ!%Rsk"=Q#\1Ge_["Z%qi1GTa)!!f@&XK/M+ +Y(b%!#+)HnXfS\-!NZLr!!k*VY,ne0XK4&-!!4[PXT#@(XJd`@!!FjUXK8K%X8jm8!8@JYNNB4aXKJ^c +q>^\NXKJb0Y5YL&@HRUqW335)XKJX5kPt`'>[1Q?!a/c6qcj&)r`]_7>sU8$1GgjD,pW71rZ;7h/hf"5 +q(Ve#"YD;W0/FF'!!AdcUS@a]!.a,1kPtmPTqe`]C5e)]t:ti]t:u4!;ulu\\8!Ss1Rk$#.qL\]=khi +^AnL2]tM%k]=U]3!!tEm]=kbe]=kr`k5Yb#]=khi]=eF3!!X8W(E!u*(],!I(^(Ti'c7hY!!Oi&.6Tj[ +p-/UB5^boZEggBZa6D&!"'(1ZEga@Z*CXB7d'gW\$NBHZE^]XkPthoRA-FNUnOLUU]-tp +P!;5u5=.Rn.OltJ.fV!t+TaAR1\WX-1GUaB2?#B3!TF(Z/,l^MX8kc6!!63&Y5YL(XKFSS!!k*VY,ne0 +XK4&-!!"PJX95W-W%@H=#V<-[XK/G(XtJl;g&MA;XK8S+Y,dQY!"&t!XK8S+Y,eV)2s:5HW335)XKJX5 +kPt\cZk69pKJ,2?!:N71,1U@0JY.&+X?n/"Wea+/M8dP0F0f^Z +#\'p;XK/M*Wt?tE:>khM5>$bB<>+s/!, ++pB/2*[!*jp+Q_-0JG"//i+L+!!-W'rhBRhUSAIF!!*b.rh0@fT`Lm)nc/qHUS4HVTqeA5f`2:=US4BV +TqeG8nGiSAU&1Sb/*6id!!A.SUS7[^!/pXQ$59&+USFNVU8+>&kl:sbTqe=r\4R00JORj*rI&#!!3D8^&5M&!9X=e]t(\c]t:ffnGid,]=khi]=ler#.qRZ]t(bcmf3F$ +]=e1$L.Tr\$NBHZE^]Xk5Y]+UnOQWUS7FW +%\f_nTqd0*6:!n%5W(#Ar$hpp+Y#<)1bpl^1'TNi1GgmC#5\D`!!%ZNX95N,XImT7#GA0%X/i>'OR`AW +/$,nTY-4q.0)P_+!!6W3Y5PF&W!Dhm#V<-[XK/G(Xt@Zoq>^b[XK8S+YHEo\!!OsTX0/P,ri?-d#O29o +W335)XKJX5kPtVa$3"-2?!1B:r*0/*%pE:D>Zk<,0J>(91,L:$+oWYl+sJ*N-nmA10JWAW#;\1j/LrJ1 +#2oO^K)MGGTqdsr!!J[aTqe@aU8*V:!!k-NTqe">DMW*?Y2" +aT);urOW-E]mRp%#(aD"]=YVf!))h^#/.X^]=khifDksX\\%gR!5%\"#.qL\]=khgj8ds8#>2\C]=kni +:%nYc]*#UW^16C-#JIa_]=khi#3Gmf(_mi'!Z)Xir"f8K"r8$k(_mkjo)JqE.R$'_5k[GA5QX/80&Q^7 +Y-Y@;['?opiW/0B#EH*qZa7$D[.42&2mTcqZa-mD2;%s7R'O'*ZE^^En,NSNZa-mC"1#5=2S]:tTsCu1 +ZE^d0pAb;1['I%;Yl_5I'X9#DTl2V'fY,ne-Y,l'o!!Q#">[1B6pKJ)5>?bB;?8=2h +1GCX8+oJo6TqS6V/,K>( +!!e(MTV8-TUS[G[!A1#CUB.&=`W5l9#E,@PTqeR#K7SN* +K_U'-Jq&?%JU`/31,CR:0Ie1B*<7,%!!dtb]Xbef]cbDs"X(Fj\\#NU\\7M5#/.X^]=khifDl.4]stbf +\\5]F!!^'I]t:ti]B'%I!!c-0]t:tg]h%kt!s60L\c',@^GY9V#JIa_]=khi#3Gme"W&$K('YTm(D[l' +)"R_..PUids$63eZEaJ:riuM]^]4V5ZEggBZF$A"!""[nZa$g?Z*^oPlMq*tZa-pCYlV.Qjo>ECUAgnfU%kAn +UnFNYUS4K.5sIOu5sd(Pr$hmo-8IA41Gee]"uA%l0f1ZshuEqZXK8S+XoYV7aT)TIXKJY*XKAQ:o)K%H +XKJY-YH4fXg]7?G))>7XtE>$Y?;>=L8%0f1O=+X-b-"s,!C0/,+8pb2n*1b^L60bF0]k5Ya`US=HV +Tqc&j,]t=9W!)3(d#p?ji +]=kef]t4=2!!g3L]t:ti]a!Qu!#>\S(`=)+q%a2P()Ii(()R)E!!Xl45ZEpjAZ?>:0!sY6iU]R9cU@t>iUnOQYRmKD+5=.Ulq^Mdn/Mf4>1Gne\ +"#D_i/`6U7*ickNNB4aXK8Rap&G*tQN!rhY-"b+W%.-6#,n]+Y,ne-!+G!i"U%Y+>$G/(>7OqC>?kE;>;\5o1+tF4 ++oEMg*@ics0eY9U0Ea0g1b^Q?!!aU@US4HXTq_T],: +UAgnfD=@N+/YW':!%Yhb#E,@PTqeBVMtR,O#*St\!MQ.gUSFY9li79eTqe*T@(_!!^!I\\#Pc]uL*W]tLtk\\5WF!!^-K]t:ti^%q`d!!g-L]t(hg]+XQ4 +#.qL\]=khi`;oc8#>2\C]=khg9(`/iA%fRf]=>Jd^?Yb(]t:ti]t:r^jT#;k(B#'E('YWl(`!r('D2>, +!%^>+5Q3nM5!D4ShuF$AZa$dAZE^Y^aT)J^ZE^dCZ3%>@C@_E22mTcqZa-mD2;/$9NO#mrZa$jC7dpB[ +2m]frriuR22Wb"o!!f4'ZEpjBZ_I*m"<"MPZa'M8!jo9Pm/RBuZa-pCZ*JN6!!-Q(!i)Ndn=p5,5=%\& +5<(1k.K^kM1Gf"c">_eh1,Jnb"uA%l1,1R&huF$5X0/V+XKJWGirJ6B#SO5AY,eY*W)iKi#V3!ZXKJb. +X=i3,#^gdY,n_-NV*8S&u2P/Y5PF&U_E+q"g"l.Y,nc,XC:2j +"?K^i>?^](!*oJ,#t?[)0JbI>+X&'/+Tii>0/*;Y">;G^0JEDZ"u.qg/h]%"huEs4US+Jo6TqS6V/)1+.!!%2;TqhU\!M_XD!!=dGUS7[^!MM$Z!!eFWUS4HXTo8RD";@H' +U7qO\!ML4p!!f9mUS4HVULN2\C]=kni9_8;jT"VVD^:h.lV!J'd +]t:ti]t:r^j8]9!(`!q\('#3M('"C0!!iQ)1dF;j5!VC/5Q="J564"QhuEm\ZEpjCrj'QE"15A=ZidY@ +[0dZEsP9"LMf"2`Bq[oJZe/-g:U9TsCu1ZEgg2oDf4X +[C!6EYd(LAW!i"n#IUnDZa-jAFl`T'%KE6lUBm2O69me"5V=Sc.Kh1W1G^cb1BTBg1,JnbrA+L11BZP8 +"@]DpXKMQ(`rQ(>s/c=&@IjI)/$,nTY-4q.0&$@4&u_n4XK8V,XpFLs""UOUY5YL*Y#d)'.d/DV.fh+@ +kl:sJXK8S+XKIQT!"(9WXK8S,Y,n[i#jqZtX0/P,XKJX5jT#>h=]kf1>[6o*r`fb50JYF@1,L.!+oWYn +-87/-0/5170J>+5r\+O20.eb01]uY9"@f/[US7[^i;i$@#G\&gUS4BVA+K[+/>Jo6TqS6V/)(%)';bZ& +"/2K`#k.fs/>8i4UB[KgTiETo/);`W.j+!U#E,@PTqeBVMt?uL/cMLLTqer"Y_P_+s%g)*Q\9]^&GVF]t:tu!!g3N\\5Pa]a+*.#/.X^]=khig&MBY^:V"j +]t:timJmL(]t:tk]=e9]!!c-0]t:tk]1her"1c+W]*,dW]t7eA!!g-J]t:ti]a!Nt";hsk(`;l\rYPVH +o`,%R5X><5!'p?Es$6QJ!&4-Ikl:s2ZEpgBZE^aV!!';&Z3%A>FRoJ<2mTcqZa-mD2>[C4!!nUkZa-pD +ZEp"g!!>0dZEsM8rj)^6Za6srZN@VFU@/*Z!!f4'ZEpjBZ_I$k$!4O@ZE^^@Za>e]!!fp4. +"FHo>U8%.P#A6=e69daq/,h"!.PLcW#;S(l1GUaA1]B-51GgmC1F:oY#@X^9Y-"n1Y/^MBVZ!RtXfPq% +!!k*VY,ne0XK4&/!!mhMY,nb-XK.$C!!=aSXKMQ(!3cC&"0AQ+XR*+`XobQ#NTgEJNNB4aXK8Rao)Jh] +X0)?%!j/PLmJmKmY,ne-Y,l'm!!#Fe=oVb#>7OnB>?kE:7PlkS1G::&+oWYn.PWY20J>+50J>+5r\+L1 +/hJ\/-Jne(@\`goiW/*@!1s.a!hlAto)K%IUS4HVTqeA5gAhM'US4HVTqe?7mf3G@Tqe=\UB%"dUB70` +UZ%mJV59+7!!eFWUS4HXTo8LB#tLbaUS=NYTqcl#!!T-kUS4HV!Ma,b!!6YaJb4HoJUi:MJI#%+0JY:9 +.N]`2*Qe?_#.slF!PQ)F]>jmVT"DVJ]t(f\nc/m-]=khi]=lr!#ll*[]=kbc^:?/i!!^'K]=kni^&GVG +]t(bghn&k^kl:r\]tM%k]t6u/!!0dD#/7X[]t(g"mJmL(]=khi]=eF0!!<9=()QWZ"W/!j(`4%]!!#4] +5kdJH5X@Y"58O"okPtj3ZEggCZ*L^V!!f1'ZE^^?Z]F\X#WK&qZEpjBZo.a]i;a0B['R*GZEggD3:?hL +2m]frqm$:.ZF&Jo!O\Zk!;Z[#TsCu1ZEgg2nc/uWZa-mAZEpmEC@;--[Bm0FZE^]XjT#Gd/u,/9U@=o^ +P!VK!76a!8.LdjW0f(UB1GUaA1,C[Ar\=X51c-sD&DmHh@]Zd4XoY`.`rH4'X/rB)XKJ^Oo)K%HXKJY- +YH4fXg].F+XKJW'X9,Q+/FNQ@/$>tVqlBk%XKLljoW/(nNTgEJNNB4aXK8Ranc/uAXfS_-XKAP)?P08pKRZ&rEBM1>qdrf0/G?\+q$%Y0eb=90/,(50JEDZ!&=I*!A>&B!!-W*qk;%1 +"cB(MU8+C_Tm6//#V;aEUS4BVUFY+"!\:%>rM'FfUFkp7""^.@U&1SdTqe=GU\1A^Ms13HMkd&@USFN@ +nc/u@USFNWUS+BW=76+oUS4HVUS4GljT#>_+bfuMomm'nrI>-(EA0.#1bUN[*Qe?e#J7[]]=GVci;i$@ +#>DbC\\5Ve+n>U;]t:ti]t:u3!!g9N]=khj]=mS3"1u7Y]`>bF]*,gX]tM&9]`PgV9^)N^9"hpM]tM$O +nc/t>^q7:j]=>Jf!q-*n]=Ybg]t:rX#3,[`)>"^E)#P-L&,#u(5X565pHJdG5de%ZEpgAZE^^U +!!f.&Za@'EZ_I$k#WK&qZEpjBZo-Y>!=Pq0Za$n:Z2q>8mJm>JZa-q:Z3@S?Za-mChm*1-!fs"Kn"U,^>sCP?5X-n".fD..1c$pC1,C[Ar\=U4 +1GUdBp&O=W#@FR7Y,nh.XN(;GOKG[eXfS[bo)K%HXKJY-YH4fXqZ,XV!XPL#rN$(&XI\bZ""UOUY5YL- +X/rG)XKAS-iN**`X,ZQJqZ$k\XK8S+XKIQQ!!&GcX9>]-XK*i?!!fR+XKJY-XC:,h!Dm%h>7+Ur1,CR> +1*n(f+q,YM0/5180/#"50/,'Y0Ea*^/1rX5!!co,TqS6TU8,a/"H&kGUS.aaTo8LB#V;aEUS4BVUFY.# +!skJZa-q9Z3@S@Z*L[?hm*9hT]lF]TsCu1ZEgg2nGiOq$*U\@Z*:O>Z`b8:!!fj9ZEpjAZ?>1- +"%/iXU@FuhU8*]35sIS!2C^1,.l&n9r%eF11GUcc1'BBi1GTpD!9aC_@f*5,XiCDHO0,IaXKSddo)K%H +XKJY-YH4fXquGaW$4*'$Y,n_,Y,nQjmJm>>Y,nf)X9,N+Y2$)ZXcW#Pq>^b[XK8S+XKIQQ!"&q.X/rD) +XK8J#'(Gr,X/rD*XKJX5irB0*6\>;>?Xo[2#]94/0Q2H+X&Nm0J>.80/#"40JEDZ">MM\0HApL +!+bu%!27F5",WeIUB@6aTo8LB#V;aEUS4BVUFY1$$4)chTqeBUTqeGRmJm>?Tqe=[U]-qgUSFRMU\(;^ +To/(7#E,@PTqeBVMt$cM#+qZcUA^hfT+g_prhBUiUS4Glj8]8^1PL>LJ.@-]It;Gh0eY17-QX9M+3FQa +#J9uK!kZ.V`rH98^q%(f]`G`=nc/m-]=khi]=lu"#\1Q[]tLqf]tNb4#.qR\]tM%irj`*B]=I4?p:UL; +9^)N^9"hpM]tM$On,NTc]=YVdrjr0)n,N^*]tM%k]=eF.!!*fOneM?F(_melpAb7Z5=#03!'^6D"@,1: +582lR"*LoTYl1ld!9X=eT*rVup!m/RBbZEggBZEp:p!!4OSZi765Z*L^7$h=9%Za-mCZE^\8FlNH("e26\n"U,^>!GD?5#Ec0jX/rJ)NUm,U/$,nTY-4q.0&HX2#aMKm!NrL& +X9#A^m/R5=Y,nf*X9#K+frP17kl:sJXK8S+XKIQP!!")?X8]1'Y,nak#k@s#X/rD*XKJX5irB/`;dEZ& +>6%q->Q.k5>$O0F0f1X?+oWYn0J>.70/#"30J>+5r\+I00/#!hp&O=W"(J%#T`(Y+!!eFUUS=NWUPn^D +#V;aEUS4BVUFZ3AjT#DhP,"eGr1a7Nm/R5>Tqe=\U]7%@UB$/>!;ca$Mkd&@USFN@n,NJ2UA^hiTqeV_g1,Jnbr\FO. +h#IXfXfS_,Y-%c+`rH1&XKDH&!."/9#V3!ZXKJb.X=iE2""Tn?XTPZ+X02H'!$1G,""UOUY5YL,Xfeb. +Y,e\^X9#A]kl:sJXK8S+XKIQP!!E9oX0/T'XoYVLnc/oqXK8S+Y,l'k!!"\>>8C@D0eG.91Emtd+u(f* +0J>.60JG.60E*[(1%kV2!!d#-US4HVTqfX.!fEbHrM'@;o)K%IUS4HVTqeA5quGgY""]n;U&LeiTqe?W +*piq0/>8i4rhB[kTqe!/p=Hq>^bYUSFNXUS3V7!!,Zdqk4%cGk(k6UBI9cTqc)V!!,Q@n:1js +Jq7_n1,(C8+p.\\/*W]tGT[!!^-K]t:ti^"r_qI_E;(]=khi\\[S3#.qR\ +]tM%gr4;s>m(N&)!P;%i!!c-0]t:tk]1hVm#eR^Z]t:ne]clqH#J7[_]=khi#35d`!!!i)('>?i((0g: +#!bC<5X.IupcegF5:#%b#^3JYZa6sBZO4bR"h(bE['?t=Z#oR;!&sn_"L58>Zo?tE!ud*(Zi766Za@!D +Zteq-"$!WmZi.05UnFBTTV(MCpRqY]TS)J/#GJH/Za-mCU@&!]N;g*dYd1O?ZY/k0riu[5ZE^]XiW';u +Sti$TUnOQZU8%FX#c+2g>=:_A5;`?h"uA"j1GUaBpbDn,1)o$L#[sm;Y,eY,Ws@Vak5YafXfeb,Y-)=, +!!FgRXKSf+X8jd1!!X*bY-"e,YPkU)XB+Zf">$UWY,qW("dtI2Nf9%WN<50"D>$>-7>$PD0>8(1E>[09C1b^[6+sA-b0JP:90/<5U!\lJN +h#I[iTqe]o)K#gUSFNXTqc)V!"'-cJ:N3&K7JQ&IJJC%JV&E% +7PZYP0I@e]*T@(`!!`b@]t:hh\\#l^#J[d^]t(hg#P%lo]`>VB^%q`l!"0p]\\#Je]=kbe]`RL"!kZ.X +rk/NJ@8'3d85%i4!D!jl!;ca$9"hpM]tM$OmJmP:]t:th]t(bc!V69rT"VhL]t:r^i;`iprY>YR(D[f& +(\eaI(`!n_!!<3d5=#34!'pgdY,n_-NU6]PRB3Km +YHP+1X=EiB"c]UbY,nc,XC:&f#rc!k?!CN<>?bD/>8(7H?!1)Z0/>:9+X&$a0JP460JW>V!\ZA7h#IX> +Tqe?WTqML^/B@hhUB7-_@IjI!/H2FDT`Lo?jT#Pk7Y.D2Tqe2\C]=khi#2fIe'c%T$()I`%(\ngL(Ddr(#l=W%!:`8S5r@?s#WT2sZEpjAZq&4< +"<"SPZaB_;!,;$)%6(T"ZEpjDZ]0-NF`qp,G4g"WFq&YriuR4O6Q]I34#osriuR7 +2s11p!!f4'ZEpjBZ_Hge$4Q"pU8+EYUS@RZ%&'AhUnV'[ +5!V@a.OkKU1,Jnb!&OC*!Al4[!!FjSXKS](X8k6%!!tWri?.!/*-cd!!eLbXKJY+Y)VfK$4!B-X/rD*XKJ<1o`,5VXK8S+Y,l'k +!!E9,>?Y>3>QS27>kqS7>[:Q;>WOVq1c$=!+YPN&r\+=*pb2_'.GOn//Yf)7U8+HX3T:&&!!580nNR%<+S5Zu!!jLMZa$jC +ZEeVp!!kKiZEggAZEcC[!!kNhZE^dC['I(;Z2q;;!OK*-Zi@?2Zi762Za'M9%'m4GZ*LX>ZEpjBZ]F>N +"$!WmZi762[5Z)*qZ$kpZEggBZEp:l!!4LQZi790ZN7!3p&G>kZEggBZ*JN1!!@SDUS@:R#bn)R5=%P! +1F`AUnM1,");G2t'Z3C21GU=#+n75e0,iUG#Sa&-U7n6RULN6`k5YK4rhBUiTqeA5o)JhCUSIg^qP+.d +US4IYU&UnfU&Lf!Tq\9TTqe9STqe?VUS4HXU3Po&""g:AU&C_d/AM5jMkd&@USFN@li7A6TVJ9UUS4BV +OpC[\"cK(LTqe:^ULN-]#%E.8It3'#o7.*tDD3e"1FXIkaT)LX\[f>^]`GeNa8l7Rrk&3DnGij/]t:ti +]t:tkrjr9C]=YcP]DoSB]DT2F]=>J`]t(\f\HBIU\K^5;!kZ.XrOorG#>2\C]=kni9^i&[!!Jn*^:h5Z +])Z@6!!c-0]t:ti]a!Bp"p,VX(`!l(o+h?D#l4Pj56),b!9X=eZa-jCZa-j1aT)Th['?sDZEpqVo)K4Y +ZEgjCZa6sDZE^[=YlM'$YlD$.Ym[kDZEpjCZE^aAZEaD9!-IE)"$!WmZi762Zo?#*q>^boZEggBZEp:k +!!ufkZ*L^AZ*JN1!!jsFUS=KYTqe@XUC*flUS=NZ>!P;:3WUZanM1,$$/5F[X8]1& +Y,ndcaT)HPY,nb+"0AQ('(Z)5/$,hTXKAY,Y-5"2Xfei!XoGU(XpD,3XKJY-XKJ`'X8lbo!!=dQYHIi* +!%[44g&MA;XK8S+XKIQK!!u/oXfSV,Y,n[Jp&G>WY,ne-Y,l'n!!!&u!!a$A=Bo*7>[7&.$sHk>>[(Dp +0JbI:+=H\5!A=c6!!f9oU8+EWTo7"m#%F:#US=NX!M^>"!!b'MUS4HVTqhR[!i)H_oV;>X$_sDjTqeW#TUS4BVUNZ>2#E,:NTqe]=khi +!!_<\#9"MZEpgAZa'S7aT)=,rNcR0ZE`s#"ZN]mZa-t:Z2q;; +rj2=(qm67,!3uL."gbM?['Zt939L8D34#osriuR62o#CuTsCu1ZEgg2mf<7c%"bjmZEpjBZa=BG!!2or +#GJH/Za-jAFl*0'H)7:2UnaXXUB[HgUSOWD62j+M.Q6fP!&*pDkPtjLXKJY+Y,nVE!!7nUY5YO(XJYOg +!%\&O!N`I&X9#K*riPmqql]^q!3Q4$!M(e)!!=dQYHIl+!N7Ng!;ca$NNB4aXK8Ral2V-,XKJY-XK8J( +<;-@tNNB4aXKJX5hZ*mP=^507?Q.k1?!1B00E*a-+oj1a0E<]Y!!eCVTq\KVfIt)ouq1&m)J:W9(Ir-ns0eXOoaT)Q>]=YVe]=jfr!9X=e +1V(-.\\,PInGrR##JIg_]t:ti]DfA@]D9/:]+2Nd]=kbg]=Ybd^:h:pJE6b4]=kiU]`>[Z!!c-0]t:tk +]1hJi#naqa]t:ti]=e7>!!Q!.]t:ti!PJ]p!!`QC)&K7X08]* +X9#7M`rPr9#E>gdY,n_-NTgELOK>ReXKJY+X"=#G#E>gdY,ne-@G_%g&mALE>$Uf+!*oJ,"^P=t1,C`e +-L`\h)VP/mD5*a&UB.&2aoDR:Tqe?U!hc]t:he[CZE2nGiU']D]G@])]D?]CEQ9]=GKM]*,g\]:]Di!!9dG]D]G( +!8IPZ9"hpM]tM$Okl:cW]=IgNpAbFl]=khi]=eF.!;um$()If('c?W[";hjj)&N/MnNR!ag&M1UZEaD7 +!jT%EirJ2o#CuTsCu1ZEgg2kl:blX0MW/"15GA)Yj@;TsM&2ZE^\8Fl!*&IA*F/USFOYUCX&pUS=HYU7+;3 +4uPP[1,Jnb!&OC*!"@Q]!_0Arri?+&!N]8D!!jXHY-"e+YH;:)!!FgTXK8T'X8oF%X8oEtX9Yo2XK8S- +XKMB#"fn:r#64bd!!=dQYHIi*!%Yhb#E>gdY,n_-NUHlE!!*J%qQ'^m'DVV5NNT@cXKJX5h>dOBr`K8, +=SQ)2>Zt?:?!:K41,La:1G:F8r\+=*pb2[So)RtS!_8rXrhBOgUK,J;#Toh8Tqe?UTOdTn">$7AUS7X] +!29@d!29.^#GIidUS4BVU&LeeUAUbfQrXIQ!!=gJTqVF[!%c+iqZ$kZUSFNXUS3V1!!3FlUAL\dTG72% +#E,:NTqec!OrC)!!KpI +]=YcT])]PB]D0)>]DoSD]*,[V]=kcS]`YmYJHFg2!kZ.XrOq:mgAhIN]tM%k]t6u%!!n(b]=kni]tL*6 +!!c-.]t:ti]a!Ksqu?p&()I]'()Q`]!Z)UfrYGPEquH=Q!C/j%!!jCJZEga?ZEgFi!9aC_KDi(XZa7"u +nc/\LZM_$0ZF/r&#dLbE[(!?7G:)8K"$!WmZi762[5Yl$#GJH/Za-mCU?DRa-F'n_ZEpmBZ)7s*!!T(& +ZEpjA!O?k)!!YHUUnaWYT^ec[CILKR6hrJB1GU^A1,C^@f`20iXKAS,Xob]+QHK7/D6Nr?"0JW*/FicB +/$,fMXoYW)kH"lgXJhnR@NGCIjT#B6X08]*X9#@P^]4V!XK8S+XKIQP!;QTt*N,s>XT#@(XI0=i!!eLa +XKJY-XC9rc"<1WK?!R&,!aJr7r`]Lj/i5+7q(N%,0Jb:5/MAmN!9X=f&u2+pTqJ0UP03h+D5$s("/2Kb +/b/lC/>K!=U&(PPUB%%fUBIEdMe!mf!!=gJTqVF[!%c.jq>^bYUSFNXUS3V0!!F@8U8+L_T`UsO#PnE* +Mkd&@US4Glh>da1Jq8E#J:mTH!eGlQrdY&M1+iSX0$""t]sbPb\%TIbb5_\Y]tV1n\H0=Un,NI%qn)(* +#J%O[]t9k.#N#L_]=kiT^#f=K!!c-0]t:tk]1hAf!N!@*])oORAbc<29"VdK]t:r^j8f#V"W.sj()@_\ +('53e +ZEsP9!OXlJ!8IPZTsCu1ZEgg2k5YWd['I!DriuR2O88h]TsCu1ZE^]XiW/lV"cfCRUS=RSUBI&V5s[X/ +1']Tj1GUaB1*G6M#m$^"Y,n_-X/HTj!9jIgTWG8sY,nY(nGiS?Y5>:#HKei@A5t02'&tWX95Q* +X"1sc#E>gdY,n_-NTU9A7fKIhXo>C&X*OOA#*#^cY,ne-!+F[`"]&E.>?kA+>68&6>lIq1=>V`f1ANU/ +0eb75/M/RufDl)BUS4HXT`V!c'$L=YR%p@MU&LhW!!+XEqkF.7k[FWp/M%S1!9O7`/Yf#5rM'?D^]4Ut +USFNXUS3V7!;QTp8,f7`U&C_dGkqCFMkd&@US4Glh#IIrJc:0"J+nHpJUi=NJ-:?Y/hJO3!9X=^JGZqY +]upB\I_E;(]=kben,N^*]t:ni]=T3_#4D`s#6NQY!kZ.XrOp/MqZ$jn]tM%k]t6u#!!p9M]t(bg]t5Ha +!!c-.]t:ti]a!9m!=0SB('#*D('5!!n4bZa-mC['t2&!!c$#ZEggB +Za9^unGiYMZEpq;Z2q9i^]4HrZa-q:Z2q?ljoF-9#GJH/Za-mCU?2F^K!hnhZ*L^BZtT=:#GJH/Za-jA +FlNK!!!PBXUS=HXn=p)*5=.a41B''31c$s#fDl1oWiN5&X/r7.jT+NF#WSldXKAS+XG?tWri?.$/&2,iNNB4aXK8Rajo>^(WiWA+XKJV*=8Mt$NNB4aXKDT*@GLnd)d-EO>jtr#=\U\+ +1&3L.1GLO7.kNIgfDl%kUS=NY"/DWf@a+lQ3W>cVTqeJp;UB.&>g]6F9""g:AU&C_d/AM5j +Mkd&@USFN@n,W1_$#HB3TqS6TUSCid!!eFWUS4HVULN$Z"=o1WIX^d:"GKo10JVSfjo>Gq\[h^O!kl8O +bQ%m[]tLtg\\0li!!^'G]tM%k]DDTH!!9dG]D]F_!;Z[#9"hpM]tM$Ojo>Jp\\#EN])fSHqZ$jn]tM%k +]=eF(!!F)T(D[hW('59Q!<3&o56=)64oRYG"kWe].C?FfZEppEXoZfJ"/3',ZMq02ZWHYs#WK&pZa$gB +Z8TJu"$!WmZi762[5[7Kg&MAOZEggBZEp:e!"#='ZEggBZa-nqqu?trZEggBZ*JN5!;ca#!s"FYTVA1N +UBI<\:I&4\1'TNh1,C[@"5!SZ+0;NFXK/G'SBV$>NN9.^Y-"k-7e$Ha/$,hQXK8P*/\h>g/?>tWri?.$ +/*-cd!!eLbXKJY+Y)VNC!0$oY"fn`*XKF&N!!eLbXKJY-XC:)gqZ$ap>@1]An66!#2)%#c0F'Bg0.\\- +1BZ80"!FA6U&C_dRcFJ6!!%rVUBI9`Tqb-J!!k-NUS=KXTqa-R!!FmKTqS7\UAuj\!!eFWUS4HXTo8"4 +!K*WKUB.&=qu?qZUSFNXTq_Tsh>d`]!-kSmf3R* +]t(\e\\6\sjT#@o]t=6V^AnL2]tM%k]t6u,!;?I!8@cFG]=khi]DDR59YJ-O]t:r^g].<\rYY,?!>cIL +!;A\\5!;+p2Xpe0!!94-Z2V'2ZF!ZY!!sRNZa6sB['[.HnGiPJrj)L/!&aWR`W-*#Za-q:Z2q?l`W5l9 +#GJH/Za-mCU?)@^%AgD:ZEpmCZEkJJ!!f4'ZEpjAZ?=q&"=9e9U8%.P!hk02!/gP,"Z%nh1G^N3!!/an +riQ@(XK4k:!!j7>Y-"e,Y,nAu#Oqco/,lXKXoL)i!!=dQYHIl+!NRa5!8@JYNNB4aXK8RajT#VpRB*Ej +X0&J)UD*S+#E>gdY,ne-@H.@a!!Eg7?!Lb+>6A&'1fF-'"u@nb/1iG(ec5`"!!S:UUS4HV!Ma,Z +!!F6oIXZ_8J-:IUBf0kM!!%KI]DoMC^!-N^]t:hg\\5\Lmf3F&]>"6UgAp:7!kZ.XrOorG#>2\C]=kni +9^i&T!!m)H]=khe]=Xa6!!c-0]t:ti]a!3k!u;[g)"A@E(D[,R#kpOd5sIV"-1V&t!!m>HZa$g@Z*LIW +!!Jq#ZEph8ZN-$T!!kNhZa-pCZElIe!6"p?34#osriuR42obpp!!f4'ZEpjBZ_HL\$7;s_['R-FZaZk@ +rW!1sZEggBZ*JN,!!@VEUS@:R!huKa!Eu;n1'BEh1G^$%!!lW,Xfeb.Y,n;B!!eUfXK/G)X/c5Fn,N_E +XKAS,YH4lZ^]4HfX08]*X9#@Pk5a39#E>gdY,n_-NT:'H+K)BFXfeb.W0IYf!!eLbXKJY-XC:/ip](Cb +=^,/$>6J2:><,m_0Es^V-Kn+XAJ-1@P7=rP[#Qh]L +\\#Ja]7K&DlMq2`\\#Ja\@]9omf3R*\\5Vg]=YcW"1u7Y^&G^[!!c-0]t:tk]1h5b"JWNA\\8!S!+Gg+ +#"lSB]=khi!!_0X!Eh!#PGq!'pKI!C.4I!!EY6ZF$n?ZEgjDG0p9r3O?#sZa$mD[2SN7#WK&p +Za6sCZo6Y=jo>KCZa-q:Z2q?l^]4V5ZEggBZEp:o!;-DeVYdFqX'sBU#q`9\XKJY+X/cp'!!k*VXKJ_0XK4&O!6,!@/?>tWri?.$ +/&hSd!!eLbXKJY+Y)VHA#rnudXKJY+XfQdH!!eLbXKJY-XC9ob!W`92mTTd">?k&+=84KK0*3^[$e>:Y +#G:jf!+XCV"YQICUS4F]UAu"t!!4^HU]-qgUSBBU!!=gJTqVF[!%d74gAhJ:USFNXUS3V+!!#%YUBR?d +U7n?+rW!1]USFNXTqc)W!;QTq)h[U0"FkoRDM#k.#b\fC]=Ybi]*IL!l2V(!^:h.h]t:uG!<'M2]t:tl +!!9dG]D]FX!!c-0]t:tk]1h2a#eR^^]=thd^EELU"\cPA]=kfW]a!0j!#P)>";hjk#Sm,!"[G:;5<]2" +!!7>PZNdbCZEppE(t&BiX0]+3eZEsP9!OXl%!!f4'ZEpjBZ_Hph +o)KGF['R$CZa-pFB`J-bZEggBZ*JN+!!7PCU@=o[U8+EVq(hk(!AOZH!9=+[@K*;2Y,n\*UCkoS#beB% +Y,n_*X,ZQJ#V3!WXK8S+XY0MO`;fukX08]*X9#@P`rPr9#E>gdY,n_-NT'pOA#uf8XKJY*X&T-"Coj_@ +XKJX5g&M1B>?p]&!aK#6!FB%,0Es0b0/5%3!n@8WA##cnTqe?WTG#ZQ#aqB]TqeBWUPnR@!%e)D"/2K` +/&2,e/Yf#5rM'?Dk5a39#E,@PTqeBVMrF^M@&'BgUS4HWUK.?pCnmc!US4Glj8eoS!b?h1nULanIXlou +`W-8L^ULhg]=GVJd/XN+\\5Ve^:CjL!!)Kg#/.X^]t(bc^&S5H]t=6Vj8ds8#>2\C]=kni9]?$R#/.PG +]+)Ha]`J06&A>ch]t:r^iW/cS!!;U)";hpi(`3!4"[5195X7'R!!E\5Za@":Z2q;+k5alL$%oRhZEpmC +[(&$_!!kNhZa-pCZEuL)!!G9fZEph=ZEgks^]4V5ZEggBZEp:a!"kU*Za6pDZF%)"!-YcUZa-jA!-Quq +"!O;3U&LhdUA1JdU8+KXUA6PE1&Wm.-I`"t#c=c+!3Z=&!NV4/!"!VFXK8J)XK8?Mmf3VDXKJY-YH4fX +gAp@9""^LVY5YL'X"1sc#E>gdY,n_-NUHl=!!InTX/iE&X9tmV!+Dq0Y,ne-@G1\g&medG>?Y67>?kJ/ +>Q7t.>PTrV0/5+50duMkjT#DhStVpQrM'@Ndf9\kUS=NYTqeBZ/+3HD/>Jo6TqS6V/,K=d!!=gJTqVF[ +!%c+iqZ$kZUSFNXUS3V)!!%TLUB%"eUC*hK!+Ve!Tqe2\C]=kni9]5sP1;Wt%%DBBe +])Vg9]=khi]=eF/!;?I")&b\!!kNhZa-pCZEuL)!!>3eZEsP9!OXl%!!f4'ZEpjBZ_HCY&.>GC['?pBZaI(VF0r6ZZEXG9 +FkQg&!H"U+USFQVV5'aVU\QYK1c$pC1DnR@!F`#6XK8P*Xfe^*eGoY2XK2<$!irDImJmMCXKJY-YH4fX +g]6F9""^LVY5YL'X"1sc#E>gdY,n_-NUQr=!"oR'X/rJ*XK/Cs&n7rDY,ne-@G(Ve6<[Mr>?tE8>$^r. +"C,/8>[7%X">)8Z1`>f`irBBqU8+KWUS4BV=4I9W3hrFEU8+HWUNc,+#V;aEUS4BVUFZ6B`;fulUS4C[ +UAujc!;Z[#Mkd&@USFN@i;`udP,"eGrM'[l'4IZ2TqenGihRZEpjCZEghp^]4HrZa-q:Z2q?ljT+'9#GJH/Za-mCU>Q"T.^-1aZ*F;7#c*!UZEpjAZ?>., +p](C.US4L^U&h'aoV;4;r\FU41CMY3$4@riQC)XK/00mJmMCXKJY-YH4fX +^]4KgX08\-"0AT)/&2,iNNB4aXK8RahuEj%VlR$#XpM52QuB./Y,ne-!+FO\#mX[=>$P<9>?P5'>PTrV +/MA\01^hb4!Xb]=kiT]u:!K!!c-0]t:tk]1h)^&>6YK]=GPa]3c/^]t:ti]a!*h#8e6n()If( +)"\RD(AU/u5s@P!4p'.4$:_A-Za-mAZa?nbf`2@+Za@$DZ*CU?ZY9=Gq^8$fM-ZE^[AZECO>Za-jAFlNJq!!d&/U8+HWTqV(Qq(`+21c.!C!R^rM +4KGQcri?4&XJR**!:Kmg*M`V8!3Z=&!NoDh!!k*VY,ne0XK4%i!!=dQYHIl+!NR`d!!eLbXKJY+Y)V<= +"?ilgXfq`,#-=c+XKJY-!N]_^!!k>_>[(B9>[(A'>PTrV/LrG,1',f'!'(@\US4HXU8+KT+P?_q*h`M- +"ehZcUS1]T!!k-NTqeHTa7E`Tqe'rh!!&\k]`l$Y]tV)Zli77']=khi]=n(A_uKkN]t=6V`W5i8 +#>2\C]=kni9\oa[\\5Pe\[fDcS@cJH]t:r^f)Yab!uDdj(\SXE(AU/t5!M.q1XH+(NO-!sriuX4[';"5 +!"(*YZa@$DZa-pDUAb/]!!kNhZa-pCZEuL)!!>3eZEsP9!OXlL!87DXTsCu1ZEgg2h>e(0Z*^d@ZE^dC +ZEggBZ*JN5!;-hnh1agWM!ICpHX95N+VB4Il!Zn5>ri?7*XKAO_quH6e#V3!Z +XKJb.X=h9g""^LVY5YL'X"393g].S=XK8S+XKIQ>!!$R/X8oF&X9Yo0XKJY-XC:)gp&G=t?Wp]>=C#,+ +>6J28>?kG/0E`mX.krL"!!@D(ni +]=k\gT%O)FTY%o:]*#dX\P2;h#/.X^]=khig&U47!kZ.XrOorG#>2\C]=kni9^_uN!"T=F]t(be\\5Ve +]t:ti]a!'g#7qdg()Rf()#4pM(`!l()#$5r5X-R`!9*td%&pS?ZEpgAZ*^itW +ri?.$/*6id!!eLbXKJY+Y)V6;!IC^?X9>]-Y,l'l!;-$5*6oNV,F">2>[0-/C>!==thUB[Ed +US=NW7dU3G!"0mAUS4?UU7n?WTG-Yl#V;aEUS4BVUFX+[""g:AU&C_d/AM5jMkd&@USFN@h#IJ#V>[.h +UAgnhTqe:^ULMgT#<[ZiJ:WE-K(OT2!"&^=]=khg\\>VfU>#YST"VbG]=GJa]qFWj#/.X^]=khigAp:7 +!kZ.XrOorG#>2\C]=kni9^i&M!"L3d]t:ti\\5Vg]=khi#1`bX()@]%(Du`Zq*,!I5^boZEggBZEp:] +!![TUnOLTU]7+b1'BBh1,KKe!"0mGXK/G)Y,ne,XDctr$WjF3XKAY/ +XKJV'/c>\[:N=nltoD">MPc0FuJ0$Qu%9U8+BTU7nSc\\5Pe +&a]Si!"&e@\\5Pc]t(hi]]fD#]t:ti]t:tl!!BjH]=n3W^AnL2]tM%k]t6tn!!6ZD\c08H]=kni]t:rX +#1`bT#oNXX!#>)@q*,!I5cN"4N2RKfsZE^dBrjMp,-fY18)kj[GZa-pBZ*L[B=6]bk2mTcqZa-mD +2;8,n!!>3eZEsP9!OXl%!!f4'ZEpjBZ_HmgmJmA/Za-j@rNZR4ZE^]Xec5h7USFNYntZ"9">_eh1'[1I +huF!6XK/J)Y-+l*Vu`2*irB5sNN9+_XT#C%X8k`T!!k*VY,ne0XK4&O!6,!@/?>tWri?.$/&hSd!!eLb +XKJY+Y)V3:";IW4Y-.`)"Kni/XC9Z["WCQK>ZtD)>6%n'0Ea3g1c#?]!!b$LU7n?UTqhU`!KnPb!!jJo6TqS6V/&2,e/Yf#5rM'?DjoF-9#E,@PTqeBVMqe:8'qh=qT`(VgTqec##GJK0Za6pCU$r'K!!,$fqQg:0Z*JN& +!!R\AU8+KXoV;.9!AlP"!8[\W7B":8kFY,qW*"g"l0X/JPQ!!=aSXKMN'!&"0L +`;g/qX08V-XfSNQ`rPr9!fa@ariQ:&NS=FA/#]MOXfJM)Y,ne-@FY>\86]>)?2e%1>[1K)%k\\5`ZF%*$2tI%F!"L?:ZaI*EZa-sD['I'F=m,hk2mTcr +['R'D2S]:q3O5oqZidV>[l;)&#GJK0Za6pCU"TJRBsY+MZEpjCZ`p_8Fk$Hl*<)Z7US4HWp7qF="#2Sc +,gHDh!!>`lXK2/u!iU>olMq,0H)n!IXKMQ("Kni-X%2@R!@t8MXob]+0&$Bg!!4aRY5PF&W%5X`!fa@a +rN6-[mf;\S$WX7/Y,n\*Y-"h0@FY>\$WpY=?1V:r0EX'b/g]och>dOHqkO1crhBOkG:`%[!?QLaUB%"e +UBI9cUS:PC9%j7Q!kH"T]t:ti\[oHYirJWMrY>SP'c%PX(AU/s5X.OUaoE#3YdCdCZa6sDZ*UgFZE&LH +$MXVu!!>64X0_f2$*ghBZEpjCZF!ct!!kNhZa6sDZElI)!!>0dZEaeBZE^fsGBe4QGNa2LG5ZR_Fp)r1 +GBHsQ!!8k#Z2V$0Z_?%P!KXYfZ3.A=Za'V;GLQTnBVP$lq(`%.1,Kfn!;lft.]<9I%'Hb7Xfe_-X/qt3 +3=#*T""eJbX8T+*Y,n_*XK/G(8*9jX/$,ePXKAS)/_g?f!!+UNrN$7,X*8#_?t!O#@00nH7I1!UNNTG` +X9#A]n,V_R!I:^EX9Gc.Xfng8e,TV,=^>6;r`oD+!*oG+q(Mn*0Js^9!8IPT/"cg9%&'AiTV8-SUSF2l +3X>3U!\S;VrM'CfU&C_gU8+JSk5Yc=USFQYTqe>4quF\9!%e&C#GIo9A7T+YAE[M&A,Tm9@g$7MA7A%" +!;ZZsMkQjCUB$5*!!%9BUBR?dTV8,ke,TVLKR\N%rdk#u!.k-"s+%c_!2TV-rjrEF]=Ybi]7:I]!"KWl +]=khg\\#Pe]=kbe^\@fs!!^-K\\#Da\\8%F]=YfV]*>qi#7(M=#ODZn#6+r,#6"i0"pP;:lMq/^]=Ybi +]=U\g!"'m[]t:ti]stbh#NPmS!!#AMr"f)m"$o.8(.,oDf$q$(7N`UACVbUAUe^1'9?h0bDG, +"s087X0/S.rN$O3Xfeh-XHniS@7;[t.4dF_@:=eTXK/H$XpM22Y-+k-XfJH5XK;E(!j&IS^]4Kg +XKJ_-!j&Q,riH+%!3GFf!j&Q-qQ'e%Y,mWL!!eLdY-"e.XGtm5#mZcsXKJY+Y,nf,@FP8\!`rT0?!RA5 +s'5D)q(Mn*0/=-b!;lg!+-WIprh17*U8+KWTqJ*RUQUOF@R_n#.P3Yj@Y0f=U8.[\$)=8hTqeBVURj(" +!!4^HU]-qgUSBRt!##SA2.aJ3]=YVa +]=kqh]=Yef]:S'`!58BD!kl4Xq>eJ7%D00_]t:ne]=Ybi]=Yc@])]P@]*5aY\\#OKnc8Oe#>DbA\[f>c +9%X+MA%B4`]tM%i]`upc!"f,G!#Y\N!uMjj(&\mJ(AU/s5!V==a8ck[K=%qjZa$jAZE^aBZEga@ZEpq; +ZNRS>['I%:Z44(EZE^^@Z*UgDZF$85p&OR^#WK&q['HsCZSoT!!&sn_$F@%EZ*CX=ZE^^?m'-JnrNQL0 +Yd1L=rNQ?oli79aZEgaAZEg1V!!4(BZi764Za-iZirJTL"%8lZU@b5U1'09f#06cJ#&UHCXf_T*!3H1& +r2^+'XKJV)XK2K+XKM8u#-G&1XKITjjT#Q:XKJY+Y-"`W^]4?bri?.'XSo:)XK8S+Y3E(eXotl/YH=o) +XoORM!!eLbXKJ_-XGtj4!Y_K4ri?.&Y5te7df9Cn=nu;%>l7h%0EWp]1Bu/*q>^U%D53m(T`CkeTamim +U8+KXUS4HWUSFNXU&C_jU8+KXUSFR_T`_'`M$`8D#V;aEUSFNVUFb1#jT#93rhBLfU]$khU8+EWU$8?N +T`q3dTqeBUrh0=Kli79KUSFNVUSEb:!9jIa'V>8urh0=%df9J,KSG!RJH(2uJE$X_!!3eH]DfA:],eGo +]t(hg]=GVe]tM%i]t:tg]=kbg]=GJc\\#UKirB:s]=khg\\%_=_uT\H#J%CW\@];b]BQs.\c02E]Y(qj +]=7dO!(uh_q>^Lfqmui#f)Q)L]=khi\\5NYdJs=a)&<#artt_Nrtb>n!'nL'#<8flZa@$CZM_$5ZEUU< +YHbA3Z2q57rNZ=-#dUeBZa-pEY?1Asmf3VPZa6sDZEpkp^]4X!Z*^gCZa-pBriuR2Z0\dpZMq05ZEggC +Z2M!0[%Zgd#GSN/Za$gBU=TAJ2mfosZ2V$/FlWPl!!EglUSFOUU\Q\E1W9>2/>0)FY,ne-XfJM*XfSY- +XfS\.YH4h.Xo>I'XSo7,XK/G*XK/G#7e6WM!!k*WX/rJ*XfF(i!!b$UY,n\+YH@c)!3YRfs/c4&$EU>2 +XfSY,Y,eX`li79MXKJ\,XK.?4!!4[PY5PF&Y@6Djnc/n%?kG.>PTrS0/#0$!"gfMUSFNXTqeU8+KAf)Q%,US4HWUSFL_@ab;^$Z^cKIXm!#pjg3]p](PM]t:ti\\5QQ +]+2B`]Xthd]=Ybi]=Y_d]DK,D]t(be]t(hLi;a(m]=khi\\$PqjT#Rs]t:ne]t(\erjr0@ke6o+r4)pA +\\1W%!!c32]=GJc]1hYnkPtk&]=kbg]=eEs!!WfH(_mf')#+mB56=)71$ntm!"=(V['R'CZEpgBZE^\4 +Z3deAZ*LX?Z*LX>qQ^41ZZli:!!"tUZ3%A>2>[Bn!!5*cZi769Z*UaA['@!EZg"dpZO4"FZEggBZa-pD +U@J<]!!f4(ZE^^@Z_>qM#?J7rEB8,qcieK!%>_b$tPs)TVJ6VUS=HWU7qL[!hlB^#,@ofTVJ3R +q4e"bA-_)o!%e&C!hlA>^]4HfUS4I_U]7%eUB70bU$/6QTqe=[UB[EeU8+HXMsLEGMkQo>rhBIOec5\> +rhKLe!Ma/Q!!GZ=J:W:MJ,k/tJAVB\!#u68]stbb]t:he]=GPe]=Ybg]=k\f\\5Ja]=5KQ]*5m[]tL-G +huEtp]t:ni\\6_tj8f.j!kl4Xrk/EE]t:o@]`PaV]D]DI]=YVe\[tQ%!!c-,]=Ybg]1VPmjo>Ut]t:he +]*H^`!uMdj)#Y3M)#G*C56*8&!7_&Y$tQEF['[-DZa6pBZ*X83%CjZEPTrS/hS?b!!fJ +\$WKK\$rZKZ*L[?hm36g!j]/+li7$ZrjN!:[C;ju!9O7bVR3Y9Z?=Rq#q8K0U8FZXUS=FYUB32,1]B-0 +1]B-0($u"M!$*V,^*ACc(=B]$8=^_/3$X5;<0/,190.\e5 +(V]qO/U*fcUC*]gUS4BVTqe[.hMsLEDMuKOTUSFZDe,TZ7USFNX@cIIX!!aZ.EI`[mIY.BGZN("NT_uD)]Y1qj^&GVD]aMB_]t:kh +\\#Da]/A=C#/.^^]t:ti^&S5H^Ujif]=kni]=khg]t<7:"hqab]t6o'!!,^(rOi6D9%3h@A,a.B]*?U^ +#7hUd()Ic%)>b3G56F/85S;9Amf3kWGFl"FZa@'F['R-FZEpn:Z37M@Sq9Me!!jEbF`qqNG'+\X!9F1d +)0^4IF`qtPFo-@=FTQZ-=6onl=*8Y0G'.q/n,VPM"UoQuFE]an!"']1@\BTnU8"KYUAUeb1BoTi1G^dB +%.4,A!"(5cNi&n\XKJV,X8]4#Y5YL*X/qD$3SFH5&c,o9')VaK!!X'F@:EYR@b+rhA77t!!;ZZt7U]_7 +ra>dre,TXY@:E_U/^aV)'J_jY='T'9>5VV)>Q$2Z1GCI8/i4!L!!t2eMOpT:US4HVrM0Cdr1a=MCc^n_ +mf3V+@q&qX@Uij\^]4WRA7B(Y@q9(Yqd]#&nmVZ/@Robb#=i64A7K(X8(7MB$"ILSA1lpCmf3\11J<1L +JU`0&It.BHYQ,CC8Y3W-]t:ni]=khi]=Yej]t:sM''TDc!!WZ4#6tG<#/1'>#6kD;rW`E-qZlEkoEG=$ +#3l3g#6+r.#1TqS3J"Enp13%'I]JcO0u +#o#TiL8CZ=USOX]U]!"K1B''11'Yu'li7A*.og"dH&R`BNe@=>!A#:i!.k3U!!s,j/l5hV>ZtB8qcj"P +!AcG/0**j5m/Y?1%hgKp@q0b@Mi3OF@q&n!+3+A5!0I6e%l5nQJUi6$KDU0!J?&YX!XArR84lKK1C"*g +jT'l4JcP0<"pGkZ()@c&q\K#m!^/b5XT3qQJcO-t#n'!a:77rQU7n=YUB32,1]B-31GUaBblE=qJcN"T +$4&FB0O%ad>ZtK[@52#r""c +0JbC9/2/Qt!.k3&!3cG.1GCL`JV&?%qLIQ*JcLB&N;s+_(`*u*(]5$K(A^5s5X$i\!.k3&!:Kmn3Bfbp +Mkd#>UAL_a1BfNh1G^d3XT3qQJcO*s#q[nc1K7R^?!LS2>Q$2Y1GCI8/g\aBJcLB&Y5ek]/ho(sJq8B$ +Jc(&Y!.k3&!/gg[#T"6l(]>-L(A^5s5X6HP!.k3&!:Bgn/NuTf:7J#QTqqU]rA4I/r\FNlMu\G0JcP9? +#pM,X1H/KA>[:M1>Q$2Y1GCI80cI+nJcLB&ci=@s/i#(@H@gZtJc(&8!.k3&!36)%&f2<"q\K#m!^/dh +li;V;JcLl4#q\J/6U,@]USOX_UB@8H1Gf"c"#D\h(6&!!sSt1G1RV>Zt<9r*'I]0/#"80J=t2 +(Td[h!.k3s!!jf(0etF\JUrFMJAVA=!.k3N!!<6=()Qi`qEG$H57m2^JcLB&NrTJ+5?^o.q_/+*0e`uo!.k3&!:Tsh(,5\A")<@;Jc(%m!.k3&!6P9D +"r7sjr"f,n!^K!ZbQ*4pJcN"T%N.K!5X@_1S"ZROUS=NYr\=I0r\=O21C6%n,0E!"KYr1GLR=3-p((J:`6#J>3*r!.k3l!!a,R'c%T%()H^1!C-_2 +!.k3&!3lM8!<0/51711buf +rdY!!K)gK'JcOs6!sBAS(]G3H564#-X8mhPJcO*s#m*@V5!VG#6qEXAU]*"K1]B-11FgTKJcLB&Y5f%5 +1c$mC/i5.8=^,*6>?h(\!&+=*!AQ"h!.k3&!07*g!AH/Z0eb=92g'_&JcC7R!.k3&!9F1]%i>0[qEG!G +/W0U\!.k4>!"D.\5X%Y$69eVJV4XKVq_A4/1F&q#JcLB&cN"D00JkL;0fCdG>$>9=?2H;W0/4Wn!.k3& +!3ZA30JY=81bUR;6@j`:IX^8VJcLB&L&_;k(Dmqg(]$>s5V.ioJcLB&mJm\W6pO('6pF"(DPEl#U]*"K +1]B-11F0%%JcLB&c2\;-/Mf%90/>468mGV)>5g2U0E*X+0d"U>JcLB&XoJn]1,1L:0eb@:<.KLMJ`?`^ +!.k3)!!30;(B50G56)jd!.k3&!:9aq/O;ci5=%P#69g:%U8%WB"Z%qi1,Bo.!.k3&!:Kms,;_&01GL^> +0JZC/>?h(\"YVM_0J=6C!.k3&!7(WF+oX2#0/,(71,*JBJ\hD=!.k3I!!mTi1BfNj1+k4Rpb2[[Mu\G0JcP3=%21EM0eY790JP781fZ0'!.k3& +!5\^:!n.JcLB&cN"(f5X.P#r]gWO69d_$5P[&7$-N=# +!.k3S!"B`#1GgpE1c-sC1G^[>q(MdTlMuM:JcLi3!YR4@r\=C+"#2G`0`Wn[!.k3&!8mkQ56)(m!.k3& +!6tQF'L2I["[>785sIR/1&qU(!.k3&!3Q;)%l6!u2#]971,L^B1H5+`!!qokJcLB&NW91k0/5.7r\4L/ +0J,![0.qnXJcLB&hZ3I:!!S8\JcLB&mf3e*5=%P#5!!!?)1B]Nl1G^fa1]B$./hd2XWW7VNJcO*s +#RN4;0/5"00/!/W_>o/fJcMJE#j5Q="K5O/<$!.k32 +!!`rt5!V:q5=#03s$-H;"#Mei15l3b!.k4+5MZA>/JcP3=#R2q60JP+10/!/VUB#lGJcNRdrBC9Gr]eR+JcLB&XT/Pi5!V@s5=#*1 +r%e7-lMuM:JcLc1!AcM12#]<11B0-.0EXr\=O3 +1,A__!A6&)0ENm]0^A^j!.k31!!Y,./hee,0`<[)08'=W!.k4.!<,1c5X%Ft/rBX\!.k4=!!b_R5sIUt +5X>63r\=U41,C[3WW7VNJcO'r#;S(l1GppE1]0$-0Ea*_0ea`m!.k3&!3Q;,/hJb1/1`J,r%R+1JcLB& +JcH&V5/JcP0<#-Y5=#34 +!C/m7!.k3&!0.$a5Wh7q5s@LsrBCQP1,:XA1,:X@MZA>/JcP0.4/Gq0=!.k3&!2'>f5O/<$!.k31!!bbQ5X7V!5X,03"@#++1,Jka!&KQ6JcLB&li78I +1c$pE1,Lca1BK6a0E!R)08]a]!.k4=!!b2,1bU^90J*,TU&]cFJcNUerBCBL5!!!E+56F/95=#*1q(erMJcLB&cN!tO1A`j- +1Ais(0ZjBI!.k3S!!iia0/#%70/50Y0B)t`!.k3&!!!#p5DoMn!.k4=!!!E*5Q3qF5P[(8!.k3&!6tQH +#W"4kr\FR31Ais(0ZsHJ!.k3R!!ii`0JG.70ebo/fJcMJEq*+iflMuM: +JcLi3#8BBe5X7P!5lddA!.k3D!;ShZ%.!tG!.k32!!"#85lEqI5P[&7$&nq:!.k41GUaB(X)l2!.k3R!!">E1B]Nk1G^fa1]B*40JP170bisSJcLB& +NW9&%r\"C.0JP47r\+:)KE-T(JcO[.#XU^?5@R5G6N/6G'.s8g&MO!FED\MF`VeOFEVdcl2Ukc!-[UK#Bb02 +F[\5J-+161GC6'!!FAr.kN=J.f^^Y!9X=`/1W7M/-d[U/1`;(.j!gQ$km&X@q9%VA7T+Y@P$[B +rF?(AA7K%X#PJ/Z!"9NL@:NhW?t. +$3g\>#6kA<#6kD;nGr7_p]oFO$3g\>#6kA<#6kD;k5YJeklq4p#6kF+!!oB:5X.P#6:!p(!9=+^TsqD9 +pp'q.37Ip.C&YF94$9paY7PceV0etRBcN"!*W:m:n +X";a#!*0$"!NrR(X9GZ+X/rC^jo>f>XKAP)XKAY+XK/C1k5YgeXK/G(X/rJ)KA$;,.]f`YX/rD)Y,eY) +X't2l!3#Fiq5aV!Y5YL.XfS\'UQ&\B#0[)8!!3E]1Aip/1c"tb"bK].0JP9\1!]h#Ml$*A!%l\#!*9)o +s.TIf#,@ofUS=NAjo>H5US7[^!hl<^rhBI&k5YLYrM'LiUS4H6g&M7+US4HX"/DQ`UAgnf@d!dlV=C8T +UCEojUS=NWUS4NXMdndPaoLo2#m`4;0/5170eb+'QlN$/L"Tl$Ej<1+tF=1BQnCjT#CCXK8W#Xob]&#M&kW&u2S3ri?7*XKS\-ri?*]klC\_$nSH\X/rD* +YH4n.XC:8ls/Yss!+FU^$nSH\X/rD*YH4n.XC:Ao!WW5!nZ;Pg"g"f.Y-"o+X9P`+XK7gu*kVIQ$N;gb +1c$mC1GSha$8[6\3\iBD0eb6^ci=-+USIRW!hu:lec5dcTV8(YUB$tmUS4EUUSFQ?jo>B5r1aIiTqeoRs.fOd$DO;jU8+HXUQK%.c2d;5!"/]["#)A^1&['R'FW*-h7#8ock5[1Aa0JP@>1^NIKj8]=D +XKJb1q5sdtVh=G38i6['R'FZa-mAZF$sC-hm](!!G6dZ*Ue8Z3.J=Z?GF3pTat- +ZE^dBZi.00Zhq'.Zhq$9Za-mCZEggAZEA9Vnc7#:!ZXEhq`t$C$!U\=8M_tT1GTBc!!A4^XKMH%#-P,1 +XKAO,fDkq\X8&b"Y,ne-XGu?B!@t8NY5PF(Y-+j7nGr:`"Kno/Y-.](!ir1>h#II+XT#C$X95W.XC:;m +pT+P$XKJ_-X8T+"Y5>:%Y-+l(X:)/3XKJY+Xfeb(A-]pN!#>Ggs"sO-$%meY>;%ig0f'7)!9F1_Mkd&@ +qkO1brhBLg:Q/'`lGW"%p8? +]DK8G]=khg^:+0r!!3A:^&,G@]*,gZ]t6nu!!'_2]*>s\]tLtg#Nl'h]t:tkrjr\D^%o8L]t:ne]=khi]=GPeS-RIBhuEnRU8"8[r]gKM)peQeTsCu1 +qm$I5['I!AZE>YG!:'Ue346,uq6L70Za6pCU?2FY2m]frZi765Za@$EG38i*[/706ZEpmEZ`+?/!9F1` +2m]frZi765Za@$EG3Ar!Z3dkCZEpjCZEggBr3HC.rj)X2Z2Cm6Za6sCZa-mCY#k5qcN!qpo03Od>$PDn +1GCXB'[Qg]NNB2]Y5>:*Y-+k-XfSHCg&M4+X/rK"XTbl.Xfegdjo>N7XfSY*ri?7*Y,nd7nc8@`rN6I/ +Xfeb+X0/Li#i5Oa/$5nTX8]1'Y-+k/@H[^aX:VG6XK/G*XK8S+Y,eV*Y,nZ)X0)6"$*LG4XKAS*Y+8&! +!!48u1A`j-1Aip7KRnZ$5qt#H2&5KYj8]:?USFO[U]7%dUB-l-g&M1+USIRW!2KOe!/p+Br;ZpNTqe=[ +UBI9aUS22\!;`DgUB@3bP6g"F""^.@U&C_hTqS6TA*X-o!;3)eUA^htTqeBVUS4HWTqS3UUS4HWr1aRl +TqeBVUSFNO8&>6-+YYVI0*!^*0*O!^(`!l'aoDN9]tM&T]`u*^]=kehSCdfC]tM&U\c0,C]=YVc]1h;d +!kGqRr4<'E]=S=2!!'_3]*PsX]=khg]t7k2!!0XB!4i$>"22=Y#Nu0_]c4Ss]t(bh]=khi]t:ti]=GJa +\\#Ja]t(bg]=n3U#/.XZ]t:n,e,\A+$)+)dUQ7`+5X6L>!!Aq#ZEsG6#ICeCZa-mAW7q:R%'Hu4ZMh'1 +Yd:(d!":inZEpmCZE^aCZ*JQ9!!9I3Zi761Zi764Za7$+h>d[T:Y,ne/XK;B' +!N]_n!;NVqX8K%"XfhZ)!3Z=&#ck).Y-+k-X02B%"0JZ+Y5PF(Y,I=!$h7or%eY3KS"bs1c$sF +)peQeMkd&@qkFCiTqeT;Tqe +0`3R,(D[i)$g.NO!!>j,]t=0T#J7[]\\5\eA(gnaI_WMg]`YmZ]1hGhr;[5;]t:ni]t:ni]=eI4!"HWR +]=khg\\#Pe\\#O2h#Ihp]t:ni]t:ni]=eI7!<3&o]`PaV\c08C\\%jS!5&6D!P>oA])oOT\,NuK]t:tg +]tM%k]=kni^.Pd5$36frTVA3+5X.Occi=0AZEgh6Z3[eDZF%!DZEnc1!!J=gZa$k6ZMh'2Za-j0jo>EA +Zi.06Za-pCYd/E7!<'21Za6sDZa-jBZ*nf4!!>3eZEabAZEpjCZEUWWkQ(=^s0;U1r3H=."L>A>Za0S: +riuR2ZMq30Z3%A=Z2Cp.8Cmk1!!,2IoKNXb=^,-782E"X+j^2kNNB4aqlC(+Y,ne/XK8I3nGqnU"F-uJ +XKM!%n,D!hlB_rhBI&nc8@`rM'^nTqed^M['[*DZ2Cp,Z2h0/Z2q5)jo>fLZa$jBZa$gBZE^]Xk5bLerNcd8 +Za-mAZEpo.huEgf@Xfeh.Y-+t2XKJX5k5bL_rN6F-XfSV,XK/E^huEm2Xfeh.#Hk55Y,ne-@H[^dX9Pi1XKJY-Xo,=* +XKJ_-XKM/r$EgJ5Y,ne-Y,eLB5rh0=erLj=g +Tqc)\!;N;lTqJ0SU\^YfUS4BVU7qR]#,7leUS=NXrM'^nUS4BVTqer,ci=)#0)dO(0_mC$('5^&GVH\\#Pe]aVH`\\#Da\\5Vg]t:uV]*,gZ\[rK` +!"#EnUnXQXO@2>uli?,I"/3$+Zhq$8Za@$CZEggBZ`FMl!!F.EZa-k-Z2q;+klC\_"?<`nZEsP9"LGD= +Z?>=1!j]/=riuO1r3H=.!O4$2!!G9fZEgh9Z37M>Z*JN;!<3&oZ2q;=riu^6Za@$EZi.02Za-q9Z4XFK +Za-mCZa-mCZa-mAZE^^?rj)Tca8c8N5!\d*$9q`u=^,*5<%Tp^ci=0-XK8T%X9u,5XKJY+XfS[u#N,Rb +&YlD.Y5,0sX9,T.NTL3L/?>kRY,n_.Y,ne-@HRUlXKJ`*X8oF$X9>Z-X/6rs!!=dQXK2]1XK8V.XKJX5 +kQ(CZ!NiO(X9Gc-XK8S-rN$(&XKMN''s4R?XK8S,XK8S-XK8S.Y-5"1X/gO!!:Tsi$8F@41Aip7KS"o- +K8"D*/i1iS",iqLU&1SlTqS6TUSFKWTpQ)V!:Bgi&tktoU%G)]TqRD,!!"VMUBmQgUS4BVTqc)[!!8ph +U&LeeU&:YgTqS6Q+8l3$!!"VMUBmQgUS4BVTqc)\!;N>hU&LejTq\!5&-A!P?&E]*,gW]t8jP!!Ah']=IUJ"1u7Y +9]Z6V]=knirk/HH]t:r^nc8@`!kl4Xrk/?E^&>PF\[f>DhZ*bj]tM&W]`bs\]=eF4!;O5.\\J*T!kH"X +qn!!A^:V"j$+mm]]t:ti]=GWR]*Z0_]t:ti\\#Bq\,Zl0Una]ZUSE$!5RHiYj8]:UZEgh6Z2q;=riu^7 +Za$jDRG\&ITX2#3os+_,ZEga/l2^b_!B@FbZ3R_AZEpjAZ?>=1rj!$?ZEpjCZ*U^AZ*L[BV@);_!B@Fb +Z3R_AZEpjAZ?>I5rW)`!#dL_AZa7'HZa0J8"gbM@Za@%;ZNmeBZEpjAZEs>3"0o5?O3%A&(-qOW$pQs\ +?!:N>>?jZQ1^;>-"-'C`Y5>=#Y5PF)X0/S+KAZ_6O/o@aYH4r*XSo4'Y,n_-NTL3A/?\uR#Hk/0X/rJ* +@HRXiX9Pi/Y,ne/Xo>L&X9"[niW'$2Y,hr2XKJY+X/rJ*@H[^dX9Yo1XK/D%XK2<$&$E"8X/rA&Y,n\, +X/rJ*Xo>C%Y4\jrH.r>f!!3]f1\ig(1CAbcJU`-#JQsf]#13DQMkd&@qkO1br1a@eTqd4t!!\CVUS4BV +U&(MgUSFNXUS3V.!!+[FrhBIerM'FfULNBdrhBRhUS4I^T`Um\U&LefP6^(I!A1#EUB%"dUB7-a@d!ge +U]7%eUB%%cUB%"bUCkj_!!>j,]t=0T +!P?&E]*5m[\%010nc8+Y"\lPB\\5WL]`bsZ]t6nu!!0^FrjrBJ]t:ti]a!X"$GF-b]=khi]=GJ]rOW*D +AGcGh!!0^FrjrBJ]t:ti]a![#pq6pC\\5Ve\%TEM^&>PS]t:he]=khi\\5Pe]=Ybi]D]DG]=GVi+o),S +!",EqU7nBWURY(C&^^R\TsCu1qm$U9['HsBZa6sCZaX#q!!d;G['R*EZEsA4rj)[2Z_HR^$okT!Za6sC +Z*Ua@Z?>[;pAb6"Zi761Zi769Za-jAZ*L^CQJqlQ34#osZa-mAZa-jAFm&i!Z3@A'St_mOrgs1`rgs4_ +TDkD^Y6D>?['I!Dr3?F0Za6t9ZN.<1ZN7FoaoDJ_5X+g)$?!:?7=ZS8Gm/Z5J"-'C`Y5>:.Y-+k/ +XKJV*XKJKkiW'3bX/rG*XK8T#X9Gc-XfegdklC\_$nSH\Y-+k-Y,eY,XC:8l!N`I'X8oF&X9br0Y,ne- +XfR9:!":EZXKJ_-XKJV*Y,l's!<3&mX9GM_OH#3Yrf@,@r/_)COH?B@X8]1#Xo,:"XpV84Y-+n.XfJM( +H--*g'JqZG1]K6,1CH!kJU`3%KRe>-0+?5.",iqLU&1SmTqS6TUS4EWUS4MSiW'3cUSFKUUSFO[UB@9d +TqhU\!/ot>$n\6LTqS6VTqeBVULNBd!Mc@fUB%"eUBmNfTqe"hVCW]=Ubu!"6EP]=Ybi]=Ybg]a!X"rjr6F]t=9W +#e7LW]t:tg^GGihj8]S"]t:ni]t:ni]=eF4!;F/2]:_bg9LqeT9)qT`9++?b84lLI]t:ti]=IpQs1SBC +$+[[[\\5Pc]=fBb!5JU1UBHT@)up&h!!8k"Z4+(FZa-mCZEpjBZa-q9Z3%A=)Wq)(!<<*IZEjJ9$*pnC +ZEpjAZa-k8Z3.G=Z(g@\"$!WmZi.04Za-jAFn,P+!;Wr#Zi766Za-pF[s$d3"$!WmZi.04Za-jAFm&i" +Z2q;+n,O1'!"1]!RBsB/ZEpgBZEggCZEggC[/R?3[tWrN$.)XKJX5k5b=Zs/u@& +"g4r0X/KIe!!=dQYHIi*"Kni/XC:DprW)\o!NqFM!#PtkK8US4C[UBI9cTqc)[!;WDiU&LejTqe^c]=khirk/HH]t:r^kQ(@j +!P;%l!!E?\U:n,:]+2Bc]t:ni]t:nk^:h.j#MT7;!;N;iB-bk)"/3$+Zi761Zi.3/ZNmeBZa-mA[%[*l +nc/n$W3Wb8Za-q9Z4""EZa6sDZEggBZ(g@\"$!WmZi.04Za-jAFlrc#ZM_$7ZEggC[^Sa,!9O7`34#os +rNZR4ZE^]XkQ(@_!OJNb!!bHDYHtUBZEsD5"gPA>ZaE:#!7:cI2*gatr*'>0>?b8t)pnWfNNB4ari?+& +rN$1)Xfeb-Xo5=$NTC-F#*u?nXKJY,ri?O3XfSS*XKJY+Y-5!gjo>K7X08])X9>]-Y,l(%!;?KhXSo:, +XfSV+X/i0Yj8]95X08])X9>]-Y,l'q!;EPqY)VlMqZ$sRHD[aGY,n\-XKVT("g4r/Y,XG)!!4T*1A!C# +J-CLSJ:UK9m/Z5J",iqLU&LeeU&CbcTa.?dTqeBWUPn46#6p?dTqeFnPh*!"aah +Za6sDZa-pDZ*L[A['R+C% +Y5YL(XfPsn!!d>AY-+k/Y,qW*"g"f-XK/E$X95W/Y)_WE""^LVY5PF)Y,ne-@IaEl!;3DqY-+k/ri6'p +*T[8'/?>tWrN$.)XKJX5kQ(@Y!NqFO!;HNs#[jF/X8]1.Xfeb,Y-+t0X/r0(bl@c#1@mX&US4BVTqS7\T`V!aU&1VaT`C&:!;um"/Yf#5rM'LhUS4Gl +k5b1M"/2E`U&LefTcW:q""g:AU&C_hTqeM1beSU +s"F-_!#3c[%SFFJ]=kni]t:ti]t:hgqmup?]a!U!!>3$=])fIWrjr?I]t:ti:#u?V]=kiT]`bs\]=eF3 +!;4#,]=YcT])\Sc!!0^F!5&3C"M;@Z]a![#pUpU>9]cZ*JN9!;Ec"Z_HO]#9&u:['HsBZi761 +Zi.01Z_?1Tnc/[s5k7/8>68&89@3_DNNB4aXKJ`(X8oF$X9Pf.XKS\)*qfU*!!4^OY5YL8Y,ne/XK8S- +XK/G(Y,n_-YHEoJ!!=dQYHIi*"Kni/XC:8lq5ah(XK8S-XK8T(X9,Gk#j)*h/?>tWrN$.)XKJX5kQ(@Y +!NqFD!!*acri?=,XKAS*YHIi*!NqF\!7CiL"uA"ioJ?8m!IeS,!!A.SUS.aaTqVCZ%&'GkU8+KWU8+EV +V'"n$!\L.?rhBssUS4BVUS+L+aUB[EeTqeBVU&C_eTo71r!sUS90_@$o('59f"76*M +!!Z'/]t:ti]D]DO]=Ybi\\#Pc\\#Pc^?,D"\%B>e]=YcU]+)H_]=k\e]t:tk]=kgNklCY^!kZ.XrOi?G +]t:r^k5b=k%(j3d]=Ybi]=GVe\Rjh%!kZ.XrOi?G]t:r^l2^hapUpU>9]Q0\1VLK9]=kbe]=kiT]`G`; +^&S-5q4e%dU7i[W!!Aq#ZEsM8!42O-!42X0"L#,;XpjRq!=H%0Z4+(FZa6sDZE^^?ZEpnCZ*UaAZa-j1 +jo>KCZa-q9Z37M>Z*JN8!;Wr"Zi%*4['?pB[$]tU"$!WmZi.04Za-jAFm&i"Z2q;+irB9bYHtL>ZEsP9 +#.(VAZa-r-hZ30H!u='b54h)8>6A2:>7Ap["-'C`Y5PF%Y554"Y5>:%Xdodn!:p0k#H%L%"g4r0Y,nf* +X:)24X0/P,XK8S.Y)_WE""^LVY5PF)Y,ne-@HRXdXT#C#X8oF%X8mk7!!=dQYHIi*"Kni/XC:;mpT+Cu +NT1!?7]*6cX8o=#X9br0Xfeb,2ZNj*!!K8US4C[UBI9cTqc)f!;6EgU]-tbUB.'_rhBIEjo>K8 +US4C[UBI9cTqc)\!;E5hTo8C?oDet`Sti%WUB[EeTqS6V36qR*&MEW-q%a#K(DlK>j8]NZ]tM%k]=kni +]t=9W$G4!`]t:ni\A#M(kPtXT^&GVD^&>PE]t(iU]*Q0^]=kni]t7#(!;lfu]=kiT]`bs\]=eF3!;X>( +])fUUrk/:ejT#@o]t=6V"M;@Z]a!d&rW)]+!P;%b!!Ah)\\7pQ"hD@X]=Ybk!<3&pUB@Za9P7!jf4nl2UmTZa9V9rj)g7Za-j@ZEjD6"1,;6%q-=o^t=!!nRcXKJY-XfS])X9>Z,XKJ`'X9,H'Gj581Kr_9QXT#@*XKJY-Y5PI$X95W/Y)_WE +""^LVY5PF)Y,ne-@HRXbXT#@/XKJY*Y,n_*XC:8l">$UWY,qW("Kni/XC:;mpT+CuNT'pA*iH'AXK2<$ +"fnf,XK8,P!:g*l(Gmp)oJ6Juqg\g#Jq8MadJsQ2USFNXTqS6TrhBUiUSFNVq4dq6pAjgc!ed;BrM0@c +"J_ZcTV;4Wrh0=Njo>K8US4C[UBI9cTqc)[!;E8fTa7EeUSFNXUS=L`@cm^n/Yf#5rM'LhUS4GlkQ(@P +!MPG2!!==7U7qIZ"eq]bUS=1U!7CiL(bdTqoIg1]q\B;O(D[egdJsAA]tM#a]tLti]=Ybi\\7mP!58?C +!$LP,"us0(]t:tkrjrEK]=k\c]t:oT]`Ym[]1qAe!kZ.XrOi?G]t:r^nGr:`pV$RZ*JN8!;Ec& +Za-pCZa9Y:"LGA>Zq'<["$!WmZi.04Za-jAFm8u,!;Ec"Z_HCY![b1Yr3?R6ZEpjCZEnf&!!"\C56*qE +>6S88?!LJOdf9K0XK8T&X:)26XI?8oXKAS*Y-.c*!j8U`li7&gX8K%,Y-+k-Y-"d^XKSe.!3Z=&"0Si1 +NogtWrN$.)XKJX5k5b7X"g4r0XKJ`*X9>]/X/nDH!!=dQYHIi*"Kni/XC:;mpT+CuNSsj=*N#n8 +X9Yf-X/rA'X(1&fnGiP7nMC#l"bD8VJ:oE$!!A.SUS7U\$_a8hOeJJDTqeBVU&LegTqaUC!;$6k=Snj% +TqS6VTqS62US4BVU&LhdT`C&6!!=gJTqVF["JMTaULNBdpS.ncUS4HVU&LheT`V!a3TpGF/Yf#5rM'Lh +US4GlkQ(@P!MPG1!!446UA1JdU8+Gn!7:cH-2oLg0DZFe(`+&*(=E0a9"hn?]=khirOW9IA%B4`\\8!S +!5AHE!5Ih"!,!kZ.XrOi?G]t:r^kQ(@j!P;%p!:^%!U:InL]=ttj^:V+i]=A3^!;N;lU7nHP#4V]S!!].& +ZEpjCZi%*>(9OjIZEpgAZEpmCZa@%VmJm8*Yl:s1ZEgh9Z3dkCZ`XV@Yd:XAriuX4ZE^.h!;um"34#os +rNZR4ZE^]Xk5b7^!jf2=riuO1riu[6Za-b^kl:fFZa-q9Z37M>Z*JNl%Y.?!L`;N+ri?4)YHEoJ!!=dQYHIi*"Kni/XC:8lpT+G!XKMQ(!3Q7%"Knf,VB4t%!\CCU +!3Z:%"Kni/XC:;mpT+CuNSjd;*iAn;#d:>4Y,n_-X/"VRn,NPE1c$u\1B<"&J-CLSI>3(Oe,T]2USFNX +TqVCZ%hbJ.USFNWUSFQWUS4HV'CGi*';)%pTqeBVrhBdnUS4+]Tqe-CBTqhU^"JMTaULNEepS.b_Mr4R9+.iG+#be#eTqeBVUS-KE +nc/bH0J+gI0)ujc('GKj(`!\3!"MW7]t:ti]=khi]t49;\c02H\\#Pc]=khiUA+`]!!]72]=GVe]DfJM +]=kh,!5#nS]=\'U"1u7Y:#u?V]=kiT]`bs\]=eF3!;F2+]*Q*^]=GVe]=kZS]q4Be!kZ.XrOi?G]t:r^ +kQ(@j!P;%_!!/\+r4W*A"hhO[TE"u.!;E5kV5'eg!n@8QTsCu1rNZF0riuV+Z*JN9!;Ec"Z_HmgnGiVM\$c4@!42X0"0o,;54h)8>6S8: +?!CMer;Zfuo`4(R"-'C`Y5PF%Y5YL)!(Eukri?1(Y,qW'!j&M`mJm?UX0/Q'Y5YL7Y-+k-.fcNOY,n_- +XK8S.Y)_`HrW!$OX08])X9>]-Y,l'p!<0&"Y5G@%XfVN)ri?1(XK2<$!L3uV!!=dQYHIi*"Kni/XC:Ao +rrDep!NqF>!!4^MX8]1#Xo5='Y-+fodJsCQ1bpjBoeQS(q1/Hq!e>kme,TT/USFO]UB%"eUB:KcUS7[^ +#bdreU8+HXTo8=="-]LRU]-tdUC!WfUSB@?V4jQW"/DQbU]-qeN91*B/Yf#5rM'LhUS4Glk5bLV!29=c +!MQ:fT`q3cUS4HWrM'CV$0hKm/Yf#5rM'LhUS4GlkQ(@P!MPG/!!+[JrM'@drM'IgTqb*9!:g*m">qti +0(^gm('GHk)&=%;!!>j,]t=6V!5&6D"onY<\\#Jerjr?E]=GVc9)8P\!!6fF^&5JU]tM%i]tj[K]t_%i +]=Ybi]=kgNjT#@o]t=6V"M;@Z]a!X"rk/`P]tM%i]t(be\\#Pcrjr3?]`YmY]j^+)!kZ.XrOi?G]t:r^ +kQ(@j!P;%^!"HQR]t:ne]tM%k\[f3eZEsM8"LGD=Z?>^ZEpX\!!F$#5X.O+5P\Lf +>[1K<>?hC'!9=+^NNB4arN$"%ri?5&!/IYYrN$7,XK/M+XK,@j!!6T-XT#@tWrN$.)XKJX5k5bL_!3Z1""0JZ+Y554%Y-+gXl2Uo;X08])X9>]-Y,l't!<)um +X9#J`h>dXdW3!-"X9Gc1Y,n[sdJs@[0f(TX1]K9+J,k0"J,t3.eGo]0USFO]UB%"eUBCPsJYJk:UBdKf +US4BVUK6ja!b/"$rh0drTqS6UUS4Gn!!&jiT`h-cTqeC^T`C&6!!=gJTqVF["JMTaULNBdrhBIeqP+.d +USFO\UBRBeTqS34l2Ul;US.[]rM'LhUS4GlkQ(@P!MPG.!!Hc-US4F]U]-qgUSF49!:^$l&2H'r1%[-o +('#3N('#0#!!>j,]t=6V!5&6D!rr9\oaU#.qRZ\\5\g]=n3U!.j&.i;i\K#,IufUSFK3eGo]FZEgh8Z2h61Z4R':$ELJ=BerqeGo]2XK8T'X8oF&X9JY)#GA0"Xo5=*X/rD*X/I'0!!OmOX0&J*qlBk$XH!2Z"K8K*Y,hQ' +"0Si1NogtWrN$.)XKJX5nGr:`ri?+&qlC")TVnllY-%])!3Z7$!+G0n""^LVY5PF)Y,ne-@H[^c +X9#J`mf;eV!h?\D^&A!"6Un,Np2\[f>^^:V"j]=GJc9`>"o]tM"h +!5&6D"1u7Y:#u?V]=kiT]`bs\]=eF3!<0YJ]=kni]=khiI\=Bd]=GVe\\#Pe]=kl_l2Umt]t=6V"M;@Z +]a![#pUpU>9\f[WI_35*\\5Vg]=khi]AWbJ!;WApU8+HXUnaY2ec5fGZEgh8Z2h61ZMjh/3O?&tZa-mC +rNZO4Z`"60!;HO"$`gV?ZEga?Zi764Za-nTrW!)1Z*C[BriuX4ZE^.d!!>3eZEsM8"LGD=Z?>=1riuO1 +qm$R8T38P-Yd(L?ZEaJ8riuU4ZqBZb"$!WmZi.04Za-jAFm&i"Z2q;+h#IjA[^39FZa-pCZE^^B!.iT! +">N)*5="j*pfdr.>?k?9=Uip^!fa:_!3Z:%!3Z=&rW!H\X/i>)XK8S+XKSb/X-O"_!"T@.X/i>'Y,ne0 +XK8J(UD!P+!3#n"!3?+#"0Si1NogtWrN$.)XKJX5nc8@`ri?+&qlC1+O@QCSXfSV,XK8K#X8kDlRU8+EWUS@[]!'BNI""g:AU&C_hTqe9\]UK^Ua?U#JIXZ]t:tm&E@2pTah+ +U>,_OTsV)1Zi.03Z*L^;i;iHL"$f(95k@59>6eD9?!UZ:>tNTI"-'C`Y5PF%Y5YO$!!-N2qlBe"rN$%# +D>XD0!!ISLXKAZ'X9>`/XJ\,X!!&tsX9Yf/XK8S.Y)_WE""^LVY5PF)Y,ne-@HRXiX8oF"X9FXbCoj_@ +r2^+(XKJY*UEAk'""^LVY5PF)Y,ne-@H[^cX9#J`g].>6ri?+&rN$+(XK/#C!!4r32"EHuJ-UXUJUW-$ +Jo'!<",iqLU&C_dU&Lhc!!-T'rM'FgUS7[^!huH,oDf#=TqeK8US4C[UBI9cTqc)e!;?KmUB%"dUBmTgUPJndUS=IYUBI9cU7`Xr!!=gJTqVF["JMTaULNEepS.b_ +MsgZ6!!J4TU8+F\UB@3bUR9L1"#MVa1%R'o('bZk)&F&'(^0C0jT#BT]tM&V]`>\D^&7p2#QD=<]t:hg +\c08D\[rLH!"C*^]=GPc^:V"f]stbdqu@,:]t(be\\5\g]t7#'!;um!]=kiT]`bs\]=eF3!<0YE]=kni +]=GJc8,s7:\\#Pe]t:uW])o[VT'H@X]=kiT]`bs\]=eF6!<3&n]`G`=g].LM_7@7k]DfMC])[E!!!!#p +UBmZkTVA3UUnTsL!!!&T!!Aq#ZEsM8!42[1qu?hqZa6q8ZMq04ZE^f-p&G+^[/R<:ZEpmCZa6pB[#Y%a +"1PVAZMh'2Za-j1jo>KCZa-q9Z37M>Z*JN8!<08(Zhgs2T)\kbZa0P9#dU_AZE^[AW!i"n"$!WmZi.04 +Za-jAFm&i"Z2q;+g].@E[JI03Za-mC.H:F"!!EWo4[2.%5P\La>[%,2"(#)6)qP&lNNB4arN$"%riH"t +!h$3nr2^+)Y-"n/X#U(Yq#CFRWW'%&XKJ\,riQ=(XEaXC!iW6(r2^"'YHEoJ!!=dQYHIi*"Kni/XC:8l +ri?+&qQ(!a!!&"]XKJ_.XTGT*Y5PF&Q3cmY""^LVY5PF)Y,ne-@H[^cX9#J`g].F8X/rN&X9,Q+X9#@D +eGoXU1bntboJ?;n#_@JXIt3$(K.Y[T!fNhK!29@d!29Cequ?h]TqS4ZU]$kfU8'aB!!,'Urh0FhTqJ1[ +T`V!aGPhFBV4aO[U]-qeN91*B/Yf#5rM'LhUS4Glnc8@`rhBIeqP+[]!!%qNUS4BSTqe?UUS=KXOpLIU +""g:AU&C_hTqe]=kni]=kni9)nrarOWBG\\5Pc]=GJcA*a0s]=kiT]`bs\]=eF7!<)um]`G`= +gAhAi]=khir4FXK!;N;tU8+BVU7nBE"Tn`)!o*bXTsCu1rNZF0rj)G%!?86AZN@G;ZMq05Z*LX@ +$MXT3)7-ZSZ*L[?ZEpgCZEpA7qu?f-ZEaM:Zi764Za-j1jo>KCZa-q9Z37M>Z*JN8!<08(Zi.0:Za$d, +!!!A'ZEpn5Z3%A=R-jqU34#mjZi.04Za-jAFm&i"Z2q;+gAhYbZE^dC['[0EZ*L]Nj8e`N"WT`k5X7O* +5PSFg>Zk98>[(E/"8r3"!o3hYNNB4arN$"%riH"t$5BAK7X08])X9>]-Y,l'p!<0&"Y5PF/X0/Ue!!!7kXKAZ%X95Z/Y(Q-B +">$UWY,qW("Kni/XC:;mpT+CuNS=FASZJlpXfeh-XKJY*@US4C[UBI9cTqc)\!;E5h +To7Y*!h,mYrLj@hU7n?W!*@\N!usD,!MQ:f +U'.3eZEsM8"LGD=Z?>=1riuO1r3?C/Z(M!q!@FrFZ3I\BZ*CUEK'r[A34#osrNZR4 +ZE^]Xl2^hapTah+U>#YVK!V_eZEggDZEUU?RFM9=/O2Sl56*qD>7"P@=Bf$6?<^G^fDl#5XK8T'X8oF& +XSVu-8?8nqXKJY*XK8S+Y,d3M!"OsdX/rD*XKJY+Y-"e,+Su-@W33;)!3?+#"0Si1NogtWrN$.) +XKJX5k5bL_!3Z7$!j8\frVusBVtmCtX0/V,W,1o&""^LVY5PF)Y,ne-@H[^cX9#J`gAhXuX0/V,XKAY, +Xfe^WirJZN"X5`Y1,C]X1\lP-IXd$'J:`9'L-=/h",iqLU&C_dU&Lha!"_VpTqJ0SUS=NYTqep=V4jU\U]-qeN91*B/Yf#5rM'LhUS4Glk5bLV!29=c!hlZR/h\pN0DH:f(`!o' +(Dmr(f)PkE]tFEXrOi3Crk8..#eR^Y]t:tg]tOEW!PL;a!"DK5]=GVe]t:tk]=>Pdq>^Z4]=GVerk/EG +]t7##!!9dG]D]DG]=khi#4_cf!<0Y5]=koU])YM&!!/b+r4<3I]t:ne]tP*H!!9dG]D]DG]=khi#3Z'] +]`G`=n,VeT$k^+`\\#Pc]t:kf]/@G*nY6/[RL/Zfj8]:UZEgh8Z2h61ZMFP$QN"5hZN%3/ZN7RLq>_"> +['[*DZa6sC['R'CZ"Wt6!OB'/Z3.G=Z(gL`r;ZpZZa-q9Z37M>Z*JN8!;Wo&Z*CX,r;Zjg\Gif9Z*L_7 +Z3.G>[9)ht"$!WmZi.04Za-jAFmB&,!;Ec"Z_H1S""(F]ZMq02ZEaD8!3=WM"[G=85!D7*56F,7>?q)1 +$X?q@>[1K;>[(^LqrN$=-XfSV,XfS\,=S`"!XKJZ& +X95W/Y)_WE""^LVY5PF)Y,ne-@HRXdXT#@&OSo.e32im[Y-+k,XKS_/ri6#gn,NM@X02N+rN$.)XKJX5 +kQ(@Y!NqF:!!=7BXK;E'"g"f.Y,e5V!:g*n1G^^A1,Sb^!&FO0!J#b!J.$pZJ:W9%J:W6(I0J:(",iqL +U&C_dU&Lh`!!@hHUS.R\rLj:eV,d?l%T]@"U8+BSUSFNVUS4D_q>^PkU&LhdU]-qeN91*B/Yf#5rM'Lh +US4Glk5b=Qrh0=Kr;ZmZV5+$`"f%feTqe=\UB!gR!!FmKTqS7\UBI9cTqc)\!;E5hTo7Y*!$;-7rh0Lj +U7n9UR,S,j,]t=6V!5&6Dq>_'`\\P_g]=khg +\\#Ja^]=E8qu@3.]tLti\@B/_]t(he\H;U-!kl4Xr4N3E]t7##!!9dG]D]DG]=khi#3Q!^^&GVD9)JYl +^:Uqf\H9CP]DfMC]C#Y#]=kiT]`bs\]=eF4!;F/-]1goYrk8oA])[;s!:cfcUn:Q_$5X0]+Q.k6>?kE;>?kB8>pf4EjT#CBXK8T'X8oF&XSMo'#GA-!XfS\- +XKMQ(!ir(;qu@3KW3!&$XKJY-YH=t/XG6NN!N`I$X95W/Y)_`HrW!$OX08])X9>]-Y,l'p!;W\uXfSUc +qu@7:X0/V,XKAY,Y,n_*XJ[-0!!=dQYHIi*"Kni/XC:AorrDep!NqF9!!&hiX9,N*#M/qU$1]kR1,C]f +1Ot&TJGt*+J:W9%J:W6)Jj7og",iqLU&C_dU&Lh`!!rmtUSFNXTqS3SrhBOhTca14%NqUCU8+KWUS4BS +TqeB2q#CMlTqeC]U]-qeN91*B/Yf#5rM'LhUS4Glk5b=Q"/2KbM>R>[A>>ilUS=HUUS7X]!M1D'!!=gJ +TqVF["JMTaULNEepS.b_MqS.2T`1\dUAUbfTq_kR!;$6q#r+"`.P37I0*O$_0ejF\r>,AL#Sn6o()@`& +(`:m*"%p8?]D]DC]DfM>!!dtb]t(be\[h^O"227>!;ca&^:h(j]t:tg^UX9T!&=9L!kl4Xr4N3E]t7## +!!9dG]D]DG]=khi#3Q!^]`YgW]1Vu$!scHM\H9IT\c02D]tM%kT^Mj^]=kiT]`bs\]=eF4!;F/-]1goY +!1j,&"hD7W^:V&Z\\Gu]nY65\U6lJmgAh;KZEaJ:rNZF0rj)>""ZE`nZE^b7Z37M>['ck1!!B1-['T_: +s0;R/!Nuk+!!0C3qm$=1ZE^.d!!>3eZEsM8"LGD=Z?>^_$ +!9=+^NNB4arN$"%riGnq!%RuLs/u=%"Kec,X-WY`".$!hX8T."Y5YL'V?cns!N`I$X95W/Y)_cIr;ZpN +X08])X9>]-Y,l'p!;C(XfIrsnc/bCX08])X9>]-Y,l't!<)umX9#J`g&M,, +ri?+&rN$+(XK*o(!!*ikr\=L12>/g,1G\QP"bD2VKR4'[!!A.SUS7X]!29Ceq#CCFrhKLerM'@crhBIV +qu?h^USFR^U]7%eUB-qkq#CJkTqhO\rh0=Njo>K8US4C[UBI9cTqc)[!;I8YK;5-7TqJ*SU&Leh +Tqe%]nc/_CUS.[]rM'LhUS4GlkQ(@P!MPG*!"=CQUS=HWUS=NWUSBF&!:p0k(GYn?!A,kt0*(sfqu@19]=kbe]=kng]=YbgT(i9g]t:ni^&G\I +]=kgNjT#@o]t=6V"M;@Z]a!X"p:UGuqZ%*a]t(\c\@K;`]t:tg]mfGN"1u7Y^&G\J]=khi#3Z']]`G`= +g&ML:]=kbg]=kbg\\5W7!9!qJUB@3cTP)sY"/3$+Zi.00Zi79*!!@ANZa0S:#I:YBZE^aCK)P`MKDr1a +ZE^^?ZEga@Z`uIa!!0C3qm$=1ZE^.d!!>3eZEsM8"LGD=Z?>=1p9F[kqZ$^)WO/r=Z*L^BZEpjAZEpm3 +nc/bOZa-q9Z37M>Z*JN9!;Ec"Z_H.R"a%&TZ*L_8Z2q;;!OZ"\!!P)?5X.M!pHSUAnll9&>?b8g!o!\W +NNB4arN$"%riGkp%UlNBYH=t0XK8S+Y-+jBrW!+=X/iA+Y5PF)Y,nb,/,0)FXKMH%"0Si1NogtW +rN$.)XKJX5nGr:`p8e7TqZ$X$Qi3ufY-"e-ri?1'X,ZZM""^LVY5PF)Y,ne-@H[^cX9#J`mf;\S"_4X: +Y,n]'X95W,X%(\@"su#\1G^jCq(i./1GgmDnpgjoK8+tTp&O1S",iqLU&C_dU&Lh^!!$L-TaIHdTqeBV +US4BVD#ODED53l!TqS6UUSFNXTV="4!!/jgqkO.a!0$.BrW!$PUS4C[UBI9cTqc)[!;I8`#*YgW +U8+ETUS+BVUS4H@nc/bDUS4C[UBI9cTqc)^!<3&nUB.'Hg&M4`US4CZUB@3bUIWo9"t22[0/#"3q(Dh( +0eb<^1%H(^(`+&*f`2+H]tM&V]`>\D^%_R6#/.R\\@];`]>+?W!PK*E!"BRQ]=>Pb]t(bg\\5M`pAbe\\5Vb]st\b]t(aKnGiX&]t=6V"M;@Z]a![# +pUpU>9\KIH#5l+5^&GVD^#K+N!:Z`cTq\:mgAh>LZEgh8Z2h61ZM+>$W3`e8rj)d8ZE^aAZOsQ'!&hKCZa-q9Z37M>Z*JN8!;Ni$Z*Ktt!!+OT"15D>Zhq$1Za-oi +o)JkPZa-q9Z37M>Z*JN9!;Ec"Z_H.R"ZNcmZ*L_8Z2h34Za=l-!!EBh5XIa/56F/95="aC"Bo&7=pj!a +!fa:_!3Z:%!3Z=&pAbhkX/rD*XfJV+Y-+t1X=F9#W2op##ct/0XfSV)X)Re5!N`I$X95W/Y)_WE""^LV +Y5PF)Y,ne-@IaEl!;NVsY,m`]!!47;XT#C"X95T+X)7G.""^LVY5PF)Y,ne-@H[^cX9#J`n,VbS"YQp[ +Y,n]'X95W-XC9`]"p-V;2)@!CpbMn*rA3to"GMM]Ka[YUj8]:?USFO]UB%"eU\=`gP5_3ZTqS6TU]$ki +UFZBqV5+$`#c")gTVA3VU29Q(!Mc@cU]-qeN9UEA!!=gJTqVF["JMTaULNBdpnInaUP\gI![+/2rh94a +"/)EaD=[`0/Yf#5rM'LhUS4GllN$napS.b_MqS.5/>/]1r1a@fTqc)L!!WKY1bgg@0_d:&0JP9_0/;u4 +!uMjk(tnrl9"hpMrOi3Crk8%+%:Ql^]=YVc]t:he]t(iU!!'_1]*Gm[\@K>c\J"W:!kl4Xr4N3E]t7## +!!9dG]D]DG]=khi#3Q!^^&GVD9)/GjTY7tJ]=n0T"MM=W]+XZ7!P?#F]D]DG]=khi#3Z']]`G`=f`2,a +]=GWS]*,gZ\\/4/!8deHUBI9bUSDJV!!Aq#ZEsM8!42[1pAc3PYd:U?ZEpmB['I$EZE"nI['HsBZ*L^@ +ZEggCWV-;mZEsP9riuX4ZE^.d!!>3eZEsM8"LGD=Z?>=1p9F[kq#COW['R'Cr3?L2ZEggD;k49"-'C` +Y5PF%Y5YNs!!3h1Y5YL-X0&P-XKAP)&"sZ7XK8S.Y,ne/XK8P)QhCC[XKMH%"0Si1NogtWrN$.) +XKJX5k5b4W!0?pU!A(;PY4o"!X/nb^!!=dQYHIi*"Kni/XC:;mpT+CuNS4@5/?AcQ"fn`+Y-+i,X(0c^ +#7NCE0f1XA1AEX*1B'*"J-:=PKnN=X!!A.SUS7X]!29CepAb:0TqS4[U]-qmUS4EWR1u6fU]-qlUS4BV +US4EGp&G,gU&1VaT`C&6!!=gJTqVF["JMTaULN`npAjo^!/^LO">-CBUS@[]"eqceU8(3M!!=gJTqVF[ +"JMTaULNEepS.b_MsgZ4!!+RErh9=d"JMNaU1DmV#7N=A0/,1:0_m@&0eiS[mhPpA)"msk!!>j,]t=6V +!5&6Dp&H)+]=GPf]=GPe]t(\eK)hRX]=Ybe]t:hh]=GI`p&G0-]=\!S"1u7Y:$DZV!!9dG]D]DG]=khi +#3Q![]`:\"!"HWR]=GVe]t:tg]=thjnc/a']t=6V"M;@Z]a!a%rrDf,!P;%Y!!9dG\b`o=[g9nP!!)Pa +#,7leUS8;#h#IPNZEgh8Z2h61ZM"8'4%4ZEpjBrNZO3ZE^.d +!!>3eZEsM8"LGD=Z?>=1q6C+/ZEg(s!!d8GZa-jB['K\;"L58>Yp]2E"$!WmZi.04Za-jAFm&i"Z2q;+ +f`2DcZa$gAZa-jBZEokX!;-0>?tB9"l'([NNB4arN$"% +riGen!D'?lX9,Q+Y5PF'Xfef'X9Yo2XKJY+UD!8#!N`I$X95W/Y)_WE""^LVY5PF)Y,ne-@HRXdX95T+ +XH*&U#Ze%/YHG"1XKDK)"0AT%*q]L8/?>tWrN$.)XKJX5kQ(@Y!NqF9!!r\-Xfeb,X/rJ+!j&GUfDl-r +1GU^A1,Uf]1BfNi1GFB2rI=m!rdY!"qLAZsKnBcg!!8(RUB%"dUB%"eU\4Zm7\QTPU7n?UrM0@crM'[n +US4BVTq\K8US4C[UBI9cTqc)f!;6EgUB@3bUPegH!EZ&oT`Lp]rh0FhURrY$ +!!=gJTqVF["JMTaULNEepS.b_Msp`3!"5QqTqeBWUS4BVUOUnr#9#6H/h\h41AEL+0JP:7(`<2e!#Y\N +!#YVL!>cON(\e!k!!>j,]t=6V!5&6Do`,*)^:UrQ]+D]e]=GYh]tV%j\\#Je\\4a1!!9jG]DT>E]=kgN +l2^_^!kZ.XrOi?G]t:r^k5b=k"1c%U8b`8q!kl.X\[fDc\@]A`]tL96!!9dG]D]DG]=khi#3u9g!;F/- +]1glX$bNs[^:h(j\[fGd1;s7n!:cffU8+EWU1E$Z"/3$+Zi.00Zi79'!""stZEgaAZEpjCqm$R6Za-jA +ZEpgBZWI,+!!2lq!j]/3eZEsM8"LGD=Z?>=1p9F[ipAb__Za-g@Za-mAZE^^?Z`XW. +!!5-dZ2h60Z37M>Z*JN9!;Ec"Z_H+Q$ad1DZEpjCZa-jAT]H1G!!P>I5!D+pp-/XE5l7e+>khM, +>[(H:=#o%9"-'C`Y5PF%Y5YNq!!.hTri?7*XKAS+ri?R4XK8S-XKJY+Y,ne,7eH`^XKMQ(ri?4)YHEoJ +!!=dQYHIi*"Kni/XC:8lp8e7UpAbAEY-4t/Xo5=)Y,n_*SHecf">$UWY,qW("Kni/XC:;mpT+CuNS4@@ +!N`H,XKJY-Y,ne-O5g66!!"SL1]oKi1,AY]!&FO0!A/m#J,k/pJ-:IQKnE.U!!A.SUS7X]!29Ceo`+uB +rhB^mTqeRTqS6TUS4BVT`LpFfDl.)/h8G'/hf*W +0*O$a0/4jlr"]8LpD*iI()Re@!!>j,]t=6V!5&6Do`,=T]=kng]=YVe\\%jS$bO$]]=khj]=YVc]CZ() +]t:oS]`Ym[]1qAe!kZ.XrOi?G]t:r^nGr:`q7Zd>!(utc%O&Ht]Y:nh]t(be^:Ck.oDes)]t=6V"M;@Z +]a![#pUpU>9^_uI!!'e4])]PD])oOT9#CW5V4aNVUS=LXUB[HfUn=BT'_qaj!!Aq#ZEsM8!42[1o`,%$ +X0_c1"gPD@ZEph8Z2q>=r3?C1[$^Ic!OB'/Z3.G=Z(gI_rW!$[Za-q9Z37M>Z*JN8!;<\uT_AEs$`UM> +Z*L[AZa@$CZEps6p&G1SZa-q9Z37M>Z*JN;!<3&nZ2q;+f`2&^[JmH9Za-mCZEp:Y!!*Bkr]gBIq`b9M +5$P69q-+&.>$"p/>6Na^"-'C`Y5PF%Y5YNq!!W_%XfS_-XT#@(XKAZ)X9#K+r2]t# +XFp-F"0AZ,XSo4&Y-5!gjo>K7X08])X9>]-Y,l'p!;]-Y,l'q!;EPqY)V*7!N<'uX9Pi/XKJY*NT:*5!!icb1,:XC1G^fb1Cu;t1,C[@1bU2.IXcltJ:W:H +J-CFWJ;&Uch#IP8USFO]UB%"eU\+Tk#ah<\TqeC^T`CkfU&LheU&:YeU8*;3!!/jgqkO.a!0$%?""g:A +U&C_hTqe[.k +TqeBV!i)KJf`29^1b^O6/2&_6r@\^90eb=90JP.&()@W#'c%Q%p_EuI()@W$g].CJ]tFEXrOi3Crk7q( +"+[qq^&>PS^Uq%g]t:ni\\5Ve]t:hg1\:YK]t:oS]`Ym[]1qAe!kZ.XrOi?G]t:r^nc8@`p:UGup&GS6 +]t(\f]st\f]t:ti\PMku!kZ.XrOi?G]t:r^kQ(@j!P;%p!9sOl]t:ni]=Ybg]=kaK_Z0\1rLs@gTq_=W +rh9IhTkO9&j8]:UZEgh8Z2h61ZLe,$2m]fpZE^\5ZN7AD@[tFDT"$!WmZi.04Za-jAFmB&,!;Ec"Z_H+Q +$b*LLZa@!CZEpgAU=fMO*'cbR5?kA->68&7>5h_+3SaZ;NNB4arN$"% +riG_l"=pOSY,qW*"Kef/XKMQ(!3?+#"Kno/S-SZd!j&Q+r2^"'YHEoJ!!=dQYHIi*"Kni/XC:8lp8e7T +p&GU:VlQo#Y-+k.Y-+k/X/Kn0!!4^PY5ka(X9>]-Y,l'q!;EPqY)V*7"K8E(Y-.c*"0Sf.No^96!!$=CTqhLY!Mc@f +UB%%fUBI9aURDG[!!/jgrhKIfrh0=Njo>K8US4C[UBI9cTqc)[!;j,]t=6V!5&6Do)K*/]t:ne]=YVa]DfDK]t:be]=thf]mfPQ!kl4Xr4N3E]t7## +!!9dG]D]DG]=khi#3Q![]`:\!!!rW*TY%hL\\5Vbrjr9G]=ejN!!9dG]D]DG]=khi#3Z']]`G`=f`2>j +]t(bg\\5\g\H0<:_Z0pbU8+HXUS+@WUC*flU8+HYTFq5)!T="\TsCu1rNZF0rj)+q"a./WZ*LY3Z2h0, +ZMq01-h@<=ZEsG6"1,;3e +ZEsM8"LGD=Z?>@2pTah+U@/*J!!0U9r3?I1ZEpm1f`2135X7P!5l!VT5X.M!5s[1S7p9/%>?kH;q-+// +>?kB<>ZqC5!W2rZ!!A4^XKMN'!3Z=&o)Jf%X731mXf\WFo)JfmY5>:&Y-5!gklC\_""^LVY5PF)Y,ne- +@HRXaX8n=S!"U-OX/rJ,XK/G(Y-+k-W(-O^""^LVY5PF)Y,ne-@Hmjm!;EPqY)V*7!N<0tX9,N)N7e1: +-SmS81GgjC1As!61,C[A1Ggp9#U3H'JU`3$IY%(30J>-Y0*3g^0`<^2+rp\"(_mf' +pD*`DrY>PO(`(p-"%p8?]D]DC]DfM8!!ih?]t(bc]=kfZ]=khe^&>PF]t(\cnc/a)]=\!S"1u7Y:#u?V +]=kiT]`bs\]=eF3!;=)+9)&Db!!0dDrjrHL]=khi]=knip&G0+]t=6V"M;@Z]a![#pUpU>9\BCO^:V"j +]t:tg^&kjW8AbE28tMcPU8%=U!2BIf!MroT!!8k"Z2h60Z2h61ZLRtqVYmb1ZE^a@ZEggBZE^aBZEnZD +!!0C3qm$=1ZE^.d!!>3eZEsM8"LGD=Z?>^ +Z*JN9!;Ec"Z_HphlMpnkrj;[2"gYJ?ZEoVG!!rio5X.Lt5!M4rr'(WU5k_G-?!CT> +>[(AdqZ,[W"-'C`Y5PF%Y5YNn!!&DcWs#T-XK8T(X8oC%X9>].XK,n&!!01(qlBn&YHEoN!;um"/?>tW +rN$.)XKJX5k5b4W!0?aP"%TGoY5PF'Y,nf*X9#4>q#CLJX08])X9>]-Y,l't!<)umX9#J`g&MNcXK8S, +Y-"e.XKSaOg&MB]1,LdC0etO?r%eO41GUaB1,9%W+?4b!JV!NF#Ch8QJUW-(7G\"HMkd&@rM'@drhK#a +!0dDW&>>emU7nceUS7X] +!hlB_rhBLd*r,d;/Yf!>U&C_hTqej,]t=6V!5&6Dnc/Z#rOWTN]t(bc]=teh]=GPa]=S== +!!L!I]=koW]`Ym[]1qAe!kZ.XrOi?G]t:r^k5b4h!(uh_"22CY]D]GB])o[ZUA"Wi]=khirk/HH]t:r^ +kQ(@j!P;%Y!<0Y5\\#BN])o[U+l`R]!!G`7U8+L_U@Y,]U6c/b!!!&[!!Aq#ZEsM8!42[1nc/q5ZF$sD +Z*L^A!j],KCZa-q9Z37M>Z*JN8!;<\uT_AHb!!8.dZhgs2Z*UdB +Xpb(+"$!WmZi.04Za-jAFm&i"Z2q;+g&M46[Bm.:Z3%A=YlV.Rg&M?q5X.Ft5?tK=>$Ui,!F8t/>6.h,hZ*bn&u2P1ri?7*XKS_.ri?+&ri?*\nGiTkY5>:&Y-5!g +jo>K7X08])X9>]-Y,l(%!;?KeX8n=Q!!7AFY557!Xob\p#l4N'/?>tWrN$.)XKJX5kQ(@Y!NqFN!:0[f +/$#eTrN$.)Xfea6g&M6g1GU[Ar\OR0rA+s>1GUaB0eFRm1L,EZJUi=GJ,t.NrdY'&Gm+!EjT#C@USFO] +UB%"eU[eBm';2+oUS=NWUS4HVrhBIerhBILnGiTbU&1VaT`C&9!<)s#/Yf#5rM'LhUS4Glk5b4N!/^:I +!d:?4qP4%`!i)1iq>^ULUS4C[UBI9cTqc)^!<3&nUB.'Hg&M4+US+=ZU]-qfULW!X#no$G0/,%40eb6Y +0*a0c0JP:8.ieg8!!*fN(`2l]!>cUP(',3_h>dXM]tM&V]`>\D^$u(1T"V\J\\5Ve]tM%kr4PCIeWmE]=kiT]`bs\]=eF4!;F/- +]1glX$ba'\]=Ybi]=GJa#NPmC!!Y_]S"cXPUA(DaTqeC]U&\$I!!Aq#ZEsM8!42[1nGibp\$N?FZa0b> +Z*L\7ZNRS?ZEjo.!!0C3qm$=1ZE^.d!!>3eZEsM8"LGD=Z?>=1p9F[kp]10k#c+f4ZE^^@Z*XG8!jT5/ +q>^UWZa-q9Z37M>Z*JN9!;Ec"Z_H.R#$/(:ZE^a@rj)[4ZZXt%!AQh<5lEnI55[VR5X.Lu5;Oc=0/Hd< +?1hD-?!CE8>[(>Z!T3qZNNB2]Y5PF%Y5YNm!")2oX/rD)XfS\,XT#@*XKJY"#OqcpXKMH%"0Si1NogtWrN$.)XKJX5nc8@`p8e7Tnc/r`X/rD*XK8S-ri?1(W/^WR""^LVY5PF)Y,ne-@H[^cX9#J`n,VbS +"%B8nYPt[.XfJS,Y$p#a!@BT#1]9*-1Cl5s1,C[@.3Tih2gTt&J:IVb]=5KP]*#aY]qFip +!kl4Xr4N3E]t7##!!9dG]D]DG]=khi#3Q![]`:[q!!ZlD]=khi^&GVH]tV+j9_eYh]=e3VrOi?G]t:r^ +kQ(@j!P;%Y!"6?L]t(be\\#Da]*@?shZ*mH5B``qUna[ZUBmQgUS=KXU6c&_!!!&\!!Aq#ZEsM8!42[1 +n,NKW[/R<@2pTah+U=oSNFgSK[Za9Y:"1,;>8E0^G!!rfn5X.Lu5X.Iu +q`bTV574\?>?kE;>?:n,!!2*["-'C`Y5PF%Y5YNl!!\(WXKJY+Y5G@(Y,nb. +3:HnKXKMH%"0Si1NogtWrN$.)XKJX5k5b4W!0?jSqu@'1UTCMtXKJY-XKMN'!,_T5""^LVY5PF) +Y,ne-@H[^cX9#J`g&MIgY-"k0X08V+Y,hZ+3SON@"#;\g1GUaB1,C]a1Cu;t1,C[A,U"FtUBI9cTqe=[UB#0.!!=gJTqVF["JMTaULNEepS.b_MsgZ4!"<>1TV8'S +TqeBVUS0a'!"&fa0JbF;0eY=;0`?kB9>$G,LhuEk=XK8T'X8oF&XRH2n#b\9$XKDT,Xo#1#X`3_/!N`I$ +X95W/Y)_WE""^LVY5PF)Y,ne-@HRXaX8n=V!;Z["*j2QHY,nc%X9#=jqu?gMX08])X9>]-Y,l'q!;EPq +Y)V-8#)oXeY-4n-riQ=(Xt8<-";cOL!9=+^9"hpMrOi3Crk7b#!e@hlrjrHH^:V(h]=YTcmf3F& +]=\!S"1u7Y:$M`V!!9dG]D]DG]=khi#3Q![]`:[o!!0^BrjrHH]tM%k]t:njq>^T/]t=6V"M;@Z]a!d& +rW)]+!P;%Z!!Z!-]t(he\c02A]t;2_#ljrh5sBLcU8+F[U]."`UB.*NhuEkQZEgh8Z2h61ZL7c'34,us +YHkL?ZEUX>Z`+<#!!9I4ZM_!1Za-j1jo>KCZa-q9Z37M>Z*JN8!;<\uT^VpaZi.06Za6sCZ`ttX +!!5-dYmI_AZa-mCZE^]XkQ(@_!OJNT!"97C['[0FZa-mAZa7.%!;?Ho1d:@m!&X[)$o0Xp86oD&>[(H; +>@%55q-*l%:uDK7X08])X9>]- +Y,l'p!;CM-SIt3*#J:I9C!JGRQ!!A.SUS7X]!29Cemf3>>rhBLg +UB%"dUB@0aP6^OV!Mc@cU]-qeN91*B/Yf#5rM'LhUS4Glk5b4N!/^FMq>^LbrhBIerM0@c"/DW_+T29A +/YSm9UBI9cTqc)\!;E5hTo7Y*$OEN$TqJ0SUSFQWUB%.E!!4T%0DI7$0E*X00/,(+*?H:$!!!&t('>Bh +()QWZ!".Wa"%p8?]D]DC]DfM3!"?WU]stbf]t:kh\%?5>!!9jG]DT>E]=kgNjT#@o]t=6V"M;@Z]a"!, +pAjp#!(u\[%DTTi]=Ybi]=YVe]t9m5!"6EN]t:ni]t:ti]a![#pUpU>9^_uJ!!BjH]t"$Q"1c%U]tsaQ +6pEq.SY?%X!2T1\!MDLP!9F1_TsCu1rNZF0rj(ql#BmGZZEpmCZi762YpSl=!OB'/Z3.G=Z(gI_rW!$[ +Za-q9Z37M>Z*JN8!;<\uT^Mj]K=(W`!jf2>rj)a5Za?kCrW!?d['?mAZa-mCZE^]Xl2^hapTah+U>#YV +8$oV.Za6sCZa-pDW7q:R"[>9@56[(H=oihH#*8pl"NNB4arN$"%riGMf$t6K7X08])X9>]-Y,l'p!;gO;Y,nf*XTY`-XITXr +!!=dRY-&&3XfSV,XKJX5kQ(@Y!NqF:!":igX/rG*XK8P*XfI`I!;QTs"#;Ygq(`%.1,:Z`1'o3L+sJfs +0K4<-rdY*%Jq8FFJ-(=S/`?[3Mkd&@rM'@drhJl]"(S%"UBmQfUS4BVURiOp!!/jgqkO.a!0$%?""g:A +U&C_hTqeg41TqhU\"e_WaURDJf!":HSTqS6TUSFNXTqc)\!;E5hTo7Y*!'1%R +#,%ZbUS4HV!Mbh4!!<V""u>^0DmL++s%aFr;Zj5)#b9Q(`+#*p(dZF(>o/o9"hn<]D]DC]DfM3 +!"0%D]t:hc]=GVe]q4Tk!kl4Xr4N3E]t7##!!9dG]D]DG]=khi#4_cf!;=)+9()`^'"tojrjrEK\[f5^ +\\3Ok!"6KP]=kbg]t:ti]a![#pUpU>9^i&J!"6QR]=>D`]t(he]4&PV#=C^B5^&lsU@=oYTRQk?j8]:U +ZEgh8Z2h61ZL%VoWO0":riuX4ZF+H7!!0C3qm$=1ZE^.h!;um"34#osrNZR4ZE^]Xk5b4]!2/`[!29Ct +r3HR4Z*UdDUAb,m2u^)_Zi765Za-jAFmB&,!;Ec"Z_H1S%$.d%ZEga@Za$gAZ]XK8T'X8oF&XR,upQ`R?kYH4h+XK,Ch!!97)XSf.%Y-5!g +jo>K7X08])X9>]-Y,l'p!;]-Y,l'q!;EPqY)V09 +!dUlMrN$""ri?.$GiSl"!!^U31G1?V0FTZh0J>%30eb1$*?H:# +!!30:)=SCC(DHr0!!>j,]t=6V!5&6Dm/R6"^Uq#V^&GVF]tFL7!!9jG]DT>E]=kgNjT#@o]t=6V"M;@Z +]a!X"p:UGupAjsg!D:**]D]8?^&GPC]hJA)"22=[\c08F]=khi#3Z']]`G`=gAhU)]t:tk\\5Vc]t:fT ++Mn*`5s@\%8>)ZNrM'@goqMSaU*nq#"/3$+Zi.00Zi78t!!sRM['R*EZF%!+li7'lZhq$1Za-j1jo>KC +Za-q9Z37M>Z*JNB!;?KeZ2gQc!!s(7['R$CZa-pDriu^6Z\/;Y2u^)gZa$gAZa-jAFm&i"Z2q;+mf;bU +%19SNZE^aBZ*L^?Za*Ze!!4rA557AA5QsA;5QS,6>k_G)>[:GCrW)$["-'C` +Y5PF%Y5YNi!!Et1XKJ](X8mk=!!01(qlBn&YHEoM!<)s#/?>tWrN$.)XKJX5k5b4W!0?OJ(($b=Y,n_, +XKAV+YH4e*D?'YeXKS_.ri?7*XKJX5l2^hapT+CuNSFL9#H4f,rN6=*Y-"k.7b[nF-T!S7q(hb%""YW? ++UB5G/i#.?I"-VEJHCFTJbOZsIY!.miW'(=USFO]UB%"eU[8$a'VM4pU&C_dJa<@=US4HXrM0@c!0$%? +""g:AU&C_hTqeJo6#bdufUS4HVULNEepS.b_Mqe:7 +#Gn,hrLjCiTqe',DD`(]kKj)"n^G)&D02"%p8?]D]DC +]DfM1!!/b+!P>o@]`9hS!!9jG]DT>E]=kgNjT#@o]t=6V"M;@Z]a!X"p:UGup]1!f%Y;C,\\5Mb\[f>c +]t:lirW!><]t:ne]tM%k]=eF4!;F/-]1grZ$GF'b\\#Ja]=YYd!5$&I#Og!sh7X61dAE5sIV! +/c@.(1,LX>1dkPQnQQ0&?!9#a!!!&]!!A4^XKMN'!3Z=&li7)VX/l3%!MB\a!!01(qlBn&YHEoN!;um" +/?>tWrN$.)XKJX5k5b4W!0?LI&Kn!PY,ne-XK/G*Y-4q.70#">X9Yf-XKJY-XC:DprW)\o!NqF;!!H`3 +X08Z(X9>Z,XK)W^!!\D^$>Y"]=YWQ])[EJ!!L!I]=koW]`Ym[]1qAe!kZ.XrOi?G]t:r^k5b4h!(uSX$DP)E\\#Pg +]=tnfrk8:2"1u1Y]*Gs]]t:ti]a![#pUpU>9\]UV#J[a]\\5\g]t(bg]AWbK!!Y\S5=.S+T)GDaU@b2_ +U8"7oirB1TZEgh8Z2h61ZKhJkQF$Rr!OF`N!!0C3qm$=1ZE^.d!!>3eZEsM8"LGD=Z?>=1p9F[kpAjme +#?J4[1S6>k_G*>$kN=#3,[cNNB4arN$"%riGDc#)'%\XK8HQlMpseY5>:&Y-5!g +jo>K7X08])X9>]-Y,l(%!;?KeX8n=J!!PfmX0&S-q5a^u*\OUur2^%(XKJX5kQ(@Y!NqFN!:Kmi#cFi, +rN?+#!NV[D!!=&n1c+n^rA+R51,L[.r?;\*0JG482gg.,JU`3$JbOZpJ,Xs"%KHLj!!A.SUS7X]!29Ce +lMq!9US7[^!%dF9!Mc@cU]-qeN9L?A!!=gJTqVF["JMTaULNBdp7hVEli75ZUSFKUTq_L\#GRugSKBAU +U&:YgTqe9\]UKTY:?8#JIa_]t(heA`<^J!!bSL +5X7Y$J>E.Z*JN9!;Ec"Z_HI[!!2ut!HtgIZ2h61Z2q>A +!,:0f"$Ah555%5?5QX/82Z,$0/28q:0/HF.r`fM/>?po,"C55:>:&;0!fa:_!3Z:%!3Z=&lMq(pSZAim +@HmgnXKMH%"0Si1NogtWrN$.)XKJX5nc8@`p8e7TlMq6-XK/G(Y-+k,Y5PF2SNF!UY-"e/XKJY- +XC:;mpT+CuNUQr9!!-N/r2]n$rN$$up+ce-1GgmE.f:Ik.kgiU!G$f]J-(4NJbOZuIt3$% +4ojXD",iqLU&C_dU&LhQ!!N[tU8+Jnl2Uj[U&1VaT`C&:!;um"/Yf#5rM'LhUS4Glk5b4N!/^"A$#HB3 +U8+EUUSFO]UCEYOTq\6SUS4HVUS4GllN$napS.b_Mqn@5A,E#$U&C_eV,l=Ns"OI+p+QY)0eb77./k7e +*W#gA";_ji()7T%pD*iI()@bH!!>j,]t=6V!5&6Dl2Us;\\#HYl2Un!]=\!S"1u7Y:#u?V]=kiT]`bs\ +]=eF3!;=)+9'ZHZ&A>]dqRZsF]=WRn\[`$[\\>bj]=khi#3Z']]`G`=h#Ilh]=Yej]=khi]t:ti!oj:< +!!Y8F5X@e+:AU[cUS@OY"/;QaQfA&JTsCu1rNZF0rj(eh"#lsHQg"JNZEsP9riuX4ZE^.d!!>3eZEsM8 +"LGD=Z?>=1p9F[kl2V'TZa7$FZEpn:Z3.A;\?Gk:#IC\@Za-jAFm&i"Z2q;+h>e$5['[0EZE^^AZEggC +\-q6qqu?j75X7V#pHJ^C5>[1S5>QJ&6q-*u,>$P63irB1@XK8T'X8oF&XQfcc +.ft]lL$8RtWrN$.)XKJX5k5b4W!0?jSoDf,OX0&J(XKJ`*X95W,W2KTq#Hk52 +Y,ne-@H[^cX9#J`h>e$,XK8P,YHFt/XK8P)W!M/Y":m:E1c4n]"Z%ni1GU6T+q5\=-8@5/1,:qAJ:<#t +omd0oJUrE!irB1>USFO]UB%"eUZqg]/;oC9kl:aZU&1VaT`C&6!!=gJTqVF["JMTaULN`npAjo^!/]t@ +#D&VCUS=NWU&LehTqeHUrM'UkTqen,NM3USId]#G[ufUS4HZ#i#C]&2Z-70Es-_ +/h\k3,5rV_*r5j<()Ied('59f(\\[J(`!V^!9F1_9"hpMrOi3Crk7Or!_c6Ckl:du]=\!S"1u7Y:$DZV +!!9dG]D]DG]=khi#3Q![]`:[i!!G0i\\5QQ]DfJS]=kqO^:V(l]=Ybg]t:r^l2^hapUpU>9\f[W]t_+g +]t:tg]=YVc^;0d[!%U8u6:!h&I&!F/U7n?VpnJ"eTVJ6V2rjr@TsCu1rNZF0rj'fL"1#8=ZMh'2Za-j1 +jo>KCZa-q9Z37M>Z*JN8!;<\uT]uLc$Dt2:Za-mDZa@$FZi%--Z37M>Z*JN9!"6*=Za-pCZEpjBZ_H=W +!Y)!2riug9Za-mAZEq$$i;i`T">)o'5="s-"[G795X7L0.Lm[Z1,(FkhM'>l@k,(ZYPu +NNB4arN$"%riGAbjT#=_Y5>:&Y-5!gjo>K7X08])X9>]-Y,l'p!;T*XKJ`$ +X9>]-Y,l'q!"5m2Y,ne-XKJY+X,Z!:!=G:oX9br2XK8S+Y,H[$!!FK&1,:]]1'TNj1,:XB0`*$r*\T3& +r\+ObJU`-"It@?E"b_MYIt0$0!!8(RUB%"dUB%"eUWri?US7R[rh0=Njo>K8US4C[UBI9cTqc)f!;6Ed +UB$/9!!EOhUS=IZU]7%_UBI9cTqc)\!!f9mTqe^^&(_di'(`E&`"W/$k'c$f1!!>j,]t=6V!5&6Dc2[pZ]=\!S"1u7Y:$M`V!!9dG +]D]DG]=khi#3Q![]`:[h!!d#I\\#Pe]t=9W!5&$>"M;@Z]a!d&rW!>>]=Ybg]tM%i]t6tp!!m/H]=kng +]=YcT])X%l!"f22.lTXX5X.P6U8+HWUna]Zq4e+dUSFWZH/nr-TsCu1rNZF0rj'fL!j]/3eZEsM8"LGD=Z?>=1p9F[kkl;&?^i,"^5,7?!Kk[!!A4^ +XKMN'!3Z=&c2[mHY5YO%X95W/Y)_WE""^LVY5PF)Y,ne-@HRXaX8n=G!!XLAXKJY*Y5YL&Y557!X9>]- +Y,l'q!!97'Y5>:%YH3`@!"O@VY,ne/XK/M,XKS_(.c:=*!!WN^1,C^A1\id21bpjB1c$U)r#uXn.5!>0 +0JGbCJ:E*#J:N4HJ-COXJ:W5Yj8]:?USFO]UB%"eUZhd@!!/jgqkO.a!0$%?""g:AU&C_hTqe+70dn+@*Vf[<(D[`%)"eXI(`!u)!os=`9"hpMrOi3Crk6SW!kl4Xr4N3E]t7##!!9dG +]D]DG]=khi#4V]f!;=)+9'?6]T"VbL]=Ybj\\%UL"M;@Z]a![#!kl4Xr4N3E]tI,.!:^$n+M#2!]=YcT +])o[X]tXOL.PX.Pr]gKMNW,[QV"UPfTqeBVUS&Rf!!Aq#ZEsM8!42[1c2[mNZhq$1Za-j1klC\_"$!Wm +Zi.04Za-jAFlrbuZ2gQ]!")6'Za-pBZa$gAZhUg/Za-jAFm8r9!!'=2Za-pCZEpjBZ_?:W#*6*sZF$sF +riu[3Yd1X1gAh?t5X.OupHJmJ5!_G!5;+Pc.L@RJ-SdG61Gg^_r`]A+oihT'>$Y?:$fq?jNNB4arN$"% +riFBF"0AZ,XSo4&Y-5!gjo>K7X08])X9>]-Y,l'p!;K8US4C[UBI9cTqc)[!;.)@!!#%YUB[BbTq\E]=kgN +jT#@o]t=6V"M;@Z]a"$-p&Og"!(uDS$,*sa\@]A`]t:oO]`bs\]=eF4!!^-K]=khi^&>PC9(2iN!!XUY +\\#Pc^&>PF]Y2!P^AnZl.m6-]5Z*JN8!;<\uT]lFa!<@;MZ*LX?Za-mDpp(%/ZE^]XlN$na!OB'0Z37M?ZEp:a +!"Y'rZa-jAZa-pCZ*CU@[5cn@!]rS3o03=B5X.:,.M4-[+X&Nq0etO?5$V;o>[1K?k8jjT#CB +XK8T'X8oF&XNgeIXKJZ&X95W/Y)_WE""^LVY5PF)Y,ne-@HRXaX8n=E!!Zl5XKSe.Xno-sX9>]-Y,l'q +!!01(r2^%(XfS[bi;aC8XK/G*XK/G)XKJ_-X/df1!;c`t/ho6V1']Tj1c$m=+X-b-%NZ]E0eY480M-hF +J:<#upj`R$J:W-!LJ?k1",iqLU&C_dU&Lh4!!/jgrhKIfrh0=Njo>K8US4C[UBI9cTqc)[!;3eZEsM8"LGD= +Z?>[;pAjom!2/HS"IZX&ZEaD7!4;O,"LGD=Z?>@2!j],?^f+#$G28>[(E5!!D?`"-'C`Y5PF%Y5YNJ +!!01(qlBn&YHEoM!<)s#/?>tWrN$.)XKJX5k5b4W!0?7B"GLAUSFO]UB%"eUWriAUS4HXrM0@c!0$%?""g:AU&C_hTqec@0!!>j,]t=6V!5&6Dl2]oG!kl4Xr4N3E]t7##!!9dG]D]DG]=khi#3Q![ +]`:\"!:Kmj28-W6\c058]`bs\]=eF4!!9jG]D]GB])fH7iW'YoVR3\7ZE^dDpp(%/ZE^]XkPt[iZa9V9!42[1!2Ar_o`,+RX0f40f1[A1,24#>?kG->6S;:>?tH?!EU9'!!A4^XKMN'!3Z=&c2[mHY5>:& +Y-5!gl2^b_""^LVY5PF)Y,ne-@HRXaX8n=D!!W[qXKJY+Y4eq"Y,ne-@I!pm!!97)Y5PF%Y5YL&NT:'B +/"iuEY5YL&X8At"Y+lZb!!Xc,1,LgD1\`^.1G^jC2#\Zt+qGkA*ZlOY0ek@:03!LNJ:[HF#C_2RJUi9* +.cp^5Mkd&@rM'@drhIa=!i)Har1j7b!0$%?""g:AU&C_hTqe.5q(N"-0eb:9+!1;"p](Hu +()7T%(\eaM(D[c(()[nL!!>j,]t=6V!5&6Dc2\!\]=Ybirk/EG]t7##!!9dG]D]DG]=khi#3Q![]`:[d +!!QiH]=GVcq7Zd@"M;@Z]a![#!kl4XrOi?G]=tsPirBU?]t(bg]t:be]=khg]t:#p!9!n].k3#35!T$3 +!_JoVoqVJ["/DWcL?8IFfZhq$1Za-j1jo>KCZa-q9Z37M>Z*JN8!;<\uT_AHT +!!aCJZa$jBZF'D4"LGD=Z?>@2!OB'0Z37M?ZEp:f!!F1"Za@(;Z37M>Za$h7ZN+\;!8db^$p['@5X%Iu +5k[DD5WL@k.Kgn=+tteO1BTHi>$_,3!*o>(#@(J<>?kB::Z_WZNNB4arN$"%riFBF!N`I$X95W/Y)_WE +""^LVY5PF)Y,ne-@IX?l!;_eh/Kss7%j)f4/hSe30ebM3JV&K(JbXa!It3*$J:@Q3jo>LA +USFO]UB%"eUWri?US7R[rh0=NklC\_""g:AU&C_hTqe/2/_30/*)S">;G`.j+X/!$1e6"VM[h(D[k_('YKi +(Dmo&"m,de9"hpMrOi3Crk6SW"22=Y^&>VH]=kgNjT#@o]t=6V"M;@Z]a!X"p:UGuj8]@V]=GJc]DK;? +]`bs\]=eF4!!0dFr4N6F\\5UKjT#l8]=kbh]=Ybg^Uq%i]=YVc!T!h7!"(2*/2TRV5DUA:Pc +Tqe@]UB7-a&Ea#qTsCu1rNZF0rj(ehjT#=eZhq$1Za-j1jo>KCZa-q9Z37M>Z*JN8!;<\uT_JNS!!P?j +Za$gBpTaq.ZE^]XkPt[iZEsM8"LGD>Z_HX`'.8gL\$E?GZEpg@ZE^[?Z*L[BQMgg?!!ac75?bE=pfdc&>lIq/?<[a!!!8.]X8oF%X8oF&XNgeHXKMH%"0Si1NogtWrN$.)XKJX5nc8@`p8e7Tj8]?7X/i>'X7r[uY,ne-@H[[mXK8T'X9>]-XK.?M!;QU"*dFW]XKAS* +riQC*Y-+k/ri?*Tg&M?s1bpmB1GLWZ1']Tk1,C-u+sHk.%NQQ4-87/-0JP4kJUi?%pj`NtJUi?&J-(4N +%-ITmMkd&@rM'@drhIa=!Mc@cU]-qeN9UEA!!=gJTqVF["JMTaULNBdp7hVEj8]96USFRVUBI9cTqc)_ +!<)s"USFO]UB%"eUB$59!!aTiV59r\USIg^"J_ZaUS7[^!.ii(#TPNN0J,"70/!&S#;7ea0-MDX*r[2[ +*VTO:";hmj)#+jO'c%Q$()@`&jo>KU]tM&V]`>\D^!6TZ]t:oS]`Ym[]1qAe!kZ.XrOi?G]t:r^k5b4h +!(u8O"M_RZ]t=3Ur4N6F]t:r^kPt[t]=\$TrOW&'k5Y]/]t(he]=n3U"MM@X^:F6V!&`U5hZ+-7.Olr4 +53LZi765Za-mCZi765Za-jAFm&i#Z3%A1c&BA>$G/(>6\Aajo>F` +Y5>:&Y-5!gjo>K7X08])X9>]-Y,l'p!;K8US4C[UBI9cTqc)e!;?KeUB$/2!!?;tUS7[^ +"JMTcTqVI\"JMTaULNEepnInaUPeL?rW!*-/8^fMUAgnnTqeBWTq\6TU]-qgUR28?!!*0Yq(_\!#;Ine +/fc#T*rI&P!!F&T(`+"a('YKh(D[o+('#-4!!>j,]t=6V!5&6Dc2[pZ]=\!S"1u7Y:$DZV!!9dG]D]DG +]=khi#3Q![]`:[b!!*/7rjr9G]=YcT]*>s^]=khi#3l3g!;O5/]=U`$!!KC +Za-q9Z37M>Z*JN8!;<\uT],qSNO,prZi%*7Z*L^AZa-jAFm&i"Z3IS7FEMbNFSKtaGBJ(PJtfET[/RBD +ZEpg@ZF$sDZa-jAZ*CU?YpnH.!WW3Bn3?n;"#DDV/,Lgq+TWf6J29>?bA3>6%dg +!!A4^XKMN'!3Z=&l2]oG!N`I$X95W/Y)_WE""^LVY5PF)Y,ne-@HRXaX8n=V!:'UfH`O6LY554(XfS\, +Y,l'q!;7B!b>bM"(Q/*RerikTq\9V +TqJ0TUS=NWU8+KT+PHer))Lb9"Yh\W*ZZ@"*VKI9#Sn6n)#4pN(`*r&(`!/g((fX/"%p8?]D]DC]DfLh +!!9jG]DT>E]=kgNl2^_^!kZ.XrOi?G]t:r^k5b4h!(u5N"!P:i^&5JK]t(he]t:ti]a!d&rW)`,!kZ!n +r]d\\>be^:Cqf]t:he]:QY8&HDe\.k3#%5KCZa-q9Z37M>Z*JN8!;<\uT],qW$)t8ZaB_;"0o,:Zi769Z*L^AZa7$F.GOn+!!!']4n1`= +5X.Iar[[jqrZM:d,lTS)0JbOO='Ss7q-*u,>?kB:r`fJ,(]FC7!UKdgNNB4arN$"%riFBF!N`I'XT#:' +Y-5!gjo>K7X08])X9>]-Y,l'p!;Y9*ZZFX0ek=70i<[YL@]rp +JH:EJkPt^CUSFO]UB%"eUZhd@!!/jgqkO.a!0$%?""g:AU&C_hTqefIS!Wai'nLt&"0JFXK +*rmA[*VBC6()Rqa('#0L(B,-N(?YZ"9"hpMrOi3Crk6SW!kl4Xr4N3E]t7##!!9dG]D]DG]=khi#4V]f +!;=)+9&TaTB=Ydj\\#JarOW6H]=khi#3Z'^]`Pj[^&GVE\\7gN"MMFZ]t4Za]=khg]t:ni]=GWS]*Q-] +]t:tg]=jlJ!!Of%.Olr0rBCEN6CsmHoqMM]rhBOiUi5Gs"/3$+Zi.00Zi78U!!0C3qm$=1ZE^.g!<)s# +34#osrNZR4ZE^]Xk5b4]!2/9N#n4#DZ*LX@ZEpn:Z37M>Z*JN;!<3&oZ3RY?Z*CU?Z*F&/!42[1"0o2< +Z2V$6Za$d@Za-pBrNZO4Za2%4!!4-)54Cc;5rSKf"tCc>+sJ0ar\=X50.^42>4u/$?!R;3!'o`J"-'C` +Y5PF%Y5YNJ!!B=*XK;B%"0Si1NogtWrN$.)XKJX5k5b4W!0?(=#RRB2Y,n_,XK;K*ri?7*XKJX5 +kQ(CZ#Hk/2Y,n_-Y4o"$Y,n_.XKDE%#-G&0XKAS,qlBjuUE8+h!rs&k2#/s&1'9?_+sHb+"W\[**?Qg2 +0Es0b1k:%,K(jcqJ,FftL03X>",iqLU&C_dU&LhP!9F1]US7R[rh0=Njo>K8US4C[UBI9cTqc)[!;.)9!!rt'TqS6UTqe!5&3C!5&6Dc2[pZ]=\!S"1u7Y:#u?V +]=kiT]`bs\]=eF>!;6Ed]`:[_!!&Vi]*u6\]t(be]tM%k]=eF4!;O8(])]D:^&GV[]=kbc]t(bg]=GPa +]t(kh\\5Vg]=k_K\,cFV#;\V05XRt(I.3m6US=HT"mH!hTsCu1rNZF0rj'fL!OB'/Z3.G=Z(gL`r;ZpZ +Za-q9Z37M>Z*JN8!;<\uT\oeS-ag=fZa$e7Z3IY@Za-jAFmB&,!;3VtZh1O'Zi763Za-q:Z4O@JZa-jA +Za-jBZ*UaB\$IF7!!<9`5Q=lj!!A4^XKMN' +!3Z=&c2[pIY,qQ&"0Si1NogtWrN$.)XKJX5k5b4W!0?%<"s0hHXfeb,ri?=+XKJY-XC:;morJ:u +YH4h/poFIuri?1'XKMQ(!j8W-ri?I0XK8S+Y,n\&UE/%g!WW6RmkP#&1F44gq'$7h*ZZ:B,r%&02)d-q +Jb=NnJ,FfuIXqUc!!A.SUS7X]!29Cec2[m?U&LhdU]-qeN91*B/Yf#5rM'LhUS4Glk5b4N!/]V6#Toh: +TqS3TUSA'hTqeIr]=\!S"1u7Y:#u?V]=kiT]`bs\]=eF3 +!;=)+9(r>M!!U'L\\#D_rjrBF]t:ti]a![#pq6mD]=kbg]=[gNrOWEI]t:ni]t:ti]t+-S#J%IW]=YVc +UA"Z(!"US0.4Qbr5!M5"5!Vo>Tq_.R"JVW`V)[]>"/3$+Zi.00Zi78U!!0C3qm$=1ZE^.d!!>3eZEsM8 +"LGD=Z?>[;pAjom!2/3L"BMk8Z*O>7#-tP@ZE^]XkQ(@_!4;[0!42L,"L5;>ZEa_BZa-pCZEpk9ZN@D; +ZM_$1\>]hf!!3j!54Cc@5WL>E.P!%H.KUb:+T[7)/!*oG+!*fV2?W\<4!!A4^XKMN' +!3Z=&c2[mHY5>:&Y-5!gklC\_""^LVY5PF)Y,ne-@HRXaX8n==!"VN!Y,n_,Y-"h-XKJY-XC:AorrDSj +!3Z*u%]cb6XKJV*X/rD'XK/J(ri?@*XfJV,W0[bA!!3Wd1AE[$1'BEc+X&'/+oNSc+s6e*$6:0@0/>=: +0KXi8pj`?qqLAWsKduK8US4C[UBI9cTqc)[!;#oDeq1()Qc^!#YPJ!>lX:!!>j,]t=6V!5&6Dl2]oG!kl4Xr4N3E]t7##!!9dG]D]DG]=khi +#3Q![]`:\"!9X=l]=YVc\\#D_]tM%k]=eF4!;O54]=khi]=kniq7Qd=rjrdV;ZEsM8#ILeBZa-jAFm&i"Z3@S?Z*L^Cp9F_(Z3mnDZEgjDZEpjC +ZMq07ZEpmE[C15/!!5)D5jpo?0IeM$/,C_*+X&$Q,9\Tm1bUU>1K%NN>Q7q2>?kE67d0mTNNB4arN$"% +riFBF!N`I$X95W/Y)_cIr;ZpNX08])X9>]-Y,l'p!;%@FbD\.l&n:n1jtjq]Yq_&L&D@*ZZ=D*[``t0eP+2COq-2J,k0" +J-(:UA*EsqMkd&@rM'@drhIa=!i)Har1j7b!0$%?""g:AU&C_hTqePE\\5WN]aDBb\\#Pe]=kni^&#>F]t:ni\%`-t!9!ne.Olqu.P!&:5 +.f1@q+>5K,/hf+O>?^i,!*oD*"C,)6>7'Qp"-'C`Y5PF%Y5YNJ!!01(qlBn&YHEoJ!!=dQYHIi*"Kni/ +XC:W!pAjog!0>q9".HGK&0J>%UJ;*fL!.k#t"FboSKF-oD",iqLU&C_dU&Lh4!!/jg +qkO.a!0$.BrW!$PUS4C[UBI9cTqc)[!;VH]=kgNjT#@o]t=6V"M;@Z]a!X"p:UGuh#IFdrOW?I]t:ti]t:r^kQ(=ir4D^:!kZ.Z +rOW'Crjr3A]DfJI\\#Pe]hQuVhuFKA.P*"u.k*GB5=.Y$8=HfL['I!BZEggBZF$o\k5Y[kZa-pCZi.01[%dhtZ*UaBZEgjD +ZEgjCG3Ao+[HXt"Za-pEZi76>Za6sDZEga?ZEgaBY#b,oiW'*A5+@(Q@c"0S`.XoPU'X9Yo2XKAS*Y-.`)!M)[/ +!!+Z,r\O(""t:`?+X&'Tq]Zds*ZuLE+!)jb/hSY*1j=M%J:W6"J:[QI"b;,WIt]oJ!!J4TU8+FYUWri? +V5+!_"f%idUS3S1!;ult/cMLFU&:YeTqc,\!!T-kUS4HVr1a7Mh#IQ_T;&*SqkF4dULWTirW)/W!MQ:f +U&LerTqS6TUSFNVUSFQYRRYd,s"=:(nLt%l*??7$*rR,Z*V074',VSc('#0E('59h)!M#%9Y7k7]*5m[ +]t:tkc2[pZ]=A$W]=YcT])YC`!"6KP]t(hi]=khi]a*^#$ba0c]=khg]tM%k9\]ULTXhf9]*>s\]t:tk +#Nu0W^%f2I]t:tg]t:ti]=kbgrjrarh9RkUS=KXUA:PdU8"E: +l2V3bZEpdAZEgaBZ*L^]!!K^9Z*LV=ZEpmBZEg+b!!,$brNZX6ZEgaAZ?570!3uO/!O8s0Yl_5;T%j;H +-F*QUrNZO1Za+]:!!'LmZ2h61Ylh;:Za'J7#IC_AZa7$9=47-N'gP"b5="p,#X1I;5X%C_.4b?H!%[ss +(Et"H+X/'Q+u;#.1,:L[>$P<:>?kE:>kqS+>[1K*l2UjDXT#=+XK8S+Y-5"m!9O7hX0/V,Y,ne.Y,n^e +jo>E4Xo5=*Y,n_-XfQ$q!!'2$X9#K*riQ=(Y)rAXjo>E&VY[@rY-"d8kPtU]l)aid!3cC)rN$7,XK8S* +XI)KH!9=+[&,n?b2#&g41GU[?1,C[A+X$\+!$hCcrZ)Ch*?H7E0eG%0/2:O`qg\Ztpj`I"J:q\&!!A+R +Tq_aaUSFNXrh7U;"f%cbUS4I^T`V!aMrk!?/><$;#,.feTqS5inGr:`!29Ce!MQ:fT`V!_M;/(3*hW;( +"/2E`@H[[kVYlM'.Z3.AI=1,=>ZEUU?Za$dAFQ`])\+-]tYlh;:Yd+,3#ILeBZa?ca-IMkq"#W@G5!;((57TqD +5?kE:>?pu."C559>QX3k#EPsfYH4e-Xo>C%YNc,L +!!K@(XKJ`*X95W-XH;QE!%e,P"Kec,Y-%]+!+Y0l$a-S5XKS_-XKJb0OSAh:!!buoYH4k/Y-%]+!+Y3m +!3#FipoXb$Y-"k1rN$7,XK8P*TPGS:!9=+a!\#r]0ekK[1As!71,C[8+sJ0R,5rb`+or`*r>lIk*\&iu +/h\nHJq/B$JUi=GJ-:ISJ:nBt!!8"PUB@3bU7qO\!27[<"J_`dTqVI\"/2E_MWOm=/cD@FUS=HTrh0=# +nc8@`!29Ce!29Cerh0=LgAhIKUS4HXTqS.YT`ANb!!&kcU\LMaUS4I_U&C_kTqeBVUR5gD^]*@Eu$bO$^]tM%h]t:ti9A0@Q]=khf]=YS`\[r(3!<)ru]CEQ0]+DNd +\[o>b]=khg]t:tg]m^Nr!!WE'.P!#!/,h"/0L.oh5X[o(US4HXU8=WZq4e(cUnaYSlMq +GN]#,\*:1"['R.?kB9>kqS,?!:K;+R9"4NN94`XK/G*ri?+&c2\!GX/rA&#-4i+XK/F^jo>T9X/i>(XK;E%!j&J4k5YUb +XKJ])X8o=#X8n=8!!6u;XT,C$WrfB(@d!dlW9LAaY,hK%#d(2/X/C\R+9Kmi!u3XJ1B9<+1As$/1B&Ks ++TWc1q]Z.a+!2OGrZ2(b0`Ed51,3p%It<-#Jq<]I"G25VK/W#q!fNeHrM'@drhBIeklBiG!2]Ld!huHJ +jo>B4rhBRhUSFR^UB"if!!AsjTqV=X!/U@Lj8]@"US=NYUA^heAEX!nVp*]tO6Tc2[pZ]=n3U +"hhO_\\1Vs!"6QR^U_%k\\#Je]a+'-pAbH/]t:he]tM&W]`:UW!"'=M\\5_f]=Ybi#Nu0O]`c*\]t:ua +]=teg]=jpr!ic5$.Ok9F%4Nbe5XI\#5'j!"US=LWUBREfUnaZVq$'1dRTVA0RU7kZR!<3&gU%tDiTV8$Q +TV-p[BK-mR!!WKe5!V=s5kdJQ5X.M!4uOl?.k<)".OltI.KV(D+T*Ai+<`=<8m5Et>kVA%=oMY+ +9BuQZClFJQN<5-"NQqM(N;eh9N@`^ +9hS)N&_R-i+\G?r9h\)O9'63D9)2-_84lEH"@u&r"p(P#!%[ss$S*\W00_]d5X85AV#@%`UBdQhU8=WY +TFm%]JcOg2!!1"<"roon5=%M!ofiOD5X-gm.N']c,9\6T+X&'S+=&]p1,CU?>Zt?:>[(H:q-+#'>[:T= +#H@cU!/1CS(,RcK1GgmDpbDk+1B''01ArC!+X/*RqBGq\ruM([!Z`F1r\Fm<1dQYDIt3'!JV!WI"bhSY +ItJ--!.k3+!!Erh0J>*]0/"sR0Es0a0/518+T?b?;>5DG->?G-7>Zr;-!.k3K!!`TZ1,LaC1c+n^"uJ(l1GUI)rZM7c +r?;(_!$_C`#9=j+*ZcIJ0)d[61Gj'$JUi9%IY%[%#/#?tD< +>?kE;8r[(H:>?k;*>6S88?<^S+50/,%40J>+7r@e=(*??3o*<7,L!$Ui,"^+u6?!A64!.k3&!65'W,;Cu01G^dA1GUaA1G^dB1,C[A1,C-u ++sHS&q&TVY*ZZI(0F'(50JP770J>(50/,+70/,+( +*uuEr*WI/L!!N`G(`!l%p_F#M()Ic)(TIIe!.k4.!;J#Q.4Qc,5X.M!EM92&U7q7T"/;K`FK#7l!/^aX +&jSYY5PIAJ5X.Ft3%-:,/+b=c+UoV=/Mf.<019&K>?kH;q-*i(r`TA.>q_/U80J>+5 +0/,%50eb78.NBNN+7pTC!!NB=(Ddi'q%`rGrYP\P()Mf-JcLB&!!)dD#q7>R00_]e5>e-RU&_"`UBRBe +UnXWXWW7VNM#[N5q`jd=#=(L=5:e67/+Y7b+T`i3-N,_(1gO[@)."^G28>[(@R!.k3&!9aC_.JGS% +1GUaB1,C]a1BSmG+sHP%p`BDT$6_&W0eY\?It<-$pOEF#Kn4c)K^&Ph!.k3l!!+Q*pb3120J>(50/,+6 +0eXUh++sAQp1bpX`>[1H9>kqS(>5h_.>$G2GWW7VNMZpj`U#K8+o+J:f,i!.k3&!9sOc(GIN;0FBHe0/#"40JP:8 +./k4e*qLE@!!3QF)"eXJ(E!u'()Q38JcLB&T`Fg:#V.>S0L%fg5]QIl#c"/hU7nBXTk92_JcMhO!X1VJ +n37%@5WpVJnL=Mgq&p4l+X%sO-8IA31dtYP?!R,.#$b>6?!CSjWrR_OMZe.LmmX.Ouu.5X.M4TqnEXUAL_bUB[NfV5'`ZOc09l!3-#$ +.R-0`nNR:E5;ju@.k3%up+$(lp`TV[r?2.lr\F^9?Wp]=>khM-?!1H:>?t"*!.k3.!!"/@1]9*,1(#fm +1G^dB1,C[8,5r_d,9ZV&pDsY`*ZlFQ0eY7GJ:dHE#(_G^JU`5nWW7VNMuWi$r[n"$r\+a60J>(50/,+7 +-lj?NrZ:\PmJmA-(Ddi'p_F&O()dr')%"FcJcLB&_#X6[$7dPV.P!)95<_N&rhBIfq4e4iUna]ZUnab% +lMuM:JcO!p"V+X8cu0ela5>?kG0>7"M?=^,$6?!CSGMu\G0X8iD3 +1,LgD1&E^<1GUaA1G^dB1,CX.+X8-Q+X-M&!$_1Z%3HT4*ZlO[0J>5*It3+FJ-1:PL5#VW!J(ia!.k30 +!!N`d.k<2,r@eX60J>+50J>(50/,+6r>l"[*ZjqomJmA#'c%W&q%a2P()[o((`""4!.k3&!5JU/.LR[T +.4cr-5=%GYUS.(N!(6)QJcLB&bQ%eJ2a'Gj5k$u=1FrGS!%[UipE9qf+WqsQ/M]1<9jM%0qHNu(r`fG- +r`fJ.+cQJR!3?/)!@oo_1,Lf]1B00/1']3N+sA-T+sHY(s!%(V#p:6:0JG(bJUW1FJGt*"JGt*#J2")* +JcL`0"p$,'/M&M+r\41&s"F=)#:1H4*ZZ:B*qUK@!!<9?()Zf^rYPVNrYPVNWW7VNJcOa0paQ\&.4Zkt +.4dVI5[:%Wn"Tl/b5d+oJcP0<"Worp4[;1'56sM=5!M4].P!%K.KD!k.eFkk+s8'`0/G^p>[(J+>Q%e, +6gF`(!.k3q!!X8q1c$sD1\id21GU^A1,:X@rZM7dr?:eWp`9ne*?Q=C*[!'f0h-_DJ:[QIr.+`s!+Cfd +JcMnQ"rT$G.P<8*q(N./0JG48/h\h!*Zt>%!$CkS!$1G,!uD^g)"e[C(]XW=!.k3&!8mkQ.LmmW.Ocks +.k3DB5sLs8U%"fWU&=rk!RUn!!.k4lIq.>[-OpJcLB&bl@tT1GU^B1GUc]1'TNj1,:XA-M\hW,5*&b*?Q=E*[WTr0RJ`UnR:Q"JmCE!!08'JcLi3!&=I<"$]":55[YE56jG<5@U>[6f'!aJk>bQ*4pJcP3="t2;a1bpgDpbE+21GUdC1+sdpr?24d+X-J%pDs_b*ZZ:D*?Hgc0P,fa +nUL[lL)fO[JcLB&c2[nj0JWP\!AZ;'0F0Bd0JG48.N]]0*Wd?'*qUK?!!*0=p_NZ@rtp[pJcLB&!!)dD +"=YiN.P(KJ"Yi5+B;;0iUB.&mXT3qQNrTG+5s@Ou5X.M!rBL3E#=(O<56.hYblE=qJcP3=#So6O1bpjB1Geh^r\F^51,C-u+Sm8R,5E8`*?H:D*ZtA&"XG`T:P+)cJ,tZ +!&+.%!AQ5+0FB3L*?H7B*Zc=C*qUK>!!!l)(',6Tli;V;JcMJEq'l@nqC2_$-nR\LOJ8KGU\LScU7_mS +!.k3T!!=o?5=#34!^Jt8p-/RC4T6l1.KD!h.KCso+V,\>+X/'Q+sA-P,;V,W>?p]&!EiX/!.k34!!sr- +1,C[A1,C[ArA+7*#W"7i,9n?T+sQq.oHO&O%36K1*Zc=C+<;U[0lMX4J-(CV#0m4#!.k4>!!su,1GL[= +1GLRq4e"dUS@U[!i;SHNrXb3 +YQ+tO5AH!Z2[ibQ*4pJcNUenL=\k.Olu6 +>lLMuU&C_dUA:PdUnW&;mJqh=JcO4!"UmUY5sR^556*tF56O5:5?kH> +>?kB:pfdi*>tP6\!.k3V!!637 +J:W0"Jq8N(J,+TsJUUi,Y5j.SOoP[j/hAY10e`JZ">MS`0JJcO4!"TgSH5$G69!Erb'>68&/,*2eV!3uS*!A++('J_I"1,C^A1,C^A +1,C[B1*[td+X6_*pEBS\!?iZV*Y'85*[NUkJ:N3&It*!#J+nHoCa6.aJcLr6%fn"//MSt50/,%50JP47 +0Ea$^0JG6\0E`O>+!)Hu*qpZV*ZcHi!-0q`kEO5X@Ru2(:%)mj\Gh.k2u3mi_fV+X&C7r`]P0>$Y?;>5;A* +?!L\h'(5gP!.k4"!!=[(B=>Zpl,"^G;84Yd63!.k3&!7LoJ&,n?e0etL? +rA"C02#]620f&\`!&+6n!$_4^q',e]!?s\r*Xj24+W__.Jq/<$J:<%KJbag"JUi8>0F![?JcN+W!>%!b +/HROY0E!R)0E!R+0/,'Y0a93O*?H7D*VgcO*WI;a,%u +/Li2!.Suk6USFQYUna[XUB>a(3?tK;>@%&/#$kG;8Mhmtd/\auJcPHD"pZ_:1,CaCrA"g<1,CaB1GUaC1GgmD-hAMW+p9&6 ++>Q7Q*W[9(rZ2Ce4Fhs6J:<'$Jq!NG#(M/R>V.E+nGn.@JcO=$"pZb7/h](8r@e[60J>+60/,%50eb78 +,5rV`+86iP*W@)\0L+hS*l()If((B>9I('>?g('9NsJcLB&!!)O=%k0%[.OlhtKqkH=U84NXU%Y5` +M*OBRZ2fIVPlLnB5$5'7>$5*8q-+&. +>Zsr\0-&C?JcLB&oDet@1,Lfc1&s-/1''0fr\Fp=1bpmD.j6)]+sJ0)+o*;b+Wr'o5Ofd**?H:C*ZZA8 +JUrE'Jq/B$q1&ZuJU_Ad0-0T`JcLB&e,TV#0JG4;r\+=*r@ea80JP:80ek@:0e".a*ZZ9q*r-fZ+s%je +46ceM"Vqji()I\c(\\[H(_m7:!.k3&!<3&h.Ln!\.Ockt.79i)U8+NZU%b;dU8=>I5X#sj!.k39!!X`6 +5sIS!5l!YD5QF"V5X.J!4"Dg2.k3#!n1"Pk.RR'0nKAA_,U"9T+Wr4=>?k<5>?pr-r`fS10f1WsZ2fIV +QN.=31GgjC1GgjC1]0!31c.!D1GT:m1b^-t+sA-R+X6_*q'#qa+ZDbTnK.]Pr#PhlrI=s#J:I?E#CLuQ +GVLg'&^gZ2!.k4E!!sZ!0J5"80J5"3qCiC60JP780e=@f*?Q:C+!(.uq&KS]*AKW:kl:i&()I]#oG.HF +'(,aO!.k3E!:_NA0.JG(/H.+$D4mVsrhK7`#c+2iU/+$@4:.5PJcN7[!#>Aq!'p?E!'pNJ$U?pA4tnE9 +.4Qhs.I\eh/29st!)W2/%N?Q7+[(H"0 +/h\q20/*5W%l#^j0JP79/g;>Y*ZcCD*V^]O*<[Q24$#Fd!!O/S()If)p_ErH)&=(X!.k3&!2';q.4Znu +.4ag9"H]FQU8%^^pS/"fU7u*\6pER1Q2lL:[f?[?3C#eo5ZtJ.>6eM?>Vbg +/0aU-$mHl=+sA0T+X&m46:(ns*Zc=C*ZZ9q*WmE(*Zb5$"`K!AJ:E(CJ-ULQInVIL0.X@/JcM2=('ZBG +0/5+70/5+50J>(50/,+60/,(7!\c)EnK%ZNrZ2=c*?H4A1-7HTkPtbm(Ddi%)#"dI(`!k3!.k3&!5SX; +.OckuoI9hir@/+&.P!uXU7n?YUA:PjU8"EXF[&8Z5:c@+JcLB&f`2$S0`F9<5X.O.56jG<5Z+sA*RmND`_>$>38=p8/8>[(E;r`]\6>$Y?'1GCU@+I)qY!4`(J!@9NX1,C[A +1,C[A1,C^A1GUaA1,C[A0HhY/+oNSg+X/L(5XG`C*$$(B*ZZ:Bp`9DUr>lFh*Zm1aJUW0%J:N3$J:[ZL +#_@PW=t_Wc0-R_'JcM2=(',a80/,+70eb770/,%40J>+70JG48"#2DM*Ut0W+!2LD*ZQ1?-p.Dhk5Yi% +()I`&()@`&()[#d";_gk('2b^JcLB&^]4Th-n6_t.Och9.K_83TVqFW#bn&R50>7b%E>?b?:>ZtB; +;)0p^1boi5!.k3\!!+/tpbE:71,C^A1GUaA1bpgC,julW+s[(1rZVD/69toD5ogpd+X%mJ*Vg`c*?H7B +*?H7B*["+)Kn92Q&:oC_J:W6%JUi8f0JP471DdM#JcM/#_W(`!l(()Rf'('q)DJcLB&i;`p=.kCTK!@oSm.LR[T.Ochs/Li3.U8.^^q4e:n +U7n,D5<_:t5S;QIJcLB&q>^R:5X=j(r]gTN5rL2Cn1"_n.Olqu.k3h]:]=/k/0Y!8![/d2nKAhm+s9Tb +>$P?;>[1K;>[(H;>$P<60/>:=2)>[7!.k3&!87DT'f.[&q(`.11,C^A1G\nb!Al:o+V#V=+s8$Q+Z2SP +6:!me+9!Db*ZcJ:E(`JU`6%J:N3$JUi?&IX3_&/h\n8%$psG!4i.4(Gmg!q(N"+ +0J>(50/3A[">;JX*Zshl$6:-1*Zc7P3]T5_!'B5?b?:>?kB:>[.,2!&jd3!\uA4p],mGJcOL)!"Ai^!&OF+%5Taq1GUaA +1G^dB0Hqb1+UK>;+<_pQ-pg3dr]pNHrZ2+_*Zatr!$2"Z#9=j.+!)qYJeiicJUi9%J:N3$JUr?%JNGS@ +0/5.6#+5IC!4i.5$o9Ri0DR:10/,%40J>+70eb=4*UXsU*?H@J*ZQ@b3BTD'466GR&K2B!(`!l(()@`& +(`4#((pO'm!.k4.!!Z=a/1<#"/,(Ln/,^pt/,Uju;kp/bUCX)oUnXTYULQPR5=%Lu2ZgJhJcM>A":7(Q +5="a'r]gNK0I[#P/+4qm.4cr!.7d92rD3Yc1*Rhc,4m&Y,5iYm+sA-f>$P99>[(E;r`]P3>[1K<5lNPB +2)@! +*??1C*Zc=C*C#++J:N3$J:W6#J:[]M$%Yf*0/#"40J!8"!.k3&!8IPU"thS&0Fofj0/#"40JP:90-_JY ++!'ek$6U?1))F<63]]Acj8]2r(_%5r(`!l(()7T&()I`'O8sk4JcH&V:f&tu/1;tunL=hq.OuqtHD@40 +UAL\pU8"EXU3Adc6U!b"5V]eLJcM>A!s1AG617#@5X@Rl.01nImj\Vp.k3"t4\nmO;>sAq6:*+F+s61q +"!8X/8,QQo>[(E;>Q.k7>?aWR1GpmC1GgH3!.k3&!;lg"!@fl_1\WX81GUaB1,C[A1bpO(+sA*Rn0&&[ ++X/'a5sdq+r^$iN3[Gag*?HBh'`jHtJcLB& +#QOj#:e<,c.k0p:"Y2,U.5d.\UCNumUS4N=5=@\!5X%Cs,eF&.!1a)o!]3,,5+sJ0R+s@sN+Wr".r`oG,$!^\=?>u(50/,+6.38C/ +!?W?P*XNu6+!)I]4#oAar]9'>!!rQ@rY>bV()@`(()@bln,S%?JcMJEr_Nb\/1;tt/,^pt/+tFr.k3," +.RXc?kE;?X$`>?!LT=>?E[<1G^a@1G^`u])[E_ScAg4 +1Go%doeHe/1,C[@0I7kc"!Sm5,5*/g+sA-R+WqsP+?2\S5l'.#X1I;5s@Lt0.[#O!%[dn!\#WMr$hn&.4[8O +:f%$d##J,^6pX-aq'#b^pE9kd+s%pO*'.>0=^Cu1r*0V60JP@<1,C^?1,'3O!.k3B!!a;s1bggB1Gn_Z +"uJ(j1F++em3)`Z+sA-\5XIb&r'C]O4?GYI*?H:D+9!>]*VLN[*?Z@C+\R<8Jc:04Jq&?%JUi<$1,(O? +1GgpC1GKEP!.k3D!!X8o0J>+61%m:,/het6/heq&+9!;]+86fX*?QC%*XEc2*?6:`3]T;"3oL)<(((in +()I]&(Dmr*(!lr4!.k3e!!uP#;bfe4.k3#!o-sel.Ok?H!\#[GrM'OjUS=NXU]-tg=[W0Rr]^KK5X5SP +!.k3&!8mhW(&C,p557>J5X.Lt5=%Ok/,h!u/+k@l/,Le".k3)G:f$pa"@,1;5WSfd![/^2oH=;Y+Wr!. ++T`]T>lIq7>[1K=>[(E9>Wjh@1BoTj1GL^B"J#OE!5JR9%l,s>1'06e1\id31c$pC1Ggp;+oW\b+TN_Y ++UTD:+X8-S5sdk(62a+R69@:l3]-gZ!ZiF(oH"ek*Zc=C*ZZA/JUi?&J:W3$J:N-#J3u'j1]T6/0*3ga +"MFee!2';n&2Q!<0ENm[0DI4+0/5(40eaprrZ)(_*Zc?s*WR;]*WR5[*X3W,4$#A_48_.u!"AuH()I`& +(_mo(()7T#d/\auJcNRd$WBr#;,BD*.k<)"/+k@l.JkS/.5d0]US"9SU8+EWU8=Sp5sRY!62j(N5X.77 +rW%NMJcO^/!>drh570Y?5X.J!3@cR/.K1ds/,1Ro/,^q'.k3%u.R[*1:\mlm5@C`?>[(H;>[:Su0/G@=2)6sC1GUNcT)aHC^]4EI0f/>T"uJ(k1GUd=r#u(aocXA\+X6h-"?/V6 +5sbH9%73BE4$#Jd0d.\^*ZlKk*Z?ADJUi3#It3'!J:N3$9JJ@[1GCF5/h]"5"ht%h!2';n&i)-/0F0Bd +0JP("*Zc=(*ZZ7Cp`9ne*ZZ:B+!)LE*AKW;3BR+!huErf()@c('c6fa!>uZW!.k3&!9!nb;,L4e;,&bp +.OcnH.KD!p.M"$Z.4H_t.k3#=StM^OUS@a_rh9R>5[(E; +>?jc!1B93/1B]Hi1G/h0!.k3&!9*td#;S.l1,C[A1GUaBq(hq*"u8%i,9\3TrZV7bq&oe`+X6k.#9tBB +5XIb(62NtQ4$#Gb4ZXkf*]+9!;V*Y'23*?H4B+!)FN3]oJc3W(o<3o9oB&Jl9# +(D[i'rYGSN!O;]W!.k4/!!lIt;GU+c7k,tb.KD!l.L.CR/hJP(=eYbg';D7sU8!H/5$kH=:bsj^1GU^B1GppD1aN,%JcLB&iW';h0/>=?1,C[@1Geb\"Z%tk +1GUjoH0J5"20JP760/<2T"YVS`0eajO*Pcr]:'? +h>dNmrY>_U(_mf(()I1]!.k3&!8db^:f1%b:ejhJ/,h!u/+tG=.k3"t.Ounu/Li/kUSFW[USOWYUSEl8 +5>[(E<=^>6::GXa]1bpgC1,1XA1G^E9!.k3)!!3?Y +0`a*er\FI/!AZJ*1(H)q1+44g+X&$Q+sA-R+S$Z],<.tV5sdk(5lPQ+!)IDoc=)Tr>m+( +*?ZIG*E[iCJUi9%J:<$"DD0J>+40/"aS!.k3&!9=+g"tM>\0.\e00/5+60DI42/ho%6,on*M +*ZZ=C*ZZ?p*WR;]*X=A\4Zbbf3]R$uiW/oW$NV"\(`!l)'c.W&#Ef(=!.k1[!)ZKh:esna:GF:K.P(3B +!%e+!'J([`.4Zl".u0mqU7n?tH< +>[:Q=>V@o31'oZl1GL^B1bpE[iW+Q1K`D/V/i3Yc1bpld1'BBg1,C`^1'TNi1FjOj+T*A_,4m#f+sA*R ++Y#cD6:4(,5sbE8%QcU13B9,^3@#Xf*ZlFDp`9DXrZ2aq*ZlFF*[)S,4[2.pqEGWW5X.Lu5X.Lt5smX\/1<%u/Li=Y.Olu" +.P!)#.4P'C%k0/,;,pIj:/Xna;GU+f;uT#e6:*t*5s$52rZV[l+s8'P+X/$O+!:J*,9S*Q*$HCE+[1K;?!UT92)$^?1,C[A1GUaB1,C^7!Q"hg!2]`#-o3Y71G^c_1);Z&1GUaA1GUa@0JG.&+WqpO*[2[M ++pT55+s7pN+X-h-&gJMA+X8-P5XRe$6:F.+5X7V%r]r_,4$#Me3BoA@+<;FA+WV^I*?-"B+WhaE*uQ%A +)Bp@F,9\:MI!^EsK7AB(KetP?0/,%50ekI;0.nh0,6?d(JcLN*"!]BL/-7CV1ArmB1GCC21c$sE1c$sD +/i>*u+rhdG,8q['*a4PTo=#Sn-lr>,JM(\%KW!.k3E +!!H.q:f1-i;%-5d-n?hu.kN/!.k<(J.L%CS.k[1Q<>[1Ao0JP@= +1Gf"c!])Vfr\FNr_Z58gVZ6u'-8[M61c-sDq_AmB1bpjB1G^a@0eY7++X&$R+/LrV1/h\e0/i#:3*?H.@(a1"A +*[)[I+W_dH*$HLI,9\9L*$6+A1d\(3njW?&Jc/u)&O/*(\.QX!.k3D!$+m6:fL:g;c$Ci +1b:+,/1E&#/1N,"/1N2%/L`/"'.GI^.4Qhr.oN+:UnaWWUSMBd62a"N5X.Iu5lNtL5X6Tk!.k3k!!<9Y +5="j*!^8h5rBV;b5X@(T-nHl%.4m&%.Om&$.4?\r.kE5#/H%%.-TkC*:eae_=B&-o:f:4@<)c1N4[;>" +5!V7o-m9cS+X%sL+<_mN*[2[I+s\<)^$4G+(3 +/het!_Z58gW;lr".K(n$/M8^S0Ej6d/LrJ-r%8F4/L)2Q+!DmI*#g"D*?Q:F+;Z1H+X/$L+<)=>)B1Ll +2EF&c2`j,d2EEr_4[%L!r>,AK!#Er^JcLB&_#P3J:Jt.h;,U.c;GJem.4?eu.4Q_q/,h"9-RgVs.kN>' +.P!)(/Lk##U7n?UU82os5=#34!'^6D!'UHM4sYg^JcP$8!s:8C62j+N5%69d^[+!`!O+s\?U*rR8d +*[)RI+s%:<*[2gK+!)R_?!LT=?!CH$r\F[41,C[@q_J=01bp#H!.k3m!!NEN1GgmErA4:*'f.['1GUaA +1G^d4+%4q_&%(0eOHb!.k3M!"&cU1bg^=0eY17 +0)[I?1GCC22(pR6/2&Y4-6XNV+rhLE*?6=FrZN:"*Zu79+rhCI*$ldR.5s:L3^5qh3^,Mh3^#Ma3S=B; +'c7`&)&F%hdf=t"JcNRd,Z%<89ib%g=&W'o74UB-IZ0boW2HSlVl6&CF'gCG/1W2#.kU`N!ICFl ++sA6T+=&-0+<*pV=^5-5>XpS,1,C^A1GL[@1,C[A1,CdD)ZlrAtr&J,Nh&/5ce%h0*g+X8s/5X[n%5s.G#5!hS$4XN?V4?Peb5WLtn4ukVX ++X%d<$4-n*X0GZGu/Lr_50.S_.1+OFe*Z?1@)&sD7)^-18$3g\:!!N?&%M'![',`&Y3^,Jb4Zc(p +3C>be4$>\gf`26Y()I`$(`*7Z!.k3&!9!nh;Gg=m:/Ohc;eD]7]Za$^?b,a1,C[@1]B0,1B]Ni1,LA6!.k49!"(&/1bpjD1c$mC1\rjD +1GggB1,C^C/0Z2Z+WqjK',D)m-7C/f+oWYq,pOQY,Ujra,W%SD4$Pk,63]V=5=._'62j1Y4$H(l3C,\n +2C^!\mf4=1%i?K1+X%^A+_-+YJ:3&_0eb=90JP160J>(6r\"C./hf"/VZ;;KaoDbs0eb470JG.60erS[ +'JhEp.k`V21c-m6*?c=A+W;RP$juG'&-jF:6p*js3&Wfd3&WiY3B@.$fDl*X)&=#'(C7>IJcLB&huF9d +;,L=i;J<8SbKJ&N\Zi::Yp?W]Yck78Yd:R:Z*CU>ZDi:@0e+e-1le<&V4Wf55X.M!585sY92%mE6C5t"(".Om#$.8uD4Y5PU0ZEUU>ZELM2Yt)%&ZELp_ +c-"8LSn:nt;,UCi:f:+g;`R!/5"%[t4$uY784kQX+X86Z-RL)b.O6>b.4cVb.4$5R'HS29*$6M)=^P98 +;_n;-#Vn1k1,C[A1,9(i1c$pB1aW6\!.k4:!"B)^1,:XA1,C^C1GL^Cq_B0J1c.!B0J>%&+s%jN*"3i; +-6so_,U=NV+t+QW,lK&5,p4p29h8&F4?bnp5s@Iu5<_Ct5!:n`4Z,P`-5I'u%1)G'qu@oK*$ugR+sh2] +I=Zue0JP480eb75/h\n81GCF60/"n2-ip=JJcNso$jA(40JP450eY770/Yd(^[c-+>SbKS,@JPf.OHMh+X/-W-6XWU+t=c[-QsZ_rZ_ge'-eSA+]hfN>$!L8rA,!?1,C[A1,:X@1G^aA1,:3Xkl?;8 +NW9+b/Md8\">Vbh1,AkcqD'f^1bUO=0eFOm+s@O;*[2mW,U=]b,:+TZ-7:,f,9\9Y+XSg59L_ZI8PMZ: +3(#qo5X>97%7*9<3\_`a%1*OZ$k`j1!"0Ye)BgSKKS+l,0/3AY#r++d0/,+:1G:H\0*74SY;^Rr]gQM6p3s4 +56aA<5Rbf\2Rb07kj:f:4k:K1:Y4uPi#9Lr#R7S66H8jFaL+W"uA%j1c$K[lMuM:NW9:g/i,:?1,CZa1B93-1(c2p1bpa?0JbI9+<_a>*?udQ +rZjg+s\H`,UO]Z-pU9u:In&J9h@lK69[_%5!;+k4?beO'b(ce#nRLM%M9*NkPu,0*$[:g +H\-Vr1bCLaihi>ZE^U?ip=0Jk@<1b\SY"uA(k0f(Bcb5d+oYQ+k7/i,7>1Gnh]!])Per\>$> +/ho4;+r_1:,U4Q\,U=]`r$27h/g_ni,pjfZ.3g)`3_2b491VcM84uQH9LqT:7Qs1*6T,>d%M]9c&.]9] +%L`aRjo>i++XqtmKJ4r1/het21&3L/1GCX>0J>.2#3u8@!0@0c$844g.k3/(q_8"'%4X%g0JbL;/2J_( +,97?X!##eS%grm[%M0!S&I8g[0/u-Z2a5^k!YZ=dnc47AJcMJE$HpW:bf\/Qb08#PrlYPkaLJLYZELM- +Yo'aMZE^[?ZE^U=Za$As8>Dtb5X7M%5=Id357'S>5 +1]B-51G^dB1,Jnb&2>ss0JkUA2)$^4&/uuB.4+p>s!RgnrZr@-,pa`Z+(/2/b4*uO,?'a"gS%h9-_&df$U&.9!V&.BL73CF\4!<3l,!.k3&!2'<+ +bKJ&Qb0.rMbKA&PbKA#Pb-J7TZM:[1Z*CObtLk6UX1(6MNbK5!V=s5!]*3!B_.$ +!.k3t!!*s&rBCBI5X.O057^"I5"%P"6:3n#5*`CZZ*O,/!OB!/Z4!qCYd(I:YIM]uc-6+/$HgT8bKA&Q +aiqo"!`.'6r^mhn8k;QH84uTL84cHF+s80Z,U+N0-N58(-mU/f.3^#h+!2"Q>0Jk@:0ek=91*[8Q+=&6Yq^)Fo-6sla%j`SL,p=H]+sJpotX>Z*LX=Yd(L;Za-g@Yc),:6Tdb"6ps685PRGF +5X7OLNrXb3nc/e=57XKeq6YctG4YlM*-YlM*.YnaRLYHkF:Za@itbKS/Pbfn8R +ai_fLrQG2_(r4-79uc +-2T"h-2o4k-2o5',U"B[+snHV-64*[1GLU;0f8\]"#D\g1B''02#]931*!P!JcO7"$iqG*1GpmB1GU^A +1,8Y]r\G$@0eb@;0/47f+s/!S+1bCBV0EX$^0eWGY"YMG_1c$0"!.k3W!"8lN/1iD)0JP76 +0/,'V0`E^1/i#(9/MSUdmJut]#RM"P&eYce%LrCJ$OmXV%1!@N%LNFL&:sn6!.k40!#Ni&bfS)Pbfn8S +bKA#Ob0.oNbe(3cZEWl(%Bct@YctI>ZE\gA5X.U/56F)651;qD/")!&OR/rA+L3*s%N) +JcPHD!5nM&H3.E%1`pR&e#B]o`4F\"rA[@.krh5q(Mq-/i,.5r\+=,r\"=,+9AbJ +JcO=$%0J"3/Li;%1GCU>1bLN]0DmL..4[&(/i*ss!#?%V&e,E`%h9*]%Lhni-3KJ4JcPHD#6le91G^jB2#]901BoTj1GUaA1]B-@0etO;1*7ek,p+H\ +,U4BW./bLm./kPO,pjrd-70u]-8&"^85)WK91hiK7SH?E8k;ZI:.e)L6q9`Z%L`aU%1WdT$4I4K$3_"M +&ekZH!:9ai)`9/t.k^WO%l,dl/h\h21G:=3.kNA%"1/&[!7_&`"tqba.P*&"1GCU<0eY.60/,%50E*X/ +.l/b2/dUJ;((h)g#7M(O$kZ*F;6post+Z*LU=&$`=@Z*:a^bf\2Pc-4DTbP]Tab5TR1bfe5QbKNRL +7nHEJ8k;NF8kMWH8khuL91_`#,U4W[,pjrb,p`74s!7Oi%O<5C+;l^\1,L[?1,C[=p+ck12)I*F1,'"* +!.k31,UjC&Mu6q1G(@;)C-IO,UFca,U=]2-5IsR,UXi_,:=Z]/5&W*9gh]M +91MKF:&[fb8fUDp91_]E7nX1"&ebc`$kEjY$jd:K$kE[X&.o6/!"0,o2_us;1G^jD2D4bYr[\4'/MT%9 +"-`e;!;?I6&2>jn0eb46/hen30J>4;1+b:3/M8P0/hJq01C`@E)%@#b%hT6X%29Kd$4ROU$471O$k3[[ +%MTE4!.k3&!.k1P!6`Ucb6,o2b0'_,&^&;?bg">Rc-"&1Z*:L;YHP2&YnOFJYd(I9ZEpg"5Z*:L=ZE^Y0Ylh;:Z*4G< +YdC[=[*&Bk!m8a0rQG5brlPhrbfn5Qb0.rNaPo``9M.oH8cD=:1Ggi[1AWd.1,9@4!.k31,:^D1G^X@$o0Fi1,Lg@ +)^QjX-7/X.52%f!#c1W&e59\%13FN%M0'V#m^eG%LNUR&IAjPET7%N!.k3&!!3-BeGdu9dEKhXbfn8Rc-=JT +bK\2QbK@i0Z)t:;Yd!c)!4)U/%^<4AZELTb5sIP!69db$pHJXCqEG'I5U-?_!.k3]!%.h!5X@V"5!M:u +6:=726:3q$5!DG"5!5X%G$UTUo+Z*:LPl +dalsue&onWcK#@7=B\[%9h@rK8P2VS9+OQd8k_oM83e:@,U4KY-6`%/!%7am%O<;C,q'fP0JYLB1,:R? +pG)n/1GUaA1As!0)ZeLiJcNC_'EKI80etO?1,L^>/M/S-1,1O@1b\h`$Sa@n0f(F',pFNX,k*,_-R'f\ +2BjOq,?=72M@U`YS@:N_H9M.oM91;KE:.S&<+!i-T+sA6,-3,@k-5.aR-R:&c+Wr'Y)_Nm$ +2(paC1b\Y[#;\+k1GU^A2#]62-Ni!$JcNC_#6lh;1GUa?1]B-I1GU^A2)6p@1,(U?0JkLA1Gpm&*@2dS +,UDn,rZV=b3$KRl,!o$r9h%TF91_ZE9j(q;@UieT>[M)N?=[DL@pYt(S=,V.T8n;7;`5C"$k!OM&.JjT +#6Noc#Tc&W1FtC8.Ob'G$o'Fh0/,"1.kib8.0K>FJcM8?"9p>-0/3>Z%ko[l0JbF=/hf+<1GUX;/d3jV +.P*=`irCJ2#mCnL$k<^V#S\IE;e's5TphgNOe/).SYpM*3&``P1Gq!B+W(RgcN&OsJcN%U&-<4S*\o`7 +2)[Dbf"68J'j8J$>j5_?DjCD_-?X@/O?X[DSARAnU>u"$e91MQF9JR_=+!MsTnKnbl+X\Qb.3TcY +0JtI>1+b6U1As!81,C^C2)7!C0Fc_9JcNC_,n`!f2)R0F1c$mC1,:X?1bpmD1+tOL5>+L?:fpO:-7:)` +,U4c.-3>G<-Qs]^-RLfH8k2QH7S$Ea?t3YU@:3_W?=IAP@pikW>[_5R(R:>YTVA'ETU_I7PF[G:8/W*L +%MTEc$K;$k))*Nj0J,171\ia'0*+60eb:6/h]";5"8(J +>A.hgE['TFrW",J$5+$_'FcX?T0=6p3_!!(-3?#!P:95s@FTRK.p>rW!9-.6p9g5s[h*5sbK8$:.'_@s!?aRA6RSrLsFjS6iJ* +ricI/Z*O@:*>N@prhU?X->t +85;WG0HMPf,pE=8ng=>]!@K,k+U8`.0JY+91,JY[r\OO/#;\+k1,La?)S,p#!8[\Z!Zs$I0J<>Y*A9-( +1c$d=5!VY6;H@(,>$5*5@9?SW+Wr3_+snK&-6jc\,:+HT3D)k68PE#h?X@&I?t*SR@piMKAR]"U?t*MS +AmuW`R@9Y-R\Q('%giOW&`Wis!@'NW2CpI6/bq(#1]B$70J4t0/i510/>:;r\+^70eu'g>%DMnIslqJKEHCOH8+F\+TMKG$53sc#8BgcT:D=@R[9P3Str$CR\,q< +Q^a8$RA_t@2@VN#2`!9K2Dd6K2`;KT[K(mZMuX.b":,JR'c.W&('56f&_d:2#:22^1cI1i +-i>;&,pjfa+XeZd+=dpK1bpjC0D%".1G^dC2)6sC1G^d5"2+\d!8[\i"tDGc1,CX@1,L[J7S$N]>[:W? +>Q.k=>$G39=]nr\&geqJ+XnZ_,k33*+snTb,;2SZ8P!#o@UEMP@q/tS?"%)K?t*VR@U`bS?YSXQ%:SY;@8T9!5$#S%1KirB;r,:4ru0eY?W0EWp[/MI&V"tqS^0/+dVh#N$,^&T8W-S?u% +/MAb20JYmh>&AJ6IY!$"JUW&rK7J?&KQf'Rjo?P)!!3K@%M(0tSY)C?R$a>*L&`Nfg!!E<63&WYm2A.r-2DmBO +3&EKP2`*%%RBM!"/cB1c$sE +0ekXV;H!L!r`^4E>?Y99?!CQ>?=$i=<$W5(-m0l_+sJ6[nKo\4,q0lg8kM`\A7K"S?t!PS@UNSQA7]1\ +An,1T@UikT@U!;OR[TV0Q2[3bSt)79Q^F>4UR7F:R$MbK&ISjB!9X=d)AOhY.Q90Y0G#lj/h\n21G:F9 +0eY450JEpK!.k4/!$Dn,0eOn,2+_+fEe&^lJ:N-"L4Oo)J:iN-H[CBuE%)4U!$2IU%7PW/TUh[ER$sJ8 +St277Si_2)dEOrAP9I3&``Q2`ro=4@dEK_>ril^7 +YctF=Z*LV)Ym7MZ*hj"f&?Gc!9="l@k>>[1K< +>$P<:>[(<8?!LN-,oRcu,l&bt,Uao`-7()b+:@q&nU@UT1B&7T'V?XdMT?so:dQ'7K" +R@aAG&Y,AaU6hFCSY)LEQ?jec$ig:h!!O>d1bC%-r\4@*oe?D!r\4R00.ems!Pe\e!9!n_"=5iX5?298 +q1&U!JUi<#rI>0*Jq8N&KkqqPirB/n%Pre4RLkjRR[Tb;TV.pJSY)FCR['9?U]37O1]fNk2u,?;2)mKO +2E*TR+e8Ub!5&:5!<`f+('PNl()Rc&rY>\S'c7c'(^K%#rVus",l'Cs2@h`)3&``R2)mQR2)d?M3B?or +q;_51"Q%DDZa'J5rNQ@,q6Bq'&[ARFZ*:U?MCU;@5XI\"5!M=+5Q="F56F/82@\ODJcN^h!t\LTNVoLQ +UnXZZq4eFoUS=KXTqJ0WTn,$NTsF0m%'["AYHtO@YHP:@aj:+Jj5]sr!9="!G#[=@fg+K +@/OI=?sd8M@UW_UraH.C@pr#"+X8?^r?_Rr,UN75rZi%%,UOi`+s@F=+YGT)1,:R>rA47)!]2\hrA+@. +">VG6!!%TNU]:Q+4%`FU>lIn->?^l-qHO;1>[CT>=[sqc!YQk*n0SVn,:Or`-mL2g,tC[>?s`S:!+Z"; +!+Gb6!G#[<@09hBQC%To!J%!!EuZ)_WfI1b^U:0JWP[pb2_'0E!R. +0.en4.ghpLKE)#\70?\/It7NL"+l)UJ,FirJH::PrdY9'IXuj!BI+T$j8];h,]]QPpR2)LrgEkXSc"o_ +R$sG5T:Ds_2DtFks#9j6r\X^83;tf>2`N`Q1_9NbJcLB&i;`o[#Sm:R!uMdj(&SjH(^:cn()I`%(]G0M +"5a(Z*B3RJ!]N"srAFm>3&`ZP3&Whu46bf9j5]4]f>b/'['6a=Yck;+YlM*,YmIY:ZEZ>=/3H0_r'13H +nj!+="$o1;*oR*N!6,!B,YrudUSRj`"/;N`UA(DaU8"I]UBdZD.kY26Yd!Z&$a-b@YctF9Z`pmZh#HEo +j8``i@KU+L@:8n?raQXQA7B"X@:*YW=[FS\,:=]b,Ual^q'H(fq^)[r-m]rV*[EBr1bpia1\id+1]0!5 +1G^jD1c$p(JcMYJ#nJIT>[(H;>[1M3>QS,5>l7e8>[(K<>$G3:>?b3"+!+c(eNr*g(C?X@#DR$sJ7R$sP:qO.nbR%'J/QC=80Tq.@.3<53&iiVr\j^6"#`%s3r_DCj9+H'jQ#Xg%--C*aK_qSZ`p[? +Z*O).s02F+$a#jL/h8nF5X%Fs6LR,>5X,-2!Ab#B!.k4#!!!&o!!jN=I%d@1USFR_UC!ZhUSFQYU8"EW +qkF[tUS=N\US=Mn.Om!IZa?t+YmIS=ZEUL+!<*i1GUaA2)6u]1&s-/1']Tj1GUaA-O&K0JcO-t!!3#u#R`(L>?tK<>Zq&1 +#@(M<>?kB;>l._;>[1H:?!CN:=^*p2+X%F@+Xuq.$mHl9,pFc].3_St?Y':MA7P:A!+Z";"_2"N@:E[E +@KU%F?![As!hGdIq3heZR$sD2R[BA,U6hC@DA;14$j@[s+Y><$/hnt60JE,R!&+:)"u._`/h]"0!!RuT +WrNG?4_01rJ:N3$K)'p!IXlrurI>B/JV&E$J:i?%J4gk&+p-j+"r;?SPEVB$pmMV^R[T_7SXPq7R\-%= +rgEq]Za-n92Zu#t3&Wbl2[qZ)2`j8e0Ec*OXZYd1C:os"\)Yd(I;Zi709 +75-2@2*X;j5X%I'57'M=5[(K<>?kE;r`TA- +>[7)/$WpV<>?tK72'$bO+R[BH@RK/ZLRKAeE +Sc+u_Q(je@S=#S$)n$J-LRM7Nilm''0)u4I)A#S=Gq:nX9QIR[TfGRL>a`[B?Yl2`NZR2`CFi!]E%urAOa6 +3rV#=3&E&C!.k3/!!j,Q(`!r'(D[_j)&F)+(`!o(oG.TF(D[f(&E!Nn!A?Ag2DR-LpGW(1rAP0D2E*QS +2E!KQ2ENu`4oOFDj5]4^o&L#8jQ,@^jPpO+j3b3;Z*:C7n?EM.Z*:Hh-n?hu1d=/f5<_:#56F/85=#34 +!^JIL`rL\kn,N_87"h>0U7e6Rrh9XmV5'`XUS=I\U&h$`oqMngU74Fu/1N0IYd:M%Ym7J9Z*UR;YhB$: +rT!5)!9="<$0:/T@UiqW@Uj$D@fKs;@LljY?=IDR?XukV+s\Td,UE"/&h#.T,UOi`&g8A=+t5<'0f(R> +nM1G-1c$pE1G^dB-48o9JcO-t&dodT>?P-5>ZtH=>?Y04>$G04r`oY2>[(E;qHF51>?b99=^!=!rZD=Y +-R:,bn0SGb,U4QZ-Wa_e?iseC@UA\9"(PeMA,]pD@q&nW@p`MI?sj55R[]V2R[B?7RLbsXR$a>5R\>k< +PaIl.N\TYr$On"#*ZZR\/h\k10C^_'0/,%40J>(50dmCj!.k4!!#cS/CP7@pJqS`*IY3?/Kn=r2KReN# +JUi9%Jbjm*JUi9%It2i!*ZlOK!Tj@c;4NiCTr.p^SFr3Ar]P2YT-@ +3&``R2`N]U2)[6K2DZue_Z58gYQ,4<(`!r((`!r((Dmu*()If'r>,PO()Iha('#3M(',-_q>f[Y!s^_@ +2uYf;1A*R/3&roX2Z>WG2DmBN3BTGf5!J&fjQ,@]n)P#>jQ#:]jQ#=^euu<]Za6n,Yl_/7Z2V$0.4YZS +.P!&65X.IunN["<#sLR=5!_Fu5p$3-!0mNh)d/8sV4s]Zrh9XmU8+HVUnOI`U8+RTUCEolT;7Q(.OQ\r +9!PV)n$)kurNQC2h#-15jQ#Od!9?tEaF@K9[>@UW1[.4-2_.JY:j +./P>&,U"K\,oe*Q+!DdQ0f1X@1\!7"1C5fm1GLU@1,KgLa8geloDfa:0MknV>[1Q>>?kE;>?k<8>$G68 +>$G37>4l)1>[(N;;Bm>/+n8>[^qE +?DX6\QC"&/R/*0_R$sJ0QC=8/Ss,h?h((0mU7n1+s$X!.k4E!!aB!='\s4>[784#[1J:>Zk98>[784r`fY3 +>?kB:>[7)/%pW=@8gki+*?lX9+sA-Y,4Qui+"^YN7 +TU_DJRfAcPRK8S;rL+.^Of+M7TV7d>Ssc3Nk5YPs,U*.."V!&+4'%PKLh0f(XB1,(@50eb9h +l2ZD9ec6($;0RVFJqST$J:N.KJcCDsJ-:FRJ:W:HJ-ggZ?R$U6+<;7-k5Y[-T9,S-RKT:IPbFZCRKB%N +S,SiWR%+&C"JDZoY-%]-"$/A!2Z5T72Z#E52Z,KB3&NTP2)[HO2`EEM#c.NQ!7h,[%N#rs(`!i%()7Z% +(`!t^('GHi()Rn`('59e!oO%`*B#i71H%-J!]Mtrpbr763'$ss$8sn'2`DjQ#Rero=%> +s5X+>%bn4mZ*LR;Yd(F:Z*LX=riuI.&$rFCZ*9lO.k3#!.O[5@55IJH5!M7s5lNtN5sIUu5lO"I56X;: +4[:P%MZC?h!\IoMkbA-Pr1a@gUSFR_UCX)oU8+Gl.Olu!-n?dQZ*4;4Z*=#.&?rFEZEUR:Z*:OCi8`nZ +j5^."!9?b?: +>[(B8>[(Go+X%mM+>mRX5VkBTJ +R$O<5RK]4RSXPn6"Il$JP>UND!X'M_r?3C*-SI#)0/,(50J>%40/5180J>.70eP170J>+6/h\e-1a3%F +!.k4I!!XZCI>*6&Ja7gjIt<*!J:W=OJ-1@QJV!fN#>#sX+J]3&WZR3:]$-2@)/u2)[!.k4'!!ElK(`!tS('YQl(Ddi&(]G0M)#G*+!!=/u2)kIl +s#0R0!&ja6#<"M!2DmES48V2?j8e6$j9al-j4^fBZa$a=rNQ@.q6:F5Yd(F;Z8aKf.Olqt.l%#f!^8h4 +q*,-M5X.Iu5?q&0$sd(A +>$>-7?!LW=>Uo[q#pLB5%j`VN,U"Q2-5.RL-RC&^.3p)`/QlCg?smGQ@q4q9!+Yt:"(#;>>l7k4Yck+' +R[BP7rL*_WopYlOs-O"XS=5tBQWNAN!?NKb**W0F')#G'K(]G0T(D[c& +()I`"hZ*cu1,q3Or\ja6n2C>*r\js<3'05br&sf8!918Z$.`K +.f:^u00VWc5lNtL5X.O55Q="D56O/85[(E;m99Qqr`^.C>[(H>>?Y6:;'R5/*?cOJ+XIOA,U*:5,q8X:%j3)C,Ual]-7^NN?!h#LA,B^8 +AFO%3@q&kS?XES7#I:Y?Vk06DT`(;ZR.ZpISc5&^SX>t9U7P0F!!!c:+rVC>r>bq_0/]1&`j*1BKB`&?Z#,!"TDpEeT1!JUr?$JUi<%J:[9Ar."curI=p"JGt$-JUi8i/KZ#U +*ZcFF(_l37"`^<.S=Q&ERK/`ERK](IT:r9fqQLAl5!1kb2)[BP2E!KRof)k0r\k$@2E3NQ2[5*=JcPcM +%1!gg(Dmu*()Rf(()@bS('#3M('k`m()Rc%()I;7!!O2s1c@[CcF@:EaF@fKs-@LlaP@:W\P9-bc,+XSQZ+t3:7$n!2D.3p&_'HeSD,9Zt/"<\p@1,Ska!&FL/ +qD.q'#W"4k1GUX@,79P5_Z12J)aR\6>[(H<>?b97>?bA!>8pgO>?kH=>?tE:>?kB;7i`ft*ZlOK*$QLE +,q&jC,U+W3-N57t,:4T[,9gAt@U`a1@K9j8@K^(F?mRaA['$="S=Q&GRfAcKRK/oWRKoC\PG+#4 +SiH!8!s0Vc*<$r_+!)CF.ki[V0a'-a0/,'Y1&!@0/hSh20JG4;0f:3`YlLO!%g=RpKS"]'JUi6#Jq8H& +Jae3gJ/EifJ:p171+<_aI+WVB`!!Ql4R\,t6l^A-MR[TS6TrG3!Z2:a15!D(l3]ArV +r\jd8s#0R0!''s:#WF_%/ik^G2Z\g:JcH,X!Z2ai'c7]$()Qrc!#Y&lnAAAEmV8@:*DK?tEeR7k#Z. ++=/9X,l&c",Ujo_+XnNT+<_pO+sA-U+!E-41]B0/1BK?kB;?!196?!&s,+sA!J+sJ-Q*??@K-R0f^,l&bs+seK^+s\EcmI[>Yd1I1T9f#9!1j"U#b7N[U7d^7V^^m2$Q^9.*?Q:C*?Q:D-2fRt0Ej*a0.nq5qCiF6/hf(6 +1G:@60J>.:1*H^^!6,!K&l3t3Knk2/Jq/B#JV&R>J/EcdJUi3"J:W6'It2i7*uuFG*uu@C+Wh^&!:Bgl +8Wog6Q^X,/nXBKKqO.V\Vlm5-Yd422#X1C75!1kc2E(+b!''j7#<"J!2E*KL3U$Nq!2KT%%i?*!()7W# +()IkR(B,'N'c%Yb('PQj()7Vth>dc`2E!KM2`3Sb2ubl:2[VH$2`EcY4[)"l55[S?j8e6*jT" +isU8+BT!i)HbrhBUjTqeEXk+hsNrhBmuT;.K:.P*&"/1W/"r[J+rYHY::YHR`+%'m(AZEg^Bd,a6J +j5]Cbro<\4$05At?>$G07?2[t/>Zt=o>6%q->Q7t- +>7+V@:aRA/+WVUI+T3Gg'IG(P,U4W]q'Hb$+XA6U,pZ/r?t*JI@UN\TA7B$9@KU%H?s`h+50J5(50JP470J=7EPlSl*&HjUuKS>&-J:<6'J:`<#Knb6EJ/!QbJ:E*#J:N6#JT!7`+!)LF+!)O' +*WQrS!:Bgo.$:*iTVS-OR$sE6RK/oURKK(QVQBd$!3Z4'$9^L74?P\c2)[BQrAO^:q)8C82`EYm2[29$ +1cI?O0^A^j!2]`,";Vgj'c%T'()@]&'c7f)m2#X9$Q'Wp'c.]&()Rc(#i,Ie2)dEO1cREP2`UCf!''p9 +r\ag:4$<7#qW%Y:lf8Z=jQ#=^j5f7]jP\"`Z*1C8ZMLgCZEga>Z`p^@FXnmj.Ocht.k)tt.kjU7nBWTq\jQ'TQ?!U]@?iFI"@M!$U?t*GN@:E_S5pe!+ +,UXl6-5\$V,9S0R,:!mH+X/'Q+sA*P+X&'R0/GBZ1\WX,1c$mCr\=a81c.!F1GUX"p&K[El2Une$oV)a +=U\S?>[1K<>?tK=?X$e!>Q7t.>Q%eB?!K]=,9\3S+WhgM*?H@I%O%1/1qb2!.k4:!"ooAH\I0,JUi<%KS4i+J:E*"J`M@[ +JIm9]=XG12*??1A*ZZ=F*ZbdW!!sU9VO*O6Tqn*@r0dYTR.HaQS=Z@LY->49YHIc,rB1NN4Zk_`2`N`T +2E*Vk2ZPi:2[hZ)2`63#!P175Y-[r/%^3.CYdMX3j5]4\jQ,@]l/Vj)o]5sV$XR1I?!q&K@UikV@Idk?b69>?bA8>ZtB$G;%>6%q*>7OnC>?bB<>?b5c+WqmQ*W@2j+LH!+Yk7raGt@A79!I@Nf)h;a;fX,:4]`-mg;i-70l[+XJHY-PdgK+[1K<"^>59>?kD2>QJ&6q-+51 +>?b?;>@(N=>ZtA1>VBGl>?kE=?V)Ug+sJ0Q,9\3O+=&*P+n8Q^*s9RK/`LRL57ER?a,*R[o``&+'?%+WMLB(EjbBrZ2Rj*ZZ=G/2&\3 +0JG490/50Z0*!a&0_mF-.P*,'//&']!.k4=!!`ouHA.''I=D0H#CqAUJUi9%JGk$"J:[NH*.`WiJ:W6# +J:N3%J:W6$JUDorJ:N&qD'C#A*?Y8%#9P'3)]]qB*UNh/%7?_Kp6tWB#G%HVR[9VDXn8jn4U=)03&WcU +2)I;j2ZPc22[MB"2Dd6J2)dBNX8mhPmJme/(Ddr+(D[i)()Rf(()@`&r>5PN)#"d\'c.]&(`!l(()@`& +()Ri*'c.W$(BrRo"9US;2`CUn!&j^5p,<492`95sIRr*!Dc3dJs=hA"imprh9FeU?/-M +UA:PpU8+NZUnaZYR:I]q.4Qbsr[J=,.P*)"/1W6TZECI<&[/OEZEUU@U`\Q@UN_S@7Wj9./kP%-RL#`-R9r]+t"Z]-34r,rZD7d+[(N=>[(H;>jbeu>[(E;rEB8*r`]D,>Q.e0 +>[1H94!jhK"sY98+WqpLr#ce$,UFTZ,9eN]-R^/c-RU/d,r8+c>[Ln'@fBd<@U`\No3M0r"0SSrSGelV +R/NHRR/!*ZR[Tb8R\-+=TU)'i&.It,!$;+_%3$H/)]g(A*Zc=C*?Zg10Es6d0JP770C:G!/M&M.0/"mm +!o*d=!!*d/r.>9(J:E'!JUi<%!.jQg!.k#t!J5h#J/WujJq8N)J:Vu>*$-+A*?H7B*[)OJ+X%gK+mo=5 +&J1G&T';^CS-5:LU8bHkYQ1p&4U4)02E*QQ2E:Xo!''^3qDJF72DlMX!.k4>!!*lQrYGkV(DRc&(`!r( +)"&.A(`!l'rY>MN(&\mQ(Ddi'(`*r"g&M7/2)dHPrAO^7r&=:-r&+U93^31!mc4B.mGoALjQ"t5!M4q5lEnJ,R'e?df9e(H_dF1 +US=HVU8+KWk+_pNrM'RkUS=KXUnn!a)5O$h6RjT9.k2tt.Oci#.PE8'.Onf1ZEUVHZ*CU>Yd1L=Yd(F9 +Y.`!"h;d\Zs5WP.q-=)-?!^n;@KBkHmU@&B@U`_S?sd>87k>u5-6sl],UF]_,UFf_,mbnA*ZlRK+WqgK +q&p7m+XSp#1,UjC1GUaB1,C`U1'9Zk68>Zt<8?0GJo>[(D1>6A,9>[%M< +>$P9:>[:N4.JFtf*?lLIrZDsl+seT\+XS?]-79o^.4-8f,WA7b?=;r*!+5_7"(5JA>kD=tYQM8:WM9B\ +!M5\NRf8`aSXQ">SXQ4?St.tR"n)Er,Tn!I*?cFHqAp1g+^d% +!!!$ZOJAG@qkF7hU8+IIUB%%dUBmZjTqeEYU7n:[UB[H0.4Zhs/,:Y7/1N5).kP&3Yd:U>ZE^^=Z*LU= +Yd(LMbfnGoj7;9ijS<*\>QeDA@U`d9@MWHbA7B([@U`SP?suYt8hDD7+K*r\F[60etR@pbMY$$o0Ro1,:X@1G^dC)[W/;fDl0X!#n^9?!gf@rEBA/>$P=s>Q7t, +>7Y"D>[(B9?!^c@=Bf&s+X?q/!$_Cc!$_@b#p(-1*u$%H+snHG-R9la+t"Z`-RL#n9hS8i?t*[/@KKqE +?LhCtYQqPBZ)=7`R[io:%[`HGR[08.R\cC@N!U+*nGiOhrYYn`)Bg@G*Zb2#%36N3*uuFO0eb780eb9R +0_m@10JG.40J>+71c%!/$,?PL!!b#qKS"](IY.QLrdj6_!.k*!#(_;SJ:`<#%=`hXJ:N)I*?H4B+!)I% +*XNi.*?lLE,U"6InGie"$kOYNS!TN)RKT:]Y-PA*Yk^Eb5!1qg2uY`62ZPc12[hW'2)[BO2E*NO2Dm"G +!0mNg#o4?p()@_c('>Bh(`3)cm1o[=r>#ANrY>bU()If'(_mf&fDl"/2)RAX2uY]<2`a)c54q&=4nI_7 +j5f8/g!%[_^p1/IZE^[?rilI-rNQT6.P<>'.k3+H.L.IR.P!&"0g>S$"?o(95!\R$$p[$A5X.Is5QJ/=qdKP8p0ntNA7T.\@q9%[?Y3eP91qf8+X&$Z,9eK\ +-71#;-4D:=*?Q@G+[:Q<>[62k%9Zq?>[(?9>[(2W,9J'++V5h@+X/'P+sA'O+s7XH+sA9H+sSHZ+t4`_-R:*$7nQB_ +?XdANk@+I#?iF=2?h@Y!YQV>?Z)ODnRK/`KRLbdOQC=,,R$s/3Pab/S%1Vn/%0-AH+sS-P+W;OG*ZZ:# +*WR;]*WmN+,VT-N""u>_0CLS)1GgmD0eb:60/,(71+!RM!4W";"ZCCSKRn](I=?ZpJ,Xs!JUcp7"+PiQ +K)L3%JUr<$)hs5X($!5e`>r36X8Yd(F:Z0.nt20J>%21c$d# +"/Q"P!"/lnH\I0,KnP#*IX_-D!.jBb)M*EhIt<0#J:W6"J:`B%CJ#Zh*$64E+!)FCrZ2@d*?c:D*?$.F +#5eJr!!ro=#R_]EQ^",6kaD^JVlmD4Yc[Q%p,rLA4ZYS"2ubf.2[DB&2`q%9T/1;qur[ImsqC2\#.k)qt009%r!'p$[CcFm:$-*@Uf=E+'r2\>t7CX9110O+seTa-7C2e +-79uU+=&$P,9S*P,5r_c,5iYi+sJ0R+sA3crA+F1n1su!r\=^71,LaD1,CWg1GgmC+:[(B7=^#$6?!CN==^,-8>j,Dl>lS%->mFS:>ujNZ/L(0;"s+m1,p4?Tr#l@j+X%sN*ZuU>,5ri$,:"K] ++sJSXQ4@StDpN58"S=%KuD( +%2p0&*?lLF+!)FD*?H7"*X<].*uu@C+tNUFmkF_or\+d90JG+60J>"40JP@,$`F'\!#5W!I=QltK7\f- +Jq/B#J:N*%K7SQ%k^XM$JUi9#J:<$!JT4m\/fbrS*ZuOG*?Q=Cr#Q+a*[2aJ+X&$8r;cTm$4@1K&/AcG +V4a"?ee+2`CUn!&jR1$og1)3&iiU2)d?M2?`OMJcN@^&J5`p()I`''c.W$ +(D[c&()IhM(B56O(B,*P()7\q!!1RL"V`gT2`!JY2Zu-%4$Gn!4n@Y9j5f7\ro=(>qW.A2"ln\(jPnA^ +aq`.@\$3-BZEUX=Za-j=?7RKU0e+Y(oI:.t.Ockt1d4/h5k$u<5l3bL5X.Lt5X565#!Y@;5W9\elN!LV +#R+%lUS4EVUS@a_$)4&bU8+KXU7n=YU[=fWU8.X\#+:!N7mB3or[Iq!/H.+#/1W7I.MaTc.k<)!.>tI6 +ZF$g?YctC;YIhs$bPo]ej5f7LjT"<8>ln>MA5#Nb8kVE$-6soc +-7L8i,pk/X+<_jH+X/$Q+X&$Rp`Tne+<_pX1,LdCn1snt#;S%j1,C[A1'ocn1GUdB1b0=DMu`eV"9U,S +=^(f0%UE:C>[1K;=^,*5>?b?@e=+7?=$oC?=$oBoNh0p$*ptFXJ_MTR[T`=RKSh?R[0??RL5^XTpgH<$P*OV +%J9]0(a0nC,on!G*?H7B*Vg`_*uuCE*@IrXK/B',?h' +R%9Q7ReE0TWNNJ2Y,nk7oW\$P$pHp@4?5>W2E*WT2E(=h$oKt&2E!KQ2E*NO2C?cNJcOU,!=p"F('YQj +()Rf&(]>*O(Ddi'k8":>()Ic&(CgT(!;$6p1H%!J2E'eY#.L@OR.P*PE5X.Iul9>hF5X.Iu5X.Is5,/+4qm.k<2%/M&H/rim*>ZECF>Z*;!db08&QbM;.=jQ#Lc +!9W).TK_X?!LT=>?b?;>?b?;p0.T'>?h)2 +$=$e>>[(H:>[1K84uQL8mbq9A7K-C +@LZgW@UinWAR]%V@UNJJm9K]tnZW:tU7IaCS=5b2rgEhVp6lGVTqIRAPV3R[%gidV!VZTn*<[H-)&aLb +*YBD6*Zlgb0eY480J>(50/,(5r@e4)nhC%s#VIba0eP+%%0;Ih&HDqsH%CHrJUi<%J:W9%J:W:FJ,k/u +J0'2jJ:W6%It<-#JUi9#J:N6#JUMN>5r15L0I@e]*Uk*T+X%sO,9e<=p&GI3%1N^S$;[4YQ'e'9RfArY +RgY[PR$s5-St2=CW2o9hnN?t:3&ikq2?5`92ZPl22ZP`72?>N5dK"k!h>e#r(_mo*()Rf&(`4#((`;r^ +!#YMI&f;B$'c7]%(`!l%()@]$)&frq)8[@3&ruX2E!KO2`E_q2ZPr+4n.M4j6G_* +j8S*Hi6'6eai_fK_6U?FYQ;#7#dU^C.P32(.P0m8#W"V-5<_:s5k8O#F*5=%7^.d\](.k<)!/M/G\YHY@:Z`^L:Zbjo1bKS/PbMqREj8e6+ +jRHLZ?=72P@q5FG!b>bLpL4/3@fBaQ@q8,%91DHH8NJ+D-7:5l,q1#M,Tn6M+Wg(q%jE/@+t,-#1GUaB +1,:XA1As$%1'fZl1,:XA1,Lcc1B9301BK[(H;>[(H;>[1K;>[6o*!*oJ,"'f&7 +?2e(/>Q.k3>?k?8>Yd`d1']Wk1b9mq+X6@u*?HFK+s%gK&g8PH,q(#e+soEF;+F8O84d;tAn#0B@K9s7 +@Kp=P@UNPL>jbnt?1G-&XJ;DRR$df?!1-( +J:N-"J:W:MJ.R9]JUV902_Zp?0JP%$*Zc?j*Xn(DRc&(`!r((`!r*()@`(oG.EDr>#GO +()Hlc$5aQp(D[c''c%PgaoDVk2DdBP2)b7h"?8>!3&_1(2`N`S2E3WT3BZXkl/W!-j5f7\p>c87jo"0@ +c,e0/bRr%A_mHVOZ*:R>Yq%:X.4Qerm4&2e.k3"L2a74*r]g`R5mF\B@:<_W@U\e9(1:cb?X[DR91)EJ92/#M59hBu-mp2_ +"stQ:*$?FNmi_cW+sA*.+Ts;M1G^fc1C#Zj1GU^B1GeGS$o9Xo1GL[A1,C^=*"Cj>Mn +>lIq:>[1K;>[(H:??h)3#$F\g1b^^@r\F^4-mBiY+TN_T+WhgL+X%sP*u67L+!i*W+YH@K'^9@-LteYQq>3U7@F7R[jAG!13\RpmM\^PaJ2;R["Qs%h0'Y$kE%4 +"rS^5*ZPq7n/_fT*?H7D*Zcd00*!^*0`j$_1&`j.0eY0J0ENm]0`E^01c$sF0-(Mm!2KT!.W^,iIY!"I +J,k)gJ-:FRIt3(MJc:0@It<&uIXm!"JUi6$HtH/41+t=90/5+)+<;OG*?H6k*X]942)b.e"uS@u3&iiRZ2fLW!!rcD +(D[i&r>#AJn.lHM()7T%(`!l''c7Z&(]G0R(Ddi('*QAV#6?hC2D[9K2Yf933;tiE2`/1W5%.Olr#m4&,c.g@LR.Q9UW55d\I5X.L45jpoD5!M7q5.LRaX/Li8# +.p]EaZ`jkAZFJ!"bfe/Pb0/#bro=1Aj5f7gj8e6(jR6@U?=...@MEB`@U`_S<_Q.W7nH6C7RSUN+=&?A ++=&!N,9S-R+$YCt>Q7t,>6S88?!LW=rEKe7>>[U<1GLO:1GUaB.fLRl,9d+1mNESn+WhgL+s@aH,U+HX,qqh`91DBF +8k2N]ART+X@/"+1AGosD@:[6T#nZW8(YcO[kR[TfEReN6^SX,b6R[]p/$4@:W%gs$Y"o83( +*[)IE*?$(GllHES+!)FO0eY.4r@n7)r\(60JG+4/hSn80-(Go!2ff'!<='XJq/E%It?j7 +!eGoQrdb!!*IWHfJUr?&J:MB.0ek@;0/5(60-q\]*?H4B*ZlKo*X?kB:>l@k,>jkks>l7eD>[(H=?!CQ<>Z!pF/h]"7/i#:>1G'jq+sQt/!$gqU +$m6]:+-J)e=YXK7SQ(It3*"rdY!"n:1OhJc($,JUi6$J:N3$J8%k> +1B'!71GCR<0dn+b*?G,#!$;7`*Zabl#9b31)BBn?*;]^J'b_8l%LN^T&.X2UQ("A:Q^df>!1WtV!1QIN +((1ln(`!l)(D[i'('_VU#:)2a2E!NP3VbT63W:u92?u)t2`X&b4[/6r!'T]0!994!'p*>r'(6H5=#-2!C/jJ563o4 +r]^KM1ER1-!!!'!!!a'IU8"?b?Vb\(^n"WmJm4gr;[0/2dBNj=^#$6=BYT,"'f)8>k)#(>[1K;>[1K;>l@k:<^nbs0/PC?0JbF= +1G(!R+T`i2,5rbc,4H``+XN7n-,M9`dmX;uU5/?XR>NAG'C3A,]pB?t!DK>[:WB +ls9.c#ILqJ['-C!Qi0M0FTTg0J>+70JG.50JG-Y0*!U'0*Esc.2`NL!6G3J$r;P1K7n`,It`UTJ-1@R +J:[6@,CtDrJ:W9$J:W9%Jq.iB2DQs@0/,%6/MJn0+rq^G*?H4A*s*N)*Uk*T+WMLG*?-(Cr;[K6&dT0[ +$kEaY'+l1PSXQ%APae!3RK/`SRKo=SVlmJ6Yc[8rnN@+>4Ztni3B&hp2Zbuu2?5Z12[;2u1,q0N2D13o +VZ6u>(`*r&(DR`'r>#JP(`!tY(B56O(((lq'c%W&()Req!Pe[?2`N`P3AWNNof)k.#WFV#3^#Yj4[/9s +s#oQ+!9<\3!orA%rT"aBbfn5RbKA#NbKJ,NZEf`F.4Qr!.P:'<#:V,Q.Outu/,^q'1I")i5X.Iu5k@5= +56*nF56F/85X5-2$U6g?5gogU]7%iU7n:WUB%%XUB%%cUD]l&URZa25r4m!p&D'p>k,lmTfs#>[:]EqdKP8 +pgX52!+>e8'OXg19h7uK84lEI8kDGu*t0;8+s6e-!$^nU!?rZ_+UfP=+X&6i1,LdB1,LfW1'B?f0f(Wb +1'TQj1GUaC1]B3=1GUdC1bpjB1F!V@WrN>*.o]YT?$U)l!+#S-%SSl<1,(L;0etR>0etI4 +qB>k_rZM7dmNESm+>['-C# +qjIMPpmN:mSBY$47FQ!!!NM*#]k;*?6'g*X*Q**ZlFF$Q^?2*??1B,qgr,1&`j, +1%-gq0E!R./h\n50JWP\$SO+d0/,"3/hnUf$,?Q-!!NKhIYEK*r."itJV!`L!.XKg!.Xlrrdbo4@6ZG" +1,1L>/hf"9/h\Ol*ZlCD+!2LDllHQU*?u^K)Bfaq!!!E?&do0Z#n7FY%1j.S(`4#((D[f&()Zrb!#=u=!#>AH +";qsj&d%7sf)Q'Z3&WWO2D[6NoJZn22E3WWr]L[:b8@K9p1@LljU@UW_S91q`I91_`K6qdMO"tpc5)BL+IrZLYQ +!$_@b!$_7_"!T3L2#T6)1'BBh1,:Wf1GUaBqD&%,r\>0D1,LaB1,:[A1GUdB1GUaB,S^[gYlFe<;>s]% +?<^]==Bkf0r`n_m#[CS<>[1K;;*Ot7""u;^/H.C31GU^3+X&$Q+<_s++TNbT+WM^L+X8!P,7lV&91DQF +92%iM91hiL@:N_S@pig@@K9s<@LHXS?sm>K?!U]A?!HZ$n?<,#YHYC=XeYf_!1(50/*/U!&=I/!&+=* +&2,^k0eP+5/hAS.0/Osk$NeFG,:#It3*$LPC>0IY!(8J.$pYJ:W9%J8%Y20JNG[r\+j;0JFmr +*?ZFF*ZZ=D+!2O&*WR;O*XWc.*??=F)[HEM$P!XV&.f0_&J>K]$>#KmSGnlUQh[!LR/NH\SXuFNXg#+9 +Y->A$Yjadb5!D+l4?GP^2E!KQ2E(:g#<4Y"3B&cR"nVeH!6Y?K$5OBo(`!u)(E*2frtt#:#8e3l(`4#( +#3Gp:!!*cjr\ag52Db+e!''p9#<4Y$3^,\j4R##mj8e6=jR;.ChTO-dc-4DVb08)Sb0/""h.k1HI!%\!t!B!(256*nG56*tJ56=#55kdMA5lX(H55m_L5X74Q)@O"S"ql6VTVJ9XnY6)Y +rhC%!US=KXTqe?VUSFQYU8"HX$)3]-:d.*.5X.I35R'G:5m"D>?t'%D!+Yt:!b>eOpgOb?9M%lO91r#N8PMoM9M$o:,5`S^+TN_J+U92@ +1,C^A1,J\\!])Sd$8OCm1,C[A1GUaBpbE%01GgpE1G\b_"Z%tb)\WLd!"/s!=]o*9>[:T>>?h;8>[(H< +q-3i'$!UP9?!CK:>[:P4>R4P>>?kB'1GLZa1C>ln1c$mB1GUF'+R($U+sA*R+X8*R+X$_,'I"e]9LMWB +8k2NG8khiK9h8]&@UoCH!F]L6@KL(L@0C"J@UNR(?0SQqWMH2WrgEhVrL*eTS!`u>$#^.c$P;G^0J<\c0JP770.nn4pb2n*0eb:9 +0/32P"YVPX*#&[f!"B?GKS+f*JU`6%J:W6%!e>iNqg\^"JGt!@J:rK'K8"r.It)orJ:E-"J94sW0/,%6 +0.nt50eb450I>m'"!&F(*W@*!*?H@F*ZZ1>*%2(+"r@[\%1a9b%h&dPLR"3nrgEnYS"9DE"I#:ES=0MM +TV^_Rkrf843&``S2`<\p2Zbs!3;>E4(XiA9!:Bgs!YuOh()Ri)(`!r((`!tb('#0I((V2t(`*r('c%Q$ +'c@`%%fsQJpAbLJ1c70M2E*NS3;PQ62#T<63&`nZ4m:u,j6Yh:il]Hfbfn5QbKA#Nbf\'6!7h,[!<<*, +&0P2KU8=WZUSFRRUB@MG@Unn:&R\.$91_cI8P)HF84uKG4Zb+l,5r\i+X/*R ++sJ0Tkog3Q+sJ0[1&Wm-1]B-=1G^dA1G^dB1,:X@1Ge_[r\OR0r\OF,%5K[p1,C^@1GL6u'aXuY!#,PD +))PW%=Bo0;>$P9:>?kB;>?bA/>817F?!UZ<>?k<6>?kK<=^508>Z4#o/i,7=1,Ahb"Z.ti1bgH@+Tru4 ++sA-/+ori3rZW(%.6osb:J"&L:.e2N8P;ZF9OM=?A,9X7@JjR9?t*UE?iaS;j]qjll*(AqWMH&QR[ET5 +'S6]'$Pcas*??1A,<.Rq%Ls0\'+>3W%LrmY +&t>5RR/EBUSXQ(;Sc5&[Ssl";".l0`[H+RV4U+#/3&WZR2XiX*,h)gG!:Bgg(`!qe(^Ccl()Rf(()Zc] +!uD^h(]>*L(]G0P(_mf'rY>J>_#X0/s#'g7r\k6D2`N`S2`N`T2E*NOr\jj<46/QOjT!I%b6?&4bf\2R +&%PM69fadS.P!&#.Ockt/*8;]/,h"./2]UU5sIOu58>?t*RH +@U`mH@K9j2@KKt0:&[]t84Z?G91V`I5=._%/g;G^+<_mPrZM=f+X6G""X5*6+X&'/+TNbd+V>nJ0etR@ +1,C^A1bpmD1,CaDrA"I21GUc]1B'*01B'*-1Ars21bpjC1B''81,:R>,9IU0$I/VY":,VS,:,,u4BGYa +=Ti&:>?kG*>6%q->6.u5r`fn:?!LQ;>?G*7=^=i]1C#`n1GU^B1G\nb">M8I+X6"k![Aj5rZM:b+oNSs +1dOGl77p6I8kVfN7ncKG92tn#r*fY9qdKh@@UieR@q&\Hj^%mll*(c8P)NG9Lq2I5=%V&3rU<'+T*A`+!Tei!$_Cc![9'Iq_J=21GU]a1&s-01'9$Lu2 +r`]A+oNNbL>?b65>$YB;>$G3:>$P<8=%4ns1c$pE1,CaC1,LgD0I\4i+X/$Q,4cuK+T`c0+Tkqh/A,9X?@q/tW?X-lB?K>DVYQhJ?XJhkbRK/WMRfArSRNA(E$4m[X%M09a +#n[CQ/j29W3]%fs+<_dI*uuFD+QXXU*?H7D*@+30ebF?1GgL)*>T:p#mB2e'F>$O(E"><-n[))/MAe23,*koJV3oN!e>fTpja<9K7JK$ +J:iQ0JU`3#JUi9#JUiE)HWW6]0JP9b0JG490E*X30e=Rk*ZlCD*?F>b+!2LF+!DgO+s%aH+uDDC3]JT! +&eGQ['b1]f&./q*SbecTR/36UR$F#,V6-r]YQ1ol4UF;94?PS^2`*HPr\ag:3&p^m!'%=cP5k^i'c.W% +rY>SN()@bb(B#$K(]>-K(BP?g(]>*R(D[f('G(;O!!*-\qDSC4qDSO81c73Q!BN@&4l,0!j7_OTj42Ar +bfn8Qbfe,Ob0=-e;,0qb:,XRO/1N/!.Out=.eP8#.4Znt.Outu0g.cd5X>32!BrdJ56F/85="?q!^Jt6 +q`b6M5!_@t4oR\J5i6e +U7n9UUA^heUA1M_UAgnnU8"mjtG?!UcD@UihU@Uo%>$s$"l91_lL91hrN7SO4R +5smn'6U*+G+X6k.![Aj4mi_ZTr?27e+X&!,+UB;9+t,-$1,Ccc1(#fn1,LaA1GgmC1[$Rq1G^lc1B''; +1bpmC1bpmE1G^jDrA"C11(#cl+s\?W*u5P*(AS[Q()7Q#,9\6U-8R>5r\>9G/i,480JY=<0/#k$>?kH> +>[(H;>$P>$>9R0T>?Y05?!LN:B#@CqK>?Y<>?K>DUYQV/6Yc4?#SX#_6R[F)C!1iqS+.4ko +%h90X%hK-O%h]=14?GMa4#nW.*ZuLG*?H7B*Ub$L*W7#Z*W@)]+!2O&*X*Q//ho%7r%J1*0/!5X">;G^ +0JVlIr\4@*s"OC(r\"X6/hnt4/1rP.0/,-Z1B9<31Bo'M,:"BJ(A&CK(aL:M,UbK(2Z>KL1b^R80eG%3 +/MStZH%:EoJ:W3$J:W<&K)'rrKDpE#K+`cdI=Hg"It<-"I;;k@1,(L;1B0$*0EX$[+s?k+"!&I)+6O[F +*W-s"+!2IB-p'LQ4$5ek%h]Q]&df*X#n7IY,>IrYPPLrYGqX(DRZ#(Ddo'(DmC]!!Wch2E3WU3;,94 +2)R>q3]fGdj#tcM"51o@bl5cdb09k."2%T2:]=2t:f'V3.Olku.4OC/!\5`Mr@8+&.k2u%3^5h-5Qa59 +5X564"@,7<5="5X[h'5lNt[69dY"5;t5G.Ocet.Outt.P'^4 +*\/ci.P!"u.ka@g:esh_:f:02bfn8Qb0/#Pc-+5blf@$cl!=?k?8>[(H:n65rs>$Co1'OFmJ49VkKKN +SXl.8p6lJV6P0\;%LEUO&.oE\+$g/n3BTAb3]o2=rZ21b*??1An/_QMrZ27a*ZZ:D*?G)#rZ2Oi+tPE# +0JP780ek=80JED[!\c>^p+ZM"r\4.(*A9$!0JP46/h\k30J>(50eG"//h\k30JP:90/"pZ0/#'Z0*790/,+60/5./+s.jH*?Z@ErZ(t\o,dQG!?`B[*ZH4X4$#A]3]]>]$P3p_#mq1S&e>?U>ah1R +R[F&Br0[JR#GJ3%XK](;X5pMI4Tdl23]R4!2uYf92Y]331^''D[K$[C()@`'()I`''c%YZ('#0L(AnsR +'c.W$(_mkopAh]'"V*FK3&`hq2u,?73BK>c4oRY,4TIXlj;ct!bKJ,QbKS5Rb06,N:f0ta:esna:,XUP +.4Qk1.KCpq.LmsZ.Ochs.4dGC5!V@t563u6r]^BJj?EW0r'(BN5m4P@?XR8NraYY2*a_Q37nZKH91hZE8N/e!6U3t)5sdn'.NouY+sA-So-+)V!$_Cc"sP37+X&$R +p`Tb_,V1]+r\Fj91G^dB1,C^A1\`^*1]&p-1\`^C1G^dB1,:[B1bgdB0f(UB1,LgD2)@$F1G\qc"u8"k +1,C^Ap+ln01,1X@1GSb_%5]mr1,(I=1G^^U>$>21>6eD[6]$(KjsI>?Y35:,"=W0.o+=1bpd? +1GUdD.Jt=j,U+H3+Tio3+X6.o'-JGB+sA-T0L.oj6:!q(6:4(#9FF<]7S$-G84uKH?sr\;$"IFQ@:3DI +?!^jr?0SR#Y-,"7ZE1%%TUqVOQiWYHpmMUf%1a']$P*^a&do@/!_#.3r]1EK4?>GM*uuCC*uuBk*WR5[ +*WmE(*?P2#rZ2.`+!)I%*Y9DC0J5(70/,%60J>+70/,'S0E-f0/,(50J>(50/53W0*j6c0/,%60/#'Y0+BTh0.\e./h\k5?%ITYrdY3(J:<$!IXgm< +rIYT5J:<$#JUqH"0eY:9/2$lT'/;0p/LDP\+!)IF+<;LE*uuCD*VCKH*WRA_*ZQ1?*@X$04?>Pb4$#Pf +.gd%&((^fZ$O[CXF.Ss"RK/oXRK](IS=H7OricC*iNVH-!^8e1s#U-E4$'kS#!!<6;(E!,e +"W/!k()@_U(B#'J('>?g('O=2[f?IK2`U[n!''s:rAF[83o<+#4j`6ngs"!bbfp(/#gCK6<)QUj:f73g +##S2n6n9ijT"9; +jPT%_>n(+G?=$oD?!^oH@:EbXpL4Y?>u+*_91q`H84uKG69mj864#qE6UF$s+X8*RmNE)b+X&$R+X&$Q ++X/*R+X/'.+TNY`+U';K1GUaBr\F^51G^dB1\ig*1]K601\WX)1]B-;0f(U?1GL[@1,LaAr\G*@1,L^A +1c$mC1c$pE1,:[BpG*(31GgmE1,:X@1,Jnb$o9Xp1c$d>2ca'h>$Lu2$!g_?>[(?8>?kM3>PD><=^509 +=BeT_/h\n61,U[A1,:X@1G1("qB5h_rZMCg+sS6Tkoh/o+sS6V,s"@[6:!t*6:!t*5WhV491_cH8OcEH +94;=?raGt?@U`dC@Kp4J?=$oA?3+G?j'CoR%Bcq(4XJ;GYQ^4$5RLZ&l#n7RX&.f0X&eGR:48q8K +4?>Sc4#fDZ+!D[Gn/`5a*ZZ:C*??1B*?H7B*?Q=C*ZcF$*X*W2/ho%5r\4U10J>(50e`>Vr\+:*r\+"" +"tqYa1GUdAr\#-D0J5%81G:I9/het40/,+70/,+80J5%51&!@&0e`M\"YMJ`0JG0Z0FKNf.P!)'0LBc5 +I=_BJ$A!\XIt<-'It3)uoRQpn(PI?lJUr>[3&NQK/hAY-/2/b40J=k"*W@)g*?Q@E*?H:D*?ZCE*U+UZ +*??1>*Zm4%4$#A`4?>J_3]K25":GSI%2'0a&IJneR%+)D"IPXHS=TVI$D!ibX0/\7Yc4_0jKRZ-##_W(D[f(()@W#(`;l\rYGbS(Ddo'('E"cfDksm2ECaq$og1)2E3WS +2E!NR3BR.%!B`R,4lYPtj8e<58QLK51GUfb1BB6eoJ-J(1,Ahcr%n(&!&X[2r\>6G1,(C>1Ggg?1c.^-=Bo!5>[1K< +>?pu."Bo#4>?h)2%:!+A>$P<:=^#$4>u!?X1Cc,n/ho"71,1I9/0c>^+o3Ad+<_pP+sHP%r#l.d+X/'. ++X/*R+X/*b5sdk(5sdk(5sdk&5!;#"84lNF:.e&I7po_6@K'^;@q0*L?iskI@:&k;!+#S1r`oM/r`oM1 +qHX)-pg!u/>[C_6Xobi3YN`8:XJ_hbS=5h4PaIo/S!]Y7S5Kt,'FtE[&.&[X.6B[R3BB5_48q8J3&rrF +*#ot?*??4#*<@3%q]>2I$m-K2*ZlIE*Zc=C+=d@Ds"XL,!&=I,""u8\0E!R.0/,+60/<5U$8XIn1,CR: +/hf"7r\":+0DRF%0EuXinJ26E(D[c&q%a&K()Rnf('"Kc!7q2W +*]H#92`N`S2DtIm"ZA;#4$Gk&4TIV;4Tdf/4[/d,"$Sh14QGN"jT"97j9"Asbl,]mbfn5Qb\L-U;GU+b +qbRVq:f0V4.4Qet.Oj""#V.\m5-0!C/jF5Q[pJ;;p<.E-:bKS2QbK\8Si;)F:j5f:]j4`SojPaAL>[:]F +@U`hXraPk:%UrgS?:dm^7nHEF9M7r9>Zk96>?b?:=oDP,>[(E;!*fG-"(#5<>5h_3>$bN11b^X;1&a!80etL? +1Fjjs+TQe><>[1[qYQqG8Vk9EHR$dlArg4CjSt&[j#8.X[$5j'V'0A3A3]fGcq`G-G4?YGC +*[)RGq]4oB!Z`:&r>kkY""$YHY=5!V@t5=#34s$6HG"@57<5=,-1!']^5rBC9Gr'0s?q`bWU5=%Lu5!M7s +6uSHgUS=HVnY6,ZU\pi*USOQXTq\6SUk)E,5X\",5sIRt5l\3s>l\41>manE?!^rLA7K%T +?iFLF@:2Yu91VWH7ncZ=4?Gtqr'C`V5sdn'6:!t'/g:09g`[^_+sA*R+sA0]1,LdB1GgjC1,CaB1,LaB +1,C^A1,Jnb!\lJc!AZD/1&s-/1AN`u1&s-/1&s',1ANaM1,:XA1,C[@1GpsD2)@!D/OruI>$>$3>?bB= +>?kB<>[@;5%UE=D>$G37>?P09=^50;r`]V&2)$g?0J>0Z1'09d./P.d+93Sa+oie^+ori2oca>Zr?;1b +rZNI0+N:.n,a?=E_?"_2"N@:*C?>le8;r*K/(!*oM/#@:bD +?!UcD?iF=5?sR&C!+4cj!3Z=**NlHBU7@U:R%0_+50eb751&N^00/,+80JG0Y0E%30.nn9Yf4$#M' +3tXM?2a98F'F"gI&J,6X%="\=qjIbWR[p(FWj8r.Yk5."Z2Lm,YPta-Y-5&.YQV/3ZF$Xg4TRW)q_eX9 +2)dHO3![t6JcP`L$3:eW(`!l(()@]&rY>PO()Qob&f2<"(`*u*(D[i*'c7`((DdqlXoS1r!?F/u2Z>W9 +2E1Up!^&Y1ml^Y5rB1-ErB:0Er]LBL4$GbhguSIppuDk=bfS#Nbf\)PaB_YB!`;`hpeVAr;,:%c8i%tJ +/1`;$i%"dWr[Rsur$r1,0K;6]5X.Ft5X%@sr]^NL5X7Lspcn^@p-/O@q*4d@!^8e2kW]G@69m_!5=UC& +US":VUB@/28q:1,1R@0ekK`1'B1,:^^=^,3:=^#!5>$P68>[(H=r*1(E>?kE=>?tK>?!:K= +>$5')2)@!F0J5(:r\FU1.jb08OcEF7n[<#?XI5NA7K.\@:3DJ?!CQ@nm29%o3DH)>[Le<>[ZTr$*LG:ZEUF2 +UnXFXRMM9ZR[@1c%h/pV%L<^[3'0/a4ZPJ]3rM#H3]K2_3BB,U.3TiY,2".;+UfPA/M].>1GUdD1,:]c +1B]Hi1bpi]1C#?X.k<5+0JiY]""u>^0)71%/1^]N!\5cPr[n1&r[n1&q(V_&%kfRi0/>7=0/G:=D2!Xp +KDpQ1KS=u2KS>/4JGXm#J:;rqJ.m?[It*$#IXZiu@ll=p0/>46/hR&U"=G<6*?P1u#T4O")B'P8*$5)& +"X>*1+!Dm&+Tri-*?H7#*Wd9")>tK[,W@bF4ZY\e4S_#^4$P_j2[0a+'bCl`&e]2PT:ML@R$a2*S=uj] +ZF7-DZEUS5ZN%0-ZLtF&ZEO/0"g554Y-t:f4U4/74Zkec2DtImr\aj;2DtuN!2';q"rA*o(Dlobru(YM +!#bbO!uD^h('k]m()Ri&()@%I!!XE$2DmBO3;k`<3B9/b4oRYF4o[_G4oIS;4TR`/qE5*H4?YkjjQ,@] +hrOarqrAdXgrmpbb0.uNb,A37<)?Ce:esn`:esna;,'na:]=/o5V4H:.4P'Bi@=jXr@/"%0fVB_50ro44Bj'H%t?!cZ!!+5_3!+5_3!+Gh8&S#9Z?=->u:.e#J84Y^/5Wh@56MNhL +6U*q)62j1T1a=1g+<_rn+nm/^+X/-0+o`bc+U]MC/i,=?1,LgD1G\qc!\uPgrA+:,r\=O21Go(c!AZD. +1&s')1As!01,AndkqX)32)6sC0Jkpq>[:W?>[:N?kB;?!CP4>SC:B=&Lk11GLL6 +0f(R=0e=Xq+X-h-r#u1c+sR"0r?D"[q',_ZrZDCg+sA*P-o_,k"[bO@5sdm565`-T6U*dq91VTH9h%oR +>[LlI@:E_V@U`bQrETP4?X6uEr`oS3?=!M9!aT&9r`oP2?2e.1?iF@??!UfE>$YE<@Bcu>YNE%iYcn&/ +"KJH!U7D1N&t#,VU/VL3#mq:Y%h13P5rq%dq)\aB4ZY_h48q>H0HV;W*$$'a*qpZ[*ZZ7B*?Q=Cr>l(d +.5*A.r\+C.0/!5W!AH2)0`Ea*0E*a40.e\+/M]+;rA+F/q(N%,0ek=80/#$T1\i^=1GCU=1GCL9/2&S0 +0.oM9J:;usIf4a#IXlruJUi4HJ-:FRJUi=NJ/3]eKS>/8Da-$70/GI>1b^R7/LVha*W@5[)uq#Y*;LTW +*ZZ:BrZ:kUq&ot`+MV((1QZ%1idUI@Zt"S=5h4Q^=>CXg#%5Ycn&1 +riZC-Z*4,1!jAc0riZ=)rNH[4Y->18Ycb.M!2?Pls2@?hlTE#92()Ic& +()I]%(]G0N(Dur`"rJ*m()Rl(!#GMM!YuOWTE#$62)kFk#rOLu4?G\h4?Yn-4TISI4?Pbk4T.DE4?>P& +4T%>N5!;%n4Zttm4?>Pa4kSg$j5]4]j5]4]h>PP,bK@rHWtA95Xmt%5<_"\.k<(H.etRp.f:gr.etRp.f([l.Kq=P-n6f3r_Nep;c$7e +:/Ca`##A#l<)lgm$rgr_bfe5PbKS,ejQ$-u!9<>)s5We5ro=";!R4sM>l\3n>od6X?!U]@?%?!:B6>$"l'>6%t* +>68&5>l@k=>[:K;:d$Ng1,CR>0etI8-mAR4"!Jj3+nHiU,4QfS+UK;9+sA-Q+sf!2r]p]V6:!t(62Ntk +5s[b$5J>[(H=?2e.3?!Ue3>m=P<>[(E;>lJ"[:T??!CK: +>"I\X$*^Y:Y-P@?Ycb&+SJ[rkSXYt2;%4!K%M'!O(d0rB5Wh%e4$,J%3Y4A54$5Se4#f;_3B8N-*ZZ0` +*=!W+*Zc=C*?P2#!$;%YruV(Y%NciC0/,%40J>+70J>(5r\"1'!\c5Zr[n.'r\O@%q(N(+0/"q0/MA_1 +r\+4(q(MS#&N)'k0.nh]J:`H+KnY23L4k3VJH(,rJ-(:UJc:0;Isum#JT+%50J5"80/#"4-mKfW*[)OE +*Zk5&p`T\Z*?=Smr#QIk*?Q:A*$$Rk4$,Ga3&ruY2`Udt+?2DB3BKMf3]KPc)A +TV&3g[^?";"0Sl4Y5>I%Y8"4EY-+t3Xfnq2Z*:I;Yd(C6Z`C,-WfZ+$r]U`R4ZPJZ2)dHO2)@,s[K*!$ +"p,MU(`=/,r>#ALq\B2K(&JdG)#k?U()7T$()R=K!!40#2>oE;2`EWU4?Yn)4o.>@4;U%=3]T2]3]fGd +4[2(m4?Yeh4$,;Y2&+s/!9 +.G60^.k3&!.4Ql!.4Znt.PWkF5lO"J5k[DB62NkH53b?95!D1p5U7e3UUnXR^UBIK?!^lG@U`_Q?XR22rCR>i:H:R(6U8Ms!%Fc![8g3rZV@d,5r_o+s8$Q,9S-Q+<`*a1&`s41,LgC1Geh^!&*mupG;e(#;\+j0etI=1&`s% +1]B-71Ggd>1c868'O4mG>?Y99>?tH9>[(E9>?kB:>[./3$=-k>>$G6;>?b9!r\G'?1,C[>/LDYc+WVaN +,9e<1+p&o3,5iYc+sHq0rZM7cr#c%b+s?b+ruh+\&0N,K4[DD#5s@Iu5*ZDjRiR[p%CSYJpk$4I1I%gY3]5;5D_!'C0@"?SV)4$JJ*?F;aruM([!Z`:& +rZ)[o*?Q=E*?H7E*ZcCF*ZcRT/MSn3r@n7)q(Me'q_/"&q(qgus"F@*!&"O1/i#4<1G\qcp+7@?/hSe2 +0J>+BGD1^&KReZ)K7JN'KRnc+Kn+`)J:<%IIL:RXKn=i+It2rh:];p\/1`A*/12P[*#fn=*ZZ.<*$-(? +*?P2##p(*+*#ot>*Zc@"+T`Z)+9!8`*ZZ:B+8d2Z*Y0D7.Q':M3B98b5!1tk4?NO)-9=1M4$5D_6p*Rk +/IMml%M90[:S4)HR[ftDV5UW(['6a:Ycb.1qPs_"XK/B"W"Z)-W2ZetWiN2%W2lttW2ZA`TaUi^jZWc1 +5!;%+4pa802`E]T2`3T$PlS]%&e,Wo(`!o(()I`(()@`'()Rf(q%a8Q(`4#((`*r&&*3f$!"K>q2`N`S +2`Ni\4[)%m55dVE4Sh5C4?P_)3>=D22E*WX4?bkk5=%Fr4ukP[0J4g\!'<(p0ek:3/FY+n.4Qbr.P!"H +.K1^q/,^q0.4H_p.4uts-n6_s.Oc_o.kCTJ!%Rpr""G]I.f:_#-n-Sn-n6Yqi@+dW./bRq.4Y-Br[J4' +.Ochr-n6Vo.fLk+.Ocbo.Ocl!.kND00f&S]r\XF,!&4@,r\FX61c$uf2#oK-2$u6!2)[BR2`FEYK`6`H +M2R7JLl7(EK7nf+IX?B^EGTB'@piSH>#eEr9FOQb4teQA/hJ_/.k3(J.LIRS.Outu.4H_q.JtY#.4Zhs +.Outur@@grs"!mpr%%ar$SF@t3B9&[3B/rW2uGZ63?Y06@:aA.-'tXDa3MuTahtd!XeD/FKQh3><_5S>3]fJj:Mbc_\Ldpe!WrQ(!V$-k!<!WE')!&c`O<'*&aF(&\mP'c%N"(D[h_(B59N +)?q-$*$-Fm5tXR;8Ou?B84H->7mf^35Wq4k2)?m=/L`"l+s@sG)Aj5)$jd7I$3pe?#6b55"U5,5"U"o1 +"9S`/!sA`/"9S`/"U55@%hfWl(B"pH')rRD&H<7?%K6_8%K6_>$k*IO&ebuY'aGKi'c7Z$()Zoa"r.jg +().N"&JZ#o$O?n>!X&N)"9\o9%M99N%LijX$k!FP&.fTt-SdhSr_+;%6p<[g0.A1h(_[Ab#6P)2"9Sf8 +%j3Vj%giLErWDTir;Zs$!^X#!r=])C#8\-i()I`& +(&8XS()Ri)(`F>6)B1/*>5he/@:E^F?m/i]=]e['<)?C^7m]I)3ArWI/L_tk+!)@7#m^bA"pbG:rWN9( +rWN3)#6b54"9eo0"8i3-!sJr:$kEp`',2/[&e5Hb&If0Z%1WjW%13CK$3^bC#RM"WrY5YO'GM2m&ePfU +&c`XF&kg.4QetpaQ@p.4QkI.fV$r.etUj +.Iene/,^pt.JYIh/,h$s.L.CQ.Ocer.P(3B$7IAR.k3"t.Olr!JcO^/!s/K)"9&E'"7?Ze&.T-W$3pb>"U"o0!W`?#!!WH(":#5A%&*a; +!!E<(!WrQ("RuZm"TJYq#5JE+#RLeE$OZqDr!Wf<$jm@O$k3XE#lt;9rW`H."nr/W!s\u8$4I:O$jut? +rWiN2#Q=r+"oe`*"ni)p"7u`p"TAK*!W`<%mfO1*"9o,=$kNs\%1N^S$3g\<"9e]*$ipA/!r[Iapmj\2b"">]K.H2fY.4QhH.fq1M.K1dt.4Y9F +q^MRpq^VUrnLF/[r@%^rr[IgrpaH@p-n-Vp.JYFn.Ien`.JYLl.J>1c.JkUp.JbLo/,:[o./kXs-n6\F +.KCrt!;llm!<3)c!8RVY!<<-#!8"9S`-!s/Q, +rW3'#rWO./>=f.KD!p.KV+M +/,Ujt.4Y6E!%@dpr[R^lm4%i[r$has.Ok$?r[Ijqr[HeUr[@"[qC;Lqr[Imur@7ap!%@ao!%@dqs!juJ +!!<-#pAk3olio!U9[\!T!e[!!!$#!s8H(!!;ur(!!!'!!!3-$!WE0"!V69k +!WE'!!WE0#!M]XH!.k3d!5g8c.K([b.fCmt.f1ap.KCps.*3q;-j1tI.4?Y3../MZ.K1e!.4Qbrr$_Uq +r[IXkr[A(%.4?Vn.4?YC.,cWS.KV%K.K1gr.1@[T.Ocer.4?So.4?YE./bRi.Hr8N.JYA!.4?Sn-n-Pn +.OceF.K:gm.0(dn.0:nI.fCgV!8@MH!WE/u"8i6!!:l.fCgq./G@m./bRp./PIn.,cWO.0CtI.4Y-AngXSeq^DLnq^MOpr$hXos!msr_>sK6r;lWmqZ3/d +JcM\KrrLsVg]79Rq#L?po`G0p_uTf;rW14CrrMHd!!1RLrVup"])Vg3gAq6Sq>gNrrW%NMJcLB&huL#2 +q'u@lr[GH.""G`K.+p'A./#(R.JYCf.JYC_.01hHqC)Cmeg^JFr[?qY!%@=c#:_/O.Olks.fCg6!:0[c +!LNk=!3-%u!<`B&!<]K.fCgq./tdr-ikbFr[@su.4?Vpr[I^ms![[lq'tn`""5TI +.fCdr.fLk"-n-Sp./G@p.OcepodT\bl6u]_q'l+f!%Imq!%J.%.Ochr.fCds.Ob-B#V%;P.4Qer.4Y9F +U&]cFVuQeug]5Is!? +^&W`bJcMGDj!fR/Jgnqn!%@dp!%@.^r@7gqlRDf_paQ.kr[IjrKE-T(X8i5$fDtODrW2corrMrrJcLB& +P5tO^oDnRbrW2cor;iGhJcLB&_#W^Kq'bqcr[@7bJgl:#p*ftkqC)Iq.Ob6F!%@7a"Y(uP.Olk3.K1gl +.K(ao.H1>Z!.k3r!!30%!<*#b!!!'!!!!&b!<*#o!!!&r!.k3&!4Dk-!Vuct!=f-ibar.K(Zi.@2L^.KD!n.KD!s.J"ti.P!%K.b-!4!;QZf +!<*#i!9+"U!UTmd!PSPc!;-gQso)Sdkd/a+Gm/R+eg]2p+ec>^N +r;m''"9AT&"9/Gj!!**%rW<-$l2UebmJqh=JcLB&huN!j!%@^o!%@Igs!lYM!%@aoq^VOmq'l+hq'`$f +Q7;h`r[[st#:h8R.4Qht/,^pg.0(do.KCm^.K:mp.0(jq.0(jp.Hgd/!V69m!(h.fCd+.=s#I.K(^u.4HYpr[@apr[@ap![oKG]IDh?!WW6%`rQ)>!s/N) +!lb4l!8@JR!N?(X!<3)>!!WH*!s8T+!V69k!VHGE!58I4!ri<#!!!&F!.k3&!.k3d!8f4*.-;uA.0(js +.JtXr.k:KH!%R^lr?q[q.(h!\.JtXn.fLk!.Ocbor[@ms.4G0E!%>E-irB,\!!1(>"p"c-"9S]+`rL\k +gAh3SW;rgr!!3'!"p"c,"9S`-r;Zfuli;V;]`80;!s/N)rVup!cN)i&JcLB&JcOa0V()Bnr[Ipt./kXq +..\ki.OcboSLL0[r@7grs![^m""G`K.ebC..Dc)G!!WH+"9nu1!i>sL!;uot!VHEm!W)is!Ls/.!!WH* +"9nu2!qZHo!<<0"!<3)S!.k4-!!EE,!s/Mt!!NB'!!*'#\c@<^JcLB&huLSB%4E\T.4Zhs.OZ\o.OlkG +.L[aT-RgGn.4H_q-n?kI.M+$W.k2tu.Olkq.junt-n-S:.K(Xp.K1aF.K1aN.IJVh-RpPo-n6Xq.0:nH +..o"h.fLk).OZes.4Qhs.Olr!r[R1^^a[/$qu?d!!!3'!!W`9%qZ$Zu!&. +!W`?'!Wi?%"98N+e,ZTN!!3'!!W`9%h#QgBrW2uu%KQP0!"TnZ'!W`?'Mu`,C!!:";"U#)8!!!&t!!!&]!.k1c!!!'#!o:-n6Y:.K:jq.aKRD +.**hA-nITJUK/uE.GcKU-n-Vrr[Imrq'ch(-n-W9Ycr(!.jc\p.4HeG.eP7h.+p'-.D5^!!VP^GnVP^=d)[HHG#n7@P"9SZ6ZDO\$'*/(6!!!&k +!!!#s!L*Qf&Z;LsVCMHCf`2!Qo`,.8W2lnr2sLDA!S@CG!$21C!!NE)!EktfUS4KVUS+9UUSFHWUSOPU +(BagC#S7FT$3UD1#+DWfV%E\.!!EK'!VQNl"8r8$!:Kmm!Wit'Su.r&fDl'U!X&W-!VZR'"9BL=UT^LO +!!*'"!YHtV;o`,*&^U_%[!6bEFTUqUB_uKnO]>2,X +!20DP.GuWV.P!"J.5!-)ZaRN8,l].0(do.KLtHq'c_%/1OZ*Z`16k-n?_pr[@mu.Oapio!<<*$!X&E&p&P'orrW0#X8qSe"YHFP.GcKS.k(BH"t>D7Za-RAr3l^6\GirSZaR*IY,aK3.Ocku.OmWqYHtW>.4Qht/,Lgj.0(js +.g%7M.4X[5XsjT*-q^qUZ*83'.K([q./k[u.k2trq'ck).O\!"ZEL`U-n?_n.k2qsngXMc\gdY.^]4`C +!R!!hZ1Fl$N^;0!s/I:UnXQ[U%bB$URe0VWf7o0'G1`d +#65X4Tq\8?!,#7n,N^V%.i]DfJP]Y;(m]=YVd\\2GP!;ZZt\@]5ZN<&;F"Ll"R]`H(P"M;:`])g^f +_#V>$r[A"#.4Q_pNr?F%4$5Vg4?>J_=E(7FZEp[=Z*6>?.kCTJ%kM_+[A,<&-n6Yr.k3"t.eP4l.P!%J +.bQ9N.eP7:.0h7L.t4t:X"`*Rs![Ri$n*MQ.Y,1=XY2(O.ObEJ.O_)AiW.g8!G@!!!%Rpt!%QVM!%@Lhc7&uK.k2u)4")T1.0:nH./#+h.L7FR +1H[*9-n-SE.f1Xs.OcepX=<00hZ+&d!!**#!!.#?YcF]+r;Zfur;[iB)i(ApYGeCT*#BD(&d\XF#mg_9 +!X/c>%13=C!V69p!s],<"Tn#jmK!%``W-)D',(W+!;ZZq!V-3q!Yl]/!0)d@V.4?Vq.4HVo.4Hf!.jubq.4Zhq.4?Yq-n$Vs.Ocht.OZer +.Ocbo.4?Pn-RgMp.4H\E.7,F4.4Q_q-n-Po.OQYm.k3"s.4cr".Ounr.4Zes.4Qbr.Ouqr.4Zl!-RgMo +.4?Vo.k3%u.Ocbo.4Qkt.Ocer.2aN`.4?Yp.4?Yp.Ochq-n6Sq.Ockt-n6Yqr[8"$.4Qer.OckH.3L)h +.kE,!.k)qq.k<"q.4Qhr.4-Gm/1E%t.Ocer.OckB.1e!X.Ocks.Ounr.OZ_p.OckG.2"$X.46Pn.Outs +.OZbq-n-Vo.f:a3.Dc)a!<3*!!!R;BW2m!)p&H$832`mZX0,bJ*#TD"$3gY:!s]#<%2'9["pP,*!!!&r +!!r`3$O[.@!WW3$rW!!#!!2ut"9AN'!t*XOa$W2$,];A^Af&If$L!sA]. +"UGMI&e5$G!s/Q.r;[6,!<<*%!WrN.$4I.Bq#CBqq#CO!!!!$%!W`9)rW)s!rW!0*!rr<&"Tnr-!j.4Qbp.k(BH'IY@Y.4Q_p-n?\s.Ocbp.jc\m +.P(KJ'IPCY.jubp.k2qs.k<%u.OQ\q.4G!@'.PFZ.4?Vm.k)qt-RpMm.4?Vn/,gt/.P*"s.Ochp.OZbq +-n-Pm.fCg3.Dl/a!<3*!!!R>CW2m!)o`,j73N0!ZXfO#m*>oP#$O6h@#7:qR'+kZU"9&>?!!**#!r;m+!WW6&!!``8#7(J5!!2Zk$3:,- +!!!$"!<<*#rVup!q>^^.#n%7P!!AGchZ3ZYrW!3)!,\L-US@tnpAciK#;W-NUSaV/)&Nu!$OR+C#6tSG +%MB?Z"T\Z+!<`Z6":#)1!!3-#!WiW:$O6_3!YGD5"9eo.!WrH'!!*'#!W`<''EA+7!!*?<"9AK+!S8!WW3$ +!!<9&!"B>C#6k50!!3-%!W;uu!PSQD!!F(N^:V)L!!L!I]>(c7!.k3&!8ddt.K:gq.1msV.Olkq.Olj- +[(*HK.k2trq'dX?-n:@hZEgf_.4Zbp7RB@#1Gpa7.P*)#-n?`:H^_CLZ*B9i0e3GX.OZbr.k:NK-7q]% +K"&%XJ4_IF.k)ns.Ocbn/Lr;;A>6K=YaeH<.k)qu.OZ\pr[S+&.OZYpr[BWQ.Ocer/1E&!.k3"t.4?Yp +.m7[$XL59jE(DT1-RpVs.4H_r:/Okb.4d/TJ#Kc4E_\(_.LRaU.4Zht.4Qbq.Ob?Hr[K0\FH!Q2XH.?p +.k)tu-R^Gn.k2qs.85;`\$36AO&dka.Oc_rpaIR?.4Qqt.4H_q.4Zhr/6uC^>Uq9S2g1_#\#bZh0.AA" +.k)kp.Olk%.H)_e!!RADW2m'+oDf"!DlBb@2lg@,+;tqD-Qa;W2QeqCc;t0!!!'$pAbI"!!s)D%graGrW!N:5!V4n$31DQ=,ElRUj"O%%Jg&) +!W)kK!"Ju2!rr<&!B"Ter;,",h+Q[2g^$3:2/!<<-$!!!-("sH*SR\H*b+oh]G!(*6IURH?^&.&=;!!32s!"8o/!XK/B$Od=A!s&H;#X17-3XGco +)HVEbV4;T^&-i:;!r`3"!Ls/C!!F+O^:V#J!!O+O]tM#^m/R=n/%<'uO;IEe":'sD/HtbHrW!'US#1NR +fDl'^Gcc3&!U]pj#$79*!UB^i!ZR'0N#;Ze!!.0(dq.0(dq.LdgT +.Olj-[(*HJ.k2trq'dU<.4HjYZ*Ud>.Olkt;R*O5[8eY*.4Ztu.R:#=ZEggCYd:jE].@AB.4Qbq.k2tt +[Bd0HZEh)].Olhr.k<"u.mpPJYHbICZ*LQ31+FXM.S_Oh\?`JL-n6Yq.k)qr.4H_uXg5@EJgi/t +.4HZ8WOTLIZEq$EXh1o?.4Zku.Ochr[CZa6mF[(*JN/Li.t./54n.OljXrjMkmr[Ad9.^cUl\gT.\\$N?KYcYC? +Yt$;m.4?So-n-S#.GuYl!<3)s!!dMFW3*-+!!2cn!s'"4XuEMaSJrLb'fVnWSXD;B&/,Za#mqc=Y-"e2 +X08Y(XK4bp!!*0-$O?nA4/]0VVQ-GfVk^"^#6Oc&%L"&GVQR%oWiMk_,6\&Kr;["PV50VE"S_s7!+8u6R!=Gm1W2g=:AZ2c7W3NgUn.fBUnFKVTW4`_MZ@!@9"1PtS^@qU7>J%V]]tM%i]ss$p!!HZ@]t:cX]>)%m^:s%9s1ANYGeD'XK8J&ri[)l%0-A/!!!*[V6$i(YH4\(XL#%6W.XX@$4a/9YHB#K!!3-/rhp.( +*1Eh/Z*1:5W;`k"W&+hY!!!&S!29H'!u^CSrsK\!!!'!!!iT*!%Xe9R%b>o!#,o[V4aT[U8"KZTr"HXV0`^U!L(tV4jHRUS4NZU8+P@#Qju*!!;usJcPTH";ebc]=m_7":)WN\#0''"/)6LPPG1^ +[D0>g]=n3U"M):\]e0'\%62&5\@]A`]t(VST7/?e!"5_#9\%0$N\[AoY\[fJb]jq!@"22=\\+p"2(qmPn]tM%k]t:rV]`9ka!!'b3 +]*Q*^]=knf]=Tff!!BjG]t=1B&HKGV]t48I^:Uqh]"P_h\\5V]!9,Hd.K(aq.1%D`[(*HJ.k2tqq'eHV +.4Qc@['@'GBIbS_KJZZEgsKZE^mDZaR'>3;t?0 +.OeZ3[=5NmZ*L^BY-5:&VR'@9hqXcXK/G$L'RYW%iqRI +X/i1fE,TQ^W2Qkt;t9nl%BQV5X2r!s8Q)rW!.>USX`Z +"Te;s"9JW*/>G1uUmamj%LFqcTV/&>!X/f8#T9A4TqS6>D/aNpX.c9eUEQJ.US=N[1B7CV$`0SmV&fU=!pTqS)e6q4#LrhC@-H3jQR +!Ws@;W1p&`NGic[OJSeIV,@?p!VZR;!oUSFA%!XJi2'#P%j;'<&"3V,\'9 +"tcs[XK"Gc!sSu78>i;hWtbj?!!*944ufKl#lk&5$kd!HWNWV2CFBPr&M/.$T-479!<<*>USFrmW*1&G +$OSJbWM?S<-34)H#$\(.Vksq%!&O]V!!41BY,JBS!rr<-1pX9eXIq?X"onl6,&sQ^Wi.rb!<<-0XKJM) +YHXc^(CLKrAXEo*!!Ne2XfSQLrVup!#6m2dY,eLu$2soE!WWL$ZDXn-1^X3_#%Xg6Vl(C:!<<*'&OWLM +%/p5,!qlTt$EU51Y9C%LNe%S>`NnW-/LJ!SRP2!6G3@!Vucu!WrE'rW!.>USX`Z +"Te>t-34,K!>MB)TpJLg$O&)TTq\8@!!3?.#!niUSWauo!!*'$$pLMA6j`qu#RV&GV5L#ZTjf/P#neb/ +Tp-Q#!!**#)3(>^USV$,#R1SdNLQT4AfV!W!Wl8hT;7_\!!!'#!!*'$(o*e$UFcBE.g\#(TqS6P0F7pd +"puSlV5'uc4:(uh!"#EmWhGuPS3%Jn$mT/8#lk#0$N6_(*<6*A!=1Y5V4jZ\Nsl$l!rrE*9:r&SUG2oQ +!=<,.V59Ft"onW)"q*_nI0]iT!qu[A!W`\(W1fn.!Wi?%$_sDhSZAN^;&ffK'JGEAUS4N%$3:,-!<^X7]t;"lr;[*'!5#hU]=G;2qu?a(=Sr.$\\Phjq>^Z/ +]=Ye)q>^X!]t(hgqu?j*^V.1:q#CH/1[kAH]=ttlqZ$l6]=k\f]tFLF!!$R.]`8uD!5SZW.0D%K.4Y"KuYD=_[ +-n$Mp.4?Z>\>cg>/1N%sZa$a?8LQ,=.4?Yp.6K+0-RgJ=.1@UR-nVd7Z*HPC-n6Y_/$l[iY-tGl.Outs +.OZm@ZEpjD5Ue-1.(Uke!9!qX!W)j%ENH+@X9S_+oDfd:XK/=kB+G:N.^$(ZY!<$i!s/OBTW5.B"9SK$ +%gX!U!!3?4$6lIQX086F#lO`+!=(J0"o\K*!<[84V60m%/dVCU'*o(pVl$A.%0HY5'VVS/X=aJR!W +#\:'@X.Th#!!*V/XJi1T$3pP3!<<-#"]VG%Y+Q1%!!!K-Ws#W.NsuHj!!Nh4WMlmBr;[!5XKJM*AGuQ/ +!rN$1-)duPTaUo%#,\Q*X=X\X!!3'!!XKYNrW2Wk&dk\+Unek:qu?p2LTIVZX<.J!!2`m#6Fo8USXZZ*<#sS!t:p! +US4cZ)%$HI!WW31HD@1/UE0L8!!!)V!1 +fDl(pY,J>/$,!W`9&$*(),Ugao@""CDPY5plgr;m1@UnXk(!!2ut'*/(5!Wr]8&6Gd5X/I!E!!*'" +!VcWs&XfSp!j+6`r;[H2!!*7YV5("q"9Sf5H)dsGQO*Qj'*/(6&Zr@AW&b1c!!"mYYH4Q1!WE'!!rW*& +#FDKjYV5tU"q.N6Y-+E4o`,.)Xfee-,5hKJ4/f3]T`>,q!!3#u&HVraXJ`!L!!!5%VlQj'+ohTD!">p.Yc+KO$3UD/!"8l/'WA+6W(I'k!!!&5!5/C4!WE'&D5!f)Ta:8j$NU52USXQD +>m^c:-iK_O3WK3^!s3.jTV<5&!!*'#!<<*2!WW9'"q(f;UnOQ[)[HHE!rN&u!WE'(!>UQWUS0:GqZ&n_ +"`pT-Rop""!=SZ%_Y!!E9%!W`k)T:r)@"98E'2kQblF5\c;jL]=kqjn,NU%\Yj]Yr;Zr3]tM&T +!!Z+OZD!!BdF]=n(A"1u+WMtR,Q?bO.fquH`0 +!On0^!!BdD\\7k?!58NI]mfYT""M'r]DV^3^:CqfjT,7kqZ$c2]XtehpAb<-]sk]*!9!po.0:nH.fCb$ +O0c=$Yq.=Q./>:r.OZ_q.(?E9Z`o!0.4S&tYHY3>.4H_r.5%U*[ZN'i/12ho.4H_q.k3&".'9t^ZumiG +.Olhr.OZ_D.0h7L.UTNjZBtP>""5TI.fLh740u5tX[4Kd.8R4YZa;qG-n-Pm.qZ/tZFVjk.MjV*['R5A +.k2qr.Ocbp.Oc`GZEpff-n5KO.^QFcZ>qHFp*hI@Za$jB5Un34/"X5R[lu;l.4Qhu.Ocks.QXo@Z%"/O +.]BhcYE1@d.4bBGr@.mt.4HbB.0q=O.4_d3Z*HUm.2aVAYd1a2.OZ\s.k2tr.4fVLZa,ZF-7LDlq^K?1 +_>sB3"`^]DWNHI!!!!'!!"K:5XeVUs%gE(aYHP785Q1Wi!*K!#>SQS>3-N+9DcS181\JX<@WG!!3-,:B[btXK)p3!!W[`XK/9Y#lO`'!rW*&!][9^XCD// +#Rd]7Y,k\1!!2fo&IkkFXfN]H!<<@ZW2up5!71T9 +-D@-*TfW;S!XJf/G+"n8#6=u+!##A7!!36/%L\DqT;,Ek!WW6&!6+a)#bn)fUJqL$p&G(# +rh1[6*WcD6%Tj7X!#Ek^UX_nLJ!!<-""9JW*!Whro#6=f3USFNX*W5sV +$DXVrV18sU"9\f,!<<*-=JMRbE!H@G!<<27!4`(4(V@Ap]C5e']=";Q#5nN(]t:tiq>^UVM51g[!;ca! +EOi]p"7Q9mG+u;dp&G2QSukQ]!!ARj\\7e=rk/,6F!!BpH\\%_=!5&6D!&sWP"9Z?L]c,K&huLSB![oKIr?qr4Za[6F/1E"r +q'cIs.4H`%\dYgKZ=575.Sd1OYchL5.NL(2[C*<:?pHUu.4?Pl.Olks.ljuCYI?YE-n?\sr@%Un#q.2P +W3`k9:a[dk.5rY(-nLsq[^'-g.4[$SZ*Uci/Li8#.P@d/\%$W5.OcbpYd1[G=$&N,4$Phj4$5YhVIW(Q.4H_r +-mgGm.OZ_@.0q=O.4V^2ZEc^m.0d,^YI@ab.fLq..4HYp.8mXZYcfT*/1;qE.DRCM!;HNtENZ7>Xp4P! +&HMk3&?Dk,Sj3\f!\(=YYHL.g!#bkl&cht6!YM#tTT;DH#6?3GT:qo=rW+)B +!7!!!$"!qlTq!<5!#c0;W2HIT"9J]. +!rr?%!!G*STqRt_!!E9%!PSQD!!F+M]tV,J!!BR6So=N,"1u7[\bZ:/+*jEa].Olu5ZEg^D.4?Yp-Ro$Cr@&(%-n6mP[BQnh.OtYHk=?Z`CC9[j`aV/$#tf\$E?DZad9#<\5gN-n-Spq'cRt +.OcjSZa$f"r@&+(Z`p^?4tA-4/1N.K.17Uk['HpA.4H_s.4X+%i@2><"`^]DWNHHt!!E<&/ZYp(URa=Q +"p$0TYHP)l!!*'"!<>WSVQ-bsXfJY$E&%k,!=&r@-E=/NV[*8'!!2ip#QXr2R&-jd'ES"0&-2c)Unjo- +!='#I:Sk1qW"T%/"tZmTY,EKGrW!$d\1 +Tr"?USX4=N%gE%=#n7uNUS4Ljr;Zg!p](R##E>+ETa^u&qZ%E5!!,K^Tp]Tr"pkl7US4HZ%KQS4!\g;r +V4j_,!W`9&(TX=)W2$&[USFZ\W1g/`USX`ZV5"=t!"G]uTqWY0!qlU%$_sJjUEBR;!Z7W+rh0@hU\pf- +W1g/dU7\-QV$I,&$'(dQV5'`XUSXPs0F\6f!!*-&p](O"!!o?nTq`V+!!N_)Wi2[8rWN?+!Wi6"#p?(> +TqVhn!WiCm!8.>T(V@Ap]C5e&\?hoJqu?i3]tLoN!!u_sZ+7QW]=X"=q#CN']=kcE!!H\mZb$51!!B3r +QPBAu"9GX8]"Rt@"1c%U^&%d7_7dOp]=bhhrk/HI^V%1jrOi3Cr;Zr5]=YWE!!BjH\\7n@!kl4XrOiZT +\\5Ve]Y1tk\\5\k^&7p6AA,Oe^&GVF^5s&r!!'_3]DDR.]DfM:!!BmI]sYq%3$.1IaUGdFo_ZELL=Z*C[F$u[XF.k4E&ZE^GZ.Ot3Br[7q" +1T\'iYl6'L.0(js.6f:`[C3K+.4Zkt3k;N"Z!%RrQ"[FIb-p=pe['HjD\$`KHZEpgA[^!@:XfJ_4 +\8j)K-n6_B.0q=O.4V^3Z*HUl.2]CpZa)hG.juns.4Qeq.R(5IZa)#//1<"'.GuYd!!RAFW2Zp(p&G6s +!!!4&W!o]$SKeRJ!\(7SYHC%b!!cN$WNN>-WiQ-%&#`D:$4@.tX/rIl#64c)!VcX$!G6n?M!#?KNW2ur!Y->47XKJb-Y,ne,X08J'"U>#-$Eg>.X<7'7 +!"Jn.!$_CB#9'\FYHXt(X8]1.Y-+k2Y,JS+W3WH0rW!EBK!2;YX/iM0Z`^L1;@`6t'+CtDY,ifI!!*'. +XfAG'-j9qb"8i-'!?nPFX/ZO%!.k4L!<3*!!!R55V5U'noDfF'"B2.jTT:E-#QlHLTqS,9qZ$m'9phQG +URnEZrh0n":^dX9$SJ0KTp>o`!<<-$p](L!#`tIJWX&J&!W`9%r;[KfU84Q'!!`oH-(L[(TfW;U!!R3h +V59o."p"c*!uRl2U8=][TqA$RTqS6TUS4BUTr"Lj!WWP#V5'e(!!!)p!!!E*UG*_i!!4(6US4BXV5'c[ +US4BVSY;mRUSXTX"p=o-%t((GVPBo[TqA$PV,7R#!!!&p!!`N*#c"/gUE0=6)ZU2n3!!BmG]sme;"p'gg[Cs/crjr6F])hg0"1PnSDt!`/ +D4n5KoDf!&[BCPI!!B:4]Y44C!#kjI!$D(<"1c%S^Ab_R]t:ti]t:ni]=PPd]>"4Drjr0Dnc/d(]t:uU +!!'k4]`G[WrOW*@]D]GC]DMX41;196]=S9_]=khi^&d^'s1SHEqZ$`/]XtfK!!BpH\[ApIrrBka![oKI +r?qr4Za[6F/1E"rq'cRt.Od!Z[Bd*Ar[Ja89sCh*Y[&\+.4HYo.k!cP\$E?DXg#.A'",04/Li5RZa@!- +.k)ns-n?_rr@&4).4?Z$XgbOA.4Q\o.4G*C4=FI@ZaZ2K/1E&!K!MYeXt(qN0=nWtZqr2".4?T.['d'A +[Bd9DYHP4:ZEpg=[(!V])Y>XK\V(Y-+k/XK/G)XKJV-W!EA'!)*%U^NiI +&./UC-_mB/TJcWI*s)HD+EaNUU7n9UUSX`]I1Q\l1SUYqT.US4HYXJ;J_US"<[US4HVUS4Lg!Wi?&#;19#V#[7hUBITtUN[1?!!`N)$DXAiUE0:5 +)@E7>V5#=C$4-h9!!30$!$7l2V4Itn!<<0%quD_BF.k+/rYd(E;.4Qbr.4?So +.4QuB<,ml+['R$J[;%-@4gVN#[jW[T-n5-Fr[A1&.4H_r0X.sn[4qM-!%@gq/gr2`['-d#-nHnu/53OY +[(&7K.qH,tYGs'"/L`/!0sS'iZrC+.<`E+$<`W4&r`0G-Xp4P!&HN/HX/i7p;[s3>"":@VY,se`!"Ar/!<<<6-SnG; +W3!&&$EC!r$je)XXKJK.rW!!#!!2utr;d'0Tr+`a&H2\0!W)j68Z],!HisT^'cT34XKJKF!!#BbVlYpb +!rW*A'!A:!">j0X/mHE!VQL#%BH\6X![R^ULhWRJd*f\\5Vgn,NQ6T=)?(!!BpH]cm7Q"1u1Y^AS$3 +])oID>5A4$\\#Jeli7.$\[fEE!!BjH]=n+B"2;C\^#]4q!Z8NJ]`PgZ!V-6j^&P_C!!N?&]=bhho`,*- +\[eoP!95Nc.0:nH.fCb$O0c=$Yq.=Q./>:t-n8$%['?g?1B&d0.S[+NZ*%:[/,^n9.jukp.OZ_q/1F2u +YHY@/.4@BhZ*1Vq-n-Voq'cOu.OZaQ\$iIA;(=!j.2aN^U9h58Be(Y_/1W6:Yd1QU/1RI!\$f3br[AU2 +.4hd6Z*uS?-n6Yp-n-Vn-n-Po.4Y>t.k2tA.01p)rj!V2.4?Yp\$rZK1Fjk'.46Sn.4HYo +.Ocbq.jc_p.OunG.fUq)-RpW?XL5@%s.#:laSY,n?:$jm+=/$c@]X#TnT!p-YH'/[$3^P/!!XRHYGeE+!SRP2!5AO6!WE'&D5!f)Ta:;k%0\2WUS+6O +((CNQ![XK!WrE(!!3<(!!3-$!!!0./tA]3Wg="mpAb6q!!rS!!MLP5 +!"&`6UT1#_-NaSV!WE'+!<<-DU7nEV#lt([!1Elj(V@Ap]CGq(]>(hY!1E]a"1u7YYjVPpP..EH0E(qR +]=GPen,NQ4TXDE)!!G^"]se%>!"(Bl]=n=H!+!(2S,!$dZam][mJm:g!58BDnc/d(]t:uU!!BjF]t<5' +"H^7-^Pq^`"22C\]DDR1]=khgo`,*)]=Y-;!5SZg.K:go.0(de.0:qH.K(_M.$1pJZEbr1.OZbp.OZ\o +.OluMYctL@\R[0<.OlrAZE:=8=XYaL-n-Vo.4Q_q./kY-.P*Nf[]QA`.4Ma0['4[#.Ob9Fs![jqr@/1* +HF:&]OX_e/.OceF.2F/k3%LZ72k-.Ocbn.k<*1Yd(H@.k2qs.4?Yr.Ouqr +.OZbt.Ochs\$r`O4=M[,q'l:m'!J[OYUEN#h;X9SM$!!3'!'F$@sYGnS&71B\7"Tp6XZEgVk!!3#u!s&B&!rW*1!<<6@Vl?2B&dSiBYH4p+ +$iBu+!<,!=GP"UBMb?!!**,rh1%$-O0kZ!s&H(!!3-CUS4?U#QOr.h>mNU"9AK&!.fLk' +.Olqr;n'!?[l+.6"XkiM.4H\E.1RgW-mpMo.^6.^Z99Ta.ebA/.^QFdYWjNc.OeK*Za.%u.Ouqq-n6Sl +.fLk7.k)qq/1N)W.Ounq.jler/1N3\\$`S(.Ob*A$S3\T.^67^Yf!"Au1!!!$"Dkj>-UBLc$quA,G!XBTZUSFNZS;7[`$O6e8.&3Q2P:ln9!WW6$!!3-&!WW6$ +!!3-)&tkYOG8(,bA#5lmV&BF:!!!30%!s/K'!s/T'!!in)W1fn)!!!&q!"/i1%ATVlTca=8!W`ch +USFNZ'*A7:!!!$"!!3'!!W`<'rW!Q<49krh!!**&!!<<,V59r^)$BX6#Qk&-$_a>oTd'F8#7@6$Whh$F +!rW-0!!**#+.]+%SHo2r!s&M]!!!$'!!*'#!WhB_\c;jL]>2%jo`+t,rk/BF[8cu&"22C[R-jqT[$Lf/ +/cG_Q$ba6a^$l"(Q`[g3pAb=`^:C_Iq#C\!ZamUH#d'\BpAb;q[Ca->!!BpK]=mb8"1u7Y^&%d0]`PgZ +^#8qn^:V(lnc/d,]=toS!!BpH]tqEF.OkHO.CZgs[ll,fp*g\*\$<9L67FB4.P.g0ZE:Gq.Olksr[8^74.UmN/1N+t/lo3T +4"D^-.Ocep.lsuF[Bq[_.0M+K.4_h*[i[ga.4H_rZ*CF;5U\'0.Olkq.4Zf7Za@'G.Ochs-n,!Bi[G$Z +.Ochs.-;u6!!<6&!WhTeq>_cAGcRmEW#ccm)&aA2))XmKW3!)$XfS01":>PA!s1!SXf\KVrW!-'!W[Ff +'En=6)Zg-ZY+_5-#m1/MW2Qf%U_F+8!<<0$"X[md!WE'(#*l$lXKF;arW!f:#S't7YH4Kp$31,5$4mja +7AHibK<;)DP7S!#!!*'#!!364Q_pg^Tc=78!"K#0!!Om-D)$L!?!q>^["!["onW, +!"4j^R\BnX0aIgZ!#c(R=fS-hVbmX#!X/o?%h_=(TqI"1T:CWE!WE'-!^O9)YX43Yl^+u+8l0B^:h4lN;*AQ$2X]*@]QoI]D2F1"2MIXXTA1s#GA90 +279<:<;-@qD6^[aQ1k7Z1^EjW"1l4\^%).*]=YVfqZ$bZ^:h.(oL!!BdF[\hXVhuM^b!@K;o.01nKr$has-n+a;s!n!s&M#:Z.P!!,\$NB>['?p;Za@"9Z3ISC +Y-Y:02,btS.k)tu.S[(IXg(eR.4Qbr.Aa;XN'f!E.k<&?[C!3AK.JH$.?Lm>X0T6[67s`C:lho]CFUe_ +.O\-#[]csEKh*dF3*WJj\$*3D.OZ_r-n5-F$S\ff[^NHHXE,m?-iPOp./k_2:pdC.ZaXsA.k)r&8s$Ne +ZuRTD.1.RT.^QFdZTouf./>;N.OcgVZE^l%.OZbq.Ts0bYd1cY5qOK60hd\8ZEnO"-S$T#\$*!BO[1EH +-S-`?Z*C[;XsthJq'cS".4HaMYcFrmr[J7(.^-1`]0@_m-n5-D%4NbT5Hq5mZmdIR.OckG.GuWX.Ochs +.-;u;!!!&s!!**%rW2Hf!WW3$qZ$tIW335)Z*(17X02H''sF^AVlQu"Q4jN+#7:V:!\1FZXf=&O!$m8n +WG`mc"TSc2/#TA?P@+Oq!"+.TYHY+,;^VhV%P2XiKh;IH!$_^tUo(>sY&#Hn#T#UoX/N1tP7.El!!EK3 +%1O);W2HPmUR_H^!s/?#(BFR?#;DsTZ)ag',RXh\%kMh$Y,PA,!WE')$Eg;.Xs!cG!VZQt%]HJ3W$VBB +'*gOuYHP%+;(2hU#S&G.X/r@!#lXf<'r\45XE#Wm#QP&6.&!fHWg!_g!VQKs%'$G1Y9NrG#65+7X/rBJ +!r2g#!?nYJY,)NW!!30$!QP39!!WK+!s8T*!V-3o![_U8=NXRL0#p!WiK1$4I`/T;89VTTDbKqu@lA!WrT\U7n9UV,&*?#RCnfCSd`'9EkIt +!s/e&WhZ70!VZR"!:.A!6, +Wf[M[!#>Y:!",["X.^R7!W`B2TVJ6R*s)EB!W'1U_(tl!rN$"(3r+?!!T7+]=G?Zqu?n6 +\\#>QDYF,9>GS[9YF]S3p&G8qZbX2d!W)j"(qmPt!W)j!]=ttjnc8^(s1A1/#64b9^V.7n!W)j"(qI8j +!W2p#]>)+o(&@n5Q+O`C@IaC#]XkhhqZ$`/]=GKF!!BpK\#\-]hZ2Ua!%@aoqC2Oq-n+a;/h/>".4Qeq +-RgPqNjlC)ZF[?NZF$sFZadEP[&^RAJgr/s.4cu!.4IorYI(Z;r[AC..k%L)ZELR?TT>&@\$NKM19Wkl +.4QhtTsqG8Z`g^=YdCaG[&JsS-n-Pn.X\\6ZFIBL['Hm@\$*-F[6Q8k.4Qhsr@/4oYdCaGYHBo:.Ocer +r@&%&.Z1X?['I'E[/RjSKS(:!;q!V(;7Dn +]t(lV]`Ym[\\A'V"2;I\#PS3#]=Y+kq>_")S?9B7]/:?@]tLtYLfF6O"$aK2^AYYJ]XkYNFuos+!!3>3 +\I?*a]=ktk\\5\k\?VUu!!WIcVQQeO:A"Sg%BmDC]`PgZ\c02D]t:ti\bc@/]t:hgnc/d&]tM&S!"^!Z +^qIFu]=kbe]=kbi[C*"3!!p!A\%B8c]e^T3(V%/g]=YcH!!'_3]DDR1YHP45o`,**]YHkI; +Za-p?Z`b:OA1/lV-RpQ#TsM/1['d*CYH4q-Vi3D[.P1QK%Wo1dYHY==['R'DYd:K,r@0]S.4?Vo.P!?` +ZECL6Ot/"2.4Qeq-n-Vq.5$+ZYd1[?ZEg^>['d6F[:1X;.juepZ*UU>5:ZCV$n!JS\#lg=5:\35.k<"s +08$UUV'P-S%cnY-bUB[Bd6G[^**C[WErMpF-P".4cpWYd(W%.k3%u.K6Re[6H,i +.Oc_n.4Qhs6+=/'[4*RR-n!e!!%Ijr!%?tYf`2!Qjo>Ve!!72BX/rB"X:2/3Y,n\*WMj;F#QXoa!!*0+ +"Tn`TX0S_"/cYnP!!*(VU8G,qXK&G)X0AD"T0N\d!s8N(%ZdZjYH4e)XJ`/!T8-k]qu@?6>,\L%Xfne, +X08V,X.1^F!!3'!%g)h6#n%K>U8t#WDZTq>!W%XK&>(YcY",7Kibl#64f4X/iD( ++SGd?!<(YHat#5R@Dj!!WrK+!WhfkrrE0$!!E0"!Wi@?hT:$`%!!!$"!!**&!$e>?TVDhm!<3)U!!E<(!sAYF!8%8a +(;7>n\\>\h]=khe]=khi^:jmG!!BjBVM4jH#!/9\\\5Vfrjr9G\ZLhd!"D-(\\#Pe]Y2%iTR&O%q>^Ks +%(j']^:h.l]>(tj\UO/N"_a=#S9#>8!"/t@]t:to]t;"f^U*pMq>^W,\[B!=!!BpL]Y4+@%LBVY]^_\$NHH<%9=H-n6`!GIt8lZF$sE['6kTYuE8* +.Ocnu.P!#PXgbX@['$U?['Y*4/1DtG.249_>.(Q?\$E9CZ*Lj&1Fjk%.OlhF.1n$Y.k6%U\@&P'.4Zhr +.Ochsr[Ap=-n/)u]skGYZE^X<[^LuS/1;tp.4HaO['dA-.4QhB.1.OS[^WTP5:J'2.4Zbq.4S9"\?)g: +Y.(^CZF,QM.P!"u/1E&$Fg/9YYHbCXK/;$XK/D'YG7jL!sf)7"8r31&3QbeXfnh,VlHP^=9S^+rW",D!!bK^YH+V'Y,JM)W-JgW!!*'" +!rr?%!!E6ZXJhthTV/&m)$L-FrW!Q6$;-kTSt)F=St;=BO#@7F!X/2s&-309 +T;&#"!W`9&#)%Y`KbsRc$j-S3+etm*UC%#(!]=YVf]=khg]t_1i/f*sW +"1th1GPM4H!k#_R]=khg]tM..p&GG`]t(hi]XkSLHij$B!fO\$rjr"pYA;"pG&,!$hRF!!3-#"9\`/!!"Do-R9oN!!33&!!!$&$Sc"@W2Qe=9J$Pd$3ph>!#WgJ2r)%$0?!!3#u#QY&4#mU_?"9\W'!!3#u!W`?'rW!?2#9co` +V5L,QCbZM,rVup!rW!01$O@%I#lk#"!85pQgCr;Zg!p&G($rX02C$N^A1!X/f5"UPD6!Wr6!"p##=#mq(Kr;Zfuh>dNV!!*!"!!0h7!9"pkG<#RL_:q>^Kr%flY4"9AW++"/'O)\N,O!W/!VcXM!<`fIb!2'>P.D[G5./PIu.4HYo.4?YE.fCe&.OZ_r.k)ns-n#!D&Lf1Z.4Qer-n6\q.4Znt +.4ltI.0h=O.OZ_p.OkcU.k)ku.46Mm-S"d^j("pbMB"p"`)!!3'!%06J0!!*-&!!NW9 +$4$\(!!E?+"U"nt!!!&t!"&f4#6tA4!!!$$!W)lp!U9[_!"f54!X8o8#6b)-!sJi1!W`9%rW!'%!!!'& +r<*0'!WhKbquI!%!^X!!<<*#mf3=hquH`sr;ls&rW`c5!<<-$!WrN+!s/B&!!3'$"9J]/!sAK'!!2HeoE,-q!Wr/trrW-! +!2r!W`?'q#LBq$3:,,!gEokl:ec!!*0#!WE-$!s8H&!s8T+ +"8W&u!rW/s!WW8g!<*$$!s/T(!WrN+!X&E'q#LEqrW!!#!X%6Y!s/N+"GQo.!.k3d!5g8E.0(dp.f(Uk +.K_(J.4Y9F!\5]Kr[Rmr!%\!t![oKGq^MFm!%Imqr[J7*.Outu.juhq-n+g=!%Rssr$hdt.OceJ.4HbC +.1%IQ.Olkr.Olktr@%q#.OZbq-n,$Cr[R([r[Imsr[Rgp!%Rsu!@fPq./tah.dSV_.L.FP.OZ\o.OtEJ +!%RXjr$p\T!%@gqr@6kWirHjprW2co!!2Kf"p5&7"TeZ)mf3Ik!!30&!WrK*rVup!mf<:emJm4fq#L?o +qZ-TrjT#Da!s&H(qu?m$!gNrr<*$!!!<*!"9JT(!gKq!!<-#r;Zp#!W`B%"9AQ+qZ$Tsq#CBqrW!'% +!WiH*rW2uu!!2or"p4i+!<<*#rW<#u!s&E&!Vufq!U'Lg!!*-&!k.Ocht.OlkB.0(dR.K([o.K1dt.k:6A#:_2P.Olkt.fLmZ.0(dp +.K1gX.Dc)D!!30$!V69k!rE#o!!NB-"U+r/pAb0opAk'lqu?]tklC8S!!3#urrN&urrMus!!2*[!W`?' +rW!0(!W`9$!^m(!X&Z1 +"p>#0!<<-!!VHEs!^[""U,#2!pfmg!#0T`Dk.!s&H(!Vufr!W<*(!W`?(!!2or"T\Z,!sAc+!WW9"!!!'! +!!!'!!!!'!!!NE(!!**%!WrN+r;ZfumK!7foDf7$!!!$"!!**%!W`?#!WW>Y!!<6&!X/K(rW2os!s&H( +!V?Bk!!!)W!!!'!!WW8q!!r]/!sAc2"9JT*rVup!iW&rZjoBu5JcLB&hZ0E#![oNJpF6"i!%\$u!\#NG +r$_[q.4PTR.Olqu.k<)!r[8(%-n-Sp-R^Al./>;!.Olqu-n$Mn-n-S?.JtU_.1dsX.Olhq.Olqu.4Qbp +-n-YA.0(dX.0(h#.Olkr./bS#.Ocep.OZ\o./>:n-n-SD.01hHkpZT\pF6(kpF-S#.4H_q.Olks.k3"s +.4FC/!%@dpi@1K$!!2?b!!2rs!s&E("9&?'!<#0!!.ZOi;ilYpAk3orW33)!s/N)rVup!qu?]trW<'$!WiE(q>^Krp&G6s!!**%!os@V +!"/l/!JcLB&JcPfN +UF?Kt.Olkr.Ochr.etOn./PIm-ikbFs!dmr!%Ims!%\!t"=krO.4Y0E#:CoJ.4HYn.etLq.Ocepm3r#br[ILh!%@gr![oEEodKtm.OceF.K1^s.4Hb:.K1am +.Jt[h.JbLs.4H_s.cVr\.4?So.c`%Q!!!&i!!!&r!!!&s!!*'#rVup!p&G'nrVup!`W,u>rVup!fDtIB +!!14B!!2ZkrW36(!Wi?%!T="Y!J:@X!.F'C<._R82.>%Wt!!!'!!;lk[!3Q=t!Sma-!8RYS!WE0!!O)Qa!;QZo!.k3&!.k3D +!95N#.0(dq.JbOl..es?.Es=;.)%/1.>.]s!;ceY!.k4.!.k4K!;Z_V!.k3&!.k3&!5SZP.CCW&.+9Vs +.A83M!.k3&!.k3&!.k3&!.k3&!.k3d!5g7;.=s"A.H:D[!.k3&!.k3&!.k4.!.k3&!.k40!<"AF.]OqL +.=s"b.Ja#E!QkCo!.k3A!;ur`!.k3&!.k3&!.k3&!8mkQ.]Y"M.=s"a.K'5K!(js^3E.4Qbrr[\!ur$_UqngUCar@$YS^FAk+cRHm` +!%?eTr[?\R!%IgG"9JZ-!dQW!<*$$"9AQ$!!!&+!8mhW!Mf_p!;Q]q!Mf\q!U]r>!.k3& +!2'>j.Jt[^.E3h8.KV%J.-W/\./,1o.k3&!/,^sq.JG=l.D@8).fCdr.+Kcs.0(jp.0(jp.K:gT.0(dR +.K:jp!!E<(!W`>-!;urW!<)ut!L.Olr!.*F('.JkUp.-W2Z.fCmp.fV$t.K_+L.4G!A +!%Ijri$mP4q'`H.fLjs.*O.'.JkRq.4FC/q^MRrq'u@modTqlq'tGSJgp1Ja!?+r@7gr!%@(\r[@dqr[Rmtr$q[ps!n!uq^VUr +q's92Q7;b\pF?%h_(!5$^]=?7!!<-%!!N*"qZ?d"rrW3$rVup!irFZ2mK!.c[/^1-rWDEc`rQ&=irB2_ +!P-nHer.Or%Z +$7RDT.4HYp.k<"rr@7grq^Mh"-n-Vq.k2tG.0_1M.jl\o.`*V;-n$Pp./k[p-jM1N-R^Dn.P(KI!\,WK +nL4ts.4Q\n.Ocks.4Zes.4ZhE.JG:l/,h$s.0(do.0CtI.4Y9F!\,WJr[7aqr[ImuqC2Inq'cFr.4H_r +qC2Fmr$_Uqq'l1j!%@"ZqZ-WsfDtpPec=M+!Q9"T\W(!c!<<-#!!*'#g&M6U!!*'#huNcXkl:\crW*3'!<<0%!!;us!o!!!)t!!!&u!<*!)!WiH+!WiB&!W2rW!!NB)"9S`, +VZ;;KJcMJE!%@aos!m:_r[AO2.Ocep/1W+u.OZ\p.4Qeq-mpMn\1&:C-RpMn-n6Yq.4HYo.k3)!-mpDk +.juns.K1ds-j_@Q.46So.Ouqra!h!:r$`@1.4?Yr.4Zkq.juhs-n6_r.Olqr.d\Yl.OZ_q.4?Yo.OZbJ +-n6VB.Jt[o.JP@p-n-PmpaH1mq^MFkr[Ipt.eY:k./kXq./k^q.0(dd.JtXt.4?Vpl6u]^qZ-Wskl:\b +rVup"qu?j'#7(P=rW!*&!Wi?%!P8=5!!!-!!!!'!!!!&r!<3,u!<3)s!!!&:!!!&q!!!)t!!#0!W`<%!!*,]!!!&h!!!'!!!30$!V-6i!!NB'!<<*# +irK)[k5YJ`r;[0,!W`E."pG/4! +"9\f.!W`9%dJsFO!Wi?&!WE'!!VZQq!!!'!!!<6%!!2"pP56!sAN(!WW9&qu?]thZ*ra!!*-&!s8T+!V$-i +!<<0"!k\L;'H"No^).+'!.k4?!!WH>?G +ZMq'6YIed..P!"t..AYp.OZbq.4Qf>Wj$Ip-n,'D!%@dp!%Rsu!\,ZKngXbl.Ochsi[G'[.OZ_r.P(KJ +r$VOpodTki!\#QHk:-9.rrMBbr;[33$r.#9%NZW3gNrkl;1q!WiH7<1]kYTqeNd +TqhU`"`>=c!<!<7"9\W)!W`?(r;lp"rrM'Y +"9AK'!Wr?'!!2ut!!2cn"98H'!Wg(:#6L"#]=kef_>_%J^:b?6!7q2P?]G0N!!-#EaoLu4#8b"d]=GJc +^AbeI]=.h#!!6Sh!l4lP!!"GF.K:m].17UVZgj.f1[0.0(js.3g;k3P2T% +]N-C.-n-Yq.46Pn.Oler.4HYo-n$Pp41_W"\l%fCfdRgf.4?MqDn!*Z['m6DZa-g=ZF-aB]2U=1-n+U7 +%k&kT.Ocbp41DAs[o=h*.K1ao.0:tL/,h"".4ZqA.etOo./kXr.Oas=s![Oh"tD,Q.k<)!r?qdt.k2tr +o-jYfk:-9.rrMEcrW!Z6"YlpRW2cu&Xg#+8Xf\Y/Y,cdV"L8"6*NZ6BXZ-=^!!3'!!!3#u"9JQ'!r8:"U"u3 +"9&?+!^^#)4mLnRk;SZ!!3#u&e%O3TqeBPTr=Z[TqS6VT;A)8 +!sel,!Up(!!<<0%!!*n4W2$1D!<kZa[3C^&SQB]=khi\%BAb +]=khgrk/<@rW)*]"22F]]q>Aa!!"GF.K:m^.2F<`J@)MdZF@0L\$WEL\?W3JZFI*?5hRUE.1[gV.4?\p +<3"XJiG#+p%N?\c;mk +ZD4J%Du0M7!WE'##Rh%=!!30$!WE'&2QWs_X)I;(fDl6Z%"kL^X/N%tX/u<'#ct21Y-5"06jW5]$j-J2 +!!!$"1T[XYXE4+9%flY2!X&T-!W`?(!jS4!!!'!!sAZ,"9Sf*!r`3% +!!*-"!!WH*"9S`-"8r9'!\Mm#;n.juhD.KrJN +\$!#VbUNN?+"/Nd.4Q_p/Ru2pZ*Ld9A32=k.mQjY]!nrO['r^Y.e+qu-n?\r.4?W<\$!'EE@NCgr[@^o +"Y(rN.OckH/,h$p.1RgV.4?Vp.4Qet.k3&".JkRr.4?V=.JtUs.OZbrr[A+&.Ocep.Ochsq^DLnq^DXr +-n-Snk:-9.rrM?a((#_oXJi>*Y+S`M)AsYR@Ap',YcFd^q>e/.'`e:7.As8NXA8fr!<<-#!=1c/G+KfT +!!!&t!!OsUW2m!uli>`>)$'^<"[]8jXK87a4rFb5"W&XrX/N2&XJdZ^KrrVus#"TAK,"9S],!s&3!mf3Cj!!<*$ +rrW0"rrN-%rW2Zl!Or]t:rYUB'0Oq^DOo.e+r".jukq.4?SqJ@Dhk[Blf+/1CHG&1B(a +3E#q@AQ.t4n8V_BV!./G@r-n6Vp +-n>3F)Cd3c.OZbq-n-Mp.4?Sn.OZbq-n?et-R^GlpF-S"-n?\r0XnNsZ+!d^.k1HG#q7>U1lf)PZ&gX@ +.OlnH.K_(J-n>3F(FUa].4?Vl.4Ztu.OfkW\#h;2.k)nq.K(_$.4?Vn.Olkrr[J.$.Ochr-n-YF.2+*Y +.4Qbs.k)qr.4Qeq.Olks-n5-F""5TH.fLk!-n6Vor[8[6.k2tu.Ouqr.4?\q.k2tt.4?Pl.4Qht-n59J +.OX:+q>^Krn,O"#!!*'"!rW!6*!!!$*@B6>k%eK`$!q?6n!WW3$!WE'! +!W2p"!WW3%qZ-Bk#7mc3XKJK\$i0i."V#RPY-)gUmJmUr!<<*#!!Zr4W14@s!!33%!WE''!<<*#!!!&u +!!!&q!"&`,!!*'#!s/Q*!WE-#!<*!#!!!&k!;lg"!b_:"^.UqM@KXe!WrH'!=>HpU88e/!!<-"%fu_2 +"_"1&OUD0i!<<*#!rDs$!<<0$!!WW<)!W)iu!<gg$!WrK)!!!'!!#>P9!!p/L;ks.Ochr.4Qbq-n,!C!\#QJr@%k!.k)qpr[9*C.OQ\n.OZ_q +.4Hbq.Oc_n.k)kr-n6Yp.OZ_o.4Qhr-n?bs.4GiX-RgGn-n$Pp-oF.:-n-Sl.fLk*/$cXgZ90Tc.kE,! +.K1^u.5O%6.fLh(.k)kr.Ochq.4Q_pr[JC,.OQSn.4Qbr-n$Po.4G0F#:V)O-n-Pm.eP5"-n6Vn.OliJ +\$WHF==X;!r@/%$.OQ`dZW&D/-RpSo.Ocqu-n-Sn-n-Vp.juhs-7C>m-n6Yo2**-6/1<"u-n-Po-n$Mn +-n$Mm.k(?F%k&nW.4Qbr-mpGn-RpPp.fLkB.k2qr.k3#!.OZ\p.4lts.4HYn.4Qbs-n-Po.4H_r-n6Yp +./k[r/,gt!.OceE.0:tL-NGRo.c`&T!!!&f!"8l.!!G-WYHFn(:C.'t!!WH0&Y+R^"8W#s!Vucr!W;uu +!W;uu!Vl]s!<<,d!!!&n!!<9&!q!!<6'!!!'$!s&K;NdV98!!<6%!<<-#!WTr"]_)up!A!W`<%!!*') +',LuU!<*$"!W +UH&P]!!n;!_3@.4Qbr-n$Por[Imrr[BiW.Outt-n6Yp-RgGl.4HYn.Olks.Ocer.4Qer +-n6Vp-n?bt.k)qs-n6\q.4Qbp-n?bq.4H_s./k\&-n6_q.4Qbr-7L2h.OZbq.4Q_n.4Qeq-n6\q-7^Pn +/1J!9\$\FM.4HVo.4?Ypr[J%$.OZbsr[A%$-RpPp-n,'E+"8Tf.Ocer-n6Yo.4Qbq.juhr.OZ\p-n-Vq +.4?Vo.ekG).Ocbp.4?ZrZE1UG/Li2!-n5-F"t(lL.Od5+$RmSU.4H_p.4Zku.K(_0-n6Vo.4Znr-mpGm +.OZbr.juhpr[Jd7-n-Po.4Qbr.4?Yo-n6_r-R^Go.4HYp-N5G1-n6_s.Ouu!.4Qeq.4H_q.4Q_p.k3%u +r@/@,.OZ_q.4Zhr-RgJl.Outtr[S=(.4?Ys.4Q_p.OkHK.K1gX.Ja#E!UB^j#GnK"XJo,(k5YJ_rVup! +qZ$Tsqu?]tr;ciuqu?j#!!*'#r;ZfurW!*&!!!$"!r`0&!<<*#!WE'$!W`<%!!3#u!s&B%!VcX&!<"TSN&!W;uu +!VcWr!<<0"!!!,u!!!'!!!!)t!!!)r!!!&t!!*-%rW!$%!!*-"!!`Q*!!**#!!2or!!3'!!!2ip!W`9% +rW)luqu?m%!sJf.!rW*#!<<0!!87DQ!V$.8!<<*$!G=-RgDl-nHht.k)hp-Rt1I/1W.u-n?br.4Qbq-n?et.4H_sr@/^;.4Q\p +.4HYp.4?Yp-n-Sp.4?Yp.^ZLcY#Q4W&!W;uu!r`0'!X&]4"q(>9!!i?#f`2!Qn,Nmu +!!!$$1S:G=Tm$\C!VZTo!WE'&!WW3%!s8B#'ESOH#mCD2!WW9%!W`B'!!**%!8#R1M:!S9!!*-& +"98E&!WrE&":#29!<<-#!rW*%!WW9%!WE'"!W`-!rW!90#RLbB!WW9%!!3'!&ci(7!!<9&!W`9$!so;C +#m^V6rW)ou$N^A4!!!$$!rr<(#7q.E!<<0$!!33&!<<-$!s8`+"pPA>#R1J7!W<#u!Q"g>]t:he0]rGj +!!*ijdf9K`]=ki3!7q2R(V@Am^Tdd3!;e2G-n=[7""5WK/-2iZrj!"h.k2qr-n-Sn-n-Sn.k1EH*@NEc +.4Zku.4d#CJ=3gO\;joP/12qr.OZer.4QhH-m^B%$G07-n-]*GFQ+K +XcQF4r[Ag8.4Qhs.P3(u.jutt.OZes.4cmTYckW$.OZhu"tD,P.Olqrr[8(&/1N/!.4Zkr.fLjs-iPS: +.4H_s.4Zl!-n6Yn-n$Pp.mnB9Z*^cuE_\/8-n?\>.30le-n6\qE4E6VZSa*Z.46Jk.4?Yq.4?Vn.OZbr +r[A^8.jc\q/l$ML\@&?!?P07 +-n6c+FdobAXcHF5.Ocbr-n6Yp.k;qq.kXS=O1;TtO]=.e-RpSr.OchG.MF3[96cZ*[Btp69e%bD.OZ_o +.kBa2s!ddE!!2Ng$ipA/"eD`rYH/H=!!2Qh!!3#u%06_C0P#j;Y-<4B('am;!#>S8!<<-$":m8,KD95` +UinF($ig8.!W)j*!=0#a<->.>RW:>!#5J61!Wr`@0j8XlX/C)?/.)O\!!*'#i;i]S!!2Qh$ip>/!X=FT +US4Fq!!;lp**0Fta:1!!30!!>>P;!!!04/Q6SaUQ'(H&dJI=!Cp\$WFh[js"\\$EBHYd:jKYsp5n-n$Mm/1E%t.p'!\['R*G +['d9RIk3*!./bV1.4\Dt[C<^KrmJm=j!#)XCW2uq)"98E&oDejlq#Cs3 +/uGSIXK/M)XJi(<%L<%8q>_05)fMdUX0/M+XJi5!BY>YK$!!!H+W!s(EBWiW5%W1YRFq>_^a%!"GU"Z`\?H!"T;cQ)q$f +Y,n\&X/hpS"p+2n$9"rdXJgm_#64`)quH`trVup!q#D392Q3d]XfJP)X/rC3$O$P2!"ZE:W2LpB!!!&u +!"]GfPcLsjYck.2X/MjR"T\Z&!"o[!!*'" +!<`lpQ`I'hXKJ_-W2QUN#m&raq#CBqn,NFirW!9BnV55:8!!3J,TqS6bUS4EWUSaf_V&TI:!",QtTq`V0!",(lV%I/@!!!$#!!!'$!!3M!V44/lrW!T4 +!X:3=US=NWUSFZZURj@L!<<2l!!tKWV5'l5#RUP4rVup!r;Zp$!s&E3!!**#!<<-%#re-BTqM=Y%&$]6 +#64c+$CdfeV',a;#6Fr-!!Xm1U]$kkUS4HZQo#-Nqu@lHV5'f^$4CFAUS4HVU8=]X-k67Y!!*'#!!*-- +2jL&0T_tPeSR)j3rW*]5!8Tqe`erW3'%`W-.N]tM#_jT#L@]t(ng]=IpS!#G2, +!Yr>\rjr0>!5&6D!!iM6!P/=0!"ZcT^:O@F$G3j`\\#Pe]oMges1A2%l^&.m1 +]DoSC!!J4q]tFaF!!JCs\[rUQ!"*/L\%]Jf]=tkiPP5(N!!'Y1]`9nP!"+aq]st\f^V.Cr"oA9"\c0;: +!!QN;\\5VgrOW&ip](<+rk/[>!"6KR^Uq1i^:fg(!!J=k]stZX]t_7q]*@s/")#6Z^&GVG]tM.Dg]74# +!@TGe.1%LR.4S9&\$3G3r@%^rr[Ijsr@%dq.4Ym'D4")[..Ocer-RiK9 +Z*CL^lYdLsHYc=k5Z`ouO +.Ob*A(app`.Olkr0=S0pYICc9.Oueo-R^Gm.4P3F4t.s2-n6Vp/>';SZEpgCZ*:O^KrnGiOir;ZgT"Kn],X!7HA!!2rs!W`9% +rW)s!rW",C!XVl*XfAJ*X0/V+W2uqj*!lTG!<<*#!!Y]lY,SM+Y-7c)"fSW-W.kZX!#,mFY-4cDQ`dBm +YHG%3XKSS$1^X6^!=&T)$`pM4X!R`F%1'#&W3!'7Wuh +!!Q2qUSF@jr;e&A!!**#!\:+DTq`S.!W`<1CS.AsTqeHYTr+NYUS3#B!VZR.!WW6$!WW\+Tr"HZSi-cU +!!*'"!WE'#!QR])f[YrOi9E]efNcrjrZS +!,&sY]t(be^V.7m])_X,"22=[]DMX<]=Ybg]tLtj]t:tk^UsCD"1Q+W\buL.!rfe3\b,t&]DoSA!"KgY +]tD%l\[fDh]tM%k1%##F]=khg]o_aaq>^dV^Uq1k]=ktjrk/?DNVibY\\#Pgq#Cm@]tM1m]=kbg\\>\h +]eB3^!5&6D!8a.4Hbr./k[q-iPPI.Ocbr.OQYn.4Q_qFL\T^[C!6IZ*:I@=\#lJX.Ochr.4Vg5YcP4?Ydq$JXg5.;Z*C[K6n9Z6.OlktZEg[?5Ue-0.CZRi +Za.'HXKSq9Z*CMt.4Q\p\?WBE5:J!00X\*qZ=PO8.Oc_p.OunsX0]1:W$j)C.4L=e[Bm6H\"8\@]sk>R +ZEKlK.f1Y;.4HYo-n$Pn.4Jf5Z`pdC[(VuL=$8)`/12nr-7UGo-N5Ft.Oq+$Z*jD58$0/(:+7S@.^u^e +YX'Ze.OutsOg27%[^Sgc-<.P'R/q>^KrnGiOjr;[%1W3#Q+Q8#?.S'Y,JA$XJi5(YcFn/W3D]squ@WBW2m,$Up-etY,JY-YH4e- +XKNWE!!**#!"8e-'VcrT!!*G*Y,8>!W33,'XK/M,XW@B@"Uh93X/I6A!!s7q=kT`(YaTa.?iTqrD,![(hU3Hh>!$)BB +Tq/$LTVJ9UUS4HXU7e9UT,Rk6!s/H'$@\hFrhBIer1a@`X/.EH!#GYDG,V10USFH5E,qSIU7n?UIg5rR +!<_E`irB&arjr0Dk5Yei^:Ung]t:hc^](nJ]XtfO!!WJ<]">Sk]D]DI]=YVc]t7kP!"ciU]toZ:^UC\d +]=YVe\%06R\bQ4-]tLqkqu@2>]=thk]=Yhg]t(bc]_ha3^:Ckhqu?i2]=GWK!!HZ>]t7eP!"^'Z]t:ti +]/^`G\@];b]=Tcb!!p3I]t:tl[PS'Z!;ZZt286]7rk/HH]=knirk840"22CY^%q^/)#h&N\@oL3)&Tut +rk/?C1&CqS\\#>bNk,/$!58BD"M(tS\%DG9"#[g)]DfJK]=Ybi]=GYiq>_*L]tLqf]":$A*4rqo]tD$7 +!8mk@.17UT.4C1bYHk#U-Ro$EnL4Sj.4S?,rj!QRE]#3q02SXSZELL;/L`.u-n/-)Xg#+:NCu,X.=O-bH;ZE[=X.k*&!6BJX\Za*O\r[?hVjT#MjFJuCESHf5^!!EEhWgX7l!!!?)X=gQQX//r8$ORM%R'WltZ#p?Q!!*'"$`L/0X<7KC!=!Uh +F*F^aX074uG]@bE)#aL=%'6M2Xs!]D"pf7JYGe<+qZ$a#!?%i7)Qg=r!<<**4KGQbW1YUL#QP)8,]U#h +X/Iu]nGj11LT%2UW2Ql"W2m#!TO]qk#Qal('EJ16$=]j6Y,nd8,7Fkk0641r/I)1S"UhE5Y-0&J!#,Yu +W3EA%V(<#Y!o +#64c)!"(okXKnq#3"Q8q"U?5kUopc%3!TEa!QtHG!W`9*E!`A7UPf9U! +V5'`Z*ru?A"`86pDl]_0TS.0"EGl2!'*J=;$DX>jTd0O:0*uQnTr"1`!!*'"!W`9&)5X1)T.U*F!s^]W +US=TU.gcF]"pQ/fTqeBZ3X>]c!V?@-$@&DITr"TZUSX`\W1@9N&-Dn6!!*-"!#Z)OXIu8cTjAfJ"q;qr +URs%A!!**.USFNV0cg>q!!*9_V4jW[QmrFH!sSrMCS@T"UGW,U!W`P&U8t&_X//c1#m_%nN2^]4]=ttl(&It7>J@e`]ik13rk/HE^Uq,[qu?e)]t4?\\Jb5Drjr0Fqu@0D*#BU/]t:g7 +)&aD2(An.7]t(hgqu?j;]>(t?pAb<0]tD&U!!KmJ\\4%"!!F.R]t:uG!!=sf]tOBV"hhU]^5`Ks!;Z[" +#f4$c^:OXJ!!3qK\bc@/]tM%kq>^Z1^U^t:q>^O5^](kB!!g6I^Uq%k]`S*3"_>ZEppDZV)er.OZ_n/TS>. +YI%7Z.4?T![^!-D]0Rko.k)nq.P,JB[(!Ma/1;tu.4_g4ZELU=2^p7*.k2r$TXVD65ds$..OZ_r/%)[h +Zp6)j.4?Vo.P&$@ZEZSD.Ouqs.Ouqt.^ZOhZ9]rh.4[KeZEq#7-nHbq-RpVpK"&+hX"OB$(GE8%Za?S[ +.4-Mm/LW%sF0W!WYq.=Q.fLjs.ekG--n\u7ZE^X@Xg54=ZEgX:[uWR#-mo0I.OZ]+])JoqYsg2k.4Qbp +.p#Fp-n-Sp.^H@dZ9Tlf.4?mZYct=&/hAJ&.Outt.ri&)YI#f..OlmV['6jBYr4*]r[J1&0Vc"[ZaW4M +r[7e.])Jo[Ysg2k.4Qbp.p5Rs.4Q_r.5869['68V.4cqs-n-VpFL89Z[4DA/.4F7+jT#GgX/iD%G5_IA +!UTjl%A'W%YG3cXrW!W5!=Di)X/rB^#QOl*&#$/-XKNfPqu@!&#u[q-W2NDpr;[*/X/i>-Xe6U@qu?p0 +L8UuRW$)!<"UhB4XfN]F!!!*"!!NS*XK8BAp](g5XKAS*+TMQD!#r)BX/IZM!"&c.!!!F=W3!;&$N:#4 +&ZDh4XHa/"!!!'!!!W^/Y-+at%/U#)!VcX$!shB"XKJb.Xfq])'<%n/E#Su^!,"pRr'X08?.rW!65W3!##X.^@:!W!^W2]=GWM +!!BsE]tO:Cqu?i4\\5]R!<9b4]D)@/#JIg_OSf(]]t1bh:&"\k!P,hRPO/>[]t:ni]t_7k^Uq1k^V(EX +!!KpH]tKNt!!L!K]=e4B!!L!J^V)Dt!!E>9]=X+$!!U!J^:V"@q#COX]t(beqZ$c2]Y2"?n,NU)]>)$D +p](Eu]tV1-n-Sq.PAW%'=s.4-Mo0t4t%oB.&W335)Xf/.pVQ6i#E!cRG!!,&u!sVi1XKAEA +#Q=c'!!!&r!!iTcW2m(p'F"^:!!NRmX/E!MaT);BrW!0-USFNZC]XY)!!NB'0W1\>*2P(e!!**#!!*-+ +Gbq@4SI,At!&C=CUSB1@!"\Y\cW1sk(!!<60V5'feXHpUSSk0rW)p!)up$IUS4HV+9;KE!!eLYV5'1W!Yiq>^W2]XkfO!!BjH]tXCEqZ$W0rk&%-"CSjT]OUa; +"22CY^&%d3]t:t6p&G2$]=tuF!"T*d]Xteh]=GPa^;%Io]+t2C"9H3H]Y!Y5"22C[^&%d3]=F=rp&G1" +H+U]d!!0gGrk8%+"LkqR]`J'3"9H3H]Y!V4"22LVPP+tY>._M\iW/uYkpZT^r[A1)Z`pdCN[Q>+.4Xg9 +#:_9dZ*UZo/,gtM-n-Sn.4@0eXgbT0.Ols?ZF@)d/1W.u-n$Mn.Ouu#Z`^U<@ONWS.4V[0Z)sc"-jM7N +-n6So.sGI/Y-X6A-n$Pn/@)UfZToui.k)nt.Oqd2Yd6D@.Ocer.4Zer.C67bYsBfg.k2rBY->4@4!l@* +.OcfXYd:XF0d\A!/"X&QY#Qr"-mpJn.Olks.oj*cZ@OGQ.4HYo-n>$A'.PF[.Ouo0H=t:X*4mN!!*'.XKJY-,5V?G!=5j/YHArI!Vud"%'HV5Xs!!!$$!!o9nTqN8'!<<-&!!*'$%&'VnTcX:9!WiBSW1fu_)uos>!<<9eWhQ8b%KQV3"b!)>'1#PA'!NP<'=qZ$c0]=G[4pAb"2)=Z^%hX1]t(bh +qu?gX]t:uM!!BsG^BWp&!uP@X^Ab_J]Xtkh]j:O9"Gsh(])qI%"22C[^&.j40tFuaoDeuA\\8=I!!9dG +]`Gl,pAbVe3'UNS\%A4_.Ochs.4?\?.30lf.4Qeq.4lr18o^u=Z)t=7ZB6Ub-oJ67 +Za)bEr$`.).Ocep.Olhq.4VX/Za)h*.OZ_rXKf7=6np2A.4P6G.4Zr#3O?-"Qn'U7.^?=bZY-+k/+ohTE!!!G$ZE'p7#m1)+"q@K/ +W2ru*rW!63X/r8&3#3DR)>tK[*uZ"TW3NFV"mH!p"U5nq;jXSeZE1+.$$$7O!#;`AX/m*8!<3)u!!!'! +!!`N)%'6P5Y9NrG#6hH7W1Y4=#5\B3!ob5+$$F'Wr[k\aoDnR!!!$'P+eYGGm+3M!s7ok!=,J#T`ZeF!#;5!rr?UUS4HS$3:/- +!Xbn*T`ZM@!!3#u$4*E'USAn4!!30&rW"PO%&'AiTcO:9!!**-StDdS@0?Q2!!*ClV59q_"p+c+#G\&j +Te@6%'cIu)*Z"_n#s+oRT77%H!!**%!!!&o!!!'!!Z;"=!=/oK-V]PpU7\3ZUML,9!#)'"U8&_1qZ-Tr +)#s[PY?%@*]`JHu8X$)+,fTfrGX!"TSN'!<<3"!"8o6URe0R59:g_)AsFl)@.2u0r(JqZ$`4]=GQK!!BpH]tO+>rO_n+"I$I2]a=Q9"-1"*]`8*2 +!<'P%!!BpH\MN:H#Q\8F\\5\h]bp\J"2DO[^$bq']tM%kqu?i6\%Rgo!!@ka]/'0Zmu#'(+QYsZEc_E +-n6Vq.k3*RZa$l#.k)nq!%Imq.OlmQZ*UZ".k)np.4\N)Yd:Yd.k3"s:pdR9\NVJk-Rh6fZ*pg@['?sE +rNZp>[^3?HZa%"i.4?Vp.Ob'@1Fah%-n?er.k)nq-n-Po7@gWg['-ht.4I9YZ`pVa.4Qbs-n6_r.4Q\p +.4?Yp.^H@dZ:.#.-n.3_ZF$p?Xg5.5Ycb44Xfo+AYd:UF.OlksYI(R>5:e36.4Qbr-n6Z0ZE^mG-RpQ* +XL#.7/1E%t.jukt.4HYqr$`IK\$`NJ\%B,U\$E6A\@8iM]!niEZRR@RjsgY,\\,#64el +!!O(;YH4f9p&GLjYH+gN!!!n?XfST.qZ%<2!!!*$!#M]>X/?($!!!>,Y,nQFrW)s!rW!!%!$;BCW3331 +!WE'&%'Hb7X!?.l5Vm*8( +Y,eY-ri?C+XK/G(ZE0u0li7"dqu?s&!X9a#YH+`3YH/TA!#hrAYce<,!<*#t!!Ne4XKJ`NrW!?FXK8V" +SXu13Pa@](rg!kZTV&BfXU"n,$N@+-XrmB<%3_gSW2pC-!#hrAYce<*!#P_:!!**CW2m##W3Jr7TH"+6!"'U>XJDPbUS4EWU%tGjSYDqb +!WW6&!<<2s!!`Q+!!!$"!!<#t#6l9#TqeBVUCnFE!#VZ.TqD_n!WW6$!WrK*!Wd5$V4FHVV5'`_V59r\Tr"HZU&bH"`W-,X]=GVakl:gt]stcJ!!BaE],:MI"22.V^%_U*!!BjF +_7BID"1btU]Cc.+]tM%kqZ-W-!58.-"1l+V^%MF.]t:nhq#CN0]t:oR!!C!H^UF">'Xtid^V.=m\\5\g +]tM%o]=knh\\@q@k5YZC]=Ybg^\n-7^:V.jmf3I']t:uU!#3&W\=%tc@pE/B>$P?=B4lLH]>(iR!!BaE +\[hA5"227Y^&7p5^:V.jq>g3h'YV,l]=YPc]=Ybi]Y;"k]=>Jd]t*)%kU?rh.OcfT['d6L5q+33.e"kk +-p=oBYd5h\.4G0F(+CX^/1E&N['R'".4I9[['R(f.OQYoq^r[As?-n-Po.^QFeYWjNb-n-Sp1:=Ep[ok+1-Rb(_ +Z*BB?+=\cg/3:#9\?E'?Z*^jBYd:gF[&pR=YHkG_.4Q_q.Ob$?#:h8R-n6bs/,h"h.k)qr.Y"_/\$pB* +-V^nRYbs'%.4Q\o.OZYm.4H_p.4?SoZEggB5Un024L_Z+YILdA['?g?Yck::['I!@Yd,`,-S)L3Y!K?Y +.k2np.4?Sn-n.Za-j@ZEC[>Z*l)2 +j!j'i!WbQc#HOo(+TMQD!Ug!l(osaAXpF_$*]C+&YB9gF(pL*BWs/S+!ek!<>?\USFY0!WW9&mf4@GUSFNV#64`* +!!!BjH]=[b:rjr0Cq#LE-!5&./"<+n_\JY2D'Y_;s]=thf +^Upti\\5Pe]=PPb]tO=DjT#Gg]=khg!WE'$]t_6dmf3I']t:uU!#3&W]t;"j]tM%i]tCtj]=khi\@oTS +!!BpJ]Y=%="1c+W\buL1]t_6dqZ-9h#J7d`]Xb_f^&>PC^&GVH]t(hg^Yo1V.1RaU-n7Nl\$E,V/1E"r +..AYg4g;9"YllO).4QhF.!-sf=Kf3?OXMV?ZEpsJ-n-Vq.4?Yq.4Hbq.64fFZF;;3.k3$TZF%))-n$Po +-n$Mo.ORQlYd1Sc.Ochq.^ZLfZ9Tlh.k3"t.Oqg7['DkG-R^Gn.4Q_q.^QCdZ9Tlg.OZ\o.<;o(Z`YZ, +.PeK?Za*=7.4?Vq.6FiE\$3?IZi76CZ)tC;ZF@0GZF74l.4Q_r.4?\A.0M+K-n6hI.N'W_.Olkq.OcpQ +Z*:O(.4A0*[BH)L-n?_pr$a-G-n-Vo.4ZpSZEpi%.OZ`/Yd1R>]!&BDZE^mGZE^^=YdLgHZ7@@R/$cYd +Wj>"j.2XN`.Ochs.6k&CZEbr0-rd^aYFI$i.k)nE.1n$[-RgPp.R:AIZ+%$FZ+@XJc:$!!N\0XK8?D +quH`trW!*GW3<2&%/g/0%'6P4XhN!#?ZXW2Qr!XKJb.WNNJ,YG\>"XK84r$2ac'!VcWp!V$.!%%sc,XG7)^2Q3[[LC*\T!!3'! +"p"]3XK8S.!$_CB*ZD8aVlm/*Y-+t2W3!)'XK&D&[&C&1!!!>,W3!-Ep](d),d",KX:G:22Q3[[LC*YS +*!-*?!s9[IX0/D&Y-+n'Y-4q.WiiG'Y-+h(#Qa#ejT#Yh!!"+;V5'nc"oneo!!"#;T`tl)!9!FUS3PM!Win/US=M9!WW3&!Z@c0V4j`\ +TqS6[TqS6TWho]i$*9s/!<<-&!<<2s!!!'!!"T/4!WiB&!!**#!!*'/SY7L+UO*7H1Spk>IKffS!<<*# +!<<*#!!*-$!_USsl]U7n7`Tqr"p"QTRC!!L!I^:sa7!!BpF +]t*b8"1u7W*<#p?]=>Jbo)Jm.]=koU!<9\2^%D@+]=e6Z\bc@/]tLtip](E0]=koO!<0S1^%hX2!kl4V +?i9s,]=kbhq>gN,$bs"3T!PQ,E +]a)0_]XkYa]=n.C"1u:\]Cc.+]Xtkhr;Zr6]t$#h!!'_/])f[Yrk/QN]=k\c\\,Q5!9P^F-n$FK\$N?K +/gr+u.OZbq-7C;m-n5-F!%@gq%Oa3@\$E+g.juns-R^Dnr[87fZ*h$".k3-VYd:N#.P(KHr[AX5.OQ]T +ZF$m0/Li2!/$cFcZp6)i.4?\D.0)X4ZWO[d.4HYn.^HCcZp?,i.Ockr-RuF.['MnD-mgAn-n-Pm/$QCc +Z9B`e.4Qbr-pFrGYdZbF.q?&lYc9*%.Olhr1:4Z*u52.4HYp.2+*Z.Ocht-n-Vq0X.ge\Q)^4hErZ1KXK&8' +,4tp>7'*PoL'7JU"U_?6XK3NW!3;!!<3*!!#Ye>!#;`>Y-9iB2*!ZY3B/uW3&iiV2` +0/YR>0/b[C0JG@?#64`2US4NY,52'T+/>O)UC$u$(9F:)V$?u#!<<0$!!V3"1u1Y\b,t$]DV^3]Y;"kmf3I+\\#KD!8mk@.2aN_.k)ug['-X=Jgi3"-n6Yp.Ochs +.juepr[J@(.k<'RZEgf0.Olkt./bS0.k.-tZaFBp.4M1"\$p?+.4?Yp.ju&Z-R^DqW3Wn>E@E:a.4V[. +Za2pr.1@US-n$Mm.7(;GZF;=_.0:nIZi76162`5P-n-SrZF[EM4=Vj1.4?Vp.4QjP['?u'-n$Pp./k\+ +OLMR'E@i]?ZE(?9.4QbE.2fIsZEcA<-n-Vq.k)hn-n-Sn-RgMp.4H_q.k)ns.k)nq.Ocbr30PmC-RgMn +.P!"u.Ocbo-S(.b['Hqc.QauCZEZ8:./bRr.OQ\E-n?bt.4QgS[Bd)'-n$MnZ*psI1FO_%.Ouqt.k2ts +-n-Sl.4?Vo/$lObZU"76&jWe/[BhA4.QauCZEZ8:.4HYo!\#THr@&%&/Li2"Za@!H2uY6:.Ochs-n6Yq +-n6Yo.Ocbqj=0-i#mXG4YH+^1"on]!!!33%!r`0)!<<*+Y,n_-!&"!G%L@lnX/e_j!!edlW2NQ$q>^g' +!!!=jXJ`-r!WE'&$ELA5Wuq'9"X'tLXJcI(!!*J1ri?)Br;[W9!!!>,XfSTF!!!$"!!*'#!=Q$2Y,iiD +!"B3XW3*.$#7-WsZ*#qa$ig8.!!!;-Y-4`9!!2utrrW-!!!2Ti"p"rIEshsLpAbd+!XEV@XK8Q2!#r)D +YHAW@!W;uu!WE'!!rN$%$`pD1Xe +US4AB!s&B&!<`c/Ta.S0!<<*#!Wr<#%fl_3!!*-&!<<-#!!**%!W2p-"rh+\!<<0&!!!$$!s8T'!!idO +V5'fZ"p,\@T`Gi.qu@')!!!'$!!*'#!"Jn%!$M7@&I+r(USSY)!rr?'!$6$Ug]`J06?+mk`q#CN/]=kl7!!!`'!!*qI!l)@ZrW!&4]=kcD!!BpJ]=n+B"1u=]^$G_$\\#Pe +o`,*+]=kiT!!BjF]t*S3"1u7]](,jY!9kpE.k)hq.k*'[Yd(I><@TFG.OtBF81H)<.k)u:.4Qbq.Z^^C +XcP(`.46Vp-mpJo345ro[n8"u.W;Z#Z+DnG-n6Yo.Ocer.;lQ#YcT`3.OcerZE^aC5Un33-n>3F"=P]b +Za1UV[43UT.4HdQZE^]$.4?Vo-7LMpYd^pE4t8#\-jhFQ-n-[N['?u'./kYB-n6_p9XM44[jskPZ`pYd +.4Qbr.Oup/[(!>O.k2tt.jutu.OchG.KCpq.fLk!.OZbpr@&(^YIAI%.46Sq.OkEXK)[+!!N\1XKJWIr;[3+!!!A.Vm!-A!!!&s!!Nb4 +XKJWKq#CdSY,e_(%OA-VYb):"!!imOXJi3f"on\l!!*'#qZ$s/6a*Ff#64f*!!2or%fls/W33(M#lk:1 +YH+a*#Q4W&!r)a"!=c34XKEcH!"0$PW3WTq#QOi*!!2]l"q.T8Wi[?Dq#Cp+,-A#KX9nq-$)k&.XB#T) +!!!'!!"f53!!<3$!XEqOX/nbp!<<*#^&SB=!!!*'!">FtTa%8J"Tn`+!Wo,`!!!-'!!!$"(SdXuV'uBF"&,G_U8Jb4!Wr<#(BOU?9V\AVTb%5*!!!;"TqeA.!!*'"!W2p.+/>O) +UC.&&!!!J'US4G)qu@0,"::j"Tq`Y1!!*'#!r`0'%\oemUE9=5&-2h6.\WW2V$nNBUS44h!Wiu7!WW<, +DPO&'5mIJm!WTqe@i!!riuq^.4Qbq/$lRf +ZU$#gr[C&[.4V=&ZF"9o.Olkq.jlbq/$cOfZ9K`d.OZbp.OlmJ['Hl:K\2Gcb-n$Mn-n$Mn-n$Mo""5QI.-)i?!!!'!!!icuW3*,%X$6ja +!!WH,&;RP0#6"T.2lNgZW%/,T!W!!",>X8iS*!!N\0Y,ncKqu?g"!"#"kX8tctqu?g#!!!E*X8jFB!!!'!!"0"!XK8E`B!!!*$!!2]lq#CX$D60hCW)*g!!!!&s!"oSmWNWD,;#gS$A>lH0XV2!@!WE'!!W2p2!<<*. +X/i>',67fF!]I*_YG`*=rVup!o`,0s$`gA/X!%-:&g=EZXKDp2!!d&5W3369#QOi*!WW3$p](LUXKS\' +&I7q.rrL4A%06G2!WWBgV4jTXUHo1a!!30&!WE'-#SVWT'F=a>"?**OUB78?"o\K;!<<*#$$W/>TqMnt +!!!\/TqS6Q*2V4jLr"98E&"9&9+!^p)!!**#!!**#!"5Qs!iVk=pAb^GTqeBV$NL88?_sTmT+qS0!#G\:!!36(!s&H*!<>$Q +Tq\A"#QXo*!"onY:\[]>do)JeI[eg%,]=YbgpAb1Frk/pAb?.]t:f[qZ$`1 +]Y1rM!!BpJ]=n(ArO_h)")#<]^\e*/!!BjH]=mq=$"^fa]Dr8K]t4@@!!BjJ\\$l%"VJM_]=e7:!!L*L +]tXUI!!ES@]t(cE!!'S/]DDR1]"P_hm/R7#]=toM!!BjF]t+(A":2]S\\%;1"22CY^=*)^!9kpF.Olbq +.OlkuS@G]'[()Ym.46PC.7l!?0lFA%Z*?,8.46[OXfo%D9IqSB.OlhuEO`<\YBD?B,q:BpYHtO>YDtq( +-n-lPUp.J<\!\cs.4Qbq/$cFdZTorf.4?Vnr@%_3rj"bn.4?Vo-n;O.Z*H\F-n6Yp-n6a!Z+%$F4=V^3 +:FRbB.4VU/Z*HVE.4Qbq-n-Sp%6(5eX,3mXY,E!7!!!&u!"'%*X0/D! +*XDcH"TAH,#pG"2$3LA/!hTJ#QOi* +!!!6RL(++_!<$ +!<<-$"9JT8Sti!UPoL#2rW*K1!!j^"@0lr8!WrK*!`USXZXUO4!a!!E?'!<<*##W8HN +V4j_(!!!'>UT1ApQPTl-rW!W6#q^9-!!*'"&>>koTca=9!!!=srhC=%('XgA!!!'&$6"4s$3:,,!rr_( +Tr=_1pAbaHU7n?W$31&-)l'F6Wg=J)rW45C!XC8t$31,.!!;]=F.'!!AFr]=S'Qq#CR"^qI@j!W2p%#J7U]]=SdS!!QQ@\%T=-q>gK+o`5$*s1A.. +"22CY]D)@/$G!j`OS8_W\\#Dcp&G?0]t$,7^:V#U!;ca!OLr-=N;!;Q3=,'R"hVI]]=frl!!KpG^:h/V +!!L!I^V,O"!!"VJ!!BdD]=Ie="H^7/^Q\Bl!AOiU!!9dC^&Ye/h&8(9ocfk[r20p#:V#OZa-d@5klce.R:;E[';,1.4Qg+ +\?iKP[rFhg.kjYY\#l;S.k2qs/QTBfYHb-M6n9Z702.G:Z++d$.4m#!jXC0Yk5YJ_qu@??V5UMuY,eLj +;_o7/+#S)@XKVW%)5\&I!!YKcW33&"@3cH +!'^Ja!!<9&!Y1QnTV8'RV2J,*(`+8MBqM/oWhlP[%fl_832<=DWhWlD#mM&$P,"_ITpuPr!!30&$%&A> +V5jNks.^F*URe0RV-jZ2!!**#!",EnUSB(7!<<*#qu?mBUS4HX$iL&2$_a>hTca=8!WE'6!C.$Qo`c/T7JZ +Hj]rT!!EQbV5'l\W)+NA"pPJcC8IW#:'L^t!lG!DM7pF0]=GO]!W2p&'t_/k]tM%Sg\\>]R!<0S1 +^%MF2OLr-<]=kfnrW)`o"i%a__70RD!!F1Q]>"I:!!^9O]=5Jc0DPSPA\G^h]>+XK!!X4Q]=khg!W2p" +(qmI9qu?i2]t:oQ!!U*K\\#HTqZ$a8\\#NUqZ$Z/]`GdXo`,*-]=kcQ!!X4Q]=khg!W2p")8!L;q>^]5 +]=khk!W)j"(;@Dp!T*nA.0V+L-n6Sn4"2X/175M^Y,ne4\$NBE[CE]QXLG@9]jWE?-RpNs[^<6C['R-H +\%&oVY.D)0/1N%s-n-VrS[Pc-Z2V$CZa-jB\$7qC.OQYo.OcesZa$gB5lN2[-n6Vn.4?W2Za-mC.OZ_p +-n;R.Z*HYF.4Qbp.4?YpTXV/3ZECF;5."lL.4QjR['?r&.4Q_p.k)hq-nTJH['I!H[mVVn.OZbq.k)qu +.?h-CYd^sH\$rlS[Bm6IYd[mh.k3&"r$qXo(b-sbEjW*XZa@!BYd1UA['R0HYd1OCR4nOg)Cd3eTsM,0 +ZEUX@YI(XEZ*La/-n-MmZa@$D!(6`6+"8ZhNj#pn\@8iP[^`WJZE:@:\lU4..4HdRZ`g`$./5506*d`# +Ypq4P.OlsBZa?pAZ*Ug@['dEK[B?,#-l=B^.ZLsM\$E. +X<70:,pKFmXKDm1!WW31L9@\_YHG%0YH4b.Y,\OU!!<<-#!WE'$!WrXCrh0CiUSIgb%&9SlUSFNZ3WfKe!Wr<$!!<&u +(BF_9US4BUUS4BVUS4BVU8+E^US4N+$O-Y6!!!*-GQ+9HUS4HXTqeBTTqS6&!!*'*rhBLf,lRcY!<<@@ +VPUJmV5'feV4jTXVOsWU1'.@S"Uh'"W1tR2!!"/@UBdJ"!<<*%$$Z9?';M7rURe*RW-SFD!<<*+Br.>r +U&LeoW2QD`US4H]V(htb!#$cgZaI9V\[f>c]">\i]t_+n\[_M:%g]YX^U_%i]t_7p]tM%h^%_R60t4a+ +]=khi\\/*W]=jF&!<'P&!!BjF]t=.Arjr0DpAbIX]>(ni]t_1mqu?i2]t(cK!!WM<]t:ti]Cc.()?.;T +]=Ybi]=ttl\c08B]D2I$!"8nA]=YVe]=Y_h\\#QS\HKUZ]=fcl!!P'g]t:tkrjrBL]=>Db]e'*^!5&6D +q>^X6^V.CrrOiHM]t(hk]tM&T!!BdD]Y3t<"1u:Z]DDR60Y>$1]t:ni]*?$\\%B2b0`(hP(V[;frk/HH +]Y;"irk/?F]AEVQ.0M"H/Li1I.30lh>dUcFYdUjC[^36EXg5.;\#VeF-n-Pp.OoMN)7$TPZ+%3JY-P=< +X\C;o.Ouqs-n-Vs;m!P.Z3[eBZE^^A\>Msu.LmjV.OcpRZ*Uf&.Ocep.f:^q5lS(tZ7.4P.OcjPZ*LZ# +r[KNL.4Qbr.P%'q\$EKKYd^\a.4HaOZa$f$.4HYo.k2qs.4?m[Za-sEV(4#D-n6)c-n6Vp.4Qm$Z*:L> +Yd1O@Yd(R?Y.&'o-iPUk.K1_%.4HZ?YcG7?Z+0e="0o,;ZMq*q[uW'i.4H_q.Om-D\$33FZEpm@YHk[? +[n/#!.4_a3Z*?SD-n-Sp.P-1bZEUgEZEga=Yd1X>[ppp<.OZ\qZa?k9ZU+=7-:"l@Za)&0.Ochs0V5bX +ZEpjCZ`gL9YdCl3.Ochr-RpZtZF-m@rj*!;Za$d=['sWs.k<+0.Hga3!W2p7!!!$*3i&aRXer+uVlQu& +W3!2(W0nk5!W+Y,nBN#Qao)#6=i,!!>*UVuEb(X/rD*XK/:a.g5_L"UqK8XfNW= +!!OIFY-"c5r;[!/Y-+t0+8>gA%?%n!!`f[TW4rlY,M?$"0Sf/XT#@)W,N(ErW!Q3!!!R`W3<8&XKJV-YH5%6 +W%e2N"UV?5Y-&rG!#u%H@Bm#>W3*/&Y-P77XJVpc#ljr+!"5j/X0*T>!#d#^XfJN1!!!$"!"ag^YH4e+ +X/iG+Y-"e'0Dtka!<!!!'! +!!<6%+JT49Tq_tq!UBq8-!WW9&&V-^Or1b"#V4jZZV'uEF!rr<&$=BR'TqS6TU]-qjU8Xi`70`nq!s8S> +!"c$.Wj/n#W'0*]t:ni\Rk^>"1c%S^%D@/^:Ckj]4:I5%L9PW]=Yej\\5Sd^ULtkq#L$e&WXQ: +]t;"m]tLte\@oGb\%N[S!!>*j]t+!O!k5eRqu?i2]t:oP!!*D9rk/HF]tM%irk/?F^%q^2]=kkho`,*+ +]XtfP!!5$i^&>PI]=Ybg]Y1lO!!*A=rOW?G]=GJa\\,Vfh>lL`$7I>P/1kA;ZFdNQrim!>[]6U5;(O.E +.4Qbq.Ock`<4BBHZa-jB[(*N-/M&7t.4?Vo.jlbE.o/NQNNodo['[9OZ`^cu.k)kq-n-RU\%'19-S-\q +-n6Vo/13To\$rq!-S$\p/%W3r\N_Mm-n?bs-n-Vm.o28=YHk-O740N6-FgOm]g;EB$S*]g[(!NM:FIbB +-lOTc-n$Pq.4H_r=Ko0=ZELL;ZECLEO?4m>.e"kq/2(nGZEga@Z*CU?[JmW@N^GbOq>_31 +!!!6aTWG2qYH=t/YcOsH*X;]Hn,Nk$&QGF)YHFt0Y,n_*rhos>,6\&Jr;[!%!!!?dVuEV+X0/P&W2aeM +#QOi*$a6V0Y5fgD!"T>pVluqsXfSV,XJi4@*sVWC"V%N2XK`rC!!OIIWi<-0qZ$j.3i&^QX0&Q'X93S] +"p+]'#m(),#f#+!X/rqN1ZT1SY;[KTqnKYK.I90!<<-#!!**,0p/`P)!!"1Z%T]CZ(,(q7,hB*.u2"1c+X[e0V'(VRMo^$u(1Nk`3>]=PPb +]tLrml2UneOLr4)]*>s\]t:ni(&\.-!"+[u]t:hc]t:tl(]+17]t:tipAb;O^V%;[^&GVE]b^DD"1l1Z +]Cc.+]"Yhfp](MW^:q4i]=\'U!#P>/"b=4mZ*^k9[/mfSr;bdVi@-<-.Ouqu-S.;SH?ca%\q,$%0e"G! +.4?So-RgGm-nQl>E/:d(WKL:?.Ocbqr$`%&.4Q_p-7C5m.4HYr&isL"Z*URBO!uS..OZhr.k<)'r[J=) +-n6Yo.4Hbr.Ochsr@&U6.Ouqs/Lr4s.Olhp.OZbq-n-\u.Oukr.K1e"-n?br.etM*-RgJq.4Qhs.4Qhr +.4Qer-nG9G&M,=[.7SB>\$EB>O]=:j.4ZnE.JG8,.Olhu/OX-3Mn$'rS;h&P0I\D".OckG-lFH`-nHl@ +F,@6/Y`E0L.Olks.OZht/1N,$r[@gqr[J("/1i'F+^9!!!&u!!<6%!!W?+#mqM;Q*.0lW,i4B!!N]>$4@1IpAb@( +$jd:M%/g/3$k*IO%g`49!r`3"!WE'1!=B&:#m^M2!<<*+%LNOR%/Bl/!WW3*$3^V=$2ac'!W;uu!r`0. +#R;YRFJu:BQ#eku"mQ'u"UQ>?E,_bWYD.0h/.r-fq#Cs,!!!3203<=tXIs])'aF^>rVup)rX&Z6$2FQ( +"pZ;LGQ+WHR!(M*#6F]%rsA]5!=0&,!#Q%L$O[7J!!!$"!<<*)$8,>&Y-+F=5njOt!"9&:+\m!SUSEoe +1_p>1!#5J7!ptBUS*-O5UHjArW*]5!<<*#!!!$$"q)kXDPNttCH`I;rW3<*!X]AF$OmCX!!!*$!<<-%#RMYJDPEo$ +O)-Wg#lt,+!=&]5$jd4K#m0oG2@#mh%I"8i00!XK/b;Ji,$SnpS)#6Fr'!"T)4#7)DEBUbZgO(BpV +"p=f)!D,tU/V[#!8mk9.K1_4.4?Sn.Oces.k)u"-RpPo.Outt +-n6\q./kY*.Ouqu-n-\r.OZ_p.OckG.17LP.OZbp.k)nq.Ome7.Ocok\$EKQ9.28<.OZ\p.4Qbq-n-Vq +.4Zhr-R^An.4?Vm.4HVn-mpJm.4Qbp.Ochr.4?Vp.Ochs-n$Po.OceE.eb@l./bRt.Oceo.fLk".Olhr +/,^q%/L`2!-S$YF.L.CQ.Ocep.4Y6Ep*g+m.4?Vnr@18c.P!"t.4?Sp.4Qer.OZbr-n-Pp-n6\q/1Dtt +/1Dqq/LW.u.46Sq.Oc_o-n6\q.4Qbs-R^Dp.Ochs-n6Vo.Ockt.k1EH""5WJ.etLn.fCe+-n6Yp.OZ_o +.OZbr.4cnQ.4Qnt.4Qktr@/L3.Ocbp.Ounr.kVk#R(D8!^a$!!!$"!<<*&!<<*# +!W)iu!W`?#!!!&q!!30$!W;uu!Q4sF!<<*#!WiH,!W`?$!<3,u!!WK*!WW6$!r`0"!WE0!!<<3"!"Ar0 +!!!*$!!33%!^KrrW)ou!/.\^'[$K. +!.k1N!8o:,.Ob6F#q.8P.OZ_o-n?bG./kY!.OZ\p.4G0F"XkfJ.4H\E.1dsZ-n6Yq-mpL'NfK/Z-n$PD +.Ng/i-S$Yo=1>N>]I>lr[7gs.Ob9F$S!MR.Ochq.jukr.K1^q/H.-u-kn*Y-n-Pp +.Olkr-n6Yq.OZbq.4?\A.0(jp.0D%K.4bBH,qCJp.OZer.juhq-n$Po.k3"t.Olqu.4HYo.4Q_q-n6Vp +.OceK/L`.tj=/=R!!3'!!!3#u!!3'!!!3#urrMoq"p"sNE,p+3q>^s*!<<*$0W;%OY6P%-!W;uu!Vufr +!Vud"!W`9$!gNrrW!$$!!!&u!!30$ +!Vucr!VZQo!WE'!!Ug!m!TR.4?Sn.OZ_n-mpDmr@%dt-n"sAr@.^o!\,QFpaHe)-R^Gn-R^Do.4lqt +.Ocbp./kY..Ockt.k)ns.k<%u.Oco".OceF.1@UQ.OQVm.OQ\o.4?\-.0(gJ!<3)u!!!&p!!<6%!!2ip +!!;rr"pf^ZY-3NdpAbI)Q)LdcJd28Vr;Zfuqu?]tq#L!d!!2rs!!2ip!!23^"9AK&!^KrrW!!#!!3'!!!9"tm/R8@^:1d2 +o`+u#rk/:eX8mhPTE+"$r[Ido"tD&O.4Qbsr@&R3-n-Po.4Qhs.Ocht.Ocbo.4Hbr.Ocbrr@7dq+t+pI +Za6gBN\Dt5.4Qeq-n6m@\$E3H;^a+E.Olks.OZYmr[J^5-n6\o-RgMo.k2qq.4HYn.Olhs.jueE.L%=L +.4H_p.K1^r.ObWR.Olhq.OckrpF-1m.4?VB.1msX/1;nt.4Qep-n6Vo-RgJmr[A+$.4HYo-n$Mmn0nDg +.Ok?H'IbL].4H_q.k3#!.Ocer.4?Sn-n,$D'IYCZ.Ocer-mpGo.4chr-mpDm.ObEK.4bBH"=PfL.Ob9F +&1T(V.4Qbq.Ocep.4HYo.OtEH!%Ram-R^Jp-R^Gp.Olho.kE/"-n-Vr/1W8$.P*)!.Oco!.P*)#.P!#! +.fLk!.Olkqr[J%&.OlksjXL3YhZ*WWlN$qco`+smpAbI`X/iJ"E"3!Oqu@!,%YL^`YGaA\qZ$Tsq>^[" +!!!'%!:g*j!gKp">RO%\\3k#JcNUe_C=t'(FL^f[Bd'I\%HZR3\N3K +8TM;E\$<'?/[$W%.ebC_.K_+M.Ot?Eeg^MHr$hRor[[stq'c:lq'c:np*fti!\,WJr[RgonL=8`!@TGr +/,UmC.H1?S!#G\:$`L83W2Qgq-l^KrrW<-'r<3<,"9eo1 +rW3*&!r`<$!r2fr!W3!#!s/W)"8rB#!WW8e!;liu!Wi3#rrLFGWrNB_]>)+l]=YWQ]`c*`\[u)0!.k3& +!8mj].1@[R.4R,n]XkV^['[.>[f3`>X%Xuo.4Cc:r$h[qqC2Us.Olr!!@fVL.0V+K-n-Yso-s_jq^V=h +r[Imur[Imso.')Ur@%dr-n5'BbULF0mJm[s!<A^V?"g?$NgSH:7n5VV5'`ZU].(m +M(Ai5!QtJl!!!'!!X&T,!s8W'!sSc.!s/Q+!mgoI"8W-&!sA`/r(!3#r,!P>qW]=kni^Uq1m?fqE@!.k4.!3dmd-n-Pm.4Zl6<03-!NK%pV1b't(-g3"d.0M%K +.4QbE.L@UU.Ochr.k<)!i[OFIr[7gt.k:HIpaQ=o.4G0FpaH4l.JkRp.J5.l.4?V7.K(ao.JkOZ.H)_\ +!"K#0!!3-#":H>3EGTE2E!B/u&Hi(6!LNis!<<-$!!**%!WrK*!;-n$Pn-n-Sm.Ochr +.k3&".4?So.4XX4Z75c$r$hUp!%Idp!%?nWmjS8c.K(^r/,:Y".4H_q-n-Spo-sSe!\#TIr[Rdo![oKG +nL4\k.4H_r.4H\C.0D%K.4Xa7i$ki0!!3'!"9AK(!!3'!qZ$["!!/8`r;lis!<!!NE*!!!$$r;ciurW33'!WrE'rVup!X8qJbrW*!!r-RgMo-n$Sn.k2qr.Ouqr-n6Yo.4Qh6 +.E3e:./PFn.)dY&.K1^t.4?Vni[OmWq^DLpi@+aTr$_^t.Ock9.GlSX!!!&t!!!&s!!!&Z!.k3&!0I6k +!rr<%!<<*#!!*-$!<<0"!<3-"!!!(Y!3#tu!W)is!TO1U!!<6&!!/)[JcLB&T`F($cm]2N-n-Vp.OcnH +.0M%K.k3%J.0D%K.4E@gk:-EZr@.apq'l:mqC)Cor$_[s.4Y9F!%QDG!%Rgo!%@gqs![jpnL=GcpaH=o +.4H_pi[G*\-mpDl.4?VD.0(dq.0(jJ.0(g$!!E<'!!!&Q!.k4.!!!&Z!!!&W!!!&`!0$s]!W`9%"TAB& +!P.=s"#.=s#K.>.\Q +!.k4.!.k3&!.k3&!.k3&!5SZP.=s"#.A83M!.k3&!.k3&!.k3&!.k3&!.k3d!5g7;.=s"A.H:D[!.k3& +!.k3&!.k4.!.k3&!.k40!2:oo.=s"b.Dc(:!.k3&!.k3&!.k3&!.k3&!8mjP.=s"#.DRCM!.k3&!.k3& +!.k3&!.k3&!.k4.!.lYO.=s#-.A?fo!.k3&!.k3&!.k3&!.k3&!!!"O.=s"#.GuYM!.k3&!.k3&!.k3& +!.k3&!.k4N!/)eQ.=s#+.=qPO!.k3&!.k3&!.k3&!.k3E!9,GZ.=s"o.Ieh*.0(fL!.k3&!.k3&!.k3& +!.k3&!2'>k.0M+L.OckF.K1gg.=s"#.=s#K.>.\Q!.k4.!<)s$!<<-#!W2rs!KmG7!.k3&!.k3&!5SZP +.=s"#.A83M!.k3&!.k4@!!!%`!.k3&!.k3&!.k3d!<+GI./kXt.OchqcRFGpJgm?Aq>^KrlMuM:JcLB& +pAb6q!!/,\JcLB&hZ/6.JcLB&i;a!2.OlkrpaWKsJgl:#_(#-ZrrL@EJcLB&T`>,p!Wr?%rW;osnc47A +JcLB&JcLB&JcO^/!%Rmqs!mpss!m4]q'siBJgl^/od]ni`$kZfquZs$"8W&H!.k3&!:9dV!Q4s + +%%EndBinary +grestore +np +grestore +grestore +pgrs +%%PageTrailer +[ +[/CSA [/0 ]] +] del_res +Adobe_AGM_Image/pt gx +Adobe_CoolType_Core/pt get exec +Adobe_AGM_Core/restore_mysetup gx +Adobe_AGM_Core/pt gx +currentdict Adobe_AGM_Utils eq {end} if +%%Trailer +Adobe_AGM_Utils begin +[/EMC pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +Adobe_AGM_Image/dt get exec +Adobe_CoolType_Core/dt get exec +Adobe_AGM_Core/dt get exec +%%Pages: 1 +%%DocumentNeededResources: +%%DocumentSuppliedResources: procset Adobe_AGM_Image 1.0 0 +%%+ procset Adobe_CoolType_Utility_T42 1.0 0 +%%+ procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%+ procset Adobe_CoolType_Core 2.31 0 +%%+ procset Adobe_AGM_Core 2.0 0 +%%+ procset Adobe_AGM_Utils 1.0 0 +%%DocumentNeededFeatures: +%%DocumentSuppliedFeatures: +%%DocumentCustomColors: +%%CMYKCustomColor: +%%RGBCustomColor: +%%EOF diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/OPMI_logo.jpg b/inst/rmarkdown/templates/opmi_article/skeleton/OPMI_logo.jpg new file mode 100755 index 000000000..6164b7021 Binary files /dev/null and b/inst/rmarkdown/templates/opmi_article/skeleton/OPMI_logo.jpg differ diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/colophon.eps b/inst/rmarkdown/templates/opmi_article/skeleton/colophon.eps new file mode 100755 index 000000000..ec80cc00e --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/colophon.eps @@ -0,0 +1,8154 @@ +%!PS-Adobe-3.1 EPSF-3.0 +%ADO_DSC_Encoding: Windows Roman +%%Title: colophon.pdf +%%Creator: Adobe Acrobat 11.0.13 +%%For: AmyH +%%CreationDate: 4/8/2016, 7:18:49 PM +%%BoundingBox: 0 0 22 23 +%%HiResBoundingBox: 0 0 21.7201 22.2000 +%%CropBox: 0 0 21.7201 22.2000 +%%LanguageLevel: 2 +%%DocumentNeededResources: (atend) +%%DocumentSuppliedResources: (atend) +%%DocumentNeededFeatures: (atend) +%%DocumentSuppliedFeatures: (atend) +%%DocumentData: Clean7Bit +%%Pages: (atend) +%%DocumentProcessColors: Black +%%DocumentCustomColors: (atend) +%%EndComments +%%BeginDefaults +%%ViewingOrientation: 1 0 0 1 +%%EndDefaults +%%BeginProlog +%%BeginResource: procset Adobe_AGM_Utils 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{currentpacking true setpacking}if +userdict/Adobe_AGM_Utils 75 dict dup begin put +/bdf +{bind def}bind def +/nd{null def}bdf +/xdf +{exch def}bdf +/ldf +{load def}bdf +/ddf +{put}bdf +/xddf +{3 -1 roll put}bdf +/xpt +{exch put}bdf +/ndf +{ + exch dup where{ + pop pop pop + }{ + xdf + }ifelse +}def +/cdndf +{ + exch dup currentdict exch known{ + pop pop + }{ + exch def + }ifelse +}def +/gx +{get exec}bdf +/ps_level + /languagelevel where{ + pop systemdict/languagelevel gx + }{ + 1 + }ifelse +def +/level2 + ps_level 2 ge +def +/level3 + ps_level 3 ge +def +/ps_version + {version cvr}stopped{-1}if +def +/set_gvm +{currentglobal exch setglobal}bdf +/reset_gvm +{setglobal}bdf +/makereadonlyarray +{ + /packedarray where{pop packedarray + }{ + array astore readonly}ifelse +}bdf +/map_reserved_ink_name +{ + dup type/stringtype eq{ + dup/Red eq{ + pop(_Red_) + }{ + dup/Green eq{ + pop(_Green_) + }{ + dup/Blue eq{ + pop(_Blue_) + }{ + dup()cvn eq{ + pop(Process) + }if + }ifelse + }ifelse + }ifelse + }if +}bdf +/AGMUTIL_GSTATE 22 dict def +/get_gstate +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_clr_spc currentcolorspace def + /AGMUTIL_GSTATE_clr_indx 0 def + /AGMUTIL_GSTATE_clr_comps 12 array def + mark currentcolor counttomark + {AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 3 -1 roll put + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 add def}repeat pop + /AGMUTIL_GSTATE_fnt rootfont def + /AGMUTIL_GSTATE_lw currentlinewidth def + /AGMUTIL_GSTATE_lc currentlinecap def + /AGMUTIL_GSTATE_lj currentlinejoin def + /AGMUTIL_GSTATE_ml currentmiterlimit def + currentdash/AGMUTIL_GSTATE_do xdf/AGMUTIL_GSTATE_da xdf + /AGMUTIL_GSTATE_sa currentstrokeadjust def + /AGMUTIL_GSTATE_clr_rnd currentcolorrendering def + /AGMUTIL_GSTATE_op currentoverprint def + /AGMUTIL_GSTATE_bg currentblackgeneration cvlit def + /AGMUTIL_GSTATE_ucr currentundercolorremoval cvlit def + currentcolortransfer cvlit/AGMUTIL_GSTATE_gy_xfer xdf cvlit/AGMUTIL_GSTATE_b_xfer xdf + cvlit/AGMUTIL_GSTATE_g_xfer xdf cvlit/AGMUTIL_GSTATE_r_xfer xdf + /AGMUTIL_GSTATE_ht currenthalftone def + /AGMUTIL_GSTATE_flt currentflat def + end +}def +/set_gstate +{ + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_clr_spc setcolorspace + AGMUTIL_GSTATE_clr_indx{AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 1 sub get + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 sub def}repeat setcolor + AGMUTIL_GSTATE_fnt setfont + AGMUTIL_GSTATE_lw setlinewidth + AGMUTIL_GSTATE_lc setlinecap + AGMUTIL_GSTATE_lj setlinejoin + AGMUTIL_GSTATE_ml setmiterlimit + AGMUTIL_GSTATE_da AGMUTIL_GSTATE_do setdash + AGMUTIL_GSTATE_sa setstrokeadjust + AGMUTIL_GSTATE_clr_rnd setcolorrendering + AGMUTIL_GSTATE_op setoverprint + AGMUTIL_GSTATE_bg cvx setblackgeneration + AGMUTIL_GSTATE_ucr cvx setundercolorremoval + AGMUTIL_GSTATE_r_xfer cvx AGMUTIL_GSTATE_g_xfer cvx AGMUTIL_GSTATE_b_xfer cvx + AGMUTIL_GSTATE_gy_xfer cvx setcolortransfer + AGMUTIL_GSTATE_ht/HalftoneType get dup 9 eq exch 100 eq or + { + currenthalftone/HalftoneType get AGMUTIL_GSTATE_ht/HalftoneType get ne + { + mark AGMUTIL_GSTATE_ht{sethalftone}stopped cleartomark + }if + }{ + AGMUTIL_GSTATE_ht sethalftone + }ifelse + AGMUTIL_GSTATE_flt setflat + end +}def +/get_gstate_and_matrix +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_ctm matrix currentmatrix def + end + get_gstate +}def +/set_gstate_and_matrix +{ + set_gstate + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_ctm setmatrix + end +}def +/AGMUTIL_str256 256 string def +/AGMUTIL_src256 256 string def +/AGMUTIL_dst64 64 string def +/AGMUTIL_srcLen nd +/AGMUTIL_ndx nd +/AGMUTIL_cpd nd +/capture_cpd{ + //Adobe_AGM_Utils/AGMUTIL_cpd currentpagedevice ddf +}def +/thold_halftone +{ + level3 + {sethalftone currenthalftone} + { + dup/HalftoneType get 3 eq + { + sethalftone currenthalftone + }{ + begin + Width Height mul{ + Thresholds read{pop}if + }repeat + end + currenthalftone + }ifelse + }ifelse +}def +/rdcmntline +{ + currentfile AGMUTIL_str256 readline pop + (%)anchorsearch{pop}if +}bdf +/filter_cmyk +{ + dup type/filetype ne{ + exch()/SubFileDecode filter + }{ + exch pop + } + ifelse + [ + exch + { + AGMUTIL_src256 readstring pop + dup length/AGMUTIL_srcLen exch def + /AGMUTIL_ndx 0 def + AGMCORE_plate_ndx 4 AGMUTIL_srcLen 1 sub{ + 1 index exch get + AGMUTIL_dst64 AGMUTIL_ndx 3 -1 roll put + /AGMUTIL_ndx AGMUTIL_ndx 1 add def + }for + pop + AGMUTIL_dst64 0 AGMUTIL_ndx getinterval + } + bind + /exec cvx + ]cvx +}bdf +/filter_indexed_devn +{ + cvi Names length mul names_index add Lookup exch get +}bdf +/filter_devn +{ + 4 dict begin + /srcStr xdf + /dstStr xdf + dup type/filetype ne{ + 0()/SubFileDecode filter + }if + [ + exch + [ + /devicen_colorspace_dict/AGMCORE_gget cvx/begin cvx + currentdict/srcStr get/readstring cvx/pop cvx + /dup cvx/length cvx 0/gt cvx[ + Adobe_AGM_Utils/AGMUTIL_ndx 0/ddf cvx + names_index Names length currentdict/srcStr get length 1 sub{ + 1/index cvx/exch cvx/get cvx + currentdict/dstStr get/AGMUTIL_ndx/load cvx 3 -1/roll cvx/put cvx + Adobe_AGM_Utils/AGMUTIL_ndx/AGMUTIL_ndx/load cvx 1/add cvx/ddf cvx + }for + currentdict/dstStr get 0/AGMUTIL_ndx/load cvx/getinterval cvx + ]cvx/if cvx + /end cvx + ]cvx + bind + /exec cvx + ]cvx + end +}bdf +/AGMUTIL_imagefile nd +/read_image_file +{ + AGMUTIL_imagefile 0 setfileposition + 10 dict begin + /imageDict xdf + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + /imbufIdx 0 def + /origDataSource imageDict/DataSource get def + /origMultipleDataSources imageDict/MultipleDataSources get def + /origDecode imageDict/Decode get def + /dstDataStr imageDict/Width get colorSpaceElemCnt mul string def + imageDict/MultipleDataSources known{MultipleDataSources}{false}ifelse + { + /imbufCnt imageDict/DataSource get length def + /imbufs imbufCnt array def + 0 1 imbufCnt 1 sub{ + /imbufIdx xdf + imbufs imbufIdx imbufLen string put + imageDict/DataSource get imbufIdx[AGMUTIL_imagefile imbufs imbufIdx get/readstring cvx/pop cvx]cvx put + }for + DeviceN_PS2{ + imageDict begin + /DataSource[DataSource/devn_sep_datasource cvx]cvx def + /MultipleDataSources false def + /Decode[0 1]def + end + }if + }{ + /imbuf imbufLen string def + Indexed_DeviceN level3 not and DeviceN_NoneName or{ + /srcDataStrs[imageDict begin + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi string + }repeat + end]def + imageDict begin + /DataSource[AGMUTIL_imagefile Decode BitsPerComponent false 1/filter_indexed_devn load dstDataStr srcDataStrs devn_alt_datasource/exec cvx]cvx def + /Decode[0 1]def + end + }{ + imageDict/DataSource[1 string dup 0 AGMUTIL_imagefile Decode length 2 idiv string/readstring cvx/pop cvx names_index/get cvx/put cvx]cvx put + imageDict/Decode[0 1]put + }ifelse + }ifelse + imageDict exch + load exec + imageDict/DataSource origDataSource put + imageDict/MultipleDataSources origMultipleDataSources put + imageDict/Decode origDecode put + end +}bdf +/write_image_file +{ + begin + {(AGMUTIL_imagefile)(w+)file}stopped{ + false + }{ + Adobe_AGM_Utils/AGMUTIL_imagefile xddf + 2 dict begin + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + MultipleDataSources{DataSource 0 get}{DataSource}ifelse type/filetype eq{ + /imbuf imbufLen string def + }if + 1 1 Height MultipleDataSources not{Decode length 2 idiv mul}if{ + pop + MultipleDataSources{ + 0 1 DataSource length 1 sub{ + DataSource type dup + /arraytype eq{ + pop DataSource exch gx + }{ + /filetype eq{ + DataSource exch get imbuf readstring pop + }{ + DataSource exch get + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }for + }{ + DataSource type dup + /arraytype eq{ + pop DataSource exec + }{ + /filetype eq{ + DataSource imbuf readstring pop + }{ + DataSource + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }ifelse + }for + end + true + }ifelse + end +}bdf +/close_image_file +{ + AGMUTIL_imagefile closefile(AGMUTIL_imagefile)deletefile +}def +statusdict/product known userdict/AGMP_current_show known not and{ + /pstr statusdict/product get def + pstr(HP LaserJet 2200)eq + pstr(HP LaserJet 4000 Series)eq or + pstr(HP LaserJet 4050 Series )eq or + pstr(HP LaserJet 8000 Series)eq or + pstr(HP LaserJet 8100 Series)eq or + pstr(HP LaserJet 8150 Series)eq or + pstr(HP LaserJet 5000 Series)eq or + pstr(HP LaserJet 5100 Series)eq or + pstr(HP Color LaserJet 4500)eq or + pstr(HP Color LaserJet 4600)eq or + pstr(HP LaserJet 5Si)eq or + pstr(HP LaserJet 1200 Series)eq or + pstr(HP LaserJet 1300 Series)eq or + pstr(HP LaserJet 4100 Series)eq or + { + userdict/AGMP_current_show/show load put + userdict/show{ + currentcolorspace 0 get + /Pattern eq + {false charpath f} + {AGMP_current_show}ifelse + }put + }if + currentdict/pstr undef +}if +/consumeimagedata +{ + begin + AGMIMG_init_common + currentdict/MultipleDataSources known not + {/MultipleDataSources false def}if + MultipleDataSources + { + DataSource 0 get type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width cvi string def + 1 1 Height cvi + { + pop + 0 1 DataSource length 1 sub + { + DataSource exch get + flushbuffer readstring pop pop + }for + }for + end + }if + dup/arraytype eq exch/packedarraytype eq or DataSource 0 get xcheck and + { + Width Height mul cvi + { + 0 1 DataSource length 1 sub + {dup DataSource exch gx length exch 0 ne{pop}if}for + dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + } + { + /DataSource load type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width Decode length 2 idiv mul cvi string def + 1 1 Height{pop DataSource flushbuffer readstring pop pop}for + end + }if + dup/arraytype eq exch/packedarraytype eq or/DataSource load xcheck and + { + Height Width BitsPerComponent mul 8 BitsPerComponent sub add 8 idiv Decode length 2 idiv mul mul + { + DataSource length dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + }ifelse + end +}bdf +/addprocs +{ + 2{/exec load}repeat + 3 1 roll + [5 1 roll]bind cvx +}def +/modify_halftone_xfer +{ + currenthalftone dup length dict copy begin + currentdict 2 index known{ + 1 index load dup length dict copy begin + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end def + currentdict end sethalftone + }{ + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end sethalftone + pop + }ifelse +}def +/clonearray +{ + dup xcheck exch + dup length array exch + Adobe_AGM_Core/AGMCORE_tmp -1 ddf + { + Adobe_AGM_Core/AGMCORE_tmp 2 copy get 1 add ddf + dup type/dicttype eq + { + Adobe_AGM_Core/AGMCORE_tmp get + exch + clonedict + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + dup type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_tmp get exch + clonearray + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + exch dup + Adobe_AGM_Core/AGMCORE_tmp get 4 -1 roll put + }forall + exch{cvx}if +}bdf +/clonedict +{ + dup length dict + begin + { + dup type/dicttype eq + {clonedict}if + dup type/arraytype eq + {clonearray}if + def + }forall + currentdict + end +}bdf +/DeviceN_PS2 +{ + /currentcolorspace AGMCORE_gget 0 get/DeviceN eq level3 not and +}bdf +/Indexed_DeviceN +{ + /indexed_colorspace_dict AGMCORE_gget dup null ne{ + dup/CSDBase known{ + /CSDBase get/CSD get_res/Names known + }{ + pop false + }ifelse + }{ + pop false + }ifelse +}bdf +/DeviceN_NoneName +{ + /Names where{ + pop + false Names + { + (None)eq or + }forall + }{ + false + }ifelse +}bdf +/DeviceN_PS2_inRip_seps +{ + /AGMCORE_in_rip_sep where + { + pop dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/DeviceN eq level3 not and AGMCORE_in_rip_sep and + { + /currentcolorspace exch AGMCORE_gput + false + }{ + true + }ifelse + }{ + true + }ifelse + }{ + true + }ifelse +}bdf +/base_colorspace_type +{ + dup type/arraytype eq{0 get}if +}bdf +/currentdistillerparams where{pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse +{ + /pdfmark_5{cleartomark}bind def +}{ + /pdfmark_5{pdfmark}bind def +}ifelse +/ReadBypdfmark_5 +{ + currentfile exch 0 exch/SubFileDecode filter + /currentdistillerparams where + {pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse + {flushfile cleartomark} + {/PUT pdfmark}ifelse +}bdf +/ReadBypdfmark_5_string +{ + 2 dict begin + /makerString exch def string/tmpString exch def + { + currentfile tmpString readline not{pop exit}if + makerString anchorsearch + { + pop pop cleartomark exit + }{ + 3 copy/PUT pdfmark_5 pop 2 copy(\n)/PUT pdfmark_5 + }ifelse + }loop + end +}bdf +/xpdfm +{ + { + dup 0 get/Label eq + { + aload length[exch 1 add 1 roll/PAGELABEL + }{ + aload pop + [{ThisPage}<<5 -2 roll>>/PUT + }ifelse + pdfmark_5 + }forall +}bdf +/lmt{ + dup 2 index le{exch}if pop dup 2 index ge{exch}if pop +}bdf +/int{ + dup 2 index sub 3 index 5 index sub div 6 -2 roll sub mul exch pop add exch pop +}bdf +/ds{ + Adobe_AGM_Utils begin +}bdf +/dt{ + currentdict Adobe_AGM_Utils eq{ + end + }if +}bdf +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_AGM_Core 2.0 0 +%%Version: 2.0 0 +%%Copyright: Copyright(C)1997-2007 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Core 209 dict dup begin put +/Adobe_AGM_Core_Id/Adobe_AGM_Core_2.0_0 def +/AGMCORE_str256 256 string def +/AGMCORE_save nd +/AGMCORE_graphicsave nd +/AGMCORE_c 0 def +/AGMCORE_m 0 def +/AGMCORE_y 0 def +/AGMCORE_k 0 def +/AGMCORE_cmykbuf 4 array def +/AGMCORE_screen[currentscreen]cvx def +/AGMCORE_tmp 0 def +/AGMCORE_&setgray nd +/AGMCORE_&setcolor nd +/AGMCORE_&setcolorspace nd +/AGMCORE_&setcmykcolor nd +/AGMCORE_cyan_plate nd +/AGMCORE_magenta_plate nd +/AGMCORE_yellow_plate nd +/AGMCORE_black_plate nd +/AGMCORE_plate_ndx nd +/AGMCORE_get_ink_data nd +/AGMCORE_is_cmyk_sep nd +/AGMCORE_host_sep nd +/AGMCORE_avoid_L2_sep_space nd +/AGMCORE_distilling nd +/AGMCORE_composite_job nd +/AGMCORE_producing_seps nd +/AGMCORE_ps_level -1 def +/AGMCORE_ps_version -1 def +/AGMCORE_environ_ok nd +/AGMCORE_CSD_cache 0 dict def +/AGMCORE_currentoverprint false def +/AGMCORE_deltaX nd +/AGMCORE_deltaY nd +/AGMCORE_name nd +/AGMCORE_sep_special nd +/AGMCORE_err_strings 4 dict def +/AGMCORE_cur_err nd +/AGMCORE_current_spot_alias false def +/AGMCORE_inverting false def +/AGMCORE_feature_dictCount nd +/AGMCORE_feature_opCount nd +/AGMCORE_feature_ctm nd +/AGMCORE_ConvertToProcess false def +/AGMCORE_Default_CTM matrix def +/AGMCORE_Default_PageSize nd +/AGMCORE_Default_flatness nd +/AGMCORE_currentbg nd +/AGMCORE_currentucr nd +/AGMCORE_pattern_paint_type 0 def +/knockout_unitsq nd +currentglobal true setglobal +[/CSA/Gradient/Procedure] +{ + /Generic/Category findresource dup length dict copy/Category defineresource pop +}forall +setglobal +/AGMCORE_key_known +{ + where{ + /Adobe_AGM_Core_Id known + }{ + false + }ifelse +}ndf +/flushinput +{ + save + 2 dict begin + /CompareBuffer 3 -1 roll def + /readbuffer 256 string def + mark + { + currentfile readbuffer{readline}stopped + {cleartomark mark} + { + not + {pop exit} + if + CompareBuffer eq + {exit} + if + }ifelse + }loop + cleartomark + end + restore +}bdf +/getspotfunction +{ + AGMCORE_screen exch pop exch pop + dup type/dicttype eq{ + dup/HalftoneType get 1 eq{ + /SpotFunction get + }{ + dup/HalftoneType get 2 eq{ + /GraySpotFunction get + }{ + pop + { + abs exch abs 2 copy add 1 gt{ + 1 sub dup mul exch 1 sub dup mul add 1 sub + }{ + dup mul exch dup mul add 1 exch sub + }ifelse + }bind + }ifelse + }ifelse + }if +}def +/np +{newpath}bdf +/clp_npth +{clip np}def +/eoclp_npth +{eoclip np}def +/npth_clp +{np clip}def +/graphic_setup +{ + /AGMCORE_graphicsave save store + concat + 0 setgray + 0 setlinecap + 0 setlinejoin + 1 setlinewidth + []0 setdash + 10 setmiterlimit + np + false setoverprint + false setstrokeadjust + //Adobe_AGM_Core/spot_alias gx + /Adobe_AGM_Image where{ + pop + Adobe_AGM_Image/spot_alias 2 copy known{ + gx + }{ + pop pop + }ifelse + }if + /sep_colorspace_dict null AGMCORE_gput + 100 dict begin + /dictstackcount countdictstack def + /showpage{}def + mark +}def +/graphic_cleanup +{ + cleartomark + dictstackcount 1 countdictstack 1 sub{end}for + end + AGMCORE_graphicsave restore +}def +/compose_error_msg +{ + grestoreall initgraphics + /Helvetica findfont 10 scalefont setfont + /AGMCORE_deltaY 100 def + /AGMCORE_deltaX 310 def + clippath pathbbox np pop pop 36 add exch 36 add exch moveto + 0 AGMCORE_deltaY rlineto AGMCORE_deltaX 0 rlineto + 0 AGMCORE_deltaY neg rlineto AGMCORE_deltaX neg 0 rlineto closepath + 0 AGMCORE_&setgray + gsave 1 AGMCORE_&setgray fill grestore + 1 setlinewidth gsave stroke grestore + currentpoint AGMCORE_deltaY 15 sub add exch 8 add exch moveto + /AGMCORE_deltaY 12 def + /AGMCORE_tmp 0 def + AGMCORE_err_strings exch get + { + dup 32 eq + { + pop + AGMCORE_str256 0 AGMCORE_tmp getinterval + stringwidth pop currentpoint pop add AGMCORE_deltaX 28 add gt + { + currentpoint AGMCORE_deltaY sub exch pop + clippath pathbbox pop pop pop 44 add exch moveto + }if + AGMCORE_str256 0 AGMCORE_tmp getinterval show( )show + 0 1 AGMCORE_str256 length 1 sub + { + AGMCORE_str256 exch 0 put + }for + /AGMCORE_tmp 0 def + }{ + AGMCORE_str256 exch AGMCORE_tmp xpt + /AGMCORE_tmp AGMCORE_tmp 1 add def + }ifelse + }forall +}bdf +/AGMCORE_CMYKDeviceNColorspaces[ + [/Separation/None/DeviceCMYK{0 0 0}] + [/Separation(Black)/DeviceCMYK{0 0 0 4 -1 roll}bind] + [/Separation(Yellow)/DeviceCMYK{0 0 3 -1 roll 0}bind] + [/DeviceN[(Yellow)(Black)]/DeviceCMYK{0 0 4 2 roll}bind] + [/Separation(Magenta)/DeviceCMYK{0 exch 0 0}bind] + [/DeviceN[(Magenta)(Black)]/DeviceCMYK{0 3 1 roll 0 exch}bind] + [/DeviceN[(Magenta)(Yellow)]/DeviceCMYK{0 3 1 roll 0}bind] + [/DeviceN[(Magenta)(Yellow)(Black)]/DeviceCMYK{0 4 1 roll}bind] + [/Separation(Cyan)/DeviceCMYK{0 0 0}] + [/DeviceN[(Cyan)(Black)]/DeviceCMYK{0 0 3 -1 roll}bind] + [/DeviceN[(Cyan)(Yellow)]/DeviceCMYK{0 exch 0}bind] + [/DeviceN[(Cyan)(Yellow)(Black)]/DeviceCMYK{0 3 1 roll}bind] + [/DeviceN[(Cyan)(Magenta)]/DeviceCMYK{0 0}] + [/DeviceN[(Cyan)(Magenta)(Black)]/DeviceCMYK{0 exch}bind] + [/DeviceN[(Cyan)(Magenta)(Yellow)]/DeviceCMYK{0}] + [/DeviceCMYK] +]def +/ds{ + Adobe_AGM_Core begin + /currentdistillerparams where + { + pop currentdistillerparams/CoreDistVersion get 5000 lt + {<>setdistillerparams}if + }if + /AGMCORE_ps_version xdf + /AGMCORE_ps_level xdf + errordict/AGM_handleerror known not{ + errordict/AGM_handleerror errordict/handleerror get put + errordict/handleerror{ + Adobe_AGM_Core begin + $error/newerror get AGMCORE_cur_err null ne and{ + $error/newerror false put + AGMCORE_cur_err compose_error_msg + }if + $error/newerror true put + end + errordict/AGM_handleerror get exec + }bind put + }if + /AGMCORE_environ_ok + ps_level AGMCORE_ps_level ge + ps_version AGMCORE_ps_version ge and + AGMCORE_ps_level -1 eq or + def + AGMCORE_environ_ok not + {/AGMCORE_cur_err/AGMCORE_bad_environ def}if + /AGMCORE_&setgray systemdict/setgray get def + level2{ + /AGMCORE_&setcolor systemdict/setcolor get def + /AGMCORE_&setcolorspace systemdict/setcolorspace get def + }if + /AGMCORE_currentbg currentblackgeneration def + /AGMCORE_currentucr currentundercolorremoval def + /AGMCORE_Default_flatness currentflat def + /AGMCORE_distilling + /product where{ + pop systemdict/setdistillerparams known product(Adobe PostScript Parser)ne and + }{ + false + }ifelse + def + /AGMCORE_GSTATE AGMCORE_key_known not{ + /AGMCORE_GSTATE 21 dict def + /AGMCORE_tmpmatrix matrix def + /AGMCORE_gstack 32 array def + /AGMCORE_gstackptr 0 def + /AGMCORE_gstacksaveptr 0 def + /AGMCORE_gstackframekeys 14 def + /AGMCORE_&gsave/gsave ldf + /AGMCORE_&grestore/grestore ldf + /AGMCORE_&grestoreall/grestoreall ldf + /AGMCORE_&save/save ldf + /AGMCORE_&setoverprint/setoverprint ldf + /AGMCORE_gdictcopy{ + begin + {def}forall + end + }def + /AGMCORE_gput{ + AGMCORE_gstack AGMCORE_gstackptr get + 3 1 roll + put + }def + /AGMCORE_gget{ + AGMCORE_gstack AGMCORE_gstackptr get + exch + get + }def + /gsave{ + AGMCORE_&gsave + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /grestore{ + AGMCORE_&grestore + AGMCORE_gstackptr 1 sub + dup AGMCORE_gstacksaveptr lt{1 add}if + dup AGMCORE_gstack exch get dup/AGMCORE_currentoverprint known + {/AGMCORE_currentoverprint get setoverprint}{pop}ifelse + /AGMCORE_gstackptr exch store + }def + /grestoreall{ + AGMCORE_&grestoreall + /AGMCORE_gstackptr AGMCORE_gstacksaveptr store + }def + /save{ + AGMCORE_&save + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + /AGMCORE_gstacksaveptr AGMCORE_gstackptr store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /setoverprint{ + dup/AGMCORE_currentoverprint exch AGMCORE_gput AGMCORE_&setoverprint + }def + 0 1 AGMCORE_gstack length 1 sub{ + AGMCORE_gstack exch AGMCORE_gstackframekeys dict put + }for + }if + level3/AGMCORE_&sysshfill AGMCORE_key_known not and + { + /AGMCORE_&sysshfill systemdict/shfill get def + /AGMCORE_&sysmakepattern systemdict/makepattern get def + /AGMCORE_&usrmakepattern/makepattern load def + }if + /currentcmykcolor[0 0 0 0]AGMCORE_gput + /currentstrokeadjust false AGMCORE_gput + /currentcolorspace[/DeviceGray]AGMCORE_gput + /sep_tint 0 AGMCORE_gput + /devicen_tints[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]AGMCORE_gput + /sep_colorspace_dict null AGMCORE_gput + /devicen_colorspace_dict null AGMCORE_gput + /indexed_colorspace_dict null AGMCORE_gput + /currentcolor_intent()AGMCORE_gput + /customcolor_tint 1 AGMCORE_gput + /absolute_colorimetric_crd null AGMCORE_gput + /relative_colorimetric_crd null AGMCORE_gput + /saturation_crd null AGMCORE_gput + /perceptual_crd null AGMCORE_gput + currentcolortransfer cvlit/AGMCore_gray_xfer xdf cvlit/AGMCore_b_xfer xdf + cvlit/AGMCore_g_xfer xdf cvlit/AGMCore_r_xfer xdf + << + /MaxPatternItem currentsystemparams/MaxPatternCache get + >> + setuserparams + end +}def +/ps +{ + /setcmykcolor where{ + pop + Adobe_AGM_Core/AGMCORE_&setcmykcolor/setcmykcolor load put + }if + Adobe_AGM_Core begin + /setcmykcolor + { + 4 copy AGMCORE_cmykbuf astore/currentcmykcolor exch AGMCORE_gput + 1 sub 4 1 roll + 3{ + 3 index add neg dup 0 lt{ + pop 0 + }if + 3 1 roll + }repeat + setrgbcolor pop + }ndf + /currentcmykcolor + { + /currentcmykcolor AGMCORE_gget aload pop + }ndf + /setoverprint + {pop}ndf + /currentoverprint + {false}ndf + /AGMCORE_cyan_plate 1 0 0 0 test_cmyk_color_plate def + /AGMCORE_magenta_plate 0 1 0 0 test_cmyk_color_plate def + /AGMCORE_yellow_plate 0 0 1 0 test_cmyk_color_plate def + /AGMCORE_black_plate 0 0 0 1 test_cmyk_color_plate def + /AGMCORE_plate_ndx + AGMCORE_cyan_plate{ + 0 + }{ + AGMCORE_magenta_plate{ + 1 + }{ + AGMCORE_yellow_plate{ + 2 + }{ + AGMCORE_black_plate{ + 3 + }{ + 4 + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_have_reported_unsupported_color_space false def + /AGMCORE_report_unsupported_color_space + { + AGMCORE_have_reported_unsupported_color_space false eq + { + (Warning: Job contains content that cannot be separated with on-host methods. This content appears on the black plate, and knocks out all other plates.)== + Adobe_AGM_Core/AGMCORE_have_reported_unsupported_color_space true ddf + }if + }def + /AGMCORE_composite_job + AGMCORE_cyan_plate AGMCORE_magenta_plate and AGMCORE_yellow_plate and AGMCORE_black_plate and def + /AGMCORE_in_rip_sep + /AGMCORE_in_rip_sep where{ + pop AGMCORE_in_rip_sep + }{ + AGMCORE_distilling + { + false + }{ + userdict/Adobe_AGM_OnHost_Seps known{ + false + }{ + level2{ + currentpagedevice/Separations 2 copy known{ + get + }{ + pop pop false + }ifelse + }{ + false + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_producing_seps AGMCORE_composite_job not AGMCORE_in_rip_sep or def + /AGMCORE_host_sep AGMCORE_producing_seps AGMCORE_in_rip_sep not and def + /AGM_preserve_spots + /AGM_preserve_spots where{ + pop AGM_preserve_spots + }{ + AGMCORE_distilling AGMCORE_producing_seps or + }ifelse + def + /AGM_is_distiller_preserving_spotimages + { + currentdistillerparams/PreserveOverprintSettings known + { + currentdistillerparams/PreserveOverprintSettings get + { + currentdistillerparams/ColorConversionStrategy known + { + currentdistillerparams/ColorConversionStrategy get + /sRGB ne + }{ + true + }ifelse + }{ + false + }ifelse + }{ + false + }ifelse + }def + /convert_spot_to_process where{pop}{ + /convert_spot_to_process + { + //Adobe_AGM_Core begin + dup map_alias{ + /Name get exch pop + }if + dup dup(None)eq exch(All)eq or + { + pop false + }{ + AGMCORE_host_sep + { + gsave + 1 0 0 0 setcmykcolor currentgray 1 exch sub + 0 1 0 0 setcmykcolor currentgray 1 exch sub + 0 0 1 0 setcmykcolor currentgray 1 exch sub + 0 0 0 1 setcmykcolor currentgray 1 exch sub + add add add 0 eq + { + pop false + }{ + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + }ifelse + grestore + }{ + AGMCORE_distilling + { + pop AGM_is_distiller_preserving_spotimages not + }{ + //Adobe_AGM_Core/AGMCORE_name xddf + false + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 0 eq + AGMUTIL_cpd/OverrideSeparations known and + { + AGMUTIL_cpd/OverrideSeparations get + { + /HqnSpots/ProcSet resourcestatus + { + pop pop pop true + }if + }if + }if + { + AGMCORE_name/HqnSpots/ProcSet findresource/TestSpot gx not + }{ + gsave + [/Separation AGMCORE_name/DeviceGray{}]AGMCORE_&setcolorspace + false + AGMUTIL_cpd/SeparationColorNames 2 copy known + { + get + {AGMCORE_name eq or}forall + not + }{ + pop pop pop true + }ifelse + grestore + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + }ifelse + /convert_to_process where{pop}{ + /convert_to_process + { + dup length 0 eq + { + pop false + }{ + AGMCORE_host_sep + { + dup true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process and}ifelse + } + forall + { + true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + (Black)eq or and + }forall + not + }{pop false}ifelse + }{ + false exch + { + /PhotoshopDuotoneList where{pop false}{true}ifelse + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process or}ifelse + } + { + convert_spot_to_process or + } + ifelse + } + forall + }ifelse + }ifelse + }def + }ifelse + /AGMCORE_avoid_L2_sep_space + version cvr 2012 lt + level2 and + AGMCORE_producing_seps not and + def + /AGMCORE_is_cmyk_sep + AGMCORE_cyan_plate AGMCORE_magenta_plate or AGMCORE_yellow_plate or AGMCORE_black_plate or + def + /AGM_avoid_0_cmyk where{ + pop AGM_avoid_0_cmyk + }{ + AGM_preserve_spots + userdict/Adobe_AGM_OnHost_Seps known + userdict/Adobe_AGM_InRip_Seps known or + not and + }ifelse + { + /setcmykcolor[ + { + 4 copy add add add 0 eq currentoverprint and{ + pop 0.0005 + }if + }/exec cvx + /AGMCORE_&setcmykcolor load dup type/operatortype ne{ + /exec cvx + }if + ]cvx def + }if + /AGMCORE_IsSeparationAProcessColor + { + dup(Cyan)eq exch dup(Magenta)eq exch dup(Yellow)eq exch(Black)eq or or or + }def + AGMCORE_host_sep{ + /setcolortransfer + { + AGMCORE_cyan_plate{ + pop pop pop + }{ + AGMCORE_magenta_plate{ + 4 3 roll pop pop pop + }{ + AGMCORE_yellow_plate{ + 4 2 roll pop pop pop + }{ + 4 1 roll pop pop pop + }ifelse + }ifelse + }ifelse + settransfer + } + def + /AGMCORE_get_ink_data + AGMCORE_cyan_plate{ + {pop pop pop} + }{ + AGMCORE_magenta_plate{ + {4 3 roll pop pop pop} + }{ + AGMCORE_yellow_plate{ + {4 2 roll pop pop pop} + }{ + {4 1 roll pop pop pop} + }ifelse + }ifelse + }ifelse + def + /AGMCORE_RemoveProcessColorNames + { + 1 dict begin + /filtername + { + dup/Cyan eq 1 index(Cyan)eq or + {pop(_cyan_)}if + dup/Magenta eq 1 index(Magenta)eq or + {pop(_magenta_)}if + dup/Yellow eq 1 index(Yellow)eq or + {pop(_yellow_)}if + dup/Black eq 1 index(Black)eq or + {pop(_black_)}if + }def + dup type/arraytype eq + {[exch{filtername}forall]} + {filtername}ifelse + end + }def + level3{ + /AGMCORE_IsCurrentColor + { + dup AGMCORE_IsSeparationAProcessColor + { + AGMCORE_plate_ndx 0 eq + {dup(Cyan)eq exch/Cyan eq or}if + AGMCORE_plate_ndx 1 eq + {dup(Magenta)eq exch/Magenta eq or}if + AGMCORE_plate_ndx 2 eq + {dup(Yellow)eq exch/Yellow eq or}if + AGMCORE_plate_ndx 3 eq + {dup(Black)eq exch/Black eq or}if + AGMCORE_plate_ndx 4 eq + {pop false}if + }{ + gsave + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + grestore + }ifelse + }def + /AGMCORE_filter_functiondatasource + { + 5 dict begin + /data_in xdf + data_in type/stringtype eq + { + /ncomp xdf + /comp xdf + /string_out data_in length ncomp idiv string def + 0 ncomp data_in length 1 sub + { + string_out exch dup ncomp idiv exch data_in exch ncomp getinterval comp get 255 exch sub put + }for + string_out + }{ + string/string_in xdf + /string_out 1 string def + /component xdf + [ + data_in string_in/readstring cvx + [component/get cvx 255/exch cvx/sub cvx string_out/exch cvx 0/exch cvx/put cvx string_out]cvx + [/pop cvx()]cvx/ifelse cvx + ]cvx/ReusableStreamDecode filter + }ifelse + end + }def + /AGMCORE_separateShadingFunction + { + 2 dict begin + /paint? xdf + /channel xdf + dup type/dicttype eq + { + begin + FunctionType 0 eq + { + /DataSource channel Range length 2 idiv DataSource AGMCORE_filter_functiondatasource def + currentdict/Decode known + {/Decode Decode channel 2 mul 2 getinterval def}if + paint? not + {/Decode[1 1]def}if + }if + FunctionType 2 eq + { + paint? + { + /C0[C0 channel get 1 exch sub]def + /C1[C1 channel get 1 exch sub]def + }{ + /C0[1]def + /C1[1]def + }ifelse + }if + FunctionType 3 eq + { + /Functions[Functions{channel paint? AGMCORE_separateShadingFunction}forall]def + }if + currentdict/Range known + {/Range[0 1]def}if + currentdict + end}{ + channel get 0 paint? AGMCORE_separateShadingFunction + }ifelse + end + }def + /AGMCORE_separateShading + { + 3 -1 roll begin + currentdict/Function known + { + currentdict/Background known + {[1 index{Background 3 index get 1 exch sub}{1}ifelse]/Background xdf}if + Function 3 1 roll AGMCORE_separateShadingFunction/Function xdf + /ColorSpace[/DeviceGray]def + }{ + ColorSpace dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }{ + ColorSpace dup 1 get AGMCORE_RemoveProcessColorNames 1 exch put + }ifelse + ColorSpace 0 get/Separation eq + { + { + [1/exch cvx/sub cvx]cvx + }{ + [/pop cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll put + pop + }{ + { + [exch ColorSpace 1 get length 1 sub exch sub/index cvx 1/exch cvx/sub cvx ColorSpace 1 get length 1 add 1/roll cvx ColorSpace 1 get length{/pop cvx}repeat]cvx + }{ + pop[ColorSpace 1 get length{/pop cvx}repeat cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll bind put + }ifelse + ColorSpace 2/DeviceGray put + }ifelse + end + }def + /AGMCORE_separateShadingDict + { + dup/ColorSpace get + dup type/arraytype ne + {[exch]}if + dup 0 get/DeviceCMYK eq + { + exch begin + currentdict + AGMCORE_cyan_plate + {0 true}if + AGMCORE_magenta_plate + {1 true}if + AGMCORE_yellow_plate + {2 true}if + AGMCORE_black_plate + {3 true}if + AGMCORE_plate_ndx 4 eq + {0 false}if + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + currentdict + end exch + }if + dup 0 get/Separation eq + { + exch begin + ColorSpace 1 get dup/None ne exch/All ne and + { + ColorSpace 1 get AGMCORE_IsCurrentColor AGMCORE_plate_ndx 4 lt and ColorSpace 1 get AGMCORE_IsSeparationAProcessColor not and + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /Separation + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + }if + }ifelse + }{ + currentdict ColorSpace 1 get AGMCORE_IsCurrentColor + 0 exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + }if + currentdict + end exch + }if + dup 0 get/DeviceN eq + { + exch begin + ColorSpace 1 get convert_to_process + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /DeviceN + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + /ColorSpace[/DeviceGray]def + }if + }ifelse + }{ + currentdict + false -1 ColorSpace 1 get + { + AGMCORE_IsCurrentColor + { + 1 add + exch pop true exch exit + }if + 1 add + }forall + exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + currentdict + end exch + }if + dup 0 get dup/DeviceCMYK eq exch dup/Separation eq exch/DeviceN eq or or not + { + exch begin + ColorSpace dup type/arraytype eq + {0 get}if + /DeviceGray ne + { + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + ColorSpace 0 get/CIEBasedA eq + { + /ColorSpace[/Separation/_ciebaseda_/DeviceGray{}]def + }if + ColorSpace 0 get dup/CIEBasedABC eq exch dup/CIEBasedDEF eq exch/DeviceRGB eq or or + { + /ColorSpace[/DeviceN[/_red_/_green_/_blue_]/DeviceRGB{}]def + }if + ColorSpace 0 get/CIEBasedDEFG eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }if + currentdict 0 false AGMCORE_separateShading + }if + }if + currentdict + end exch + }if + pop + dup/AGMCORE_ignoreshade known + { + begin + /ColorSpace[/Separation(None)/DeviceGray{}]def + currentdict end + }if + }def + /shfill + { + AGMCORE_separateShadingDict + dup/AGMCORE_ignoreshade known + {pop} + {AGMCORE_&sysshfill}ifelse + }def + /makepattern + { + exch + dup/PatternType get 2 eq + { + clonedict + begin + /Shading Shading AGMCORE_separateShadingDict def + Shading/AGMCORE_ignoreshade known + currentdict end exch + {pop<>}if + exch AGMCORE_&sysmakepattern + }{ + exch AGMCORE_&usrmakepattern + }ifelse + }def + }if + }if + AGMCORE_in_rip_sep{ + /setcustomcolor + { + exch aload pop + dup 7 1 roll inRip_spot_has_ink not { + 4{4 index mul 4 1 roll} + repeat + /DeviceCMYK setcolorspace + 6 -2 roll pop pop + }{ + //Adobe_AGM_Core begin + /AGMCORE_k xdf/AGMCORE_y xdf/AGMCORE_m xdf/AGMCORE_c xdf + end + [/Separation 4 -1 roll/DeviceCMYK + {dup AGMCORE_c mul exch dup AGMCORE_m mul exch dup AGMCORE_y mul exch AGMCORE_k mul} + ] + setcolorspace + }ifelse + setcolor + }ndf + /setseparationgray + { + [/Separation(All)/DeviceGray{}]setcolorspace_opt + 1 exch sub setcolor + }ndf + }{ + /setseparationgray + { + AGMCORE_&setgray + }ndf + }ifelse + /findcmykcustomcolor + { + 5 makereadonlyarray + }ndf + /setcustomcolor + { + exch aload pop pop + 4{4 index mul 4 1 roll}repeat + setcmykcolor pop + }ndf + /has_color + /colorimage where{ + AGMCORE_producing_seps{ + pop true + }{ + systemdict eq + }ifelse + }{ + false + }ifelse + def + /map_index + { + 1 index mul exch getinterval{255 div}forall + }bdf + /map_indexed_devn + { + Lookup Names length 3 -1 roll cvi map_index + }bdf + /n_color_components + { + base_colorspace_type + dup/DeviceGray eq{ + pop 1 + }{ + /DeviceCMYK eq{ + 4 + }{ + 3 + }ifelse + }ifelse + }bdf + level2{ + /mo/moveto ldf + /li/lineto ldf + /cv/curveto ldf + /knockout_unitsq + { + 1 setgray + 0 0 1 1 rectfill + }def + level2/setcolorspace AGMCORE_key_known not and{ + /AGMCORE_&&&setcolorspace/setcolorspace ldf + /AGMCORE_ReplaceMappedColor + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + /AGMCORE_SpotAliasAry2 where{ + begin + dup 0 get dup/Separation eq + { + pop + dup length array copy + dup dup 1 get + current_spot_alias + { + dup map_alias + { + false set_spot_alias + dup 1 exch setsepcolorspace + true set_spot_alias + begin + /sep_colorspace_dict currentdict AGMCORE_gput + pop pop pop + [ + /Separation Name + CSA map_csa + MappedCSA + /sep_colorspace_proc load + ] + dup Name + end + }if + }if + map_reserved_ink_name 1 xpt + }{ + /DeviceN eq + { + dup length array copy + dup dup 1 get[ + exch{ + current_spot_alias{ + dup map_alias{ + /Name get exch pop + }if + }if + map_reserved_ink_name + }forall + ]1 xpt + }if + }ifelse + end + }if + }if + }def + /setcolorspace + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/Indexed eq + { + AGMCORE_distilling + { + /PhotoshopDuotoneList where + { + pop false + }{ + true + }ifelse + }{ + true + }ifelse + { + aload pop 3 -1 roll + AGMCORE_ReplaceMappedColor + 3 1 roll 4 array astore + }if + }{ + AGMCORE_ReplaceMappedColor + }ifelse + }if + DeviceN_PS2_inRip_seps{AGMCORE_&&&setcolorspace}if + }def + }if + }{ + /adj + { + currentstrokeadjust{ + transform + 0.25 sub round 0.25 add exch + 0.25 sub round 0.25 add exch + itransform + }if + }def + /mo{ + adj moveto + }def + /li{ + adj lineto + }def + /cv{ + 6 2 roll adj + 6 2 roll adj + 6 2 roll adj curveto + }def + /knockout_unitsq + { + 1 setgray + 8 8 1[8 0 0 8 0 0]{}image + }def + /currentstrokeadjust{ + /currentstrokeadjust AGMCORE_gget + }def + /setstrokeadjust{ + /currentstrokeadjust exch AGMCORE_gput + }def + /setcolorspace + { + /currentcolorspace exch AGMCORE_gput + }def + /currentcolorspace + { + /currentcolorspace AGMCORE_gget + }def + /setcolor_devicecolor + { + base_colorspace_type + dup/DeviceGray eq{ + pop setgray + }{ + /DeviceCMYK eq{ + setcmykcolor + }{ + setrgbcolor + }ifelse + }ifelse + }def + /setcolor + { + currentcolorspace 0 get + dup/DeviceGray ne{ + dup/DeviceCMYK ne{ + dup/DeviceRGB ne{ + dup/Separation eq{ + pop + currentcolorspace 3 gx + currentcolorspace 2 get + }{ + dup/Indexed eq{ + pop + currentcolorspace 3 get dup type/stringtype eq{ + currentcolorspace 1 get n_color_components + 3 -1 roll map_index + }{ + exec + }ifelse + currentcolorspace 1 get + }{ + /AGMCORE_cur_err/AGMCORE_invalid_color_space def + AGMCORE_invalid_color_space + }ifelse + }ifelse + }if + }if + }if + setcolor_devicecolor + }def + }ifelse + /sop/setoverprint ldf + /lw/setlinewidth ldf + /lc/setlinecap ldf + /lj/setlinejoin ldf + /ml/setmiterlimit ldf + /dsh/setdash ldf + /sadj/setstrokeadjust ldf + /gry/setgray ldf + /rgb/setrgbcolor ldf + /cmyk[ + /currentcolorspace[/DeviceCMYK]/AGMCORE_gput cvx + /setcmykcolor load dup type/operatortype ne{/exec cvx}if + ]cvx bdf + level3 AGMCORE_host_sep not and{ + /nzopmsc{ + 6 dict begin + /kk exch def + /yy exch def + /mm exch def + /cc exch def + /sum 0 def + cc 0 ne{/sum sum 2#1000 or def cc}if + mm 0 ne{/sum sum 2#0100 or def mm}if + yy 0 ne{/sum sum 2#0010 or def yy}if + kk 0 ne{/sum sum 2#0001 or def kk}if + AGMCORE_CMYKDeviceNColorspaces sum get setcolorspace + sum 0 eq{0}if + end + setcolor + }bdf + }{ + /nzopmsc/cmyk ldf + }ifelse + /sep/setsepcolor ldf + /devn/setdevicencolor ldf + /idx/setindexedcolor ldf + /colr/setcolor ldf + /csacrd/set_csa_crd ldf + /sepcs/setsepcolorspace ldf + /devncs/setdevicencolorspace ldf + /idxcs/setindexedcolorspace ldf + /cp/closepath ldf + /clp/clp_npth ldf + /eclp/eoclp_npth ldf + /f/fill ldf + /ef/eofill ldf + /@/stroke ldf + /nclp/npth_clp ldf + /gset/graphic_setup ldf + /gcln/graphic_cleanup ldf + /ct/concat ldf + /cf/currentfile ldf + /fl/filter ldf + /rs/readstring ldf + /AGMCORE_def_ht currenthalftone def + /clonedict Adobe_AGM_Utils begin/clonedict load end def + /clonearray Adobe_AGM_Utils begin/clonearray load end def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall + /getrampcolor + { + /indx exch def + 0 1 NumComp 1 sub + { + dup + Samples exch get + dup type/stringtype eq{indx get}if + exch + Scaling exch get aload pop + 3 1 roll + mul add + }for + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /sssetbackground{ + aload pop + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /RadialShade + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /r2 xdf + /c2y xdf + /c2x xdf + /r1 xdf + /c1y xdf + /c1x xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + c1x c2x eq + { + c1y c2y lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope c2y c1y sub c2x c1x sub div def + /theta slope 1 atan def + c2x c1x lt c2y c1y ge and{/theta theta 180 sub def}if + c2x c1x lt c2y c1y lt and{/theta theta 180 add def}if + }ifelse + gsave + clippath + c1x c1y translate + theta rotate + -90 rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax xdf + /xMax xdf + /yMin xdf + /xMin xdf + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + /max{2 copy gt{pop}{exch pop}ifelse}bdf + /min{2 copy lt{pop}{exch pop}ifelse}bdf + rampdict begin + 40 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + c1x c1y translate + theta rotate + -90 rotate + /c2y c1x c2x sub dup mul c1y c2y sub dup mul add sqrt def + /c1y 0 def + /c1x 0 def + /c2x 0 def + ext0 + { + 0 getrampcolor + c2y r2 add r1 sub 0.0001 lt + { + c1x c1y r1 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2y r1 add r2 le + { + c1x c1y r1 0 360 arc + fill + } + { + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r1 neg def + /p1y c1y def + /p2x r1 def + /p2y c1y def + p1x p1y moveto p2x p2y lineto p2x yMin lineto p1x yMin lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r1 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y p1x SS1 div neg def + /SS2 90 theta sub dup sin exch cos div def + /p2x r1 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y p2x SS2 div neg def + r1 r2 gt + { + /L1maxX p1x yMin p1y sub SS1 div add def + /L2maxX p2x yMin p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + c1x c2x sub dup mul + c1y c2y sub dup mul + add 0.5 exp + 0 dtransform + dup mul exch dup mul add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + /hires xdf + hires mul + /numpix xdf + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + /xInc c2x c1x sub numsteps div def + /yInc c2y c1y sub numsteps div def + /rInc r2 r1 sub numsteps div def + /cx c1x def + /cy c1y def + /radius r1 def + np + xInc 0 eq yInc 0 eq rInc 0 eq and and + { + 0 getrampcolor + cx cy radius 0 360 arc + stroke + NumSamples 1 sub getrampcolor + cx cy radius 72 hires div add 0 360 arc + 0 setlinewidth + stroke + }{ + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + cx cy radius 0 360 arc + /cx cx xInc add def + /cy cy yInc add def + /radius radius rInc add def + cx cy radius 360 0 arcn + eofill + rampIndxInc add + }repeat + pop + }ifelse + ext1 + { + c2y r2 add r1 lt + { + c2x c2y r2 0 360 arc + fill + }{ + c2y r1 add r2 sub 0.0001 le + { + c2x c2y r2 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r2 neg def + /p1y c2y def + /p2x r2 def + /p2y c2y def + p1x p1y moveto p2x p2y lineto p2x yMax lineto p1x yMax lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r2 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y c2y p1x SS1 div sub def + /SS2 90 theta sub dup sin exch cos div def + /p2x r2 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y c2y p2x SS2 div sub def + r1 r2 lt + { + /L1maxX p1x yMax p1y sub SS1 div add def + /L2maxX p2x yMax p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + grestore + grestore + end + end + end + }ifelse + }bdf + /GenStrips + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /y2 xdf + /x2 xdf + /y1 xdf + /x1 xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + x1 x2 eq + { + y1 y2 lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope y2 y1 sub x2 x1 sub div def + /theta slope 1 atan def + x2 x1 lt y2 y1 ge and{/theta theta 180 sub def}if + x2 x1 lt y2 y1 lt and{/theta theta 180 add def}if + } + ifelse + gsave + clippath + x1 y1 translate + theta rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax exch def + /xMax exch def + /yMin exch def + /xMin exch def + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + rampdict begin + 20 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + x1 y1 translate + theta rotate + /xStart 0 def + /xEnd x2 x1 sub dup mul y2 y1 sub dup mul add 0.5 exp def + /ySpan yMax yMin sub def + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + xStart 0 transform + xEnd 0 transform + 3 -1 roll + sub dup mul + 3 1 roll + sub dup mul + add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + mul + /numpix xdf + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + ext0 + { + 0 getrampcolor + xMin xStart lt + { + xMin yMin xMin neg ySpan rectfill + }if + }if + /xInc xEnd xStart sub numsteps div def + /x xStart def + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + x yMin xInc ySpan rectfill + /x x xInc add def + rampIndxInc add + }repeat + pop + ext1{ + xMax xEnd gt + { + xEnd yMin xMax xEnd sub ySpan rectfill + }if + }if + grestore + grestore + end + end + end + }ifelse + }bdf +}def +/pt +{ + end +}def +/dt{ +}def +/pgsv{ + //Adobe_AGM_Core/AGMCORE_save save put +}def +/pgrs{ + //Adobe_AGM_Core/AGMCORE_save get restore +}def +systemdict/findcolorrendering known{ + /findcolorrendering systemdict/findcolorrendering get def +}if +systemdict/setcolorrendering known{ + /setcolorrendering systemdict/setcolorrendering get def +}if +/test_cmyk_color_plate +{ + gsave + setcmykcolor currentgray 1 ne + grestore +}def +/inRip_spot_has_ink +{ + dup//Adobe_AGM_Core/AGMCORE_name xddf + convert_spot_to_process not +}def +/map255_to_range +{ + 1 index sub + 3 -1 roll 255 div mul add +}def +/set_csa_crd +{ + /sep_colorspace_dict null AGMCORE_gput + begin + CSA get_csa_by_name setcolorspace_opt + set_crd + end +} +def +/map_csa +{ + currentdict/MappedCSA known{MappedCSA null ne}{false}ifelse + {pop}{get_csa_by_name/MappedCSA xdf}ifelse +}def +/setsepcolor +{ + /sep_colorspace_dict AGMCORE_gget begin + dup/sep_tint exch AGMCORE_gput + TintProc + end +}def +/setdevicencolor +{ + /devicen_colorspace_dict AGMCORE_gget begin + Names length copy + Names length 1 sub -1 0 + { + /devicen_tints AGMCORE_gget 3 1 roll xpt + }for + TintProc + end +}def +/sep_colorspace_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + currentdict/Components known{ + Components aload pop + TintMethod/Lab eq{ + 2{AGMCORE_tmp mul NComponents 1 roll}repeat + LMax sub AGMCORE_tmp mul LMax add NComponents 1 roll + }{ + TintMethod/Subtractive eq{ + NComponents{ + AGMCORE_tmp mul NComponents 1 roll + }repeat + }{ + NComponents{ + 1 sub AGMCORE_tmp mul 1 add NComponents 1 roll + }repeat + }ifelse + }ifelse + }{ + ColorLookup AGMCORE_tmp ColorLookup length 1 sub mul round cvi get + aload pop + }ifelse + end +}def +/sep_colorspace_gray_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + GrayLookup AGMCORE_tmp GrayLookup length 1 sub mul round cvi get + end +}def +/sep_proc_name +{ + dup 0 get + dup/DeviceRGB eq exch/DeviceCMYK eq or level2 not and has_color not and{ + pop[/DeviceGray] + /sep_colorspace_gray_proc + }{ + /sep_colorspace_proc + }ifelse +}def +/setsepcolorspace +{ + current_spot_alias{ + dup begin + Name map_alias{ + exch pop + }if + end + }if + dup/sep_colorspace_dict exch AGMCORE_gput + begin + CSA map_csa + /AGMCORE_sep_special Name dup()eq exch(All)eq or store + AGMCORE_avoid_L2_sep_space{ + [/Indexed MappedCSA sep_proc_name 255 exch + {255 div}/exec cvx 3 -1 roll[4 1 roll load/exec cvx]cvx + ]setcolorspace_opt + /TintProc{ + 255 mul round cvi setcolor + }bdf + }{ + MappedCSA 0 get/DeviceCMYK eq + currentdict/Components known and + AGMCORE_sep_special not and{ + /TintProc[ + Components aload pop Name findcmykcustomcolor + /exch cvx/setcustomcolor cvx + ]cvx bdf + }{ + AGMCORE_host_sep Name(All)eq and{ + /TintProc{ + 1 exch sub setseparationgray + }bdf + }{ + AGMCORE_in_rip_sep MappedCSA 0 get/DeviceCMYK eq and + AGMCORE_host_sep or + Name()eq and{ + /TintProc[ + MappedCSA sep_proc_name exch 0 get/DeviceCMYK eq{ + cvx/setcmykcolor cvx + }{ + cvx/setgray cvx + }ifelse + ]cvx bdf + }{ + AGMCORE_producing_seps MappedCSA 0 get dup/DeviceCMYK eq exch/DeviceGray eq or and AGMCORE_sep_special not and{ + /TintProc[ + /dup cvx + MappedCSA sep_proc_name cvx exch + 0 get/DeviceGray eq{ + 1/exch cvx/sub cvx 0 0 0 4 -1/roll cvx + }if + /Name cvx/findcmykcustomcolor cvx/exch cvx + AGMCORE_host_sep{ + AGMCORE_is_cmyk_sep + /Name cvx + /AGMCORE_IsSeparationAProcessColor load/exec cvx + /not cvx/and cvx + }{ + Name inRip_spot_has_ink not + }ifelse + [ + /pop cvx 1 + ]cvx/if cvx + /setcustomcolor cvx + ]cvx bdf + }{ + /TintProc{setcolor}bdf + [/Separation Name MappedCSA sep_proc_name load]setcolorspace_opt + }ifelse + }ifelse + }ifelse + }ifelse + }ifelse + set_crd + setsepcolor + end +}def +/additive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 + 0 1 numarrays 1 sub + { + 1 exch add/index cvx + c1/get cvx/mul cvx + }for + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/subtractive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 1 + 0 1 numarrays 1 sub + { + 1 3 3 -1 roll add/index cvx + c1/get cvx/sub cvx/mul cvx + }for + /sub cvx + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/exec_tint_transform +{ + /TintProc[ + /TintTransform cvx/setcolor cvx + ]cvx bdf + MappedCSA setcolorspace_opt +}bdf +/devn_makecustomcolor +{ + 2 dict begin + /names_index xdf + /Names xdf + 1 1 1 1 Names names_index get findcmykcustomcolor + /devicen_tints AGMCORE_gget names_index get setcustomcolor + Names length{pop}repeat + end +}bdf +/setdevicencolorspace +{ + dup/AliasedColorants known{false}{true}ifelse + current_spot_alias and{ + 7 dict begin + /names_index 0 def + dup/names_len exch/Names get length def + /new_names names_len array def + /new_LookupTables names_len array def + /alias_cnt 0 def + dup/Names get + { + dup map_alias{ + exch pop + dup/ColorLookup known{ + dup begin + new_LookupTables names_index ColorLookup put + end + }{ + dup/Components known{ + dup begin + new_LookupTables names_index Components put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + new_names names_index 3 -1 roll/Name get put + /alias_cnt alias_cnt 1 add def + }{ + /name xdf + new_names names_index name put + dup/LookupTables known{ + dup begin + new_LookupTables names_index LookupTables names_index get put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + /names_index names_index 1 add def + }forall + alias_cnt 0 gt{ + /AliasedColorants true def + /lut_entry_len new_LookupTables 0 get dup length 256 ge{0 get length}{length}ifelse def + 0 1 names_len 1 sub{ + /names_index xdf + new_LookupTables names_index get dup length 256 ge{0 get length}{length}ifelse lut_entry_len ne{ + /AliasedColorants false def + exit + }{ + new_LookupTables names_index get 0 get null eq{ + dup/Names get names_index get/name xdf + name(Cyan)eq name(Magenta)eq name(Yellow)eq name(Black)eq + or or or not{ + /AliasedColorants false def + exit + }if + }if + }ifelse + }for + lut_entry_len 1 eq{ + /AliasedColorants false def + }if + AliasedColorants{ + dup begin + /Names new_names def + /LookupTables new_LookupTables def + /AliasedColorants true def + /NComponents lut_entry_len def + /TintMethod NComponents 4 eq{/Subtractive}{/Additive}ifelse def + /MappedCSA TintMethod/Additive eq{/DeviceRGB}{/DeviceCMYK}ifelse def + currentdict/TTTablesIdx known not{ + /TTTablesIdx -1 def + }if + end + }if + }if + end + }if + dup/devicen_colorspace_dict exch AGMCORE_gput + begin + currentdict/AliasedColorants known{ + AliasedColorants + }{ + false + }ifelse + dup not{ + CSA map_csa + }if + /TintTransform load type/nulltype eq or{ + /TintTransform[ + 0 1 Names length 1 sub + { + /TTTablesIdx TTTablesIdx 1 add def + dup LookupTables exch get dup 0 get null eq + { + 1 index + Names exch get + dup(Cyan)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0 0 0 + } + { + dup(Magenta)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0/exch cvx 0 0 + }{ + (Yellow)eq + { + exch + LookupTables length exch sub + /index cvx + 0 0 3 -1/roll cvx 0 + }{ + exch + LookupTables length exch sub + /index cvx + 0 0 0 4 -1/roll cvx + }ifelse + }ifelse + }ifelse + 5 -1/roll cvx/astore cvx + }{ + dup length 1 sub + LookupTables length 4 -1 roll sub 1 add + /index cvx/mul cvx/round cvx/cvi cvx/get cvx + }ifelse + Names length TTTablesIdx add 1 add 1/roll cvx + }for + Names length[/pop cvx]cvx/repeat cvx + NComponents Names length + TintMethod/Subtractive eq + { + subtractive_blend + }{ + additive_blend + }ifelse + ]cvx bdf + }if + AGMCORE_host_sep{ + Names convert_to_process{ + exec_tint_transform + } + { + currentdict/AliasedColorants known{ + AliasedColorants not + }{ + false + }ifelse + 5 dict begin + /AvoidAliasedColorants xdf + /painted? false def + /names_index 0 def + /names_len Names length def + AvoidAliasedColorants{ + /currentspotalias current_spot_alias def + false set_spot_alias + }if + Names{ + AGMCORE_is_cmyk_sep{ + dup(Cyan)eq AGMCORE_cyan_plate and exch + dup(Magenta)eq AGMCORE_magenta_plate and exch + dup(Yellow)eq AGMCORE_yellow_plate and exch + (Black)eq AGMCORE_black_plate and or or or{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + }if + painted?{exit}if + }{ + 0 0 0 0 5 -1 roll findcmykcustomcolor 1 setcustomcolor currentgray 0 eq{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + exit + }if + }ifelse + /names_index names_index 1 add def + }forall + AvoidAliasedColorants{ + currentspotalias set_spot_alias + }if + painted?{ + /devicen_colorspace_dict AGMCORE_gget/names_index names_index put + }{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + names_len[/pop cvx]cvx/repeat cvx 1/setseparationgray cvx + 0 0 0 0/setcmykcolor cvx + ]cvx ddf + }ifelse + end + }ifelse + } + { + AGMCORE_in_rip_sep{ + Names convert_to_process not + }{ + level3 + }ifelse + { + [/DeviceN Names MappedCSA/TintTransform load]setcolorspace_opt + /TintProc level3 not AGMCORE_in_rip_sep and{ + [ + Names/length cvx[/pop cvx]cvx/repeat cvx + ]cvx bdf + }{ + {setcolor}bdf + }ifelse + }{ + exec_tint_transform + }ifelse + }ifelse + set_crd + /AliasedColorants false def + end +}def +/setindexedcolorspace +{ + dup/indexed_colorspace_dict exch AGMCORE_gput + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + currentdict devncs + }{ + 1 currentdict sepcs + }ifelse + AGMCORE_host_sep{ + 4 dict begin + /compCnt/Names where{pop Names length}{1}ifelse def + /NewLookup HiVal 1 add string def + 0 1 HiVal{ + /tableIndex xdf + Lookup dup type/stringtype eq{ + compCnt tableIndex map_index + }{ + exec + }ifelse + /Names where{ + pop setdevicencolor + }{ + setsepcolor + }ifelse + currentgray + tableIndex exch + 255 mul cvi + NewLookup 3 1 roll put + }for + [/Indexed currentcolorspace HiVal NewLookup]setcolorspace_opt + end + }{ + level3 + { + currentdict/Names known{ + [/Indexed[/DeviceN Names MappedCSA/TintTransform load]HiVal Lookup]setcolorspace_opt + }{ + [/Indexed[/Separation Name MappedCSA sep_proc_name load]HiVal Lookup]setcolorspace_opt + }ifelse + }{ + [/Indexed MappedCSA HiVal + [ + currentdict/Names known{ + Lookup dup type/stringtype eq + {/exch cvx CSDBase/CSD get_res/Names get length dup/mul cvx exch/getinterval cvx{255 div}/forall cvx} + {/exec cvx}ifelse + /TintTransform load/exec cvx + }{ + Lookup dup type/stringtype eq + {/exch cvx/get cvx 255/div cvx} + {/exec cvx}ifelse + CSDBase/CSD get_res/MappedCSA get sep_proc_name exch pop/load cvx/exec cvx + }ifelse + ]cvx + ]setcolorspace_opt + }ifelse + }ifelse + end + set_crd + } + { + CSA map_csa + AGMCORE_host_sep level2 not and{ + 0 0 0 0 setcmykcolor + }{ + [/Indexed MappedCSA + level2 not has_color not and{ + dup 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or{ + pop[/DeviceGray] + }if + HiVal GrayLookup + }{ + HiVal + currentdict/RangeArray known{ + { + /indexed_colorspace_dict AGMCORE_gget begin + Lookup exch + dup HiVal gt{ + pop HiVal + }if + NComponents mul NComponents getinterval{}forall + NComponents 1 sub -1 0{ + RangeArray exch 2 mul 2 getinterval aload pop map255_to_range + NComponents 1 roll + }for + end + }bind + }{ + Lookup + }ifelse + }ifelse + ]setcolorspace_opt + set_crd + }ifelse + }ifelse + end +}def +/setindexedcolor +{ + AGMCORE_host_sep{ + /indexed_colorspace_dict AGMCORE_gget + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + map_indexed_devn + devn + } + { + Lookup 1 3 -1 roll map_index + sep + }ifelse + end + }{ + Lookup MappedCSA/DeviceCMYK eq{4}{1}ifelse 3 -1 roll + map_index + MappedCSA/DeviceCMYK eq{setcmykcolor}{setgray}ifelse + }ifelse + end + }{ + level3 not AGMCORE_in_rip_sep and/indexed_colorspace_dict AGMCORE_gget/CSDBase known and{ + /indexed_colorspace_dict AGMCORE_gget/CSDBase get/CSD get_res begin + map_indexed_devn + devn + end + } + { + setcolor + }ifelse + }ifelse +}def +/ignoreimagedata +{ + currentoverprint not{ + gsave + dup clonedict begin + 1 setgray + /Decode[0 1]def + /DataSourcedef + /MultipleDataSources false def + /BitsPerComponent 8 def + currentdict end + systemdict/image gx + grestore + }if + consumeimagedata +}def +/add_res +{ + dup/CSD eq{ + pop + //Adobe_AGM_Core begin + /AGMCORE_CSD_cache load 3 1 roll put + end + }{ + defineresource pop + }ifelse +}def +/del_res +{ + { + aload pop exch + dup/CSD eq{ + pop + {//Adobe_AGM_Core/AGMCORE_CSD_cache get exch undef}forall + }{ + exch + {1 index undefineresource}forall + pop + }ifelse + }forall +}def +/get_res +{ + dup/CSD eq{ + pop + dup type dup/nametype eq exch/stringtype eq or{ + AGMCORE_CSD_cache exch get + }if + }{ + findresource + }ifelse +}def +/get_csa_by_name +{ + dup type dup/nametype eq exch/stringtype eq or{ + /CSA get_res + }if +}def +/paintproc_buf_init +{ + /count get 0 0 put +}def +/paintproc_buf_next +{ + dup/count get dup 0 get + dup 3 1 roll + 1 add 0 xpt + get +}def +/cachepaintproc_compress +{ + 5 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + /string_size 16000 def + /readbuffer string_size string def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + /LZWFilter + { + exch + dup length 0 eq{ + pop + }{ + ppdict dup length 1 sub 3 -1 roll put + }ifelse + {string_size}{0}ifelse string + }/LZWEncode filter def + { + ReadFilter readbuffer readstring + exch LZWFilter exch writestring + not{exit}if + }loop + LZWFilter closefile + ppdict + end +}def +/cachepaintproc +{ + 2 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + { + ReadFilter 16000 string readstring exch + ppdict dup length 1 sub 3 -1 roll put + not{exit}if + }loop + ppdict dup dup length 1 sub()put + end +}def +/make_pattern +{ + exch clonedict exch + dup matrix currentmatrix matrix concatmatrix 0 0 3 2 roll itransform + exch 3 index/XStep get 1 index exch 2 copy div cvi mul sub sub + exch 3 index/YStep get 1 index exch 2 copy div cvi mul sub sub + matrix translate exch matrix concatmatrix + 1 index begin + BBox 0 get XStep div cvi XStep mul/xshift exch neg def + BBox 1 get YStep div cvi YStep mul/yshift exch neg def + BBox 0 get xshift add + BBox 1 get yshift add + BBox 2 get xshift add + BBox 3 get yshift add + 4 array astore + /BBox exch def + [xshift yshift/translate load null/exec load]dup + 3/PaintProc load put cvx/PaintProc exch def + end + gsave 0 setgray + makepattern + grestore +}def +/set_pattern +{ + dup/PatternType get 1 eq{ + dup/PaintType get 1 eq{ + currentoverprint sop[/DeviceGray]setcolorspace 0 setgray + }if + }if + setpattern +}def +/setcolorspace_opt +{ + dup currentcolorspace eq{pop}{setcolorspace}ifelse +}def +/updatecolorrendering +{ + currentcolorrendering/RenderingIntent known{ + currentcolorrendering/RenderingIntent get + } + { + Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/Saturation eq + { + /saturation_crd AGMCORE_gget dup null eq + } + { + /perceptual_crd AGMCORE_gget dup null eq + }ifelse + }ifelse + }ifelse + { + pop null + } + { + /RenderingIntent known{null}{Intent}ifelse + }ifelse + }ifelse + Intent ne{ + Intent/ColorRendering{findresource}stopped + { + pop pop systemdict/findcolorrendering known + { + Intent findcolorrendering + { + /ColorRendering findresource true exch + } + { + /ColorRendering findresource + product(Xerox Phaser 5400)ne + exch + }ifelse + dup Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd exch AGMCORE_gput + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd exch AGMCORE_gput + } + { + Intent/Saturation eq + { + /saturation_crd exch AGMCORE_gput + } + { + Intent/Perceptual eq + { + /perceptual_crd exch AGMCORE_gput + } + { + pop + }ifelse + }ifelse + }ifelse + }ifelse + 1 index{exch}{pop}ifelse + } + {false}ifelse + } + {true}ifelse + { + dup begin + currentdict/TransformPQR known{ + currentdict/TransformPQR get aload pop + 3{{}eq 3 1 roll}repeat or or + } + {true}ifelse + currentdict/MatrixPQR known{ + currentdict/MatrixPQR get aload pop + 1.0 eq 9 1 roll 0.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 1.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 0.0 eq 9 1 roll 1.0 eq + and and and and and and and and + } + {true}ifelse + end + or + { + clonedict begin + /TransformPQR[ + {4 -1 roll 3 get dup 3 1 roll sub 5 -1 roll 3 get 3 -1 roll sub div + 3 -1 roll 3 get 3 -1 roll 3 get dup 4 1 roll sub mul add}bind + {4 -1 roll 4 get dup 3 1 roll sub 5 -1 roll 4 get 3 -1 roll sub div + 3 -1 roll 4 get 3 -1 roll 4 get dup 4 1 roll sub mul add}bind + {4 -1 roll 5 get dup 3 1 roll sub 5 -1 roll 5 get 3 -1 roll sub div + 3 -1 roll 5 get 3 -1 roll 5 get dup 4 1 roll sub mul add}bind + ]def + /MatrixPQR[0.8951 -0.7502 0.0389 0.2664 1.7135 -0.0685 -0.1614 0.0367 1.0296]def + /RangePQR[-0.3227950745 2.3229645538 -1.5003771057 3.5003465881 -0.1369979095 2.136967392]def + currentdict end + }if + setcolorrendering_opt + }if + }if +}def +/set_crd +{ + AGMCORE_host_sep not level2 and{ + currentdict/ColorRendering known{ + ColorRendering/ColorRendering{findresource}stopped not{setcolorrendering_opt}if + }{ + currentdict/Intent known{ + updatecolorrendering + }if + }ifelse + currentcolorspace dup type/arraytype eq + {0 get}if + /DeviceRGB eq + { + currentdict/UCR known + {/UCR}{/AGMCORE_currentucr}ifelse + load setundercolorremoval + currentdict/BG known + {/BG}{/AGMCORE_currentbg}ifelse + load setblackgeneration + }if + }if +}def +/set_ucrbg +{ + dup null eq {pop /AGMCORE_currentbg load}{/Procedure get_res}ifelse + dup currentblackgeneration eq {pop}{setblackgeneration}ifelse + dup null eq {pop /AGMCORE_currentucr load}{/Procedure get_res}ifelse + dup currentundercolorremoval eq {pop}{setundercolorremoval}ifelse +}def +/setcolorrendering_opt +{ + dup currentcolorrendering eq{ + pop + }{ + product(HP Color LaserJet 2605)anchorsearch{ + pop pop pop + }{ + pop + clonedict + begin + /Intent Intent def + currentdict + end + setcolorrendering + }ifelse + }ifelse +}def +/cpaint_gcomp +{ + convert_to_process//Adobe_AGM_Core/AGMCORE_ConvertToProcess xddf + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get not + { + (%end_cpaint_gcomp)flushinput + }if +}def +/cpaint_gsep +{ + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get + { + (%end_cpaint_gsep)flushinput + }if +}def +/cpaint_gend +{np}def +/T1_path +{ + currentfile token pop currentfile token pop mo + { + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 exch rlineto + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 rlineto + }loop +}def +/T1_gsave + level3 + {/clipsave} + {/gsave}ifelse + load def +/T1_grestore + level3 + {/cliprestore} + {/grestore}ifelse + load def +/set_spot_alias_ary +{ + dup inherit_aliases + //Adobe_AGM_Core/AGMCORE_SpotAliasAry xddf +}def +/set_spot_normalization_ary +{ + dup inherit_aliases + dup length + /AGMCORE_SpotAliasAry where{pop AGMCORE_SpotAliasAry length add}if + array + //Adobe_AGM_Core/AGMCORE_SpotAliasAry2 xddf + /AGMCORE_SpotAliasAry where{ + pop + AGMCORE_SpotAliasAry2 0 AGMCORE_SpotAliasAry putinterval + AGMCORE_SpotAliasAry length + }{0}ifelse + AGMCORE_SpotAliasAry2 3 1 roll exch putinterval + true set_spot_alias +}def +/inherit_aliases +{ + {dup/Name get map_alias{/CSD put}{pop}ifelse}forall +}def +/set_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias 3 -1 roll put + }{ + pop + }ifelse +}def +/current_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias get + }{ + false + }ifelse +}def +/map_alias +{ + /AGMCORE_SpotAliasAry2 where{ + begin + /AGMCORE_name xdf + false + AGMCORE_SpotAliasAry2{ + dup/Name get AGMCORE_name eq{ + /CSD get/CSD get_res + exch pop true + exit + }{ + pop + }ifelse + }forall + end + }{ + pop false + }ifelse +}bdf +/spot_alias +{ + true set_spot_alias + /AGMCORE_&setcustomcolor AGMCORE_key_known not{ + //Adobe_AGM_Core/AGMCORE_&setcustomcolor/setcustomcolor load put + }if + /customcolor_tint 1 AGMCORE_gput + //Adobe_AGM_Core begin + /setcustomcolor + { + //Adobe_AGM_Core begin + dup/customcolor_tint exch AGMCORE_gput + 1 index aload pop pop 1 eq exch 1 eq and exch 1 eq and exch 1 eq and not + current_spot_alias and{1 index 4 get map_alias}{false}ifelse + { + false set_spot_alias + /sep_colorspace_dict AGMCORE_gget null ne + {/sep_colorspace_dict AGMCORE_gget/ForeignContent known not}{false}ifelse + 3 1 roll 2 index{ + exch pop/sep_tint AGMCORE_gget exch + }if + mark 3 1 roll + setsepcolorspace + counttomark 0 ne{ + setsepcolor + }if + pop + not{/sep_tint 1.0 AGMCORE_gput/sep_colorspace_dict AGMCORE_gget/ForeignContent true put}if + pop + true set_spot_alias + }{ + AGMCORE_&setcustomcolor + }ifelse + end + }bdf + end +}def +/begin_feature +{ + Adobe_AGM_Core/AGMCORE_feature_dictCount countdictstack put + count Adobe_AGM_Core/AGMCORE_feature_opCount 3 -1 roll put + {Adobe_AGM_Core/AGMCORE_feature_ctm matrix currentmatrix put}if +}def +/end_feature +{ + 2 dict begin + /spd/setpagedevice load def + /setpagedevice{get_gstate spd set_gstate}def + stopped{$error/newerror false put}if + end + count Adobe_AGM_Core/AGMCORE_feature_opCount get sub dup 0 gt{{pop}repeat}{pop}ifelse + countdictstack Adobe_AGM_Core/AGMCORE_feature_dictCount get sub dup 0 gt{{end}repeat}{pop}ifelse + {Adobe_AGM_Core/AGMCORE_feature_ctm get setmatrix}if +}def +/set_negative +{ + //Adobe_AGM_Core begin + /AGMCORE_inverting exch def + level2{ + currentpagedevice/NegativePrint known AGMCORE_distilling not and{ + currentpagedevice/NegativePrint get//Adobe_AGM_Core/AGMCORE_inverting get ne{ + true begin_feature true{ + <>setpagedevice + }end_feature + }if + /AGMCORE_inverting false def + }if + }if + AGMCORE_inverting{ + [{1 exch sub}/exec load dup currenttransfer exch]cvx bind settransfer + AGMCORE_distilling{ + erasepage + }{ + gsave np clippath 1/setseparationgray where{pop setseparationgray}{setgray}ifelse + /AGMIRS_&fill where{pop AGMIRS_&fill}{fill}ifelse grestore + }ifelse + }if + end +}def +/lw_save_restore_override{ + /md where{ + pop + md begin + initializepage + /initializepage{}def + /pmSVsetup{}def + /endp{}def + /pse{}def + /psb{}def + /orig_showpage where + {pop} + {/orig_showpage/showpage load def} + ifelse + /showpage{orig_showpage gR}def + end + }if +}def +/pscript_showpage_override{ + /NTPSOct95 where + { + begin + showpage + save + /showpage/restore load def + /restore{exch pop}def + end + }if +}def +/driver_media_override +{ + /md where{ + pop + md/initializepage known{ + md/initializepage{}put + }if + md/rC known{ + md/rC{4{pop}repeat}put + }if + }if + /mysetup where{ + /mysetup[1 0 0 1 0 0]put + }if + Adobe_AGM_Core/AGMCORE_Default_CTM matrix currentmatrix put + level2 + {Adobe_AGM_Core/AGMCORE_Default_PageSize currentpagedevice/PageSize get put}if +}def +/capture_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup Pscript_Win_Data/mysetup get put + }if + }if +}def +/restore_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup known{ + Pscript_Win_Data/mysetup Adobe_AGM_Core/save_mysetup get put + Adobe_AGM_Core/save_mysetup undef + }if + }if + }if +}def +/driver_check_media_override +{ + /PrepsDict where + {pop} + { + Adobe_AGM_Core/AGMCORE_Default_CTM get matrix currentmatrix ne + Adobe_AGM_Core/AGMCORE_Default_PageSize get type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_Default_PageSize get 0 get currentpagedevice/PageSize get 0 get eq and + Adobe_AGM_Core/AGMCORE_Default_PageSize get 1 get currentpagedevice/PageSize get 1 get eq and + }if + { + Adobe_AGM_Core/AGMCORE_Default_CTM get setmatrix + }if + }ifelse +}def +AGMCORE_err_strings begin + /AGMCORE_bad_environ(Environment not satisfactory for this job. Ensure that the PPD is correct or that the PostScript level requested is supported by this printer. )def + /AGMCORE_color_space_onhost_seps(This job contains colors that will not separate with on-host methods. )def + /AGMCORE_invalid_color_space(This job contains an invalid color space. )def +end +/set_def_ht +{AGMCORE_def_ht sethalftone}def +/set_def_flat +{AGMCORE_Default_flatness setflat}def +end +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_CoolType_Core 2.31 0 +%%Copyright: Copyright 1997-2006 Adobe Systems Incorporated. All Rights Reserved. +%%Version: 2.31 0 +10 dict begin +/Adobe_CoolType_Passthru currentdict def +/Adobe_CoolType_Core_Defined userdict/Adobe_CoolType_Core known def +Adobe_CoolType_Core_Defined + {/Adobe_CoolType_Core userdict/Adobe_CoolType_Core get def} +if +userdict/Adobe_CoolType_Core 70 dict dup begin put +/Adobe_CoolType_Version 2.31 def +/Level2? + systemdict/languagelevel known dup + {pop systemdict/languagelevel get 2 ge} + if def +Level2? not + { + /currentglobal false def + /setglobal/pop load def + /gcheck{pop false}bind def + /currentpacking false def + /setpacking/pop load def + /SharedFontDirectory 0 dict def + } +if +currentpacking +true setpacking +currentglobal false setglobal +userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} +if +get + begin + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + end +setglobal +currentglobal true setglobal +userdict/Adobe_CoolType_GVMFonts known not + {userdict/Adobe_CoolType_GVMFonts 10 dict put} +if +setglobal +currentglobal false setglobal +userdict/Adobe_CoolType_LVMFonts known not + {userdict/Adobe_CoolType_LVMFonts 10 dict put} +if +setglobal +/ct_VMDictPut + { + dup gcheck{Adobe_CoolType_GVMFonts}{Adobe_CoolType_LVMFonts}ifelse + 3 1 roll put + }bind def +/ct_VMDictUndef + { + dup Adobe_CoolType_GVMFonts exch known + {Adobe_CoolType_GVMFonts exch undef} + { + dup Adobe_CoolType_LVMFonts exch known + {Adobe_CoolType_LVMFonts exch undef} + {pop} + ifelse + }ifelse + }bind def +/ct_str1 1 string def +/ct_xshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_yshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 exch + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_xyshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + {_ct_na _ct_i 1 add get}stopped + {pop pop pop} + { + _ct_x _ct_y moveto + rmoveto + } + ifelse + } + ifelse + /_ct_i _ct_i 2 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/xsh{{@xshow}stopped{Adobe_CoolType_Data begin ct_xshow end}if}bind def +/ysh{{@yshow}stopped{Adobe_CoolType_Data begin ct_yshow end}if}bind def +/xysh{{@xyshow}stopped{Adobe_CoolType_Data begin ct_xyshow end}if}bind def +currentglobal true setglobal +/ct_T3Defs +{ +/BuildChar +{ + 1 index/Encoding get exch get + 1 index/BuildGlyph get exec +}bind def +/BuildGlyph +{ + exch begin + GlyphProcs exch get exec + end +}bind def +}bind def +setglobal +/@_SaveStackLevels + { + Adobe_CoolType_Data + begin + /@vmState currentglobal def false setglobal + @opStackCountByLevel + @opStackLevel + 2 copy known not + { + 2 copy + 3 dict dup/args + 7 index + 5 add array put + put get + } + { + get dup/args get dup length 3 index lt + { + dup length 5 add array exch + 1 index exch 0 exch putinterval + 1 index exch/args exch put + } + {pop} + ifelse + } + ifelse + begin + count 1 sub + 1 index lt + {pop count} + if + dup/argCount exch def + dup 0 gt + { + args exch 0 exch getinterval + astore pop + } + {pop} + ifelse + count + /restCount exch def + end + /@opStackLevel @opStackLevel 1 add def + countdictstack 1 sub + @dictStackCountByLevel exch @dictStackLevel exch put + /@dictStackLevel @dictStackLevel 1 add def + @vmState setglobal + end + }bind def +/@_RestoreStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + @opStackCountByLevel @opStackLevel get + begin + count restCount sub dup 0 gt + {{pop}repeat} + {pop} + ifelse + args 0 argCount getinterval{}forall + end + /@dictStackLevel @dictStackLevel 1 sub def + @dictStackCountByLevel @dictStackLevel get + end + countdictstack exch sub dup 0 gt + {{end}repeat} + {pop} + ifelse + }bind def +/@_PopStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + /@dictStackLevel @dictStackLevel 1 sub def + end + }bind def +/@Raise + { + exch cvx exch errordict exch get exec + stop + }bind def +/@ReRaise + { + cvx $error/errorname get errordict exch get exec + stop + }bind def +/@Stopped + { + 0 @#Stopped + }bind def +/@#Stopped + { + @_SaveStackLevels + stopped + {@_RestoreStackLevels true} + {@_PopStackLevels false} + ifelse + }bind def +/@Arg + { + Adobe_CoolType_Data + begin + @opStackCountByLevel @opStackLevel 1 sub get + begin + args exch + argCount 1 sub exch sub get + end + end + }bind def +currentglobal true setglobal +/CTHasResourceForAllBug + Level2? + { + 1 dict dup + /@shouldNotDisappearDictValue true def + Adobe_CoolType_Data exch/@shouldNotDisappearDict exch put + begin + count @_SaveStackLevels + {(*){pop stop}128 string/Category resourceforall} + stopped pop + @_RestoreStackLevels + currentdict Adobe_CoolType_Data/@shouldNotDisappearDict get dup 3 1 roll ne dup 3 1 roll + { + /@shouldNotDisappearDictValue known + { + { + end + currentdict 1 index eq + {pop exit} + if + } + loop + } + if + } + { + pop + end + } + ifelse + } + {false} + ifelse + def +true setglobal +/CTHasResourceStatusBug + Level2? + { + mark + {/steveamerige/Category resourcestatus} + stopped + {cleartomark true} + {cleartomark currentglobal not} + ifelse + } + {false} + ifelse + def +setglobal +/CTResourceStatus + { + mark 3 1 roll + /Category findresource + begin + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + end + }bind def +/CTWorkAroundBugs + { + Level2? + { + /cid_PreLoad/ProcSet resourcestatus + { + pop pop + currentglobal + mark + { + (*) + { + dup/CMap CTHasResourceStatusBug + {CTResourceStatus} + {resourcestatus} + ifelse + { + pop dup 0 eq exch 1 eq or + { + dup/CMap findresource gcheck setglobal + /CMap undefineresource + } + { + pop CTHasResourceForAllBug + {exit} + {stop} + ifelse + } + ifelse + } + {pop} + ifelse + } + 128 string/CMap resourceforall + } + stopped + {cleartomark} + stopped pop + setglobal + } + if + } + if + }bind def +/ds + { + Adobe_CoolType_Core + begin + CTWorkAroundBugs + /mo/moveto load def + /nf/newencodedfont load def + /msf{makefont setfont}bind def + /uf{dup undefinefont ct_VMDictUndef}bind def + /ur/undefineresource load def + /chp/charpath load def + /awsh/awidthshow load def + /wsh/widthshow load def + /ash/ashow load def + /@xshow/xshow load def + /@yshow/yshow load def + /@xyshow/xyshow load def + /@cshow/cshow load def + /sh/show load def + /rp/repeat load def + /.n/.notdef def + end + currentglobal false setglobal + userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} + if + get + begin + /AddWidths? false def + /CC 0 def + /charcode 2 string def + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + /InVMFontsByCMap 10 dict def + /InVMDeepCopiedFonts 10 dict def + end + setglobal + }bind def +/dt + { + currentdict Adobe_CoolType_Core eq + {end} + if + }bind def +/ps + { + Adobe_CoolType_Core begin + Adobe_CoolType_GVMFonts begin + Adobe_CoolType_LVMFonts begin + SharedFontDirectory begin + }bind def +/pt + { + end + end + end + end + }bind def +/unload + { + systemdict/languagelevel known + { + systemdict/languagelevel get 2 ge + { + userdict/Adobe_CoolType_Core 2 copy known + {undef} + {pop pop} + ifelse + } + if + } + if + }bind def +/ndf + { + 1 index where + {pop pop pop} + {dup xcheck{bind}if def} + ifelse + }def +/findfont systemdict + begin + userdict + begin + /globaldict where{/globaldict get begin}if + dup where pop exch get + /globaldict where{pop end}if + end + end +Adobe_CoolType_Core_Defined + {/systemfindfont exch def} + { + /findfont 1 index def + /systemfindfont exch def + } +ifelse +/undefinefont + {pop}ndf +/copyfont + { + currentglobal 3 1 roll + 1 index gcheck setglobal + dup null eq{0}{dup length}ifelse + 2 index length add 1 add dict + begin + exch + { + 1 index/FID eq + {pop pop} + {def} + ifelse + } + forall + dup null eq + {pop} + {{def}forall} + ifelse + currentdict + end + exch setglobal + }bind def +/copyarray + { + currentglobal exch + dup gcheck setglobal + dup length array copy + exch setglobal + }bind def +/newencodedfont + { + currentglobal + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + { + FontDirectory 3 index known + {FontDirectory 3 index get/FontReferenced known} + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + ifelse + } + ifelse + dup + { + 3 index findfont/FontReferenced get + 2 index dup type/nametype eq + {findfont} + if ne + {pop false} + if + } + if + dup + { + 1 index dup type/nametype eq + {findfont} + if + dup/CharStrings known + { + /CharStrings get length + 4 index findfont/CharStrings get length + ne + { + pop false + } + if + } + {pop} + ifelse + } + if + { + pop + 1 index findfont + /Encoding get exch + 0 1 255 + {2 copy get 3 index 3 1 roll put} + for + pop pop pop + } + { + currentglobal + 4 1 roll + dup type/nametype eq + {findfont} + if + dup gcheck setglobal + dup dup maxlength 2 add dict + begin + exch + { + 1 index/FID ne + 2 index/Encoding ne and + {def} + {pop pop} + ifelse + } + forall + /FontReferenced exch def + /Encoding exch dup length array copy def + /FontName 1 index dup type/stringtype eq{cvn}if def dup + currentdict + end + definefont ct_VMDictPut + setglobal + } + ifelse + }bind def +/SetSubstituteStrategy + { + $SubstituteFont + begin + dup type/dicttype ne + {0 dict} + if + currentdict/$Strategies known + { + exch $Strategies exch + 2 copy known + { + get + 2 copy maxlength exch maxlength add dict + begin + {def}forall + {def}forall + currentdict + dup/$Init known + {dup/$Init get exec} + if + end + /$Strategy exch def + } + {pop pop pop} + ifelse + } + {pop pop} + ifelse + end + }bind def +/scff + { + $SubstituteFont + begin + dup type/stringtype eq + {dup length exch} + {null} + ifelse + /$sname exch def + /$slen exch def + /$inVMIndex + $sname null eq + { + 1 index $str cvs + dup length $slen sub $slen getinterval cvn + } + {$sname} + ifelse def + end + {findfont} + @Stopped + { + dup length 8 add string exch + 1 index 0(BadFont:)putinterval + 1 index exch 8 exch dup length string cvs putinterval cvn + {findfont} + @Stopped + {pop/Courier findfont} + if + } + if + $SubstituteFont + begin + /$sname null def + /$slen 0 def + /$inVMIndex null def + end + }bind def +/isWidthsOnlyFont + { + dup/WidthsOnly known + {pop pop true} + { + dup/FDepVector known + {/FDepVector get{isWidthsOnlyFont dup{exit}if}forall} + { + dup/FDArray known + {/FDArray get{isWidthsOnlyFont dup{exit}if}forall} + {pop} + ifelse + } + ifelse + } + ifelse + }bind def +/ct_StyleDicts 4 dict dup begin + /Adobe-Japan1 4 dict dup begin + Level2? + { + /Serif + /HeiseiMin-W3-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMin-W3} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMin-W3/CIDFont resourcestatus + {pop pop/HeiseiMin-W3} + {/Ryumin-Light} + ifelse + } + {/Ryumin-Light} + ifelse + } + ifelse + def + /SansSerif + /HeiseiKakuGo-W5-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiKakuGo-W5} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiKakuGo-W5/CIDFont resourcestatus + {pop pop/HeiseiKakuGo-W5} + {/GothicBBB-Medium} + ifelse + } + {/GothicBBB-Medium} + ifelse + } + ifelse + def + /HeiseiMaruGo-W4-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMaruGo-W4/CIDFont resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + ifelse + /RoundSansSerif exch def + /Default Serif def + } + { + /Serif/Ryumin-Light def + /SansSerif/GothicBBB-Medium def + { + (fonts/Jun101-Light-83pv-RKSJ-H)status + }stopped + {pop}{ + {pop pop pop pop/Jun101-Light} + {SansSerif} + ifelse + /RoundSansSerif exch def + }ifelse + /Default Serif def + } + ifelse + end + def + /Adobe-Korea1 4 dict dup begin + /Serif/HYSMyeongJo-Medium def + /SansSerif/HYGoThic-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-GB1 4 dict dup begin + /Serif/STSong-Light def + /SansSerif/STHeiti-Regular def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-CNS1 4 dict dup begin + /Serif/MKai-Medium def + /SansSerif/MHei-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def +end +def +Level2?{currentglobal true setglobal}if +/ct_BoldRomanWidthProc + { + stringwidth 1 index 0 ne{exch .03 add exch}if setcharwidth + 0 0 + }bind def +/ct_Type0WidthProc + { + dup stringwidth 0 0 moveto + 2 index true charpath pathbbox + 0 -1 + 7 index 2 div .88 + setcachedevice2 + pop + 0 0 + }bind def +/ct_Type0WMode1WidthProc + { + dup stringwidth + pop 2 div neg -0.88 + 2 copy + moveto + 0 -1 + 5 -1 roll true charpath pathbbox + setcachedevice + }bind def +/cHexEncoding +[/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 +/c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 +/c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 +/c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B +/c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E +/c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 +/c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 +/c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 +/c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA +/cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD +/cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 +/cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 +/cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 +/cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def +/ct_BoldBaseFont + 11 dict begin + /FontType 3 def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /Encoding cHexEncoding def + /_setwidthProc/ct_BoldRomanWidthProc load def + /_bcstr1 1 string def + /BuildChar + { + exch begin + _basefont setfont + _bcstr1 dup 0 4 -1 roll put + dup + _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +systemdict/composefont known +{ +/ct_DefineIdentity-H +{ + /Identity-H/CMap resourcestatus + { + pop pop + } + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse +} +def +/ct_BoldBaseCIDFont + 11 dict begin + /CIDFontType 1 def + /CIDFontName/ct_BoldBaseCIDFont def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /_setwidthProc/ct_Type0WidthProc load def + /_bcstr2 2 string def + /BuildGlyph + { + exch begin + _basefont setfont + _bcstr2 1 2 index 256 mod put + _bcstr2 0 3 -1 roll 256 idiv put + _bcstr2 dup _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +}if +Level2?{setglobal}if +/ct_CopyFont{ + { + 1 index/FID ne 2 index/UniqueID ne and + {def}{pop pop}ifelse + }forall +}bind def +/ct_Type0CopyFont +{ + exch + dup length dict + begin + ct_CopyFont + [ + exch + FDepVector + { + dup/FontType get 0 eq + { + 1 index ct_Type0CopyFont + /_ctType0 exch definefont + } + { + /_ctBaseFont exch + 2 index exec + } + ifelse + exch + } + forall + pop + ] + /FDepVector exch def + currentdict + end +}bind def +/ct_MakeBoldFont +{ + dup/ct_SyntheticBold known + { + dup length 3 add dict begin + ct_CopyFont + /ct_StrokeWidth .03 0 FontMatrix idtransform pop def + /ct_SyntheticBold true def + currentdict + end + definefont + } + { + dup dup length 3 add dict + begin + ct_CopyFont + /PaintType 2 def + /StrokeWidth .03 0 FontMatrix idtransform pop def + /dummybold currentdict + end + definefont + dup/FontType get dup 9 ge exch 11 le and + { + ct_BoldBaseCIDFont + dup length 3 add dict copy begin + dup/CIDSystemInfo get/CIDSystemInfo exch def + ct_DefineIdentity-H + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefont exch def + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefonto exch def + currentdict + end + /CIDFont defineresource + } + { + ct_BoldBaseFont + dup length 3 add dict copy begin + /_basefont exch def + /_basefonto exch def + currentdict + end + definefont + } + ifelse + } + ifelse +}bind def +/ct_MakeBold{ + 1 index + 1 index + findfont + currentglobal 5 1 roll + dup gcheck setglobal + dup + /FontType get 0 eq + { + dup/WMode known{dup/WMode get 1 eq}{false}ifelse + version length 4 ge + and + {version 0 4 getinterval cvi 2015 ge} + {true} + ifelse + {/ct_Type0WidthProc} + {/ct_Type0WMode1WidthProc} + ifelse + ct_BoldBaseFont/_setwidthProc 3 -1 roll load put + {ct_MakeBoldFont}ct_Type0CopyFont definefont + } + { + dup/_fauxfont known not 1 index/SubstMaster known not and + { + ct_BoldBaseFont/_setwidthProc /ct_BoldRomanWidthProc load put + ct_MakeBoldFont + } + { + 2 index 2 index eq + {exch pop } + { + dup length dict begin + ct_CopyFont + currentdict + end + definefont + } + ifelse + } + ifelse + } + ifelse + pop pop pop + setglobal +}bind def +/?str1 256 string def +/?set + { + $SubstituteFont + begin + /$substituteFound false def + /$fontname 1 index def + /$doSmartSub false def + end + dup + findfont + $SubstituteFont + begin + $substituteFound + {false} + { + dup/FontName known + { + dup/FontName get $fontname eq + 1 index/DistillerFauxFont known not and + /currentdistillerparams where + {pop false 2 index isWidthsOnlyFont not and} + if + } + {false} + ifelse + } + ifelse + exch pop + /$doSmartSub true def + end + { + 5 1 roll pop pop pop pop + findfont + } + { + 1 index + findfont + dup/FontType get 3 eq + { + 6 1 roll pop pop pop pop pop false + } + {pop true} + ifelse + { + $SubstituteFont + begin + pop pop + /$styleArray 1 index def + /$regOrdering 2 index def + pop pop + 0 1 $styleArray length 1 sub + { + $styleArray exch get + ct_StyleDicts $regOrdering + 2 copy known + { + get + exch 2 copy known not + {pop/Default} + if + get + dup type/nametype eq + { + ?str1 cvs length dup 1 add exch + ?str1 exch(-)putinterval + exch dup length exch ?str1 exch 3 index exch putinterval + add ?str1 exch 0 exch getinterval cvn + } + { + pop pop/Unknown + } + ifelse + } + { + pop pop pop pop/Unknown + } + ifelse + } + for + end + findfont + }if + } + ifelse + currentglobal false setglobal 3 1 roll + null copyfont definefont pop + setglobal + }bind def +setpacking +userdict/$SubstituteFont 25 dict put +1 dict + begin + /SubstituteFont + dup $error exch 2 copy known + {get} + {pop pop{pop/Courier}bind} + ifelse def + /currentdistillerparams where dup + { + pop pop + currentdistillerparams/CannotEmbedFontPolicy 2 copy known + {get/Error eq} + {pop pop false} + ifelse + } + if not + { + countdictstack array dictstack 0 get + begin + userdict + begin + $SubstituteFont + begin + /$str 128 string def + /$fontpat 128 string def + /$slen 0 def + /$sname null def + /$match false def + /$fontname null def + /$substituteFound false def + /$inVMIndex null def + /$doSmartSub true def + /$depth 0 def + /$fontname null def + /$italicangle 26.5 def + /$dstack null def + /$Strategies 10 dict dup + begin + /$Type3Underprint + { + currentglobal exch false setglobal + 11 dict + begin + /UseFont exch + $WMode 0 ne + { + dup length dict copy + dup/WMode $WMode put + /UseFont exch definefont + } + if def + /FontName $fontname dup type/stringtype eq{cvn}if def + /FontType 3 def + /FontMatrix[.001 0 0 .001 0 0]def + /Encoding 256 array dup 0 1 255{/.notdef put dup}for pop def + /FontBBox[0 0 0 0]def + /CCInfo 7 dict dup + begin + /cc null def + /x 0 def + /y 0 def + end def + /BuildChar + { + exch + begin + CCInfo + begin + 1 string dup 0 3 index put exch pop + /cc exch def + UseFont 1000 scalefont setfont + cc stringwidth/y exch def/x exch def + x y setcharwidth + $SubstituteFont/$Strategy get/$Underprint get exec + 0 0 moveto cc show + x y moveto + end + end + }bind def + currentdict + end + exch setglobal + }bind def + /$GetaTint + 2 dict dup + begin + /$BuildFont + { + dup/WMode known + {dup/WMode get} + {0} + ifelse + /$WMode exch def + $fontname exch + dup/FontName known + { + dup/FontName get + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + exch + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index/FontName get known + { + pop + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index get + null copyfont + } + {$deepcopyfont} + ifelse + exch 1 index exch/FontBasedOn exch put + dup/FontName $fontname dup type/stringtype eq{cvn}if put + definefont + Adobe_CoolType_Data/InVMDeepCopiedFonts get + begin + dup/FontBasedOn get 1 index def + end + }bind def + /$Underprint + { + gsave + x abs y abs gt + {/y 1000 def} + {/x -1000 def 500 120 translate} + ifelse + Level2? + { + [/Separation(All)/DeviceCMYK{0 0 0 1 pop}] + setcolorspace + } + {0 setgray} + ifelse + 10 setlinewidth + x .8 mul + [7 3] + { + y mul 8 div 120 sub x 10 div exch moveto + 0 y 4 div neg rlineto + dup 0 rlineto + 0 y 4 div rlineto + closepath + gsave + Level2? + {.2 setcolor} + {.8 setgray} + ifelse + fill grestore + stroke + } + forall + pop + grestore + }bind def + end def + /$Oblique + 1 dict dup + begin + /$BuildFont + { + currentglobal exch dup gcheck setglobal + null copyfont + begin + /FontBasedOn + currentdict/FontName known + { + FontName + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + def + /FontName $fontname dup type/stringtype eq{cvn}if def + /currentdistillerparams where + {pop} + { + /FontInfo currentdict/FontInfo known + {FontInfo null copyfont} + {2 dict} + ifelse + dup + begin + /ItalicAngle $italicangle def + /FontMatrix FontMatrix + [1 0 ItalicAngle dup sin exch cos div 1 0 0] + matrix concatmatrix readonly + end + 4 2 roll def + def + } + ifelse + FontName currentdict + end + definefont + exch setglobal + }bind def + end def + /$None + 1 dict dup + begin + /$BuildFont{}bind def + end def + end def + /$Oblique SetSubstituteStrategy + /$findfontByEnum + { + dup type/stringtype eq{cvn}if + dup/$fontname exch def + $sname null eq + {$str cvs dup length $slen sub $slen getinterval} + {pop $sname} + ifelse + $fontpat dup 0(fonts/*)putinterval exch 7 exch putinterval + /$match false def + $SubstituteFont/$dstack countdictstack array dictstack put + mark + { + $fontpat 0 $slen 7 add getinterval + {/$match exch def exit} + $str filenameforall + } + stopped + { + cleardictstack + currentdict + true + $SubstituteFont/$dstack get + { + exch + { + 1 index eq + {pop false} + {true} + ifelse + } + {begin false} + ifelse + } + forall + pop + } + if + cleartomark + /$slen 0 def + $match false ne + {$match(fonts/)anchorsearch pop pop cvn} + {/Courier} + ifelse + }bind def + /$ROS 1 dict dup + begin + /Adobe 4 dict dup + begin + /Japan1 [/Ryumin-Light/HeiseiMin-W3 + /GothicBBB-Medium/HeiseiKakuGo-W5 + /HeiseiMaruGo-W4/Jun101-Light]def + /Korea1 [/HYSMyeongJo-Medium/HYGoThic-Medium]def + /GB1 [/STSong-Light/STHeiti-Regular]def + /CNS1 [/MKai-Medium/MHei-Medium]def + end def + end def + /$cmapname null def + /$deepcopyfont + { + dup/FontType get 0 eq + { + 1 dict dup/FontName/copied put copyfont + begin + /FDepVector FDepVector copyarray + 0 1 2 index length 1 sub + { + 2 copy get $deepcopyfont + dup/FontName/copied put + /copied exch definefont + 3 copy put pop pop + } + for + def + currentdict + end + } + {$Strategies/$Type3Underprint get exec} + ifelse + }bind def + /$buildfontname + { + dup/CIDFont findresource/CIDSystemInfo get + begin + Registry length Ordering length Supplement 8 string cvs + 3 copy length 2 add add add string + dup 5 1 roll dup 0 Registry putinterval + dup 4 index(-)putinterval + dup 4 index 1 add Ordering putinterval + 4 2 roll add 1 add 2 copy(-)putinterval + end + 1 add 2 copy 0 exch getinterval $cmapname $fontpat cvs exch + anchorsearch + {pop pop 3 2 roll putinterval cvn/$cmapname exch def} + {pop pop pop pop pop} + ifelse + length + $str 1 index(-)putinterval 1 add + $str 1 index $cmapname $fontpat cvs putinterval + $cmapname length add + $str exch 0 exch getinterval cvn + }bind def + /$findfontByROS + { + /$fontname exch def + $ROS Registry 2 copy known + { + get Ordering 2 copy known + {get} + {pop pop[]} + ifelse + } + {pop pop[]} + ifelse + false exch + { + dup/CIDFont resourcestatus + { + pop pop + save + 1 index/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get} + {false} + ifelse + exch pop + exch restore + {pop} + {exch pop true exit} + ifelse + } + {pop} + ifelse + } + forall + {$str cvs $buildfontname} + { + false(*) + { + save exch + dup/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get not} + {true} + ifelse + exch/CIDSystemInfo get + dup/Registry get Registry eq + exch/Ordering get Ordering eq and and + {exch restore exch pop true exit} + {pop restore} + ifelse + } + $str/CIDFont resourceforall + {$buildfontname} + {$fontname $findfontByEnum} + ifelse + } + ifelse + }bind def + end + end + currentdict/$error known currentdict/languagelevel known and dup + {pop $error/SubstituteFont known} + if + dup + {$error} + {Adobe_CoolType_Core} + ifelse + begin + { + /SubstituteFont + /CMap/Category resourcestatus + { + pop pop + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + { + $sname null eq + {dup $str cvs dup length $slen sub $slen getinterval cvn} + {$sname} + ifelse + Adobe_CoolType_Data/InVMFontsByCMap get + 1 index 2 copy known + { + get + false exch + { + pop + currentglobal + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + { + FontDirectory 1 index known + {exch pop true exit} + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + ifelse + } + ifelse + } + forall + } + {pop pop false} + ifelse + { + exch pop exch pop + } + { + dup/CMap resourcestatus + { + pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + } + { + 128 string cvs + dup(-)search + { + 3 1 roll search + { + 3 1 roll pop + {dup cvi} + stopped + {pop pop pop pop pop $findfontByEnum} + { + 4 2 roll pop pop + exch length + exch + 2 index length + 2 index + sub + exch 1 sub -1 0 + { + $str cvs dup length + 4 index + 0 + 4 index + 4 3 roll add + getinterval + exch 1 index exch 3 index exch + putinterval + dup/CMap resourcestatus + { + pop pop + 4 1 roll pop pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + true exit + } + {pop} + ifelse + } + for + dup type/booleantype eq + {pop} + {pop pop pop $findfontByEnum} + ifelse + } + ifelse + } + {pop pop pop $findfontByEnum} + ifelse + } + {pop pop $findfontByEnum} + ifelse + } + ifelse + } + ifelse + } + {//SubstituteFont exec} + ifelse + /$slen 0 def + end + } + } + { + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + {$findfontByEnum} + {//SubstituteFont exec} + ifelse + end + } + } + ifelse + bind readonly def + Adobe_CoolType_Core/scfindfont/systemfindfont load put + } + { + /scfindfont + { + $SubstituteFont + begin + dup systemfindfont + dup/FontName known + {dup/FontName get dup 3 index ne} + {/noname true} + ifelse + dup + { + /$origfontnamefound 2 index def + /$origfontname 4 index def/$substituteFound true def + } + if + exch pop + { + $slen 0 gt + $sname null ne + 3 index length $slen gt or and + { + pop dup $findfontByEnum findfont + dup maxlength 1 add dict + begin + {1 index/FID eq{pop pop}{def}ifelse} + forall + currentdict + end + definefont + dup/FontName known{dup/FontName get}{null}ifelse + $origfontnamefound ne + { + $origfontname $str cvs print + ( substitution revised, using )print + dup/FontName known + {dup/FontName get}{(unspecified font)} + ifelse + $str cvs print(.\n)print + } + if + } + {exch pop} + ifelse + } + {exch pop} + ifelse + end + }bind def + } + ifelse + end + end + Adobe_CoolType_Core_Defined not + { + Adobe_CoolType_Core/findfont + { + $SubstituteFont + begin + $depth 0 eq + { + /$fontname 1 index dup type/stringtype ne{$str cvs}if def + /$substituteFound false def + } + if + /$depth $depth 1 add def + end + scfindfont + $SubstituteFont + begin + /$depth $depth 1 sub def + $substituteFound $depth 0 eq and + { + $inVMIndex null ne + {dup $inVMIndex $AddInVMFont} + if + $doSmartSub + { + currentdict/$Strategy known + {$Strategy/$BuildFont get exec} + if + } + if + } + if + end + }bind put + } + if + } + if + end +/$AddInVMFont + { + exch/FontName 2 copy known + { + get + 1 dict dup begin exch 1 index gcheck def end exch + Adobe_CoolType_Data/InVMFontsByCMap get exch + $DictAdd + } + {pop pop pop} + ifelse + }bind def +/$DictAdd + { + 2 copy known not + {2 copy 4 index length dict put} + if + Level2? not + { + 2 copy get dup maxlength exch length 4 index length add lt + 2 copy get dup length 4 index length add exch maxlength 1 index lt + { + 2 mul dict + begin + 2 copy get{forall}def + 2 copy currentdict put + end + } + {pop} + ifelse + } + if + get + begin + {def} + forall + end + }bind def +end +end +%%EndResource +currentglobal true setglobal +%%BeginResource: procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%Copyright: Copyright 1987-2006 Adobe Systems Incorporated. +%%Version: 1.23 0 +systemdict/languagelevel known dup + {currentglobal false setglobal} + {false} +ifelse +exch +userdict/Adobe_CoolType_Utility 2 copy known + {2 copy get dup maxlength 27 add dict copy} + {27 dict} +ifelse put +Adobe_CoolType_Utility + begin + /@eexecStartData + def + /@recognizeCIDFont null def + /ct_Level2? exch def + /ct_Clone? 1183615869 internaldict dup + /CCRun known not + exch/eCCRun known not + ct_Level2? and or def +ct_Level2? + {globaldict begin currentglobal true setglobal} +if + /ct_AddStdCIDMap + ct_Level2? + {{ + mark + Adobe_CoolType_Utility/@recognizeCIDFont currentdict put + { + ((Hex)57 StartData + 0615 1e27 2c39 1c60 d8a8 cc31 fe2b f6e0 + 7aa3 e541 e21c 60d8 a8c9 c3d0 6d9e 1c60 + d8a8 c9c2 02d7 9a1c 60d8 a849 1c60 d8a8 + cc36 74f4 1144 b13b 77)0()/SubFileDecode filter cvx exec + } + stopped + { + cleartomark + Adobe_CoolType_Utility/@recognizeCIDFont get + countdictstack dup array dictstack + exch 1 sub -1 0 + { + 2 copy get 3 index eq + {1 index length exch sub 1 sub{end}repeat exit} + {pop} + ifelse + } + for + pop pop + Adobe_CoolType_Utility/@eexecStartData get eexec + } + {cleartomark} + ifelse + }} + {{ + Adobe_CoolType_Utility/@eexecStartData get eexec + }} + ifelse bind def +userdict/cid_extensions known +dup{cid_extensions/cid_UpdateDB known and}if + { + cid_extensions + begin + /cid_GetCIDSystemInfo + { + 1 index type/stringtype eq + {exch cvn exch} + if + cid_extensions + begin + dup load 2 index known + { + 2 copy + cid_GetStatusInfo + dup null ne + { + 1 index load + 3 index get + dup null eq + {pop pop cid_UpdateDB} + { + exch + 1 index/Created get eq + {exch pop exch pop} + {pop cid_UpdateDB} + ifelse + } + ifelse + } + {pop cid_UpdateDB} + ifelse + } + {cid_UpdateDB} + ifelse + end + }bind def + end + } +if +ct_Level2? + {end setglobal} +if + /ct_UseNativeCapability? systemdict/composefont known def + /ct_MakeOCF 35 dict def + /ct_Vars 25 dict def + /ct_GlyphDirProcs 6 dict def + /ct_BuildCharDict 15 dict dup + begin + /charcode 2 string def + /dst_string 1500 string def + /nullstring()def + /usewidths? true def + end def + ct_Level2?{setglobal}{pop}ifelse + ct_GlyphDirProcs + begin + /GetGlyphDirectory + { + systemdict/languagelevel known + {pop/CIDFont findresource/GlyphDirectory get} + { + 1 index/CIDFont findresource/GlyphDirectory + get dup type/dicttype eq + { + dup dup maxlength exch length sub 2 index lt + { + dup length 2 index add dict copy 2 index + /CIDFont findresource/GlyphDirectory 2 index put + } + if + } + if + exch pop exch pop + } + ifelse + + + }def + /+ + { + systemdict/languagelevel known + { + currentglobal false setglobal + 3 dict begin + /vm exch def + } + {1 dict begin} + ifelse + /$ exch def + systemdict/languagelevel known + { + vm setglobal + /gvm currentglobal def + $ gcheck setglobal + } + if + ?{$ begin}if + }def + /?{$ type/dicttype eq}def + /|{ + userdict/Adobe_CoolType_Data known + { + Adobe_CoolType_Data/AddWidths? known + { + currentdict Adobe_CoolType_Data + begin + begin + AddWidths? + { + Adobe_CoolType_Data/CC 3 index put + ?{def}{$ 3 1 roll put}ifelse + CC charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore + currentfont/Widths get exch CC exch put + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + end + end + } + {?{def}{$ 3 1 roll put}ifelse} ifelse + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + }def + /! + { + ?{end}if + systemdict/languagelevel known + {gvm setglobal} + if + end + }def + /:{string currentfile exch readstring pop}executeonly def + end + ct_MakeOCF + begin + /ct_cHexEncoding + [/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 + /c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 + /c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 + /c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B + /c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E + /c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 + /c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 + /c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 + /c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA + /cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD + /cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 + /cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 + /cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 + /cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def + /ct_CID_STR_SIZE 8000 def + /ct_mkocfStr100 100 string def + /ct_defaultFontMtx[.001 0 0 .001 0 0]def + /ct_1000Mtx[1000 0 0 1000 0 0]def + /ct_raise{exch cvx exch errordict exch get exec stop}bind def + /ct_reraise + {cvx $error/errorname get(Error: )print dup( )cvs print + errordict exch get exec stop + }bind def + /ct_cvnsi + { + 1 index add 1 sub 1 exch 0 4 1 roll + { + 2 index exch get + exch 8 bitshift + add + } + for + exch pop + }bind def + /ct_GetInterval + { + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /dst_index 0 def + dup dst_string length gt + {dup string/dst_string exch def} + if + 1 index ct_CID_STR_SIZE idiv + /arrayIndex exch def + 2 index arrayIndex get + 2 index + arrayIndex ct_CID_STR_SIZE mul + sub + { + dup 3 index add 2 index length le + { + 2 index getinterval + dst_string dst_index 2 index putinterval + length dst_index add/dst_index exch def + exit + } + { + 1 index length 1 index sub + dup 4 1 roll + getinterval + dst_string dst_index 2 index putinterval + pop dup dst_index add/dst_index exch def + sub + /arrayIndex arrayIndex 1 add def + 2 index dup length arrayIndex gt + {arrayIndex get} + { + pop + exit + } + ifelse + 0 + } + ifelse + } + loop + pop pop pop + dst_string 0 dst_index getinterval + end + }bind def + ct_Level2? + { + /ct_resourcestatus + currentglobal mark true setglobal + {/unknowninstancename/Category resourcestatus} + stopped + {cleartomark setglobal true} + {cleartomark currentglobal not exch setglobal} + ifelse + { + { + mark 3 1 roll/Category findresource + begin + ct_Vars/vm currentglobal put + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + ct_Vars/vm get setglobal + end + } + } + {{resourcestatus}} + ifelse bind def + /CIDFont/Category ct_resourcestatus + {pop pop} + { + currentglobal true setglobal + /Generic/Category findresource + dup length dict copy + dup/InstanceType/dicttype put + /CIDFont exch/Category defineresource pop + setglobal + } + ifelse + ct_UseNativeCapability? + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + if + } + { + /ct_Category 2 dict begin + /CIDFont 10 dict def + /ProcSet 2 dict def + currentdict + end + def + /defineresource + { + ct_Category 1 index 2 copy known + { + get + dup dup maxlength exch length eq + { + dup length 10 add dict copy + ct_Category 2 index 2 index put + } + if + 3 index 3 index put + pop exch pop + } + {pop pop/defineresource/undefined ct_raise} + ifelse + }bind def + /findresource + { + ct_Category 1 index 2 copy known + { + get + 2 index 2 copy known + {get 3 1 roll pop pop} + {pop pop/findresource/undefinedresource ct_raise} + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /resourcestatus + { + ct_Category 1 index 2 copy known + { + get + 2 index known + exch pop exch pop + { + 0 -1 true + } + { + false + } + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /ct_resourcestatus/resourcestatus load def + } + ifelse + /ct_CIDInit 2 dict + begin + /ct_cidfont_stream_init + { + { + dup(Binary)eq + { + pop + null + currentfile + ct_Level2? + { + {cid_BYTE_COUNT()/SubFileDecode filter} + stopped + {pop pop pop} + if + } + if + /readstring load + exit + } + if + dup(Hex)eq + { + pop + currentfile + ct_Level2? + { + {null exch/ASCIIHexDecode filter/readstring} + stopped + {pop exch pop(>)exch/readhexstring} + if + } + {(>)exch/readhexstring} + ifelse + load + exit + } + if + /StartData/typecheck ct_raise + } + loop + cid_BYTE_COUNT ct_CID_STR_SIZE le + { + 2 copy cid_BYTE_COUNT string exch exec + pop + 1 array dup + 3 -1 roll + 0 exch put + } + { + cid_BYTE_COUNT ct_CID_STR_SIZE div ceiling cvi + dup array exch 2 sub 0 exch 1 exch + { + 2 copy + 5 index + ct_CID_STR_SIZE + string + 6 index exec + pop + put + pop + } + for + 2 index + cid_BYTE_COUNT ct_CID_STR_SIZE mod string + 3 index exec + pop + 1 index exch + 1 index length 1 sub + exch put + } + ifelse + cid_CIDFONT exch/GlyphData exch put + 2 index null eq + { + pop pop pop + } + { + pop/readstring load + 1 string exch + { + 3 copy exec + pop + dup length 0 eq + { + pop pop pop pop pop + true exit + } + if + 4 index + eq + { + pop pop pop pop + false exit + } + if + } + loop + pop + } + ifelse + }bind def + /StartData + { + mark + { + currentdict + dup/FDArray get 0 get/FontMatrix get + 0 get 0.001 eq + { + dup/CDevProc known not + { + /CDevProc 1183615869 internaldict/stdCDevProc 2 copy known + {get} + { + pop pop + {pop pop pop pop pop 0 -1000 7 index 2 div 880} + } + ifelse + def + } + if + } + { + /CDevProc + { + pop pop pop pop pop + 0 + 1 cid_temp/cid_CIDFONT get + /FDArray get 0 get + /FontMatrix get 0 get div + 7 index 2 div + 1 index 0.88 mul + }def + } + ifelse + /cid_temp 15 dict def + cid_temp + begin + /cid_CIDFONT exch def + 3 copy pop + dup/cid_BYTE_COUNT exch def 0 gt + { + ct_cidfont_stream_init + FDArray + { + /Private get + dup/SubrMapOffset known + { + begin + /Subrs SubrCount array def + Subrs + SubrMapOffset + SubrCount + SDBytes + ct_Level2? + { + currentdict dup/SubrMapOffset undef + dup/SubrCount undef + /SDBytes undef + } + if + end + /cid_SD_BYTES exch def + /cid_SUBR_COUNT exch def + /cid_SUBR_MAP_OFFSET exch def + /cid_SUBRS exch def + cid_SUBR_COUNT 0 gt + { + GlyphData cid_SUBR_MAP_OFFSET cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + 0 1 cid_SUBR_COUNT 1 sub + { + exch 1 index + 1 add + cid_SD_BYTES mul cid_SUBR_MAP_OFFSET add + GlyphData exch cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + cid_SUBRS 4 2 roll + GlyphData exch + 4 index + 1 index + sub + ct_GetInterval + dup length string copy put + } + for + pop + } + if + } + {pop} + ifelse + } + forall + } + if + cleartomark pop pop + end + CIDFontName currentdict/CIDFont defineresource pop + end end + } + stopped + {cleartomark/StartData ct_reraise} + if + }bind def + currentdict + end def + /ct_saveCIDInit + { + /CIDInit/ProcSet ct_resourcestatus + {true} + {/CIDInitC/ProcSet ct_resourcestatus} + ifelse + { + pop pop + /CIDInit/ProcSet findresource + ct_UseNativeCapability? + {pop null} + {/CIDInit ct_CIDInit/ProcSet defineresource pop} + ifelse + } + {/CIDInit ct_CIDInit/ProcSet defineresource pop null} + ifelse + ct_Vars exch/ct_oldCIDInit exch put + }bind def + /ct_restoreCIDInit + { + ct_Vars/ct_oldCIDInit get dup null ne + {/CIDInit exch/ProcSet defineresource pop} + {pop} + ifelse + }bind def + /ct_BuildCharSetUp + { + 1 index + begin + CIDFont + begin + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /ct_dfCharCode exch def + /ct_dfDict exch def + CIDFirstByte ct_dfCharCode add + dup CIDCount ge + {pop 0} + if + /cid exch def + { + GlyphDirectory cid 2 copy known + {get} + {pop pop nullstring} + ifelse + dup length FDBytes sub 0 gt + { + dup + FDBytes 0 ne + {0 FDBytes ct_cvnsi} + {pop 0} + ifelse + /fdIndex exch def + dup length FDBytes sub FDBytes exch getinterval + /charstring exch def + exit + } + { + pop + cid 0 eq + {/charstring nullstring def exit} + if + /cid 0 def + } + ifelse + } + loop + }def + /ct_SetCacheDevice + { + 0 0 moveto + dup stringwidth + 3 -1 roll + true charpath + pathbbox + 0 -1000 + 7 index 2 div 880 + setcachedevice2 + 0 0 moveto + }def + /ct_CloneSetCacheProc + { + 1 eq + { + stringwidth + pop -2 div -880 + 0 -1000 setcharwidth + moveto + } + { + usewidths? + { + currentfont/Widths get cid + 2 copy known + {get exch pop aload pop} + {pop pop stringwidth} + ifelse + } + {stringwidth} + ifelse + setcharwidth + 0 0 moveto + } + ifelse + }def + /ct_Type3ShowCharString + { + ct_FDDict fdIndex 2 copy known + {get} + { + currentglobal 3 1 roll + 1 index gcheck setglobal + ct_Type1FontTemplate dup maxlength dict copy + begin + FDArray fdIndex get + dup/FontMatrix 2 copy known + {get} + {pop pop ct_defaultFontMtx} + ifelse + /FontMatrix exch dup length array copy def + /Private get + /Private exch def + /Widths rootfont/Widths get def + /CharStrings 1 dict dup/.notdef + dup length string copy put def + currentdict + end + /ct_Type1Font exch definefont + dup 5 1 roll put + setglobal + } + ifelse + dup/CharStrings get 1 index/Encoding get + ct_dfCharCode get charstring put + rootfont/WMode 2 copy known + {get} + {pop pop 0} + ifelse + exch + 1000 scalefont setfont + ct_str1 0 ct_dfCharCode put + ct_str1 exch ct_dfSetCacheProc + ct_SyntheticBold + { + currentpoint + ct_str1 show + newpath + moveto + ct_str1 true charpath + ct_StrokeWidth setlinewidth + stroke + } + {ct_str1 show} + ifelse + }def + /ct_Type4ShowCharString + { + ct_dfDict ct_dfCharCode charstring + FDArray fdIndex get + dup/FontMatrix get dup ct_defaultFontMtx ct_matrixeq not + {ct_1000Mtx matrix concatmatrix concat} + {pop} + ifelse + /Private get + Adobe_CoolType_Utility/ct_Level2? get not + { + ct_dfDict/Private + 3 -1 roll + {put} + 1183615869 internaldict/superexec get exec + } + if + 1183615869 internaldict + Adobe_CoolType_Utility/ct_Level2? get + {1 index} + {3 index/Private get mark 6 1 roll} + ifelse + dup/RunInt known + {/RunInt get} + {pop/CCRun} + ifelse + get exec + Adobe_CoolType_Utility/ct_Level2? get not + {cleartomark} + if + }bind def + /ct_BuildCharIncremental + { + { + Adobe_CoolType_Utility/ct_MakeOCF get begin + ct_BuildCharSetUp + ct_ShowCharString + } + stopped + {stop} + if + end + end + end + end + }bind def + /BaseFontNameStr(BF00)def + /ct_Type1FontTemplate 14 dict + begin + /FontType 1 def + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /PaintType 0 def + currentdict + end def + /BaseFontTemplate 11 dict + begin + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /BuildChar/ct_BuildCharIncremental load def + ct_Clone? + { + /FontType 3 def + /ct_ShowCharString/ct_Type3ShowCharString load def + /ct_dfSetCacheProc/ct_CloneSetCacheProc load def + /ct_SyntheticBold false def + /ct_StrokeWidth 1 def + } + { + /FontType 4 def + /Private 1 dict dup/lenIV 4 put def + /CharStrings 1 dict dup/.notdefput def + /PaintType 0 def + /ct_ShowCharString/ct_Type4ShowCharString load def + } + ifelse + /ct_str1 1 string def + currentdict + end def + /BaseFontDictSize BaseFontTemplate length 5 add def + /ct_matrixeq + { + true 0 1 5 + { + dup 4 index exch get exch 3 index exch get eq and + dup not + {exit} + if + } + for + exch pop exch pop + }bind def + /ct_makeocf + { + 15 dict + begin + exch/WMode exch def + exch/FontName exch def + /FontType 0 def + /FMapType 2 def + dup/FontMatrix known + {dup/FontMatrix get/FontMatrix exch def} + {/FontMatrix matrix def} + ifelse + /bfCount 1 index/CIDCount get 256 idiv 1 add + dup 256 gt{pop 256}if def + /Encoding + 256 array 0 1 bfCount 1 sub{2 copy dup put pop}for + bfCount 1 255{2 copy bfCount put pop}for + def + /FDepVector bfCount dup 256 lt{1 add}if array def + BaseFontTemplate BaseFontDictSize dict copy + begin + /CIDFont exch def + CIDFont/FontBBox known + {CIDFont/FontBBox get/FontBBox exch def} + if + CIDFont/CDevProc known + {CIDFont/CDevProc get/CDevProc exch def} + if + currentdict + end + BaseFontNameStr 3(0)putinterval + 0 1 bfCount dup 256 eq{1 sub}if + { + FDepVector exch + 2 index BaseFontDictSize dict copy + begin + dup/CIDFirstByte exch 256 mul def + FontType 3 eq + {/ct_FDDict 2 dict def} + if + currentdict + end + 1 index 16 + BaseFontNameStr 2 2 getinterval cvrs pop + BaseFontNameStr exch definefont + put + } + for + ct_Clone? + {/Widths 1 index/CIDFont get/GlyphDirectory get length dict def} + if + FontName + currentdict + end + definefont + ct_Clone? + { + gsave + dup 1000 scalefont setfont + ct_BuildCharDict + begin + /usewidths? false def + currentfont/Widths get + begin + exch/CIDFont get/GlyphDirectory get + { + pop + dup charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore def + } + forall + end + /usewidths? true def + end + grestore + } + {exch pop} + ifelse + }bind def + currentglobal true setglobal + /ct_ComposeFont + { + ct_UseNativeCapability? + { + 2 index/CMap ct_resourcestatus + {pop pop exch pop} + { + /CIDInit/ProcSet findresource + begin + 12 dict + begin + begincmap + /CMapName 3 index def + /CMapVersion 1.000 def + /CMapType 1 def + exch/WMode exch def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + { + dup length string copy + exch pop exch pop + } + {pop(Identity)} + ifelse + } + {pop (Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + 3 2 roll pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + setglobal + /ct_MakeIdentity + { + ct_UseNativeCapability? + { + 1 index/CMap ct_resourcestatus + {pop pop} + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CMapName 2 index def + /CMapVersion 1.000 def + /CMapType 1 def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + {dup length string copy exch pop exch pop} + {pop(Identity)} + ifelse + } + {pop(Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + exch pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + currentdict readonly pop + end + end +%%EndResource +setglobal +%%BeginResource: procset Adobe_CoolType_Utility_T42 1.0 0 +%%Copyright: Copyright 1987-2004 Adobe Systems Incorporated. +%%Version: 1.0 0 +userdict/ct_T42Dict 15 dict put +ct_T42Dict begin +/Is2015? +{ + version + cvi + 2015 + ge +}bind def +/AllocGlyphStorage +{ + Is2015? + { + pop + } + { + {string}forall + }ifelse +}bind def +/Type42DictBegin +{ +25 dict begin + /FontName exch def + /CharStrings 256 dict +begin + /.notdef 0 def + currentdict +end def + /Encoding exch def + /PaintType 0 def + /FontType 42 def + /FontMatrix[1 0 0 1 0 0]def + 4 array astore cvx/FontBBox exch def + /sfnts +}bind def +/Type42DictEnd +{ + currentdict dup/FontName get exch definefont end +ct_T42Dict exch +dup/FontName get exch put +}bind def +/RD{string currentfile exch readstring pop}executeonly def +/PrepFor2015 +{ +Is2015? +{ + /GlyphDirectory + 16 + dict def + sfnts 0 get + dup + 2 index + (glyx) + putinterval + 2 index + (locx) + putinterval + pop + pop +} +{ + pop + pop +}ifelse +}bind def +/AddT42Char +{ +Is2015? +{ + /GlyphDirectory get + begin + def + end + pop + pop +} +{ + /sfnts get + 4 index + get + 3 index + 2 index + putinterval + pop + pop + pop + pop +}ifelse +}bind def +/T0AddT42Mtx2 +{ +/CIDFont findresource/Metrics2 get begin def end +}bind def +end +%%EndResource +currentglobal true setglobal +%%BeginFile: MMFauxFont.prc +%%Copyright: Copyright 1987-2001 Adobe Systems Incorporated. +%%All Rights Reserved. +userdict /ct_EuroDict 10 dict put +ct_EuroDict begin +/ct_CopyFont +{ + { 1 index /FID ne {def} {pop pop} ifelse} forall +} def +/ct_GetGlyphOutline +{ + gsave + initmatrix newpath + exch findfont dup + length 1 add dict + begin + ct_CopyFont + /Encoding Encoding dup length array copy + dup + 4 -1 roll + 0 exch put + def + currentdict + end + /ct_EuroFont exch definefont + 1000 scalefont setfont + 0 0 moveto + [ + <00> stringwidth + <00> false charpath + pathbbox + [ + {/m cvx} {/l cvx} {/c cvx} {/cp cvx} pathforall + grestore + counttomark 8 add +} +def +/ct_MakeGlyphProc +{ + ] cvx + /ct_PSBuildGlyph cvx + ] cvx +} def +/ct_PSBuildGlyph +{ + gsave + 8 -1 roll pop + 7 1 roll + 6 -2 roll ct_FontMatrix transform 6 2 roll + 4 -2 roll ct_FontMatrix transform 4 2 roll + ct_FontMatrix transform + currentdict /PaintType 2 copy known {get 2 eq}{pop pop false} ifelse + dup 9 1 roll + { + currentdict /StrokeWidth 2 copy known + { + get 2 div + 0 ct_FontMatrix dtransform pop + 5 1 roll + 4 -1 roll 4 index sub + 4 1 roll + 3 -1 roll 4 index sub + 3 1 roll + exch 4 index add exch + 4 index add + 5 -1 roll pop + } + { + pop pop + } + ifelse + } + if + setcachedevice + ct_FontMatrix concat + ct_PSPathOps begin + exec + end + { + currentdict /StrokeWidth 2 copy known + { get } + { pop pop 0 } + ifelse + setlinewidth stroke + } + { + fill + } + ifelse + grestore +} def +/ct_PSPathOps 4 dict dup begin + /m {moveto} def + /l {lineto} def + /c {curveto} def + /cp {closepath} def +end +def +/ct_matrix1000 [1000 0 0 1000 0 0] def +/ct_AddGlyphProc +{ + 2 index findfont dup length 4 add dict + begin + ct_CopyFont + /CharStrings CharStrings dup length 1 add dict copy + begin + 3 1 roll def + currentdict + end + def + /ct_FontMatrix ct_matrix1000 FontMatrix matrix concatmatrix def + /ct_PSBuildGlyph /ct_PSBuildGlyph load def + /ct_PSPathOps /ct_PSPathOps load def + currentdict + end + definefont pop +} +def +systemdict /languagelevel known +{ + /ct_AddGlyphToPrinterFont { + 2 copy + ct_GetGlyphOutline 3 add -1 roll restore + ct_MakeGlyphProc + ct_AddGlyphProc + } def +} +{ + /ct_AddGlyphToPrinterFont { + pop pop restore + Adobe_CTFauxDict /$$$FONTNAME get + /Euro + Adobe_CTFauxDict /$$$SUBSTITUTEBASE get + ct_EuroDict exch get + ct_AddGlyphProc + } def +} ifelse +/AdobeSansMM +{ +556 0 24 -19 541 703 + { + 541 628 m + 510 669 442 703 354 703 c + 201 703 117 607 101 444 c + 50 444 l + 25 372 l + 97 372 l + 97 301 l + 49 301 l + 24 229 l + 103 229 l + 124 67 209 -19 350 -19 c + 435 -19 501 25 509 32 c + 509 131 l + 492 105 417 60 343 60 c + 267 60 204 127 197 229 c + 406 229 l + 430 301 l + 191 301 l + 191 372 l + 455 372 l + 479 444 l + 194 444 l + 201 531 245 624 348 624 c + 433 624 484 583 509 534 c + cp + 556 0 m + } +ct_PSBuildGlyph +} def +/AdobeSerifMM +{ +500 0 10 -12 484 692 + { + 347 298 m + 171 298 l + 170 310 170 322 170 335 c + 170 362 l + 362 362 l + 374 403 l + 172 403 l + 184 580 244 642 308 642 c + 380 642 434 574 457 457 c + 481 462 l + 474 691 l + 449 691 l + 433 670 429 657 410 657 c + 394 657 360 692 299 692 c + 204 692 94 604 73 403 c + 22 403 l + 10 362 l + 70 362 l + 69 352 69 341 69 330 c + 69 319 69 308 70 298 c + 22 298 l + 10 257 l + 73 257 l + 97 57 216 -12 295 -12 c + 364 -12 427 25 484 123 c + 458 142 l + 425 101 384 37 316 37 c + 256 37 189 84 173 257 c + 335 257 l + cp + 500 0 m + } +ct_PSBuildGlyph +} def +end +%%EndFile +setglobal +Adobe_CoolType_Core begin /$None SetSubstituteStrategy end +%%BeginResource: procset Adobe_AGM_Image 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Image 71 dict dup begin put +/Adobe_AGM_Image_Id/Adobe_AGM_Image_1.0_0 def +/nd{ + null def +}bind def +/AGMIMG_&image nd +/AGMIMG_&colorimage nd +/AGMIMG_&imagemask nd +/AGMIMG_mbuf()def +/AGMIMG_ybuf()def +/AGMIMG_kbuf()def +/AGMIMG_c 0 def +/AGMIMG_m 0 def +/AGMIMG_y 0 def +/AGMIMG_k 0 def +/AGMIMG_tmp nd +/AGMIMG_imagestring0 nd +/AGMIMG_imagestring1 nd +/AGMIMG_imagestring2 nd +/AGMIMG_imagestring3 nd +/AGMIMG_imagestring4 nd +/AGMIMG_imagestring5 nd +/AGMIMG_cnt nd +/AGMIMG_fsave nd +/AGMIMG_colorAry nd +/AGMIMG_override nd +/AGMIMG_name nd +/AGMIMG_maskSource nd +/AGMIMG_flushfilters nd +/invert_image_samples nd +/knockout_image_samples nd +/img nd +/sepimg nd +/devnimg nd +/idximg nd +/ds +{ + Adobe_AGM_Core begin + Adobe_AGM_Image begin + /AGMIMG_&image systemdict/image get def + /AGMIMG_&imagemask systemdict/imagemask get def + /colorimage where{ + pop + /AGMIMG_&colorimage/colorimage ldf + }if + end + end +}def +/ps +{ + Adobe_AGM_Image begin + /AGMIMG_ccimage_exists{/customcolorimage where + { + pop + /Adobe_AGM_OnHost_Seps where + { + pop false + }{ + /Adobe_AGM_InRip_Seps where + { + pop false + }{ + true + }ifelse + }ifelse + }{ + false + }ifelse + }bdf + level2{ + /invert_image_samples + { + Adobe_AGM_Image/AGMIMG_tmp Decode length ddf + /Decode[Decode 1 get Decode 0 get]def + }def + /knockout_image_samples + { + Operator/imagemask ne{ + /Decode[1 1]def + }if + }def + }{ + /invert_image_samples + { + {1 exch sub}currenttransfer addprocs settransfer + }def + /knockout_image_samples + { + {pop 1}currenttransfer addprocs settransfer + }def + }ifelse + /img/imageormask ldf + /sepimg/sep_imageormask ldf + /devnimg/devn_imageormask ldf + /idximg/indexed_imageormask ldf + /_ctype 7 def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall +}def +/pt +{ + end +}def +/dt +{ +}def +/AGMIMG_flushfilters +{ + dup type/arraytype ne + {1 array astore}if + dup 0 get currentfile ne + {dup 0 get flushfile}if + { + dup type/filetype eq + { + dup status 1 index currentfile ne and + {closefile} + {pop} + ifelse + }{pop}ifelse + }forall +}def +/AGMIMG_init_common +{ + currentdict/T known{/ImageType/T ldf currentdict/T undef}if + currentdict/W known{/Width/W ldf currentdict/W undef}if + currentdict/H known{/Height/H ldf currentdict/H undef}if + currentdict/M known{/ImageMatrix/M ldf currentdict/M undef}if + currentdict/BC known{/BitsPerComponent/BC ldf currentdict/BC undef}if + currentdict/D known{/Decode/D ldf currentdict/D undef}if + currentdict/DS known{/DataSource/DS ldf currentdict/DS undef}if + currentdict/O known{ + /Operator/O load 1 eq{ + /imagemask + }{ + /O load 2 eq{ + /image + }{ + /colorimage + }ifelse + }ifelse + def + currentdict/O undef + }if + currentdict/HSCI known{/HostSepColorImage/HSCI ldf currentdict/HSCI undef}if + currentdict/MD known{/MultipleDataSources/MD ldf currentdict/MD undef}if + currentdict/I known{/Interpolate/I ldf currentdict/I undef}if + currentdict/SI known{/SkipImageProc/SI ldf currentdict/SI undef}if + /DataSource load xcheck not{ + DataSource type/arraytype eq{ + DataSource 0 get type/filetype eq{ + /_Filters DataSource def + currentdict/MultipleDataSources known not{ + /DataSource DataSource dup length 1 sub get def + }if + }if + }if + currentdict/MultipleDataSources known not{ + /MultipleDataSources DataSource type/arraytype eq{ + DataSource length 1 gt + } + {false}ifelse def + }if + }if + /NComponents Decode length 2 div def + currentdict/SkipImageProc known not{/SkipImageProc{false}def}if +}bdf +/imageormask_sys +{ + begin + AGMIMG_init_common + save mark + level2{ + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + AGMIMG_&imagemask + }{ + BitsPerComponent ImageMatrix/DataSource load + AGMIMG_&image + }ifelse + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + cleartomark restore + end +}def +/overprint_plate +{ + currentoverprint{ + 0 get dup type/nametype eq{ + dup/DeviceGray eq{ + pop AGMCORE_black_plate not + }{ + /DeviceCMYK eq{ + AGMCORE_is_cmyk_sep not + }if + }ifelse + }{ + false exch + { + AGMOHS_sepink eq or + }forall + not + }ifelse + }{ + pop false + }ifelse +}def +/process_mask +{ + level3{ + dup begin + /ImageType 1 def + end + 4 dict begin + /DataDict exch def + /ImageType 3 def + /InterleaveType 3 def + /MaskDict 9 dict begin + /ImageType 1 def + /Width DataDict dup/MaskWidth known{/MaskWidth}{/Width}ifelse get def + /Height DataDict dup/MaskHeight known{/MaskHeight}{/Height}ifelse get def + /ImageMatrix[Width 0 0 Height neg 0 Height]def + /NComponents 1 def + /BitsPerComponent 1 def + /Decode DataDict dup/MaskD known{/MaskD}{[1 0]}ifelse get def + /DataSource Adobe_AGM_Core/AGMIMG_maskSource get def + currentdict end def + currentdict end + }if +}def +/use_mask +{ + dup/Mask known {dup/Mask get}{false}ifelse +}def +/imageormask +{ + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + } + { + save mark + level2 AGMCORE_host_sep not and{ + currentdict + Operator/imagemask eq DeviceN_PS2 not and{ + imagemask + }{ + AGMCORE_in_rip_sep currentoverprint and currentcolorspace 0 get/DeviceGray eq and{ + [/Separation/Black/DeviceGray{}]setcolorspace + /Decode[Decode 1 get Decode 0 get]def + }if + use_mask{ + process_mask image + }{ + DeviceN_NoneName DeviceN_PS2 Indexed_DeviceN level3 not and or or AGMCORE_in_rip_sep and + { + Names convert_to_process not{ + 2 dict begin + /imageDict xdf + /names_index 0 def + gsave + imageDict write_image_file{ + Names{ + dup(None)ne{ + [/Separation 3 -1 roll/DeviceGray{1 exch sub}]setcolorspace + Operator imageDict read_image_file + names_index 0 eq{true setoverprint}if + /names_index names_index 1 add def + }{ + pop + }ifelse + }forall + close_image_file + }if + grestore + end + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + /Adobe_AGM_OnHost_Seps where{ + pop imagemask + }{ + currentgray 1 ne{ + currentdict imageormask_sys + }{ + currentoverprint not{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }ifelse + }{ + BitsPerComponent ImageMatrix + MultipleDataSources{ + 0 1 NComponents 1 sub{ + DataSource exch get + }for + }{ + /DataSource load + }ifelse + Operator/colorimage eq{ + AGMCORE_host_sep{ + MultipleDataSources level2 or NComponents 4 eq and{ + AGMCORE_is_cmyk_sep{ + MultipleDataSources{ + /DataSource DataSource 0 get xcheck + { + [ + DataSource 0 get/exec cvx + DataSource 1 get/exec cvx + DataSource 2 get/exec cvx + DataSource 3 get/exec cvx + /AGMCORE_get_ink_data cvx + ]cvx + }{ + DataSource aload pop AGMCORE_get_ink_data + }ifelse def + }{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + /DataSource load + filter_cmyk 0()/SubFileDecode filter def + }ifelse + /Decode[Decode 0 get Decode 1 get]def + /MultipleDataSources false def + /NComponents 1 def + /Operator/image def + invert_image_samples + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }{ + MultipleDataSources NComponents AGMIMG_&colorimage + }ifelse + }{ + true NComponents colorimage + }ifelse + }{ + Operator/image eq{ + AGMCORE_host_sep{ + /DoImage true def + currentdict/HostSepColorImage known{HostSepColorImage not}{false}ifelse + { + AGMCORE_black_plate not Operator/imagemask ne and{ + /DoImage false def + currentdict ignoreimagedata + }if + }if + 1 AGMCORE_&setgray + DoImage + {currentdict imageormask_sys}if + }{ + use_mask{ + process_mask image + }{ + image + }ifelse + }ifelse + }{ + Operator/knockout eq{ + pop pop pop pop pop + currentcolorspace overprint_plate not{ + knockout_unitsq + }if + }if + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/sep_imageormask +{ + /sep_colorspace_dict AGMCORE_gget begin + CSA map_csa + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_avoid_L2_sep_space{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + }if + AGMIMG_ccimage_exists + MappedCSA 0 get/DeviceCMYK eq and + currentdict/Components known and + Name()ne and + Name(All)ne and + Operator/image eq and + AGMCORE_producing_seps not and + level2 not and + { + Width Height BitsPerComponent ImageMatrix + [ + /DataSource load/exec cvx + { + 0 1 2 index length 1 sub{ + 1 index exch + 2 copy get 255 xor put + }for + }/exec cvx + ]cvx bind + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Name findcmykcustomcolor + customcolorimage + }{ + AGMCORE_producing_seps not{ + level2{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne AGMCORE_avoid_L2_sep_space not and currentcolorspace 0 get/Separation ne and{ + [/Separation Name MappedCSA sep_proc_name exch dup 0 get 15 string cvs(/Device)anchorsearch{pop pop 0 get}{pop}ifelse exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + currentdict imageormask + }{ + currentdict + Operator/imagemask eq{ + imageormask + }{ + sep_imageormask_lev1 + }ifelse + }ifelse + }{ + AGMCORE_host_sep{ + Operator/knockout eq{ + currentdict/ImageMatrix get concat + knockout_unitsq + }{ + currentgray 1 ne{ + AGMCORE_is_cmyk_sep Name(All)ne and{ + level2{ + Name AGMCORE_IsSeparationAProcessColor + { + Operator/imagemask eq{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + /sep_tint AGMCORE_gget 1 exch sub AGMCORE_&setcolor + }if + }{ + invert_image_samples + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + [/Separation Name[/DeviceGray] + { + sep_colorspace_proc AGMCORE_get_ink_data + 1 exch sub + }bind + ]AGMCORE_&setcolorspace + /sep_tint AGMCORE_gget AGMCORE_&setcolor + }if + }ifelse + currentdict imageormask_sys + }{ + currentdict + Operator/imagemask eq{ + imageormask_sys + }{ + sep_image_lev1_sep + }ifelse + }ifelse + }{ + Operator/imagemask ne{ + invert_image_samples + }if + currentdict imageormask_sys + }ifelse + }{ + currentoverprint not Name(All)eq or Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + currentcolorspace 0 get/Separation ne{ + [/Separation Name MappedCSA sep_proc_name exch 0 get exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + }if + currentoverprint + MappedCSA 0 get/DeviceCMYK eq and + Name AGMCORE_IsSeparationAProcessColor not and + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{Name inRip_spot_has_ink not and}{false}ifelse + Name(All)ne and{ + imageormask_l2_overprint + }{ + currentdict imageormask + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end +}def +/colorSpaceElemCnt +{ + mark currentcolor counttomark dup 2 add 1 roll cleartomark +}bdf +/devn_sep_datasource +{ + 1 dict begin + /dataSource xdf + [ + 0 1 dataSource length 1 sub{ + dup currentdict/dataSource get/exch cvx/get cvx/exec cvx + /exch cvx names_index/ne cvx[/pop cvx]cvx/if cvx + }for + ]cvx bind + end +}bdf +/devn_alt_datasource +{ + 11 dict begin + /convProc xdf + /origcolorSpaceElemCnt xdf + /origMultipleDataSources xdf + /origBitsPerComponent xdf + /origDecode xdf + /origDataSource xdf + /dsCnt origMultipleDataSources{origDataSource length}{1}ifelse def + /DataSource origMultipleDataSources + { + [ + BitsPerComponent 8 idiv origDecode length 2 idiv mul string + 0 1 origDecode length 2 idiv 1 sub + { + dup 7 mul 1 add index exch dup BitsPerComponent 8 idiv mul exch + origDataSource exch get 0()/SubFileDecode filter + BitsPerComponent 8 idiv string/readstring cvx/pop cvx/putinterval cvx + }for + ]bind cvx + }{origDataSource}ifelse 0()/SubFileDecode filter def + [ + origcolorSpaceElemCnt string + 0 2 origDecode length 2 sub + { + dup origDecode exch get dup 3 -1 roll 1 add origDecode exch get exch sub 2 BitsPerComponent exp 1 sub div + 1 BitsPerComponent 8 idiv{DataSource/read cvx/not cvx{0}/if cvx/mul cvx}repeat/mul cvx/add cvx + }for + /convProc load/exec cvx + origcolorSpaceElemCnt 1 sub -1 0 + { + /dup cvx 2/add cvx/index cvx + 3 1/roll cvx/exch cvx 255/mul cvx/cvi cvx/put cvx + }for + ]bind cvx 0()/SubFileDecode filter + end +}bdf +/devn_imageormask +{ + /devicen_colorspace_dict AGMCORE_gget begin + CSA map_csa + 2 dict begin + dup + /srcDataStrs[3 -1 roll begin + AGMIMG_init_common + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi + { + dup 65535 gt{1 add 2 div cvi}{exit}ifelse + }loop + string + }repeat + end]def + /dstDataStr srcDataStrs 0 get length string def + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_producing_seps not{ + level3 not{ + Operator/imagemask ne{ + /DataSource[[ + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + colorSpaceElemCnt/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource 1/string cvx/readstring cvx/pop cvx]cvx colorSpaceElemCnt 1 sub{dup}repeat]def + /MultipleDataSources true def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + }if + }if + currentdict imageormask + }{ + AGMCORE_host_sep{ + Names convert_to_process{ + CSA get_csa_by_name 0 get/DeviceCMYK eq{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + 4/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + filter_cmyk 0()/SubFileDecode filter def + /MultipleDataSources false def + /Decode[1 0]def + /DeviceGray setcolorspace + currentdict imageormask_sys + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate{ + /DataSource + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + CSA get_csa_by_name 0 get/DeviceRGB eq{3}{1}ifelse/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + /MultipleDataSources false def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + currentdict imageormask_sys + }{ + gsave + knockout_unitsq + grestore + currentdict consumeimagedata + }ifelse + }ifelse + } + { + /devicen_colorspace_dict AGMCORE_gget/names_index known{ + Operator/imagemask ne{ + MultipleDataSources{ + /DataSource[DataSource devn_sep_datasource/exec cvx]cvx def + /MultipleDataSources false def + }{ + /DataSource/DataSource load dstDataStr srcDataStrs 0 get filter_devn def + }ifelse + invert_image_samples + }if + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + currentdict imageormask + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end + end +}def +/imageormask_l2_overprint +{ + currentdict + currentcmykcolor add add add 0 eq{ + currentdict consumeimagedata + }{ + level3{ + currentcmykcolor + /AGMIMG_k xdf + /AGMIMG_y xdf + /AGMIMG_m xdf + /AGMIMG_c xdf + Operator/imagemask eq{ + [/DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ]/DeviceCMYK{}]setcolorspace + AGMIMG_c 0 ne{AGMIMG_c}if + AGMIMG_m 0 ne{AGMIMG_m}if + AGMIMG_y 0 ne{AGMIMG_y}if + AGMIMG_k 0 ne{AGMIMG_k}if + setcolor + }{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + [/Indexed + [ + /DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ] + /DeviceCMYK{ + AGMIMG_k 0 eq{0}if + AGMIMG_y 0 eq{0 exch}if + AGMIMG_m 0 eq{0 3 1 roll}if + AGMIMG_c 0 eq{0 4 1 roll}if + } + ] + 255 + { + 255 div + mark exch + dup dup dup + AGMIMG_k 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 1 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_y 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 2 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_m 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 3 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_c 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + counttomark 1 add -1 roll pop + } + ]setcolorspace + }ifelse + imageormask_sys + }{ + write_image_file{ + currentcmykcolor + 0 ne{ + [/Separation/Black/DeviceGray{}]setcolorspace + gsave + /Black + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 1 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Yellow/DeviceGray{}]setcolorspace + gsave + /Yellow + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 2 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Magenta/DeviceGray{}]setcolorspace + gsave + /Magenta + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 3 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Cyan/DeviceGray{}]setcolorspace + gsave + /Cyan + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + close_image_file + }{ + imageormask + }ifelse + }ifelse + }ifelse +}def +/indexed_imageormask +{ + begin + AGMIMG_init_common + save mark + currentdict + AGMCORE_host_sep{ + Operator/knockout eq{ + /indexed_colorspace_dict AGMCORE_gget dup/CSA known{ + /CSA get get_csa_by_name + }{ + /Names get + }ifelse + overprint_plate not{ + knockout_unitsq + }if + }{ + Indexed_DeviceN{ + /devicen_colorspace_dict AGMCORE_gget dup/names_index known exch/Names get convert_to_process or{ + indexed_image_lev2_sep + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }{ + AGMCORE_is_cmyk_sep{ + Operator/imagemask eq{ + imageormask_sys + }{ + level2{ + indexed_image_lev2_sep + }{ + indexed_image_lev1_sep + }ifelse + }ifelse + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + level2{ + Indexed_DeviceN{ + /indexed_colorspace_dict AGMCORE_gget begin + }{ + /indexed_colorspace_dict AGMCORE_gget dup null ne + { + begin + currentdict/CSDBase known{CSDBase/CSD get_res/MappedCSA get}{CSA}ifelse + get_csa_by_name 0 get/DeviceCMYK eq ps_level 3 ge and ps_version 3015.007 lt and + AGMCORE_in_rip_sep and{ + [/Indexed[/DeviceN[/Cyan/Magenta/Yellow/Black]/DeviceCMYK{}]HiVal Lookup] + setcolorspace + }if + end + } + {pop}ifelse + }ifelse + imageormask + Indexed_DeviceN{ + end + }if + }{ + Operator/imagemask eq{ + imageormask + }{ + indexed_imageormask_lev1 + }ifelse + }ifelse + }ifelse + cleartomark restore + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/indexed_image_lev2_sep +{ + /indexed_colorspace_dict AGMCORE_gget begin + begin + Indexed_DeviceN not{ + currentcolorspace + dup 1/DeviceGray put + dup 3 + currentcolorspace 2 get 1 add string + 0 1 2 3 AGMCORE_get_ink_data 4 currentcolorspace 3 get length 1 sub + { + dup 4 idiv exch currentcolorspace 3 get exch get 255 exch sub 2 index 3 1 roll put + }for + put setcolorspace + }if + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + end end +}def + /OPIimage + { + dup type/dicttype ne{ + 10 dict begin + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /ImageType 1 def + /Decode[0 1 def] + currentdict + end + }if + dup begin + /NComponents 1 cdndf + /MultipleDataSources false cdndf + /SkipImageProc{false}cdndf + /Decode[ + 0 + currentcolorspace 0 get/Indexed eq{ + 2 BitsPerComponent exp 1 sub + }{ + 1 + }ifelse + ]cdndf + /Operator/image cdndf + end + /sep_colorspace_dict AGMCORE_gget null eq{ + imageormask + }{ + gsave + dup begin invert_image_samples end + sep_imageormask + grestore + }ifelse + }def +/cachemask_level2 +{ + 3 dict begin + /LZWEncode filter/WriteFilter xdf + /readBuffer 256 string def + /ReadFilter + currentfile + 0(%EndMask)/SubFileDecode filter + /ASCII85Decode filter + /RunLengthDecode filter + def + { + ReadFilter readBuffer readstring exch + WriteFilter exch writestring + not{exit}if + }loop + WriteFilter closefile + end +}def +/spot_alias +{ + /mapto_sep_imageormask + { + dup type/dicttype ne{ + 12 dict begin + /ImageType 1 def + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /MultipleDataSources false def + }{ + begin + }ifelse + /Decode[/customcolor_tint AGMCORE_gget 0]def + /Operator/image def + /SkipImageProc{false}def + currentdict + end + sep_imageormask + }bdf + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_colorAry xddf + /customcolor_tint AGMCORE_gget + << + /Name AGMIMG_colorAry 4 get + /CSA[/DeviceCMYK] + /TintMethod/Subtractive + /TintProc null + /MappedCSA null + /NComponents 4 + /Components[AGMIMG_colorAry aload pop pop] + >> + setsepcolorspace + mapto_sep_imageormask + }ndf + Adobe_AGM_Image/AGMIMG_&customcolorimage/customcolorimage load put + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_override false put + current_spot_alias{dup 4 get map_alias}{false}ifelse + { + false set_spot_alias + /customcolor_tint AGMCORE_gget exch setsepcolorspace + pop + mapto_sep_imageormask + true set_spot_alias + }{ + //Adobe_AGM_Image/AGMIMG_&customcolorimage get exec + }ifelse + }bdf +}def +/snap_to_device +{ + 6 dict begin + matrix currentmatrix + dup 0 get 0 eq 1 index 3 get 0 eq and + 1 index 1 get 0 eq 2 index 2 get 0 eq and or exch pop + { + 1 1 dtransform 0 gt exch 0 gt/AGMIMG_xSign? exch def/AGMIMG_ySign? exch def + 0 0 transform + AGMIMG_ySign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + AGMIMG_xSign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + itransform/AGMIMG_llY exch def/AGMIMG_llX exch def + 1 1 transform + AGMIMG_ySign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + AGMIMG_xSign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + itransform/AGMIMG_urY exch def/AGMIMG_urX exch def + [AGMIMG_urX AGMIMG_llX sub 0 0 AGMIMG_urY AGMIMG_llY sub AGMIMG_llX AGMIMG_llY]concat + }{ + }ifelse + end +}def +level2 not{ + /colorbuf + { + 0 1 2 index length 1 sub{ + dup 2 index exch get + 255 exch sub + 2 index + 3 1 roll + put + }for + }def + /tint_image_to_color + { + begin + Width Height BitsPerComponent ImageMatrix + /DataSource load + end + Adobe_AGM_Image begin + /AGMIMG_mbuf 0 string def + /AGMIMG_ybuf 0 string def + /AGMIMG_kbuf 0 string def + { + colorbuf dup length AGMIMG_mbuf length ne + { + dup length dup dup + /AGMIMG_mbuf exch string def + /AGMIMG_ybuf exch string def + /AGMIMG_kbuf exch string def + }if + dup AGMIMG_mbuf copy AGMIMG_ybuf copy AGMIMG_kbuf copy pop + } + addprocs + {AGMIMG_mbuf}{AGMIMG_ybuf}{AGMIMG_kbuf}true 4 colorimage + end + }def + /sep_imageormask_lev1 + { + begin + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + { + 255 mul round cvi GrayLookup exch get + }currenttransfer addprocs settransfer + currentdict imageormask + }{ + /sep_colorspace_dict AGMCORE_gget/Components known{ + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + AGMIMG_y 0.0 eq AGMIMG_m 0.0 eq and AGMIMG_c 0.0 eq and{ + {AGMIMG_k mul 1 exch sub}currenttransfer addprocs settransfer + currentdict imageormask + }{ + currentcolortransfer + {AGMIMG_k mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_y mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_m mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_c mul 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }{ + MappedCSA 0 get/DeviceGray eq{ + {255 mul round cvi ColorLookup exch get 0 get}currenttransfer addprocs settransfer + currentdict imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + /sep_image_lev1_sep + { + begin + /sep_colorspace_dict AGMCORE_gget/Components known{ + Components aload pop + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + {AGMIMG_c mul 1 exch sub} + {AGMIMG_m mul 1 exch sub} + {AGMIMG_y mul 1 exch sub} + {AGMIMG_k mul 1 exch sub} + }{ + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub} + }ifelse + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end + }def + /indexed_imageormask_lev1 + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + currentdict + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + {HiVal mul round cvi GrayLookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceGray eq{ + {HiVal mul round cvi Lookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 2 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 1 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi Lookup exch get HiVal div}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }ifelse + }ifelse + }ifelse + end end + }def + /indexed_image_lev1_sep + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub} + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end end + }def +}if +end +systemdict/setpacking known +{setpacking}if +%%EndResource +currentdict Adobe_AGM_Utils eq {end} if +%%EndProlog +%%BeginSetup +Adobe_AGM_Utils begin +2 2010 Adobe_AGM_Core/ds gx +Adobe_CoolType_Core/ds get exec +Adobe_AGM_Image/ds gx +[/NamespacePush pdfmark_5 +[/_objdef {Doc_Metadata} /type /stream /OBJ pdfmark_5 +[{Doc_Metadata} 9289 (% &end XMP packet& %) ReadBypdfmark_5_string + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + +% &end XMP packet& % + +[{Doc_Metadata} 2 dict begin /Type /Metadata def /Subtype /XML def currentdict end /PUT pdfmark_5 +[/Document 1 dict begin /Metadata {Doc_Metadata} def currentdict end /BDC pdfmark_5 +[/NamespacePop pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +%%EndSetup +%%Page: 1 1 +%%EndPageComments +%%BeginPageSetup +Adobe_AGM_Utils begin +Adobe_AGM_Core/ps gx +Adobe_AGM_Core/capture_mysetup gx +Adobe_AGM_Utils/capture_cpd gx +Adobe_CoolType_Core/ps get exec +Adobe_AGM_Image/ps gx +%%EndPageSetup +1 -1 scale 0 -22.2 translate +pgsv +[1 0 0 1 0 0 ]ct +gsave +np +gsave +0 0 mo +0 22.2 li +21.72 22.2 li +21.72 0 li +cp +clp +0 22.2 mo +21.72 22.2 li +21.72 0 li +0 0 li +cp +false sop +/0 +<< +/Name (Black) +/0 +[/DeviceCMYK] /CSA add_res +/CSA /0 get_csa_by_name +/MappedCSA /0 /CSA get_res +/TintMethod /Subtractive +/TintProc null +/NComponents 4 +/Components [ 0 0 0 1 ] +>> +/CSD add_res +1 /0 /CSD get_res sepcs +gsave +clp +[1 0 0 -1 0 22.2 ]ct +[21.72 0 0 22.2 0 -1.2815e-6 ]ct +snap_to_device +<< +/T 1 +/W 91 +/H 93 +/M[91 0 0 -93 0 93 ] +/BC 8 +/D[0 1 ] +/DS cf /ASCII85Decode fl /RunLengthDecode filter +/O 2 +>> +%%BeginBinary: 1 +sepimg +blI\A])_@$r;Wetr;Zfsar;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Ys\ +r;ZWor;ZcsrW)lrquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquH]q!<;orr;Ys\r;ZWo +r;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Z!]!!)rsqZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZp +quH]q!<;utr;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;ZZpm/[(aqZ-QoquHZpquHZp +r;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHcs +rr;iqr;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Z'_rW)lrqZ-QoquHZpquHZpr;ccqquHZpqZ-Qo +kQ(P\qZ-QoquHZpquHcsrr;osr;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Z`rlN$k_ +qZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-Wqs8Vusr;ZZpr;Z]qr;ZZpr;ZWor;Ys\r;ZWor;ZZp +r;ZZpr;Z]qr;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Z-aquHZpqZ-QoquHZpquHZp +r;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHZp +qZ-Qo!!)6`r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Ys\r;ZWo!<<#tquHZpquHZpr;ccqquHZpqZ-Qo +kQ(P\qZ-QoquHZpquHZpr;ccqrW)rur;ZWor;ZBho`4piqZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\ +qZ-QoquH`rs8Vusr;Z]qr;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZZp!!)rskQ(P\qZ-Qo +quHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZp +r;ZitrVucqr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;ZHjo)S^gqZ-QoquHZpquHZpr;ccq +quHZpqZ-QokQ(P\qZ-Qoqu?`srVucqr;Z]qr;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;Z`r +rW)lrkQ(P\qZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(V^s8Vrrr;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Ys\ +r;ZWor;ZZpr;ZZpr;Z`r!!)rsquHZpqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHZpqZ-Qop]0gar;ZWo +r;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Ys\r;ZWor;Z]q!!)rsquHZpr;ccqquHZpqZ-QokQ(P\qZ-QoquHZp +quHZpr;ccqquHZp!!)osr;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Ys\!<<#tqZ-QoquHZpquHZp +r;ccqquHZpqZ-QokQ(P\qZ-QoquHZpquHZp!!)uur;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZp +r;ZWor;ZTnmf<:cqZ-QoquHZpquHZpr;ccqquHZpqZ-QokQ(P\qZ-QorrE#ur;ZZpr;Z]qr;ZZpr;ZWo +r;Ys\r;ZWor;ZZpr;ZZpr;Z]qr;ZZprVlltqZ-QokQ(P\qZ-QoquHZpquHZpr;ccqquHZpqZ-Qokl:\` +r;ZWor;ZZpr;ZZpr;Z]qr;ZZpr;ZWor;Ys\r;ZWor;ZZpr;ZZprVlltr;ccqquHZpqZ-QokQ(P\qZ-Qo +quHZpquHZpr;ccqquHZpqZ-QoquF>/r;Y"AhZ3TSWrW2"rr9#!r;Y[TbQ.S@]E%F$r;Wetr;Z?g\H)R- +cN)c$r;Wetr;Wetr;YaVaoMA>^&[R$r;Wetr;ZEi[fH@+d/_o$r;Wl!rrDusklAU$r;X_9k5bG[WrW(t +quH-bJ,~> + +%%EndBinary +grestore +np +grestore +grestore +pgrs +%%PageTrailer +[ +[/CSA [/0 ]] +[/CSD [/0 ]] +] del_res +Adobe_AGM_Image/pt gx +Adobe_CoolType_Core/pt get exec +Adobe_AGM_Core/restore_mysetup gx +Adobe_AGM_Core/pt gx +currentdict Adobe_AGM_Utils eq {end} if +%%Trailer +Adobe_AGM_Utils begin +[/EMC pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +Adobe_AGM_Image/dt get exec +Adobe_CoolType_Core/dt get exec +Adobe_AGM_Core/dt get exec +%%Pages: 1 +%%DocumentNeededResources: +%%DocumentSuppliedResources: procset Adobe_AGM_Image 1.0 0 +%%+ procset Adobe_CoolType_Utility_T42 1.0 0 +%%+ procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%+ procset Adobe_CoolType_Core 2.31 0 +%%+ procset Adobe_AGM_Core 2.0 0 +%%+ procset Adobe_AGM_Utils 1.0 0 +%%DocumentNeededFeatures: +%%DocumentSuppliedFeatures: +%%DocumentCustomColors: +%%CMYKCustomColor: +%%RGBCustomColor: +%%EOF diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/colophon.pdf b/inst/rmarkdown/templates/opmi_article/skeleton/colophon.pdf new file mode 100755 index 000000000..ba7f0fd3c Binary files /dev/null and b/inst/rmarkdown/templates/opmi_article/skeleton/colophon.pdf differ diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/openaccess3.eps b/inst/rmarkdown/templates/opmi_article/skeleton/openaccess3.eps new file mode 100755 index 000000000..b2e9d6cff --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/openaccess3.eps @@ -0,0 +1,8204 @@ +%!PS-Adobe-3.1 EPSF-3.0 +%ADO_DSC_Encoding: Windows Roman +%%Title: openaccess3.pdf +%%Creator: Adobe Acrobat 11.0.13 +%%For: AmyH +%%CreationDate: 4/8/2016, 7:20:25 PM +%%BoundingBox: 0 0 12 13 +%%HiResBoundingBox: 0 0 11.5201 12.9601 +%%CropBox: 0 0 11.5201 12.9601 +%%LanguageLevel: 2 +%%DocumentNeededResources: (atend) +%%DocumentSuppliedResources: (atend) +%%DocumentNeededFeatures: (atend) +%%DocumentSuppliedFeatures: (atend) +%%DocumentData: Clean7Bit +%%Pages: (atend) +%%DocumentProcessColors: Cyan Magenta Yellow Black +%%DocumentCustomColors: (atend) +%%EndComments +%%BeginDefaults +%%ViewingOrientation: 1 0 0 1 +%%EndDefaults +%%BeginProlog +%%BeginResource: procset Adobe_AGM_Utils 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{currentpacking true setpacking}if +userdict/Adobe_AGM_Utils 75 dict dup begin put +/bdf +{bind def}bind def +/nd{null def}bdf +/xdf +{exch def}bdf +/ldf +{load def}bdf +/ddf +{put}bdf +/xddf +{3 -1 roll put}bdf +/xpt +{exch put}bdf +/ndf +{ + exch dup where{ + pop pop pop + }{ + xdf + }ifelse +}def +/cdndf +{ + exch dup currentdict exch known{ + pop pop + }{ + exch def + }ifelse +}def +/gx +{get exec}bdf +/ps_level + /languagelevel where{ + pop systemdict/languagelevel gx + }{ + 1 + }ifelse +def +/level2 + ps_level 2 ge +def +/level3 + ps_level 3 ge +def +/ps_version + {version cvr}stopped{-1}if +def +/set_gvm +{currentglobal exch setglobal}bdf +/reset_gvm +{setglobal}bdf +/makereadonlyarray +{ + /packedarray where{pop packedarray + }{ + array astore readonly}ifelse +}bdf +/map_reserved_ink_name +{ + dup type/stringtype eq{ + dup/Red eq{ + pop(_Red_) + }{ + dup/Green eq{ + pop(_Green_) + }{ + dup/Blue eq{ + pop(_Blue_) + }{ + dup()cvn eq{ + pop(Process) + }if + }ifelse + }ifelse + }ifelse + }if +}bdf +/AGMUTIL_GSTATE 22 dict def +/get_gstate +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_clr_spc currentcolorspace def + /AGMUTIL_GSTATE_clr_indx 0 def + /AGMUTIL_GSTATE_clr_comps 12 array def + mark currentcolor counttomark + {AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 3 -1 roll put + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 add def}repeat pop + /AGMUTIL_GSTATE_fnt rootfont def + /AGMUTIL_GSTATE_lw currentlinewidth def + /AGMUTIL_GSTATE_lc currentlinecap def + /AGMUTIL_GSTATE_lj currentlinejoin def + /AGMUTIL_GSTATE_ml currentmiterlimit def + currentdash/AGMUTIL_GSTATE_do xdf/AGMUTIL_GSTATE_da xdf + /AGMUTIL_GSTATE_sa currentstrokeadjust def + /AGMUTIL_GSTATE_clr_rnd currentcolorrendering def + /AGMUTIL_GSTATE_op currentoverprint def + /AGMUTIL_GSTATE_bg currentblackgeneration cvlit def + /AGMUTIL_GSTATE_ucr currentundercolorremoval cvlit def + currentcolortransfer cvlit/AGMUTIL_GSTATE_gy_xfer xdf cvlit/AGMUTIL_GSTATE_b_xfer xdf + cvlit/AGMUTIL_GSTATE_g_xfer xdf cvlit/AGMUTIL_GSTATE_r_xfer xdf + /AGMUTIL_GSTATE_ht currenthalftone def + /AGMUTIL_GSTATE_flt currentflat def + end +}def +/set_gstate +{ + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_clr_spc setcolorspace + AGMUTIL_GSTATE_clr_indx{AGMUTIL_GSTATE_clr_comps AGMUTIL_GSTATE_clr_indx 1 sub get + /AGMUTIL_GSTATE_clr_indx AGMUTIL_GSTATE_clr_indx 1 sub def}repeat setcolor + AGMUTIL_GSTATE_fnt setfont + AGMUTIL_GSTATE_lw setlinewidth + AGMUTIL_GSTATE_lc setlinecap + AGMUTIL_GSTATE_lj setlinejoin + AGMUTIL_GSTATE_ml setmiterlimit + AGMUTIL_GSTATE_da AGMUTIL_GSTATE_do setdash + AGMUTIL_GSTATE_sa setstrokeadjust + AGMUTIL_GSTATE_clr_rnd setcolorrendering + AGMUTIL_GSTATE_op setoverprint + AGMUTIL_GSTATE_bg cvx setblackgeneration + AGMUTIL_GSTATE_ucr cvx setundercolorremoval + AGMUTIL_GSTATE_r_xfer cvx AGMUTIL_GSTATE_g_xfer cvx AGMUTIL_GSTATE_b_xfer cvx + AGMUTIL_GSTATE_gy_xfer cvx setcolortransfer + AGMUTIL_GSTATE_ht/HalftoneType get dup 9 eq exch 100 eq or + { + currenthalftone/HalftoneType get AGMUTIL_GSTATE_ht/HalftoneType get ne + { + mark AGMUTIL_GSTATE_ht{sethalftone}stopped cleartomark + }if + }{ + AGMUTIL_GSTATE_ht sethalftone + }ifelse + AGMUTIL_GSTATE_flt setflat + end +}def +/get_gstate_and_matrix +{ + AGMUTIL_GSTATE begin + /AGMUTIL_GSTATE_ctm matrix currentmatrix def + end + get_gstate +}def +/set_gstate_and_matrix +{ + set_gstate + AGMUTIL_GSTATE begin + AGMUTIL_GSTATE_ctm setmatrix + end +}def +/AGMUTIL_str256 256 string def +/AGMUTIL_src256 256 string def +/AGMUTIL_dst64 64 string def +/AGMUTIL_srcLen nd +/AGMUTIL_ndx nd +/AGMUTIL_cpd nd +/capture_cpd{ + //Adobe_AGM_Utils/AGMUTIL_cpd currentpagedevice ddf +}def +/thold_halftone +{ + level3 + {sethalftone currenthalftone} + { + dup/HalftoneType get 3 eq + { + sethalftone currenthalftone + }{ + begin + Width Height mul{ + Thresholds read{pop}if + }repeat + end + currenthalftone + }ifelse + }ifelse +}def +/rdcmntline +{ + currentfile AGMUTIL_str256 readline pop + (%)anchorsearch{pop}if +}bdf +/filter_cmyk +{ + dup type/filetype ne{ + exch()/SubFileDecode filter + }{ + exch pop + } + ifelse + [ + exch + { + AGMUTIL_src256 readstring pop + dup length/AGMUTIL_srcLen exch def + /AGMUTIL_ndx 0 def + AGMCORE_plate_ndx 4 AGMUTIL_srcLen 1 sub{ + 1 index exch get + AGMUTIL_dst64 AGMUTIL_ndx 3 -1 roll put + /AGMUTIL_ndx AGMUTIL_ndx 1 add def + }for + pop + AGMUTIL_dst64 0 AGMUTIL_ndx getinterval + } + bind + /exec cvx + ]cvx +}bdf +/filter_indexed_devn +{ + cvi Names length mul names_index add Lookup exch get +}bdf +/filter_devn +{ + 4 dict begin + /srcStr xdf + /dstStr xdf + dup type/filetype ne{ + 0()/SubFileDecode filter + }if + [ + exch + [ + /devicen_colorspace_dict/AGMCORE_gget cvx/begin cvx + currentdict/srcStr get/readstring cvx/pop cvx + /dup cvx/length cvx 0/gt cvx[ + Adobe_AGM_Utils/AGMUTIL_ndx 0/ddf cvx + names_index Names length currentdict/srcStr get length 1 sub{ + 1/index cvx/exch cvx/get cvx + currentdict/dstStr get/AGMUTIL_ndx/load cvx 3 -1/roll cvx/put cvx + Adobe_AGM_Utils/AGMUTIL_ndx/AGMUTIL_ndx/load cvx 1/add cvx/ddf cvx + }for + currentdict/dstStr get 0/AGMUTIL_ndx/load cvx/getinterval cvx + ]cvx/if cvx + /end cvx + ]cvx + bind + /exec cvx + ]cvx + end +}bdf +/AGMUTIL_imagefile nd +/read_image_file +{ + AGMUTIL_imagefile 0 setfileposition + 10 dict begin + /imageDict xdf + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + /imbufIdx 0 def + /origDataSource imageDict/DataSource get def + /origMultipleDataSources imageDict/MultipleDataSources get def + /origDecode imageDict/Decode get def + /dstDataStr imageDict/Width get colorSpaceElemCnt mul string def + imageDict/MultipleDataSources known{MultipleDataSources}{false}ifelse + { + /imbufCnt imageDict/DataSource get length def + /imbufs imbufCnt array def + 0 1 imbufCnt 1 sub{ + /imbufIdx xdf + imbufs imbufIdx imbufLen string put + imageDict/DataSource get imbufIdx[AGMUTIL_imagefile imbufs imbufIdx get/readstring cvx/pop cvx]cvx put + }for + DeviceN_PS2{ + imageDict begin + /DataSource[DataSource/devn_sep_datasource cvx]cvx def + /MultipleDataSources false def + /Decode[0 1]def + end + }if + }{ + /imbuf imbufLen string def + Indexed_DeviceN level3 not and DeviceN_NoneName or{ + /srcDataStrs[imageDict begin + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi string + }repeat + end]def + imageDict begin + /DataSource[AGMUTIL_imagefile Decode BitsPerComponent false 1/filter_indexed_devn load dstDataStr srcDataStrs devn_alt_datasource/exec cvx]cvx def + /Decode[0 1]def + end + }{ + imageDict/DataSource[1 string dup 0 AGMUTIL_imagefile Decode length 2 idiv string/readstring cvx/pop cvx names_index/get cvx/put cvx]cvx put + imageDict/Decode[0 1]put + }ifelse + }ifelse + imageDict exch + load exec + imageDict/DataSource origDataSource put + imageDict/MultipleDataSources origMultipleDataSources put + imageDict/Decode origDecode put + end +}bdf +/write_image_file +{ + begin + {(AGMUTIL_imagefile)(w+)file}stopped{ + false + }{ + Adobe_AGM_Utils/AGMUTIL_imagefile xddf + 2 dict begin + /imbufLen Width BitsPerComponent mul 7 add 8 idiv def + MultipleDataSources{DataSource 0 get}{DataSource}ifelse type/filetype eq{ + /imbuf imbufLen string def + }if + 1 1 Height MultipleDataSources not{Decode length 2 idiv mul}if{ + pop + MultipleDataSources{ + 0 1 DataSource length 1 sub{ + DataSource type dup + /arraytype eq{ + pop DataSource exch gx + }{ + /filetype eq{ + DataSource exch get imbuf readstring pop + }{ + DataSource exch get + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }for + }{ + DataSource type dup + /arraytype eq{ + pop DataSource exec + }{ + /filetype eq{ + DataSource imbuf readstring pop + }{ + DataSource + }ifelse + }ifelse + AGMUTIL_imagefile exch writestring + }ifelse + }for + end + true + }ifelse + end +}bdf +/close_image_file +{ + AGMUTIL_imagefile closefile(AGMUTIL_imagefile)deletefile +}def +statusdict/product known userdict/AGMP_current_show known not and{ + /pstr statusdict/product get def + pstr(HP LaserJet 2200)eq + pstr(HP LaserJet 4000 Series)eq or + pstr(HP LaserJet 4050 Series )eq or + pstr(HP LaserJet 8000 Series)eq or + pstr(HP LaserJet 8100 Series)eq or + pstr(HP LaserJet 8150 Series)eq or + pstr(HP LaserJet 5000 Series)eq or + pstr(HP LaserJet 5100 Series)eq or + pstr(HP Color LaserJet 4500)eq or + pstr(HP Color LaserJet 4600)eq or + pstr(HP LaserJet 5Si)eq or + pstr(HP LaserJet 1200 Series)eq or + pstr(HP LaserJet 1300 Series)eq or + pstr(HP LaserJet 4100 Series)eq or + { + userdict/AGMP_current_show/show load put + userdict/show{ + currentcolorspace 0 get + /Pattern eq + {false charpath f} + {AGMP_current_show}ifelse + }put + }if + currentdict/pstr undef +}if +/consumeimagedata +{ + begin + AGMIMG_init_common + currentdict/MultipleDataSources known not + {/MultipleDataSources false def}if + MultipleDataSources + { + DataSource 0 get type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width cvi string def + 1 1 Height cvi + { + pop + 0 1 DataSource length 1 sub + { + DataSource exch get + flushbuffer readstring pop pop + }for + }for + end + }if + dup/arraytype eq exch/packedarraytype eq or DataSource 0 get xcheck and + { + Width Height mul cvi + { + 0 1 DataSource length 1 sub + {dup DataSource exch gx length exch 0 ne{pop}if}for + dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + } + { + /DataSource load type + dup/filetype eq + { + 1 dict begin + /flushbuffer Width Decode length 2 idiv mul cvi string def + 1 1 Height{pop DataSource flushbuffer readstring pop pop}for + end + }if + dup/arraytype eq exch/packedarraytype eq or/DataSource load xcheck and + { + Height Width BitsPerComponent mul 8 BitsPerComponent sub add 8 idiv Decode length 2 idiv mul mul + { + DataSource length dup 0 eq + {pop exit}if + sub dup 0 le + {exit}if + }loop + pop + }if + }ifelse + end +}bdf +/addprocs +{ + 2{/exec load}repeat + 3 1 roll + [5 1 roll]bind cvx +}def +/modify_halftone_xfer +{ + currenthalftone dup length dict copy begin + currentdict 2 index known{ + 1 index load dup length dict copy begin + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end def + currentdict end sethalftone + }{ + currentdict/TransferFunction known{ + /TransferFunction load + }{ + currenttransfer + }ifelse + addprocs/TransferFunction xdf + currentdict end sethalftone + pop + }ifelse +}def +/clonearray +{ + dup xcheck exch + dup length array exch + Adobe_AGM_Core/AGMCORE_tmp -1 ddf + { + Adobe_AGM_Core/AGMCORE_tmp 2 copy get 1 add ddf + dup type/dicttype eq + { + Adobe_AGM_Core/AGMCORE_tmp get + exch + clonedict + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + dup type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_tmp get exch + clonearray + Adobe_AGM_Core/AGMCORE_tmp 4 -1 roll ddf + }if + exch dup + Adobe_AGM_Core/AGMCORE_tmp get 4 -1 roll put + }forall + exch{cvx}if +}bdf +/clonedict +{ + dup length dict + begin + { + dup type/dicttype eq + {clonedict}if + dup type/arraytype eq + {clonearray}if + def + }forall + currentdict + end +}bdf +/DeviceN_PS2 +{ + /currentcolorspace AGMCORE_gget 0 get/DeviceN eq level3 not and +}bdf +/Indexed_DeviceN +{ + /indexed_colorspace_dict AGMCORE_gget dup null ne{ + dup/CSDBase known{ + /CSDBase get/CSD get_res/Names known + }{ + pop false + }ifelse + }{ + pop false + }ifelse +}bdf +/DeviceN_NoneName +{ + /Names where{ + pop + false Names + { + (None)eq or + }forall + }{ + false + }ifelse +}bdf +/DeviceN_PS2_inRip_seps +{ + /AGMCORE_in_rip_sep where + { + pop dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/DeviceN eq level3 not and AGMCORE_in_rip_sep and + { + /currentcolorspace exch AGMCORE_gput + false + }{ + true + }ifelse + }{ + true + }ifelse + }{ + true + }ifelse +}bdf +/base_colorspace_type +{ + dup type/arraytype eq{0 get}if +}bdf +/currentdistillerparams where{pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse +{ + /pdfmark_5{cleartomark}bind def +}{ + /pdfmark_5{pdfmark}bind def +}ifelse +/ReadBypdfmark_5 +{ + currentfile exch 0 exch/SubFileDecode filter + /currentdistillerparams where + {pop currentdistillerparams/CoreDistVersion get 5000 lt}{true}ifelse + {flushfile cleartomark} + {/PUT pdfmark}ifelse +}bdf +/ReadBypdfmark_5_string +{ + 2 dict begin + /makerString exch def string/tmpString exch def + { + currentfile tmpString readline not{pop exit}if + makerString anchorsearch + { + pop pop cleartomark exit + }{ + 3 copy/PUT pdfmark_5 pop 2 copy(\n)/PUT pdfmark_5 + }ifelse + }loop + end +}bdf +/xpdfm +{ + { + dup 0 get/Label eq + { + aload length[exch 1 add 1 roll/PAGELABEL + }{ + aload pop + [{ThisPage}<<5 -2 roll>>/PUT + }ifelse + pdfmark_5 + }forall +}bdf +/lmt{ + dup 2 index le{exch}if pop dup 2 index ge{exch}if pop +}bdf +/int{ + dup 2 index sub 3 index 5 index sub div 6 -2 roll sub mul exch pop add exch pop +}bdf +/ds{ + Adobe_AGM_Utils begin +}bdf +/dt{ + currentdict Adobe_AGM_Utils eq{ + end + }if +}bdf +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_AGM_Core 2.0 0 +%%Version: 2.0 0 +%%Copyright: Copyright(C)1997-2007 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Core 209 dict dup begin put +/Adobe_AGM_Core_Id/Adobe_AGM_Core_2.0_0 def +/AGMCORE_str256 256 string def +/AGMCORE_save nd +/AGMCORE_graphicsave nd +/AGMCORE_c 0 def +/AGMCORE_m 0 def +/AGMCORE_y 0 def +/AGMCORE_k 0 def +/AGMCORE_cmykbuf 4 array def +/AGMCORE_screen[currentscreen]cvx def +/AGMCORE_tmp 0 def +/AGMCORE_&setgray nd +/AGMCORE_&setcolor nd +/AGMCORE_&setcolorspace nd +/AGMCORE_&setcmykcolor nd +/AGMCORE_cyan_plate nd +/AGMCORE_magenta_plate nd +/AGMCORE_yellow_plate nd +/AGMCORE_black_plate nd +/AGMCORE_plate_ndx nd +/AGMCORE_get_ink_data nd +/AGMCORE_is_cmyk_sep nd +/AGMCORE_host_sep nd +/AGMCORE_avoid_L2_sep_space nd +/AGMCORE_distilling nd +/AGMCORE_composite_job nd +/AGMCORE_producing_seps nd +/AGMCORE_ps_level -1 def +/AGMCORE_ps_version -1 def +/AGMCORE_environ_ok nd +/AGMCORE_CSD_cache 0 dict def +/AGMCORE_currentoverprint false def +/AGMCORE_deltaX nd +/AGMCORE_deltaY nd +/AGMCORE_name nd +/AGMCORE_sep_special nd +/AGMCORE_err_strings 4 dict def +/AGMCORE_cur_err nd +/AGMCORE_current_spot_alias false def +/AGMCORE_inverting false def +/AGMCORE_feature_dictCount nd +/AGMCORE_feature_opCount nd +/AGMCORE_feature_ctm nd +/AGMCORE_ConvertToProcess false def +/AGMCORE_Default_CTM matrix def +/AGMCORE_Default_PageSize nd +/AGMCORE_Default_flatness nd +/AGMCORE_currentbg nd +/AGMCORE_currentucr nd +/AGMCORE_pattern_paint_type 0 def +/knockout_unitsq nd +currentglobal true setglobal +[/CSA/Gradient/Procedure] +{ + /Generic/Category findresource dup length dict copy/Category defineresource pop +}forall +setglobal +/AGMCORE_key_known +{ + where{ + /Adobe_AGM_Core_Id known + }{ + false + }ifelse +}ndf +/flushinput +{ + save + 2 dict begin + /CompareBuffer 3 -1 roll def + /readbuffer 256 string def + mark + { + currentfile readbuffer{readline}stopped + {cleartomark mark} + { + not + {pop exit} + if + CompareBuffer eq + {exit} + if + }ifelse + }loop + cleartomark + end + restore +}bdf +/getspotfunction +{ + AGMCORE_screen exch pop exch pop + dup type/dicttype eq{ + dup/HalftoneType get 1 eq{ + /SpotFunction get + }{ + dup/HalftoneType get 2 eq{ + /GraySpotFunction get + }{ + pop + { + abs exch abs 2 copy add 1 gt{ + 1 sub dup mul exch 1 sub dup mul add 1 sub + }{ + dup mul exch dup mul add 1 exch sub + }ifelse + }bind + }ifelse + }ifelse + }if +}def +/np +{newpath}bdf +/clp_npth +{clip np}def +/eoclp_npth +{eoclip np}def +/npth_clp +{np clip}def +/graphic_setup +{ + /AGMCORE_graphicsave save store + concat + 0 setgray + 0 setlinecap + 0 setlinejoin + 1 setlinewidth + []0 setdash + 10 setmiterlimit + np + false setoverprint + false setstrokeadjust + //Adobe_AGM_Core/spot_alias gx + /Adobe_AGM_Image where{ + pop + Adobe_AGM_Image/spot_alias 2 copy known{ + gx + }{ + pop pop + }ifelse + }if + /sep_colorspace_dict null AGMCORE_gput + 100 dict begin + /dictstackcount countdictstack def + /showpage{}def + mark +}def +/graphic_cleanup +{ + cleartomark + dictstackcount 1 countdictstack 1 sub{end}for + end + AGMCORE_graphicsave restore +}def +/compose_error_msg +{ + grestoreall initgraphics + /Helvetica findfont 10 scalefont setfont + /AGMCORE_deltaY 100 def + /AGMCORE_deltaX 310 def + clippath pathbbox np pop pop 36 add exch 36 add exch moveto + 0 AGMCORE_deltaY rlineto AGMCORE_deltaX 0 rlineto + 0 AGMCORE_deltaY neg rlineto AGMCORE_deltaX neg 0 rlineto closepath + 0 AGMCORE_&setgray + gsave 1 AGMCORE_&setgray fill grestore + 1 setlinewidth gsave stroke grestore + currentpoint AGMCORE_deltaY 15 sub add exch 8 add exch moveto + /AGMCORE_deltaY 12 def + /AGMCORE_tmp 0 def + AGMCORE_err_strings exch get + { + dup 32 eq + { + pop + AGMCORE_str256 0 AGMCORE_tmp getinterval + stringwidth pop currentpoint pop add AGMCORE_deltaX 28 add gt + { + currentpoint AGMCORE_deltaY sub exch pop + clippath pathbbox pop pop pop 44 add exch moveto + }if + AGMCORE_str256 0 AGMCORE_tmp getinterval show( )show + 0 1 AGMCORE_str256 length 1 sub + { + AGMCORE_str256 exch 0 put + }for + /AGMCORE_tmp 0 def + }{ + AGMCORE_str256 exch AGMCORE_tmp xpt + /AGMCORE_tmp AGMCORE_tmp 1 add def + }ifelse + }forall +}bdf +/AGMCORE_CMYKDeviceNColorspaces[ + [/Separation/None/DeviceCMYK{0 0 0}] + [/Separation(Black)/DeviceCMYK{0 0 0 4 -1 roll}bind] + [/Separation(Yellow)/DeviceCMYK{0 0 3 -1 roll 0}bind] + [/DeviceN[(Yellow)(Black)]/DeviceCMYK{0 0 4 2 roll}bind] + [/Separation(Magenta)/DeviceCMYK{0 exch 0 0}bind] + [/DeviceN[(Magenta)(Black)]/DeviceCMYK{0 3 1 roll 0 exch}bind] + [/DeviceN[(Magenta)(Yellow)]/DeviceCMYK{0 3 1 roll 0}bind] + [/DeviceN[(Magenta)(Yellow)(Black)]/DeviceCMYK{0 4 1 roll}bind] + [/Separation(Cyan)/DeviceCMYK{0 0 0}] + [/DeviceN[(Cyan)(Black)]/DeviceCMYK{0 0 3 -1 roll}bind] + [/DeviceN[(Cyan)(Yellow)]/DeviceCMYK{0 exch 0}bind] + [/DeviceN[(Cyan)(Yellow)(Black)]/DeviceCMYK{0 3 1 roll}bind] + [/DeviceN[(Cyan)(Magenta)]/DeviceCMYK{0 0}] + [/DeviceN[(Cyan)(Magenta)(Black)]/DeviceCMYK{0 exch}bind] + [/DeviceN[(Cyan)(Magenta)(Yellow)]/DeviceCMYK{0}] + [/DeviceCMYK] +]def +/ds{ + Adobe_AGM_Core begin + /currentdistillerparams where + { + pop currentdistillerparams/CoreDistVersion get 5000 lt + {<>setdistillerparams}if + }if + /AGMCORE_ps_version xdf + /AGMCORE_ps_level xdf + errordict/AGM_handleerror known not{ + errordict/AGM_handleerror errordict/handleerror get put + errordict/handleerror{ + Adobe_AGM_Core begin + $error/newerror get AGMCORE_cur_err null ne and{ + $error/newerror false put + AGMCORE_cur_err compose_error_msg + }if + $error/newerror true put + end + errordict/AGM_handleerror get exec + }bind put + }if + /AGMCORE_environ_ok + ps_level AGMCORE_ps_level ge + ps_version AGMCORE_ps_version ge and + AGMCORE_ps_level -1 eq or + def + AGMCORE_environ_ok not + {/AGMCORE_cur_err/AGMCORE_bad_environ def}if + /AGMCORE_&setgray systemdict/setgray get def + level2{ + /AGMCORE_&setcolor systemdict/setcolor get def + /AGMCORE_&setcolorspace systemdict/setcolorspace get def + }if + /AGMCORE_currentbg currentblackgeneration def + /AGMCORE_currentucr currentundercolorremoval def + /AGMCORE_Default_flatness currentflat def + /AGMCORE_distilling + /product where{ + pop systemdict/setdistillerparams known product(Adobe PostScript Parser)ne and + }{ + false + }ifelse + def + /AGMCORE_GSTATE AGMCORE_key_known not{ + /AGMCORE_GSTATE 21 dict def + /AGMCORE_tmpmatrix matrix def + /AGMCORE_gstack 32 array def + /AGMCORE_gstackptr 0 def + /AGMCORE_gstacksaveptr 0 def + /AGMCORE_gstackframekeys 14 def + /AGMCORE_&gsave/gsave ldf + /AGMCORE_&grestore/grestore ldf + /AGMCORE_&grestoreall/grestoreall ldf + /AGMCORE_&save/save ldf + /AGMCORE_&setoverprint/setoverprint ldf + /AGMCORE_gdictcopy{ + begin + {def}forall + end + }def + /AGMCORE_gput{ + AGMCORE_gstack AGMCORE_gstackptr get + 3 1 roll + put + }def + /AGMCORE_gget{ + AGMCORE_gstack AGMCORE_gstackptr get + exch + get + }def + /gsave{ + AGMCORE_&gsave + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /grestore{ + AGMCORE_&grestore + AGMCORE_gstackptr 1 sub + dup AGMCORE_gstacksaveptr lt{1 add}if + dup AGMCORE_gstack exch get dup/AGMCORE_currentoverprint known + {/AGMCORE_currentoverprint get setoverprint}{pop}ifelse + /AGMCORE_gstackptr exch store + }def + /grestoreall{ + AGMCORE_&grestoreall + /AGMCORE_gstackptr AGMCORE_gstacksaveptr store + }def + /save{ + AGMCORE_&save + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gstackptr 1 add + dup 32 ge{limitcheck}if + /AGMCORE_gstackptr exch store + /AGMCORE_gstacksaveptr AGMCORE_gstackptr store + AGMCORE_gstack AGMCORE_gstackptr get + AGMCORE_gdictcopy + }def + /setoverprint{ + dup/AGMCORE_currentoverprint exch AGMCORE_gput AGMCORE_&setoverprint + }def + 0 1 AGMCORE_gstack length 1 sub{ + AGMCORE_gstack exch AGMCORE_gstackframekeys dict put + }for + }if + level3/AGMCORE_&sysshfill AGMCORE_key_known not and + { + /AGMCORE_&sysshfill systemdict/shfill get def + /AGMCORE_&sysmakepattern systemdict/makepattern get def + /AGMCORE_&usrmakepattern/makepattern load def + }if + /currentcmykcolor[0 0 0 0]AGMCORE_gput + /currentstrokeadjust false AGMCORE_gput + /currentcolorspace[/DeviceGray]AGMCORE_gput + /sep_tint 0 AGMCORE_gput + /devicen_tints[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]AGMCORE_gput + /sep_colorspace_dict null AGMCORE_gput + /devicen_colorspace_dict null AGMCORE_gput + /indexed_colorspace_dict null AGMCORE_gput + /currentcolor_intent()AGMCORE_gput + /customcolor_tint 1 AGMCORE_gput + /absolute_colorimetric_crd null AGMCORE_gput + /relative_colorimetric_crd null AGMCORE_gput + /saturation_crd null AGMCORE_gput + /perceptual_crd null AGMCORE_gput + currentcolortransfer cvlit/AGMCore_gray_xfer xdf cvlit/AGMCore_b_xfer xdf + cvlit/AGMCore_g_xfer xdf cvlit/AGMCore_r_xfer xdf + << + /MaxPatternItem currentsystemparams/MaxPatternCache get + >> + setuserparams + end +}def +/ps +{ + /setcmykcolor where{ + pop + Adobe_AGM_Core/AGMCORE_&setcmykcolor/setcmykcolor load put + }if + Adobe_AGM_Core begin + /setcmykcolor + { + 4 copy AGMCORE_cmykbuf astore/currentcmykcolor exch AGMCORE_gput + 1 sub 4 1 roll + 3{ + 3 index add neg dup 0 lt{ + pop 0 + }if + 3 1 roll + }repeat + setrgbcolor pop + }ndf + /currentcmykcolor + { + /currentcmykcolor AGMCORE_gget aload pop + }ndf + /setoverprint + {pop}ndf + /currentoverprint + {false}ndf + /AGMCORE_cyan_plate 1 0 0 0 test_cmyk_color_plate def + /AGMCORE_magenta_plate 0 1 0 0 test_cmyk_color_plate def + /AGMCORE_yellow_plate 0 0 1 0 test_cmyk_color_plate def + /AGMCORE_black_plate 0 0 0 1 test_cmyk_color_plate def + /AGMCORE_plate_ndx + AGMCORE_cyan_plate{ + 0 + }{ + AGMCORE_magenta_plate{ + 1 + }{ + AGMCORE_yellow_plate{ + 2 + }{ + AGMCORE_black_plate{ + 3 + }{ + 4 + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_have_reported_unsupported_color_space false def + /AGMCORE_report_unsupported_color_space + { + AGMCORE_have_reported_unsupported_color_space false eq + { + (Warning: Job contains content that cannot be separated with on-host methods. This content appears on the black plate, and knocks out all other plates.)== + Adobe_AGM_Core/AGMCORE_have_reported_unsupported_color_space true ddf + }if + }def + /AGMCORE_composite_job + AGMCORE_cyan_plate AGMCORE_magenta_plate and AGMCORE_yellow_plate and AGMCORE_black_plate and def + /AGMCORE_in_rip_sep + /AGMCORE_in_rip_sep where{ + pop AGMCORE_in_rip_sep + }{ + AGMCORE_distilling + { + false + }{ + userdict/Adobe_AGM_OnHost_Seps known{ + false + }{ + level2{ + currentpagedevice/Separations 2 copy known{ + get + }{ + pop pop false + }ifelse + }{ + false + }ifelse + }ifelse + }ifelse + }ifelse + def + /AGMCORE_producing_seps AGMCORE_composite_job not AGMCORE_in_rip_sep or def + /AGMCORE_host_sep AGMCORE_producing_seps AGMCORE_in_rip_sep not and def + /AGM_preserve_spots + /AGM_preserve_spots where{ + pop AGM_preserve_spots + }{ + AGMCORE_distilling AGMCORE_producing_seps or + }ifelse + def + /AGM_is_distiller_preserving_spotimages + { + currentdistillerparams/PreserveOverprintSettings known + { + currentdistillerparams/PreserveOverprintSettings get + { + currentdistillerparams/ColorConversionStrategy known + { + currentdistillerparams/ColorConversionStrategy get + /sRGB ne + }{ + true + }ifelse + }{ + false + }ifelse + }{ + false + }ifelse + }def + /convert_spot_to_process where{pop}{ + /convert_spot_to_process + { + //Adobe_AGM_Core begin + dup map_alias{ + /Name get exch pop + }if + dup dup(None)eq exch(All)eq or + { + pop false + }{ + AGMCORE_host_sep + { + gsave + 1 0 0 0 setcmykcolor currentgray 1 exch sub + 0 1 0 0 setcmykcolor currentgray 1 exch sub + 0 0 1 0 setcmykcolor currentgray 1 exch sub + 0 0 0 1 setcmykcolor currentgray 1 exch sub + add add add 0 eq + { + pop false + }{ + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + }ifelse + grestore + }{ + AGMCORE_distilling + { + pop AGM_is_distiller_preserving_spotimages not + }{ + //Adobe_AGM_Core/AGMCORE_name xddf + false + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 0 eq + AGMUTIL_cpd/OverrideSeparations known and + { + AGMUTIL_cpd/OverrideSeparations get + { + /HqnSpots/ProcSet resourcestatus + { + pop pop pop true + }if + }if + }if + { + AGMCORE_name/HqnSpots/ProcSet findresource/TestSpot gx not + }{ + gsave + [/Separation AGMCORE_name/DeviceGray{}]AGMCORE_&setcolorspace + false + AGMUTIL_cpd/SeparationColorNames 2 copy known + { + get + {AGMCORE_name eq or}forall + not + }{ + pop pop pop true + }ifelse + grestore + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + }ifelse + /convert_to_process where{pop}{ + /convert_to_process + { + dup length 0 eq + { + pop false + }{ + AGMCORE_host_sep + { + dup true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process and}ifelse + } + forall + { + true exch + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + (Black)eq or and + }forall + not + }{pop false}ifelse + }{ + false exch + { + /PhotoshopDuotoneList where{pop false}{true}ifelse + { + dup(Cyan)eq exch + dup(Magenta)eq 3 -1 roll or exch + dup(Yellow)eq 3 -1 roll or exch + dup(Black)eq 3 -1 roll or + {pop} + {convert_spot_to_process or}ifelse + } + { + convert_spot_to_process or + } + ifelse + } + forall + }ifelse + }ifelse + }def + }ifelse + /AGMCORE_avoid_L2_sep_space + version cvr 2012 lt + level2 and + AGMCORE_producing_seps not and + def + /AGMCORE_is_cmyk_sep + AGMCORE_cyan_plate AGMCORE_magenta_plate or AGMCORE_yellow_plate or AGMCORE_black_plate or + def + /AGM_avoid_0_cmyk where{ + pop AGM_avoid_0_cmyk + }{ + AGM_preserve_spots + userdict/Adobe_AGM_OnHost_Seps known + userdict/Adobe_AGM_InRip_Seps known or + not and + }ifelse + { + /setcmykcolor[ + { + 4 copy add add add 0 eq currentoverprint and{ + pop 0.0005 + }if + }/exec cvx + /AGMCORE_&setcmykcolor load dup type/operatortype ne{ + /exec cvx + }if + ]cvx def + }if + /AGMCORE_IsSeparationAProcessColor + { + dup(Cyan)eq exch dup(Magenta)eq exch dup(Yellow)eq exch(Black)eq or or or + }def + AGMCORE_host_sep{ + /setcolortransfer + { + AGMCORE_cyan_plate{ + pop pop pop + }{ + AGMCORE_magenta_plate{ + 4 3 roll pop pop pop + }{ + AGMCORE_yellow_plate{ + 4 2 roll pop pop pop + }{ + 4 1 roll pop pop pop + }ifelse + }ifelse + }ifelse + settransfer + } + def + /AGMCORE_get_ink_data + AGMCORE_cyan_plate{ + {pop pop pop} + }{ + AGMCORE_magenta_plate{ + {4 3 roll pop pop pop} + }{ + AGMCORE_yellow_plate{ + {4 2 roll pop pop pop} + }{ + {4 1 roll pop pop pop} + }ifelse + }ifelse + }ifelse + def + /AGMCORE_RemoveProcessColorNames + { + 1 dict begin + /filtername + { + dup/Cyan eq 1 index(Cyan)eq or + {pop(_cyan_)}if + dup/Magenta eq 1 index(Magenta)eq or + {pop(_magenta_)}if + dup/Yellow eq 1 index(Yellow)eq or + {pop(_yellow_)}if + dup/Black eq 1 index(Black)eq or + {pop(_black_)}if + }def + dup type/arraytype eq + {[exch{filtername}forall]} + {filtername}ifelse + end + }def + level3{ + /AGMCORE_IsCurrentColor + { + dup AGMCORE_IsSeparationAProcessColor + { + AGMCORE_plate_ndx 0 eq + {dup(Cyan)eq exch/Cyan eq or}if + AGMCORE_plate_ndx 1 eq + {dup(Magenta)eq exch/Magenta eq or}if + AGMCORE_plate_ndx 2 eq + {dup(Yellow)eq exch/Yellow eq or}if + AGMCORE_plate_ndx 3 eq + {dup(Black)eq exch/Black eq or}if + AGMCORE_plate_ndx 4 eq + {pop false}if + }{ + gsave + false setoverprint + current_spot_alias false set_spot_alias + 1 1 1 1 6 -1 roll findcmykcustomcolor 1 setcustomcolor + set_spot_alias + currentgray 1 ne + grestore + }ifelse + }def + /AGMCORE_filter_functiondatasource + { + 5 dict begin + /data_in xdf + data_in type/stringtype eq + { + /ncomp xdf + /comp xdf + /string_out data_in length ncomp idiv string def + 0 ncomp data_in length 1 sub + { + string_out exch dup ncomp idiv exch data_in exch ncomp getinterval comp get 255 exch sub put + }for + string_out + }{ + string/string_in xdf + /string_out 1 string def + /component xdf + [ + data_in string_in/readstring cvx + [component/get cvx 255/exch cvx/sub cvx string_out/exch cvx 0/exch cvx/put cvx string_out]cvx + [/pop cvx()]cvx/ifelse cvx + ]cvx/ReusableStreamDecode filter + }ifelse + end + }def + /AGMCORE_separateShadingFunction + { + 2 dict begin + /paint? xdf + /channel xdf + dup type/dicttype eq + { + begin + FunctionType 0 eq + { + /DataSource channel Range length 2 idiv DataSource AGMCORE_filter_functiondatasource def + currentdict/Decode known + {/Decode Decode channel 2 mul 2 getinterval def}if + paint? not + {/Decode[1 1]def}if + }if + FunctionType 2 eq + { + paint? + { + /C0[C0 channel get 1 exch sub]def + /C1[C1 channel get 1 exch sub]def + }{ + /C0[1]def + /C1[1]def + }ifelse + }if + FunctionType 3 eq + { + /Functions[Functions{channel paint? AGMCORE_separateShadingFunction}forall]def + }if + currentdict/Range known + {/Range[0 1]def}if + currentdict + end}{ + channel get 0 paint? AGMCORE_separateShadingFunction + }ifelse + end + }def + /AGMCORE_separateShading + { + 3 -1 roll begin + currentdict/Function known + { + currentdict/Background known + {[1 index{Background 3 index get 1 exch sub}{1}ifelse]/Background xdf}if + Function 3 1 roll AGMCORE_separateShadingFunction/Function xdf + /ColorSpace[/DeviceGray]def + }{ + ColorSpace dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }{ + ColorSpace dup 1 get AGMCORE_RemoveProcessColorNames 1 exch put + }ifelse + ColorSpace 0 get/Separation eq + { + { + [1/exch cvx/sub cvx]cvx + }{ + [/pop cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll put + pop + }{ + { + [exch ColorSpace 1 get length 1 sub exch sub/index cvx 1/exch cvx/sub cvx ColorSpace 1 get length 1 add 1/roll cvx ColorSpace 1 get length{/pop cvx}repeat]cvx + }{ + pop[ColorSpace 1 get length{/pop cvx}repeat cvx 1]cvx + }ifelse + ColorSpace 3 3 -1 roll bind put + }ifelse + ColorSpace 2/DeviceGray put + }ifelse + end + }def + /AGMCORE_separateShadingDict + { + dup/ColorSpace get + dup type/arraytype ne + {[exch]}if + dup 0 get/DeviceCMYK eq + { + exch begin + currentdict + AGMCORE_cyan_plate + {0 true}if + AGMCORE_magenta_plate + {1 true}if + AGMCORE_yellow_plate + {2 true}if + AGMCORE_black_plate + {3 true}if + AGMCORE_plate_ndx 4 eq + {0 false}if + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + currentdict + end exch + }if + dup 0 get/Separation eq + { + exch begin + ColorSpace 1 get dup/None ne exch/All ne and + { + ColorSpace 1 get AGMCORE_IsCurrentColor AGMCORE_plate_ndx 4 lt and ColorSpace 1 get AGMCORE_IsSeparationAProcessColor not and + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /Separation + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + }if + }ifelse + }{ + currentdict ColorSpace 1 get AGMCORE_IsCurrentColor + 0 exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + }if + currentdict + end exch + }if + dup 0 get/DeviceN eq + { + exch begin + ColorSpace 1 get convert_to_process + { + ColorSpace 2 get dup type/arraytype eq{0 get}if/DeviceCMYK eq + { + /ColorSpace + [ + /DeviceN + ColorSpace 1 get + /DeviceGray + [ + ColorSpace 3 get/exec cvx + 4 AGMCORE_plate_ndx sub -1/roll cvx + 4 1/roll cvx + 3[/pop cvx]cvx/repeat cvx + 1/exch cvx/sub cvx + ]cvx + ]def + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + currentdict 0 false AGMCORE_separateShading + /ColorSpace[/DeviceGray]def + }if + }ifelse + }{ + currentdict + false -1 ColorSpace 1 get + { + AGMCORE_IsCurrentColor + { + 1 add + exch pop true exch exit + }if + 1 add + }forall + exch + dup not currentoverprint and + {/AGMCORE_ignoreshade true def}if + AGMCORE_separateShading + }ifelse + currentdict + end exch + }if + dup 0 get dup/DeviceCMYK eq exch dup/Separation eq exch/DeviceN eq or or not + { + exch begin + ColorSpace dup type/arraytype eq + {0 get}if + /DeviceGray ne + { + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate not + { + ColorSpace 0 get/CIEBasedA eq + { + /ColorSpace[/Separation/_ciebaseda_/DeviceGray{}]def + }if + ColorSpace 0 get dup/CIEBasedABC eq exch dup/CIEBasedDEF eq exch/DeviceRGB eq or or + { + /ColorSpace[/DeviceN[/_red_/_green_/_blue_]/DeviceRGB{}]def + }if + ColorSpace 0 get/CIEBasedDEFG eq + { + /ColorSpace[/DeviceN[/_cyan_/_magenta_/_yellow_/_black_]/DeviceCMYK{}]def + }if + currentdict 0 false AGMCORE_separateShading + }if + }if + currentdict + end exch + }if + pop + dup/AGMCORE_ignoreshade known + { + begin + /ColorSpace[/Separation(None)/DeviceGray{}]def + currentdict end + }if + }def + /shfill + { + AGMCORE_separateShadingDict + dup/AGMCORE_ignoreshade known + {pop} + {AGMCORE_&sysshfill}ifelse + }def + /makepattern + { + exch + dup/PatternType get 2 eq + { + clonedict + begin + /Shading Shading AGMCORE_separateShadingDict def + Shading/AGMCORE_ignoreshade known + currentdict end exch + {pop<>}if + exch AGMCORE_&sysmakepattern + }{ + exch AGMCORE_&usrmakepattern + }ifelse + }def + }if + }if + AGMCORE_in_rip_sep{ + /setcustomcolor + { + exch aload pop + dup 7 1 roll inRip_spot_has_ink not { + 4{4 index mul 4 1 roll} + repeat + /DeviceCMYK setcolorspace + 6 -2 roll pop pop + }{ + //Adobe_AGM_Core begin + /AGMCORE_k xdf/AGMCORE_y xdf/AGMCORE_m xdf/AGMCORE_c xdf + end + [/Separation 4 -1 roll/DeviceCMYK + {dup AGMCORE_c mul exch dup AGMCORE_m mul exch dup AGMCORE_y mul exch AGMCORE_k mul} + ] + setcolorspace + }ifelse + setcolor + }ndf + /setseparationgray + { + [/Separation(All)/DeviceGray{}]setcolorspace_opt + 1 exch sub setcolor + }ndf + }{ + /setseparationgray + { + AGMCORE_&setgray + }ndf + }ifelse + /findcmykcustomcolor + { + 5 makereadonlyarray + }ndf + /setcustomcolor + { + exch aload pop pop + 4{4 index mul 4 1 roll}repeat + setcmykcolor pop + }ndf + /has_color + /colorimage where{ + AGMCORE_producing_seps{ + pop true + }{ + systemdict eq + }ifelse + }{ + false + }ifelse + def + /map_index + { + 1 index mul exch getinterval{255 div}forall + }bdf + /map_indexed_devn + { + Lookup Names length 3 -1 roll cvi map_index + }bdf + /n_color_components + { + base_colorspace_type + dup/DeviceGray eq{ + pop 1 + }{ + /DeviceCMYK eq{ + 4 + }{ + 3 + }ifelse + }ifelse + }bdf + level2{ + /mo/moveto ldf + /li/lineto ldf + /cv/curveto ldf + /knockout_unitsq + { + 1 setgray + 0 0 1 1 rectfill + }def + level2/setcolorspace AGMCORE_key_known not and{ + /AGMCORE_&&&setcolorspace/setcolorspace ldf + /AGMCORE_ReplaceMappedColor + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + /AGMCORE_SpotAliasAry2 where{ + begin + dup 0 get dup/Separation eq + { + pop + dup length array copy + dup dup 1 get + current_spot_alias + { + dup map_alias + { + false set_spot_alias + dup 1 exch setsepcolorspace + true set_spot_alias + begin + /sep_colorspace_dict currentdict AGMCORE_gput + pop pop pop + [ + /Separation Name + CSA map_csa + MappedCSA + /sep_colorspace_proc load + ] + dup Name + end + }if + }if + map_reserved_ink_name 1 xpt + }{ + /DeviceN eq + { + dup length array copy + dup dup 1 get[ + exch{ + current_spot_alias{ + dup map_alias{ + /Name get exch pop + }if + }if + map_reserved_ink_name + }forall + ]1 xpt + }if + }ifelse + end + }if + }if + }def + /setcolorspace + { + dup type dup/arraytype eq exch/packedarraytype eq or + { + dup 0 get/Indexed eq + { + AGMCORE_distilling + { + /PhotoshopDuotoneList where + { + pop false + }{ + true + }ifelse + }{ + true + }ifelse + { + aload pop 3 -1 roll + AGMCORE_ReplaceMappedColor + 3 1 roll 4 array astore + }if + }{ + AGMCORE_ReplaceMappedColor + }ifelse + }if + DeviceN_PS2_inRip_seps{AGMCORE_&&&setcolorspace}if + }def + }if + }{ + /adj + { + currentstrokeadjust{ + transform + 0.25 sub round 0.25 add exch + 0.25 sub round 0.25 add exch + itransform + }if + }def + /mo{ + adj moveto + }def + /li{ + adj lineto + }def + /cv{ + 6 2 roll adj + 6 2 roll adj + 6 2 roll adj curveto + }def + /knockout_unitsq + { + 1 setgray + 8 8 1[8 0 0 8 0 0]{}image + }def + /currentstrokeadjust{ + /currentstrokeadjust AGMCORE_gget + }def + /setstrokeadjust{ + /currentstrokeadjust exch AGMCORE_gput + }def + /setcolorspace + { + /currentcolorspace exch AGMCORE_gput + }def + /currentcolorspace + { + /currentcolorspace AGMCORE_gget + }def + /setcolor_devicecolor + { + base_colorspace_type + dup/DeviceGray eq{ + pop setgray + }{ + /DeviceCMYK eq{ + setcmykcolor + }{ + setrgbcolor + }ifelse + }ifelse + }def + /setcolor + { + currentcolorspace 0 get + dup/DeviceGray ne{ + dup/DeviceCMYK ne{ + dup/DeviceRGB ne{ + dup/Separation eq{ + pop + currentcolorspace 3 gx + currentcolorspace 2 get + }{ + dup/Indexed eq{ + pop + currentcolorspace 3 get dup type/stringtype eq{ + currentcolorspace 1 get n_color_components + 3 -1 roll map_index + }{ + exec + }ifelse + currentcolorspace 1 get + }{ + /AGMCORE_cur_err/AGMCORE_invalid_color_space def + AGMCORE_invalid_color_space + }ifelse + }ifelse + }if + }if + }if + setcolor_devicecolor + }def + }ifelse + /sop/setoverprint ldf + /lw/setlinewidth ldf + /lc/setlinecap ldf + /lj/setlinejoin ldf + /ml/setmiterlimit ldf + /dsh/setdash ldf + /sadj/setstrokeadjust ldf + /gry/setgray ldf + /rgb/setrgbcolor ldf + /cmyk[ + /currentcolorspace[/DeviceCMYK]/AGMCORE_gput cvx + /setcmykcolor load dup type/operatortype ne{/exec cvx}if + ]cvx bdf + level3 AGMCORE_host_sep not and{ + /nzopmsc{ + 6 dict begin + /kk exch def + /yy exch def + /mm exch def + /cc exch def + /sum 0 def + cc 0 ne{/sum sum 2#1000 or def cc}if + mm 0 ne{/sum sum 2#0100 or def mm}if + yy 0 ne{/sum sum 2#0010 or def yy}if + kk 0 ne{/sum sum 2#0001 or def kk}if + AGMCORE_CMYKDeviceNColorspaces sum get setcolorspace + sum 0 eq{0}if + end + setcolor + }bdf + }{ + /nzopmsc/cmyk ldf + }ifelse + /sep/setsepcolor ldf + /devn/setdevicencolor ldf + /idx/setindexedcolor ldf + /colr/setcolor ldf + /csacrd/set_csa_crd ldf + /sepcs/setsepcolorspace ldf + /devncs/setdevicencolorspace ldf + /idxcs/setindexedcolorspace ldf + /cp/closepath ldf + /clp/clp_npth ldf + /eclp/eoclp_npth ldf + /f/fill ldf + /ef/eofill ldf + /@/stroke ldf + /nclp/npth_clp ldf + /gset/graphic_setup ldf + /gcln/graphic_cleanup ldf + /ct/concat ldf + /cf/currentfile ldf + /fl/filter ldf + /rs/readstring ldf + /AGMCORE_def_ht currenthalftone def + /clonedict Adobe_AGM_Utils begin/clonedict load end def + /clonearray Adobe_AGM_Utils begin/clonearray load end def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall + /getrampcolor + { + /indx exch def + 0 1 NumComp 1 sub + { + dup + Samples exch get + dup type/stringtype eq{indx get}if + exch + Scaling exch get aload pop + 3 1 roll + mul add + }for + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /sssetbackground{ + aload pop + ColorSpaceFamily/Separation eq + {sep} + { + ColorSpaceFamily/DeviceN eq + {devn}{setcolor}ifelse + }ifelse + }bdf + /RadialShade + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /r2 xdf + /c2y xdf + /c2x xdf + /r1 xdf + /c1y xdf + /c1x xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + c1x c2x eq + { + c1y c2y lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope c2y c1y sub c2x c1x sub div def + /theta slope 1 atan def + c2x c1x lt c2y c1y ge and{/theta theta 180 sub def}if + c2x c1x lt c2y c1y lt and{/theta theta 180 add def}if + }ifelse + gsave + clippath + c1x c1y translate + theta rotate + -90 rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax xdf + /xMax xdf + /yMin xdf + /xMin xdf + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + /max{2 copy gt{pop}{exch pop}ifelse}bdf + /min{2 copy lt{pop}{exch pop}ifelse}bdf + rampdict begin + 40 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + c1x c1y translate + theta rotate + -90 rotate + /c2y c1x c2x sub dup mul c1y c2y sub dup mul add sqrt def + /c1y 0 def + /c1x 0 def + /c2x 0 def + ext0 + { + 0 getrampcolor + c2y r2 add r1 sub 0.0001 lt + { + c1x c1y r1 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2y r1 add r2 le + { + c1x c1y r1 0 360 arc + fill + } + { + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r1 neg def + /p1y c1y def + /p2x r1 def + /p2y c1y def + p1x p1y moveto p2x p2y lineto p2x yMin lineto p1x yMin lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r1 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y p1x SS1 div neg def + /SS2 90 theta sub dup sin exch cos div def + /p2x r1 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y p2x SS2 div neg def + r1 r2 gt + { + /L1maxX p1x yMin p1y sub SS1 div add def + /L2maxX p2x yMin p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + c1x c2x sub dup mul + c1y c2y sub dup mul + add 0.5 exp + 0 dtransform + dup mul exch dup mul add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + /hires xdf + hires mul + /numpix xdf + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + /xInc c2x c1x sub numsteps div def + /yInc c2y c1y sub numsteps div def + /rInc r2 r1 sub numsteps div def + /cx c1x def + /cy c1y def + /radius r1 def + np + xInc 0 eq yInc 0 eq rInc 0 eq and and + { + 0 getrampcolor + cx cy radius 0 360 arc + stroke + NumSamples 1 sub getrampcolor + cx cy radius 72 hires div add 0 360 arc + 0 setlinewidth + stroke + }{ + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + cx cy radius 0 360 arc + /cx cx xInc add def + /cy cy yInc add def + /radius radius rInc add def + cx cy radius 360 0 arcn + eofill + rampIndxInc add + }repeat + pop + }ifelse + ext1 + { + c2y r2 add r1 lt + { + c2x c2y r2 0 360 arc + fill + }{ + c2y r1 add r2 sub 0.0001 le + { + c2x c2y r2 360 0 arcn + pathbbox + /aymax exch def + /axmax exch def + /aymin exch def + /axmin exch def + /bxMin xMin axmin min def + /byMin yMin aymin min def + /bxMax xMax axmax max def + /byMax yMax aymax max def + bxMin byMin moveto + bxMax byMin lineto + bxMax byMax lineto + bxMin byMax lineto + bxMin byMin lineto + eofill + }{ + c2x c2y r2 0 360 arc fill + r1 r2 eq + { + /p1x r2 neg def + /p1y c2y def + /p2x r2 def + /p2y c2y def + p1x p1y moveto p2x p2y lineto p2x yMax lineto p1x yMax lineto + fill + }{ + /AA r2 r1 sub c2y div def + AA -1 eq + {/theta 89.99 def} + {/theta AA 1 AA dup mul sub sqrt div 1 atan def} + ifelse + /SS1 90 theta add dup sin exch cos div def + /p1x r2 SS1 SS1 mul SS1 SS1 mul 1 add div sqrt mul neg def + /p1y c2y p1x SS1 div sub def + /SS2 90 theta sub dup sin exch cos div def + /p2x r2 SS2 SS2 mul SS2 SS2 mul 1 add div sqrt mul def + /p2y c2y p2x SS2 div sub def + r1 r2 lt + { + /L1maxX p1x yMax p1y sub SS1 div add def + /L2maxX p2x yMax p2y sub SS2 div add def + }{ + /L1maxX 0 def + /L2maxX 0 def + }ifelse + p1x p1y moveto p2x p2y lineto L2maxX L2maxX p2x sub SS2 mul p2y add lineto + L1maxX L1maxX p1x sub SS1 mul p1y add lineto + fill + }ifelse + }ifelse + }ifelse + }if + grestore + grestore + end + end + end + }ifelse + }bdf + /GenStrips + { + 40 dict begin + /ColorSpaceFamily xdf + /background xdf + /ext1 xdf + /ext0 xdf + /BBox xdf + /y2 xdf + /x2 xdf + /y1 xdf + /x1 xdf + /rampdict xdf + /setinkoverprint where{pop/setinkoverprint{pop}def}if + gsave + BBox length 0 gt + { + np + BBox 0 get BBox 1 get moveto + BBox 2 get BBox 0 get sub 0 rlineto + 0 BBox 3 get BBox 1 get sub rlineto + BBox 2 get BBox 0 get sub neg 0 rlineto + closepath + clip + np + }if + x1 x2 eq + { + y1 y2 lt{/theta 90 def}{/theta 270 def}ifelse + }{ + /slope y2 y1 sub x2 x1 sub div def + /theta slope 1 atan def + x2 x1 lt y2 y1 ge and{/theta theta 180 sub def}if + x2 x1 lt y2 y1 lt and{/theta theta 180 add def}if + } + ifelse + gsave + clippath + x1 y1 translate + theta rotate + {pathbbox}stopped + {0 0 0 0}if + /yMax exch def + /xMax exch def + /yMin exch def + /xMin exch def + grestore + xMax xMin eq yMax yMin eq or + { + grestore + end + }{ + rampdict begin + 20 dict begin + background length 0 gt{background sssetbackground gsave clippath fill grestore}if + gsave + x1 y1 translate + theta rotate + /xStart 0 def + /xEnd x2 x1 sub dup mul y2 y1 sub dup mul add 0.5 exp def + /ySpan yMax yMin sub def + /numsteps NumSamples def + /rampIndxInc 1 def + /subsampling false def + xStart 0 transform + xEnd 0 transform + 3 -1 roll + sub dup mul + 3 1 roll + sub dup mul + add 0.5 exp 72 div + 0 72 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 72 0 matrix defaultmatrix dtransform dup mul exch dup mul add sqrt + 1 index 1 index lt{exch}if pop + mul + /numpix xdf + numpix 0 ne + { + NumSamples numpix div 0.5 gt + { + /numsteps numpix 2 div round cvi dup 1 le{pop 2}if def + /rampIndxInc NumSamples 1 sub numsteps div def + /subsampling true def + }if + }if + ext0 + { + 0 getrampcolor + xMin xStart lt + { + xMin yMin xMin neg ySpan rectfill + }if + }if + /xInc xEnd xStart sub numsteps div def + /x xStart def + 0 + numsteps + { + dup + subsampling{round cvi}if + getrampcolor + x yMin xInc ySpan rectfill + /x x xInc add def + rampIndxInc add + }repeat + pop + ext1{ + xMax xEnd gt + { + xEnd yMin xMax xEnd sub ySpan rectfill + }if + }if + grestore + grestore + end + end + end + }ifelse + }bdf +}def +/pt +{ + end +}def +/dt{ +}def +/pgsv{ + //Adobe_AGM_Core/AGMCORE_save save put +}def +/pgrs{ + //Adobe_AGM_Core/AGMCORE_save get restore +}def +systemdict/findcolorrendering known{ + /findcolorrendering systemdict/findcolorrendering get def +}if +systemdict/setcolorrendering known{ + /setcolorrendering systemdict/setcolorrendering get def +}if +/test_cmyk_color_plate +{ + gsave + setcmykcolor currentgray 1 ne + grestore +}def +/inRip_spot_has_ink +{ + dup//Adobe_AGM_Core/AGMCORE_name xddf + convert_spot_to_process not +}def +/map255_to_range +{ + 1 index sub + 3 -1 roll 255 div mul add +}def +/set_csa_crd +{ + /sep_colorspace_dict null AGMCORE_gput + begin + CSA get_csa_by_name setcolorspace_opt + set_crd + end +} +def +/map_csa +{ + currentdict/MappedCSA known{MappedCSA null ne}{false}ifelse + {pop}{get_csa_by_name/MappedCSA xdf}ifelse +}def +/setsepcolor +{ + /sep_colorspace_dict AGMCORE_gget begin + dup/sep_tint exch AGMCORE_gput + TintProc + end +}def +/setdevicencolor +{ + /devicen_colorspace_dict AGMCORE_gget begin + Names length copy + Names length 1 sub -1 0 + { + /devicen_tints AGMCORE_gget 3 1 roll xpt + }for + TintProc + end +}def +/sep_colorspace_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + currentdict/Components known{ + Components aload pop + TintMethod/Lab eq{ + 2{AGMCORE_tmp mul NComponents 1 roll}repeat + LMax sub AGMCORE_tmp mul LMax add NComponents 1 roll + }{ + TintMethod/Subtractive eq{ + NComponents{ + AGMCORE_tmp mul NComponents 1 roll + }repeat + }{ + NComponents{ + 1 sub AGMCORE_tmp mul 1 add NComponents 1 roll + }repeat + }ifelse + }ifelse + }{ + ColorLookup AGMCORE_tmp ColorLookup length 1 sub mul round cvi get + aload pop + }ifelse + end +}def +/sep_colorspace_gray_proc +{ + /AGMCORE_tmp exch store + /sep_colorspace_dict AGMCORE_gget begin + GrayLookup AGMCORE_tmp GrayLookup length 1 sub mul round cvi get + end +}def +/sep_proc_name +{ + dup 0 get + dup/DeviceRGB eq exch/DeviceCMYK eq or level2 not and has_color not and{ + pop[/DeviceGray] + /sep_colorspace_gray_proc + }{ + /sep_colorspace_proc + }ifelse +}def +/setsepcolorspace +{ + current_spot_alias{ + dup begin + Name map_alias{ + exch pop + }if + end + }if + dup/sep_colorspace_dict exch AGMCORE_gput + begin + CSA map_csa + /AGMCORE_sep_special Name dup()eq exch(All)eq or store + AGMCORE_avoid_L2_sep_space{ + [/Indexed MappedCSA sep_proc_name 255 exch + {255 div}/exec cvx 3 -1 roll[4 1 roll load/exec cvx]cvx + ]setcolorspace_opt + /TintProc{ + 255 mul round cvi setcolor + }bdf + }{ + MappedCSA 0 get/DeviceCMYK eq + currentdict/Components known and + AGMCORE_sep_special not and{ + /TintProc[ + Components aload pop Name findcmykcustomcolor + /exch cvx/setcustomcolor cvx + ]cvx bdf + }{ + AGMCORE_host_sep Name(All)eq and{ + /TintProc{ + 1 exch sub setseparationgray + }bdf + }{ + AGMCORE_in_rip_sep MappedCSA 0 get/DeviceCMYK eq and + AGMCORE_host_sep or + Name()eq and{ + /TintProc[ + MappedCSA sep_proc_name exch 0 get/DeviceCMYK eq{ + cvx/setcmykcolor cvx + }{ + cvx/setgray cvx + }ifelse + ]cvx bdf + }{ + AGMCORE_producing_seps MappedCSA 0 get dup/DeviceCMYK eq exch/DeviceGray eq or and AGMCORE_sep_special not and{ + /TintProc[ + /dup cvx + MappedCSA sep_proc_name cvx exch + 0 get/DeviceGray eq{ + 1/exch cvx/sub cvx 0 0 0 4 -1/roll cvx + }if + /Name cvx/findcmykcustomcolor cvx/exch cvx + AGMCORE_host_sep{ + AGMCORE_is_cmyk_sep + /Name cvx + /AGMCORE_IsSeparationAProcessColor load/exec cvx + /not cvx/and cvx + }{ + Name inRip_spot_has_ink not + }ifelse + [ + /pop cvx 1 + ]cvx/if cvx + /setcustomcolor cvx + ]cvx bdf + }{ + /TintProc{setcolor}bdf + [/Separation Name MappedCSA sep_proc_name load]setcolorspace_opt + }ifelse + }ifelse + }ifelse + }ifelse + }ifelse + set_crd + setsepcolor + end +}def +/additive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 + 0 1 numarrays 1 sub + { + 1 exch add/index cvx + c1/get cvx/mul cvx + }for + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/subtractive_blend +{ + 3 dict begin + /numarrays xdf + /numcolors xdf + 0 1 numcolors 1 sub + { + /c1 xdf + 1 1 + 0 1 numarrays 1 sub + { + 1 3 3 -1 roll add/index cvx + c1/get cvx/sub cvx/mul cvx + }for + /sub cvx + numarrays 1 add 1/roll cvx + }for + numarrays[/pop cvx]cvx/repeat cvx + end +}def +/exec_tint_transform +{ + /TintProc[ + /TintTransform cvx/setcolor cvx + ]cvx bdf + MappedCSA setcolorspace_opt +}bdf +/devn_makecustomcolor +{ + 2 dict begin + /names_index xdf + /Names xdf + 1 1 1 1 Names names_index get findcmykcustomcolor + /devicen_tints AGMCORE_gget names_index get setcustomcolor + Names length{pop}repeat + end +}bdf +/setdevicencolorspace +{ + dup/AliasedColorants known{false}{true}ifelse + current_spot_alias and{ + 7 dict begin + /names_index 0 def + dup/names_len exch/Names get length def + /new_names names_len array def + /new_LookupTables names_len array def + /alias_cnt 0 def + dup/Names get + { + dup map_alias{ + exch pop + dup/ColorLookup known{ + dup begin + new_LookupTables names_index ColorLookup put + end + }{ + dup/Components known{ + dup begin + new_LookupTables names_index Components put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + new_names names_index 3 -1 roll/Name get put + /alias_cnt alias_cnt 1 add def + }{ + /name xdf + new_names names_index name put + dup/LookupTables known{ + dup begin + new_LookupTables names_index LookupTables names_index get put + end + }{ + dup begin + new_LookupTables names_index[null null null null]put + end + }ifelse + }ifelse + /names_index names_index 1 add def + }forall + alias_cnt 0 gt{ + /AliasedColorants true def + /lut_entry_len new_LookupTables 0 get dup length 256 ge{0 get length}{length}ifelse def + 0 1 names_len 1 sub{ + /names_index xdf + new_LookupTables names_index get dup length 256 ge{0 get length}{length}ifelse lut_entry_len ne{ + /AliasedColorants false def + exit + }{ + new_LookupTables names_index get 0 get null eq{ + dup/Names get names_index get/name xdf + name(Cyan)eq name(Magenta)eq name(Yellow)eq name(Black)eq + or or or not{ + /AliasedColorants false def + exit + }if + }if + }ifelse + }for + lut_entry_len 1 eq{ + /AliasedColorants false def + }if + AliasedColorants{ + dup begin + /Names new_names def + /LookupTables new_LookupTables def + /AliasedColorants true def + /NComponents lut_entry_len def + /TintMethod NComponents 4 eq{/Subtractive}{/Additive}ifelse def + /MappedCSA TintMethod/Additive eq{/DeviceRGB}{/DeviceCMYK}ifelse def + currentdict/TTTablesIdx known not{ + /TTTablesIdx -1 def + }if + end + }if + }if + end + }if + dup/devicen_colorspace_dict exch AGMCORE_gput + begin + currentdict/AliasedColorants known{ + AliasedColorants + }{ + false + }ifelse + dup not{ + CSA map_csa + }if + /TintTransform load type/nulltype eq or{ + /TintTransform[ + 0 1 Names length 1 sub + { + /TTTablesIdx TTTablesIdx 1 add def + dup LookupTables exch get dup 0 get null eq + { + 1 index + Names exch get + dup(Cyan)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0 0 0 + } + { + dup(Magenta)eq + { + pop exch + LookupTables length exch sub + /index cvx + 0/exch cvx 0 0 + }{ + (Yellow)eq + { + exch + LookupTables length exch sub + /index cvx + 0 0 3 -1/roll cvx 0 + }{ + exch + LookupTables length exch sub + /index cvx + 0 0 0 4 -1/roll cvx + }ifelse + }ifelse + }ifelse + 5 -1/roll cvx/astore cvx + }{ + dup length 1 sub + LookupTables length 4 -1 roll sub 1 add + /index cvx/mul cvx/round cvx/cvi cvx/get cvx + }ifelse + Names length TTTablesIdx add 1 add 1/roll cvx + }for + Names length[/pop cvx]cvx/repeat cvx + NComponents Names length + TintMethod/Subtractive eq + { + subtractive_blend + }{ + additive_blend + }ifelse + ]cvx bdf + }if + AGMCORE_host_sep{ + Names convert_to_process{ + exec_tint_transform + } + { + currentdict/AliasedColorants known{ + AliasedColorants not + }{ + false + }ifelse + 5 dict begin + /AvoidAliasedColorants xdf + /painted? false def + /names_index 0 def + /names_len Names length def + AvoidAliasedColorants{ + /currentspotalias current_spot_alias def + false set_spot_alias + }if + Names{ + AGMCORE_is_cmyk_sep{ + dup(Cyan)eq AGMCORE_cyan_plate and exch + dup(Magenta)eq AGMCORE_magenta_plate and exch + dup(Yellow)eq AGMCORE_yellow_plate and exch + (Black)eq AGMCORE_black_plate and or or or{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + }if + painted?{exit}if + }{ + 0 0 0 0 5 -1 roll findcmykcustomcolor 1 setcustomcolor currentgray 0 eq{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + Names names_index/devn_makecustomcolor cvx + ]cvx ddf + /painted? true def + exit + }if + }ifelse + /names_index names_index 1 add def + }forall + AvoidAliasedColorants{ + currentspotalias set_spot_alias + }if + painted?{ + /devicen_colorspace_dict AGMCORE_gget/names_index names_index put + }{ + /devicen_colorspace_dict AGMCORE_gget/TintProc[ + names_len[/pop cvx]cvx/repeat cvx 1/setseparationgray cvx + 0 0 0 0/setcmykcolor cvx + ]cvx ddf + }ifelse + end + }ifelse + } + { + AGMCORE_in_rip_sep{ + Names convert_to_process not + }{ + level3 + }ifelse + { + [/DeviceN Names MappedCSA/TintTransform load]setcolorspace_opt + /TintProc level3 not AGMCORE_in_rip_sep and{ + [ + Names/length cvx[/pop cvx]cvx/repeat cvx + ]cvx bdf + }{ + {setcolor}bdf + }ifelse + }{ + exec_tint_transform + }ifelse + }ifelse + set_crd + /AliasedColorants false def + end +}def +/setindexedcolorspace +{ + dup/indexed_colorspace_dict exch AGMCORE_gput + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + currentdict devncs + }{ + 1 currentdict sepcs + }ifelse + AGMCORE_host_sep{ + 4 dict begin + /compCnt/Names where{pop Names length}{1}ifelse def + /NewLookup HiVal 1 add string def + 0 1 HiVal{ + /tableIndex xdf + Lookup dup type/stringtype eq{ + compCnt tableIndex map_index + }{ + exec + }ifelse + /Names where{ + pop setdevicencolor + }{ + setsepcolor + }ifelse + currentgray + tableIndex exch + 255 mul cvi + NewLookup 3 1 roll put + }for + [/Indexed currentcolorspace HiVal NewLookup]setcolorspace_opt + end + }{ + level3 + { + currentdict/Names known{ + [/Indexed[/DeviceN Names MappedCSA/TintTransform load]HiVal Lookup]setcolorspace_opt + }{ + [/Indexed[/Separation Name MappedCSA sep_proc_name load]HiVal Lookup]setcolorspace_opt + }ifelse + }{ + [/Indexed MappedCSA HiVal + [ + currentdict/Names known{ + Lookup dup type/stringtype eq + {/exch cvx CSDBase/CSD get_res/Names get length dup/mul cvx exch/getinterval cvx{255 div}/forall cvx} + {/exec cvx}ifelse + /TintTransform load/exec cvx + }{ + Lookup dup type/stringtype eq + {/exch cvx/get cvx 255/div cvx} + {/exec cvx}ifelse + CSDBase/CSD get_res/MappedCSA get sep_proc_name exch pop/load cvx/exec cvx + }ifelse + ]cvx + ]setcolorspace_opt + }ifelse + }ifelse + end + set_crd + } + { + CSA map_csa + AGMCORE_host_sep level2 not and{ + 0 0 0 0 setcmykcolor + }{ + [/Indexed MappedCSA + level2 not has_color not and{ + dup 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or{ + pop[/DeviceGray] + }if + HiVal GrayLookup + }{ + HiVal + currentdict/RangeArray known{ + { + /indexed_colorspace_dict AGMCORE_gget begin + Lookup exch + dup HiVal gt{ + pop HiVal + }if + NComponents mul NComponents getinterval{}forall + NComponents 1 sub -1 0{ + RangeArray exch 2 mul 2 getinterval aload pop map255_to_range + NComponents 1 roll + }for + end + }bind + }{ + Lookup + }ifelse + }ifelse + ]setcolorspace_opt + set_crd + }ifelse + }ifelse + end +}def +/setindexedcolor +{ + AGMCORE_host_sep{ + /indexed_colorspace_dict AGMCORE_gget + begin + currentdict/CSDBase known{ + CSDBase/CSD get_res begin + currentdict/Names known{ + map_indexed_devn + devn + } + { + Lookup 1 3 -1 roll map_index + sep + }ifelse + end + }{ + Lookup MappedCSA/DeviceCMYK eq{4}{1}ifelse 3 -1 roll + map_index + MappedCSA/DeviceCMYK eq{setcmykcolor}{setgray}ifelse + }ifelse + end + }{ + level3 not AGMCORE_in_rip_sep and/indexed_colorspace_dict AGMCORE_gget/CSDBase known and{ + /indexed_colorspace_dict AGMCORE_gget/CSDBase get/CSD get_res begin + map_indexed_devn + devn + end + } + { + setcolor + }ifelse + }ifelse +}def +/ignoreimagedata +{ + currentoverprint not{ + gsave + dup clonedict begin + 1 setgray + /Decode[0 1]def + /DataSourcedef + /MultipleDataSources false def + /BitsPerComponent 8 def + currentdict end + systemdict/image gx + grestore + }if + consumeimagedata +}def +/add_res +{ + dup/CSD eq{ + pop + //Adobe_AGM_Core begin + /AGMCORE_CSD_cache load 3 1 roll put + end + }{ + defineresource pop + }ifelse +}def +/del_res +{ + { + aload pop exch + dup/CSD eq{ + pop + {//Adobe_AGM_Core/AGMCORE_CSD_cache get exch undef}forall + }{ + exch + {1 index undefineresource}forall + pop + }ifelse + }forall +}def +/get_res +{ + dup/CSD eq{ + pop + dup type dup/nametype eq exch/stringtype eq or{ + AGMCORE_CSD_cache exch get + }if + }{ + findresource + }ifelse +}def +/get_csa_by_name +{ + dup type dup/nametype eq exch/stringtype eq or{ + /CSA get_res + }if +}def +/paintproc_buf_init +{ + /count get 0 0 put +}def +/paintproc_buf_next +{ + dup/count get dup 0 get + dup 3 1 roll + 1 add 0 xpt + get +}def +/cachepaintproc_compress +{ + 5 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + /string_size 16000 def + /readbuffer string_size string def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + /LZWFilter + { + exch + dup length 0 eq{ + pop + }{ + ppdict dup length 1 sub 3 -1 roll put + }ifelse + {string_size}{0}ifelse string + }/LZWEncode filter def + { + ReadFilter readbuffer readstring + exch LZWFilter exch writestring + not{exit}if + }loop + LZWFilter closefile + ppdict + end +}def +/cachepaintproc +{ + 2 dict begin + currentfile exch 0 exch/SubFileDecode filter/ReadFilter exch def + /ppdict 20 dict def + currentglobal true setglobal + ppdict 1 array dup 0 1 put/count xpt + setglobal + { + ReadFilter 16000 string readstring exch + ppdict dup length 1 sub 3 -1 roll put + not{exit}if + }loop + ppdict dup dup length 1 sub()put + end +}def +/make_pattern +{ + exch clonedict exch + dup matrix currentmatrix matrix concatmatrix 0 0 3 2 roll itransform + exch 3 index/XStep get 1 index exch 2 copy div cvi mul sub sub + exch 3 index/YStep get 1 index exch 2 copy div cvi mul sub sub + matrix translate exch matrix concatmatrix + 1 index begin + BBox 0 get XStep div cvi XStep mul/xshift exch neg def + BBox 1 get YStep div cvi YStep mul/yshift exch neg def + BBox 0 get xshift add + BBox 1 get yshift add + BBox 2 get xshift add + BBox 3 get yshift add + 4 array astore + /BBox exch def + [xshift yshift/translate load null/exec load]dup + 3/PaintProc load put cvx/PaintProc exch def + end + gsave 0 setgray + makepattern + grestore +}def +/set_pattern +{ + dup/PatternType get 1 eq{ + dup/PaintType get 1 eq{ + currentoverprint sop[/DeviceGray]setcolorspace 0 setgray + }if + }if + setpattern +}def +/setcolorspace_opt +{ + dup currentcolorspace eq{pop}{setcolorspace}ifelse +}def +/updatecolorrendering +{ + currentcolorrendering/RenderingIntent known{ + currentcolorrendering/RenderingIntent get + } + { + Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd AGMCORE_gget dup null eq + } + { + Intent/Saturation eq + { + /saturation_crd AGMCORE_gget dup null eq + } + { + /perceptual_crd AGMCORE_gget dup null eq + }ifelse + }ifelse + }ifelse + { + pop null + } + { + /RenderingIntent known{null}{Intent}ifelse + }ifelse + }ifelse + Intent ne{ + Intent/ColorRendering{findresource}stopped + { + pop pop systemdict/findcolorrendering known + { + Intent findcolorrendering + { + /ColorRendering findresource true exch + } + { + /ColorRendering findresource + product(Xerox Phaser 5400)ne + exch + }ifelse + dup Intent/AbsoluteColorimetric eq + { + /absolute_colorimetric_crd exch AGMCORE_gput + } + { + Intent/RelativeColorimetric eq + { + /relative_colorimetric_crd exch AGMCORE_gput + } + { + Intent/Saturation eq + { + /saturation_crd exch AGMCORE_gput + } + { + Intent/Perceptual eq + { + /perceptual_crd exch AGMCORE_gput + } + { + pop + }ifelse + }ifelse + }ifelse + }ifelse + 1 index{exch}{pop}ifelse + } + {false}ifelse + } + {true}ifelse + { + dup begin + currentdict/TransformPQR known{ + currentdict/TransformPQR get aload pop + 3{{}eq 3 1 roll}repeat or or + } + {true}ifelse + currentdict/MatrixPQR known{ + currentdict/MatrixPQR get aload pop + 1.0 eq 9 1 roll 0.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 1.0 eq 9 1 roll 0.0 eq 9 1 roll + 0.0 eq 9 1 roll 0.0 eq 9 1 roll 1.0 eq + and and and and and and and and + } + {true}ifelse + end + or + { + clonedict begin + /TransformPQR[ + {4 -1 roll 3 get dup 3 1 roll sub 5 -1 roll 3 get 3 -1 roll sub div + 3 -1 roll 3 get 3 -1 roll 3 get dup 4 1 roll sub mul add}bind + {4 -1 roll 4 get dup 3 1 roll sub 5 -1 roll 4 get 3 -1 roll sub div + 3 -1 roll 4 get 3 -1 roll 4 get dup 4 1 roll sub mul add}bind + {4 -1 roll 5 get dup 3 1 roll sub 5 -1 roll 5 get 3 -1 roll sub div + 3 -1 roll 5 get 3 -1 roll 5 get dup 4 1 roll sub mul add}bind + ]def + /MatrixPQR[0.8951 -0.7502 0.0389 0.2664 1.7135 -0.0685 -0.1614 0.0367 1.0296]def + /RangePQR[-0.3227950745 2.3229645538 -1.5003771057 3.5003465881 -0.1369979095 2.136967392]def + currentdict end + }if + setcolorrendering_opt + }if + }if +}def +/set_crd +{ + AGMCORE_host_sep not level2 and{ + currentdict/ColorRendering known{ + ColorRendering/ColorRendering{findresource}stopped not{setcolorrendering_opt}if + }{ + currentdict/Intent known{ + updatecolorrendering + }if + }ifelse + currentcolorspace dup type/arraytype eq + {0 get}if + /DeviceRGB eq + { + currentdict/UCR known + {/UCR}{/AGMCORE_currentucr}ifelse + load setundercolorremoval + currentdict/BG known + {/BG}{/AGMCORE_currentbg}ifelse + load setblackgeneration + }if + }if +}def +/set_ucrbg +{ + dup null eq {pop /AGMCORE_currentbg load}{/Procedure get_res}ifelse + dup currentblackgeneration eq {pop}{setblackgeneration}ifelse + dup null eq {pop /AGMCORE_currentucr load}{/Procedure get_res}ifelse + dup currentundercolorremoval eq {pop}{setundercolorremoval}ifelse +}def +/setcolorrendering_opt +{ + dup currentcolorrendering eq{ + pop + }{ + product(HP Color LaserJet 2605)anchorsearch{ + pop pop pop + }{ + pop + clonedict + begin + /Intent Intent def + currentdict + end + setcolorrendering + }ifelse + }ifelse +}def +/cpaint_gcomp +{ + convert_to_process//Adobe_AGM_Core/AGMCORE_ConvertToProcess xddf + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get not + { + (%end_cpaint_gcomp)flushinput + }if +}def +/cpaint_gsep +{ + //Adobe_AGM_Core/AGMCORE_ConvertToProcess get + { + (%end_cpaint_gsep)flushinput + }if +}def +/cpaint_gend +{np}def +/T1_path +{ + currentfile token pop currentfile token pop mo + { + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 exch rlineto + currentfile token pop dup type/stringtype eq + {pop exit}if + 0 rlineto + }loop +}def +/T1_gsave + level3 + {/clipsave} + {/gsave}ifelse + load def +/T1_grestore + level3 + {/cliprestore} + {/grestore}ifelse + load def +/set_spot_alias_ary +{ + dup inherit_aliases + //Adobe_AGM_Core/AGMCORE_SpotAliasAry xddf +}def +/set_spot_normalization_ary +{ + dup inherit_aliases + dup length + /AGMCORE_SpotAliasAry where{pop AGMCORE_SpotAliasAry length add}if + array + //Adobe_AGM_Core/AGMCORE_SpotAliasAry2 xddf + /AGMCORE_SpotAliasAry where{ + pop + AGMCORE_SpotAliasAry2 0 AGMCORE_SpotAliasAry putinterval + AGMCORE_SpotAliasAry length + }{0}ifelse + AGMCORE_SpotAliasAry2 3 1 roll exch putinterval + true set_spot_alias +}def +/inherit_aliases +{ + {dup/Name get map_alias{/CSD put}{pop}ifelse}forall +}def +/set_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias 3 -1 roll put + }{ + pop + }ifelse +}def +/current_spot_alias +{ + /AGMCORE_SpotAliasAry2 where{ + /AGMCORE_current_spot_alias get + }{ + false + }ifelse +}def +/map_alias +{ + /AGMCORE_SpotAliasAry2 where{ + begin + /AGMCORE_name xdf + false + AGMCORE_SpotAliasAry2{ + dup/Name get AGMCORE_name eq{ + /CSD get/CSD get_res + exch pop true + exit + }{ + pop + }ifelse + }forall + end + }{ + pop false + }ifelse +}bdf +/spot_alias +{ + true set_spot_alias + /AGMCORE_&setcustomcolor AGMCORE_key_known not{ + //Adobe_AGM_Core/AGMCORE_&setcustomcolor/setcustomcolor load put + }if + /customcolor_tint 1 AGMCORE_gput + //Adobe_AGM_Core begin + /setcustomcolor + { + //Adobe_AGM_Core begin + dup/customcolor_tint exch AGMCORE_gput + 1 index aload pop pop 1 eq exch 1 eq and exch 1 eq and exch 1 eq and not + current_spot_alias and{1 index 4 get map_alias}{false}ifelse + { + false set_spot_alias + /sep_colorspace_dict AGMCORE_gget null ne + {/sep_colorspace_dict AGMCORE_gget/ForeignContent known not}{false}ifelse + 3 1 roll 2 index{ + exch pop/sep_tint AGMCORE_gget exch + }if + mark 3 1 roll + setsepcolorspace + counttomark 0 ne{ + setsepcolor + }if + pop + not{/sep_tint 1.0 AGMCORE_gput/sep_colorspace_dict AGMCORE_gget/ForeignContent true put}if + pop + true set_spot_alias + }{ + AGMCORE_&setcustomcolor + }ifelse + end + }bdf + end +}def +/begin_feature +{ + Adobe_AGM_Core/AGMCORE_feature_dictCount countdictstack put + count Adobe_AGM_Core/AGMCORE_feature_opCount 3 -1 roll put + {Adobe_AGM_Core/AGMCORE_feature_ctm matrix currentmatrix put}if +}def +/end_feature +{ + 2 dict begin + /spd/setpagedevice load def + /setpagedevice{get_gstate spd set_gstate}def + stopped{$error/newerror false put}if + end + count Adobe_AGM_Core/AGMCORE_feature_opCount get sub dup 0 gt{{pop}repeat}{pop}ifelse + countdictstack Adobe_AGM_Core/AGMCORE_feature_dictCount get sub dup 0 gt{{end}repeat}{pop}ifelse + {Adobe_AGM_Core/AGMCORE_feature_ctm get setmatrix}if +}def +/set_negative +{ + //Adobe_AGM_Core begin + /AGMCORE_inverting exch def + level2{ + currentpagedevice/NegativePrint known AGMCORE_distilling not and{ + currentpagedevice/NegativePrint get//Adobe_AGM_Core/AGMCORE_inverting get ne{ + true begin_feature true{ + <>setpagedevice + }end_feature + }if + /AGMCORE_inverting false def + }if + }if + AGMCORE_inverting{ + [{1 exch sub}/exec load dup currenttransfer exch]cvx bind settransfer + AGMCORE_distilling{ + erasepage + }{ + gsave np clippath 1/setseparationgray where{pop setseparationgray}{setgray}ifelse + /AGMIRS_&fill where{pop AGMIRS_&fill}{fill}ifelse grestore + }ifelse + }if + end +}def +/lw_save_restore_override{ + /md where{ + pop + md begin + initializepage + /initializepage{}def + /pmSVsetup{}def + /endp{}def + /pse{}def + /psb{}def + /orig_showpage where + {pop} + {/orig_showpage/showpage load def} + ifelse + /showpage{orig_showpage gR}def + end + }if +}def +/pscript_showpage_override{ + /NTPSOct95 where + { + begin + showpage + save + /showpage/restore load def + /restore{exch pop}def + end + }if +}def +/driver_media_override +{ + /md where{ + pop + md/initializepage known{ + md/initializepage{}put + }if + md/rC known{ + md/rC{4{pop}repeat}put + }if + }if + /mysetup where{ + /mysetup[1 0 0 1 0 0]put + }if + Adobe_AGM_Core/AGMCORE_Default_CTM matrix currentmatrix put + level2 + {Adobe_AGM_Core/AGMCORE_Default_PageSize currentpagedevice/PageSize get put}if +}def +/capture_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup Pscript_Win_Data/mysetup get put + }if + }if +}def +/restore_mysetup +{ + /Pscript_Win_Data where{ + pop + Pscript_Win_Data/mysetup known{ + Adobe_AGM_Core/save_mysetup known{ + Pscript_Win_Data/mysetup Adobe_AGM_Core/save_mysetup get put + Adobe_AGM_Core/save_mysetup undef + }if + }if + }if +}def +/driver_check_media_override +{ + /PrepsDict where + {pop} + { + Adobe_AGM_Core/AGMCORE_Default_CTM get matrix currentmatrix ne + Adobe_AGM_Core/AGMCORE_Default_PageSize get type/arraytype eq + { + Adobe_AGM_Core/AGMCORE_Default_PageSize get 0 get currentpagedevice/PageSize get 0 get eq and + Adobe_AGM_Core/AGMCORE_Default_PageSize get 1 get currentpagedevice/PageSize get 1 get eq and + }if + { + Adobe_AGM_Core/AGMCORE_Default_CTM get setmatrix + }if + }ifelse +}def +AGMCORE_err_strings begin + /AGMCORE_bad_environ(Environment not satisfactory for this job. Ensure that the PPD is correct or that the PostScript level requested is supported by this printer. )def + /AGMCORE_color_space_onhost_seps(This job contains colors that will not separate with on-host methods. )def + /AGMCORE_invalid_color_space(This job contains an invalid color space. )def +end +/set_def_ht +{AGMCORE_def_ht sethalftone}def +/set_def_flat +{AGMCORE_Default_flatness setflat}def +end +systemdict/setpacking known +{setpacking}if +%%EndResource +%%BeginResource: procset Adobe_CoolType_Core 2.31 0 +%%Copyright: Copyright 1997-2006 Adobe Systems Incorporated. All Rights Reserved. +%%Version: 2.31 0 +10 dict begin +/Adobe_CoolType_Passthru currentdict def +/Adobe_CoolType_Core_Defined userdict/Adobe_CoolType_Core known def +Adobe_CoolType_Core_Defined + {/Adobe_CoolType_Core userdict/Adobe_CoolType_Core get def} +if +userdict/Adobe_CoolType_Core 70 dict dup begin put +/Adobe_CoolType_Version 2.31 def +/Level2? + systemdict/languagelevel known dup + {pop systemdict/languagelevel get 2 ge} + if def +Level2? not + { + /currentglobal false def + /setglobal/pop load def + /gcheck{pop false}bind def + /currentpacking false def + /setpacking/pop load def + /SharedFontDirectory 0 dict def + } +if +currentpacking +true setpacking +currentglobal false setglobal +userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} +if +get + begin + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + end +setglobal +currentglobal true setglobal +userdict/Adobe_CoolType_GVMFonts known not + {userdict/Adobe_CoolType_GVMFonts 10 dict put} +if +setglobal +currentglobal false setglobal +userdict/Adobe_CoolType_LVMFonts known not + {userdict/Adobe_CoolType_LVMFonts 10 dict put} +if +setglobal +/ct_VMDictPut + { + dup gcheck{Adobe_CoolType_GVMFonts}{Adobe_CoolType_LVMFonts}ifelse + 3 1 roll put + }bind def +/ct_VMDictUndef + { + dup Adobe_CoolType_GVMFonts exch known + {Adobe_CoolType_GVMFonts exch undef} + { + dup Adobe_CoolType_LVMFonts exch known + {Adobe_CoolType_LVMFonts exch undef} + {pop} + ifelse + }ifelse + }bind def +/ct_str1 1 string def +/ct_xshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_yshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + _ct_x _ct_y moveto + 0 exch + rmoveto + } + ifelse + /_ct_i _ct_i 1 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/ct_xyshow +{ + /_ct_na exch def + /_ct_i 0 def + currentpoint + /_ct_y exch def + /_ct_x exch def + { + pop pop + ct_str1 exch 0 exch put + ct_str1 show + {_ct_na _ct_i get}stopped + {pop pop} + { + {_ct_na _ct_i 1 add get}stopped + {pop pop pop} + { + _ct_x _ct_y moveto + rmoveto + } + ifelse + } + ifelse + /_ct_i _ct_i 2 add def + currentpoint + /_ct_y exch def + /_ct_x exch def + } + exch + @cshow +}bind def +/xsh{{@xshow}stopped{Adobe_CoolType_Data begin ct_xshow end}if}bind def +/ysh{{@yshow}stopped{Adobe_CoolType_Data begin ct_yshow end}if}bind def +/xysh{{@xyshow}stopped{Adobe_CoolType_Data begin ct_xyshow end}if}bind def +currentglobal true setglobal +/ct_T3Defs +{ +/BuildChar +{ + 1 index/Encoding get exch get + 1 index/BuildGlyph get exec +}bind def +/BuildGlyph +{ + exch begin + GlyphProcs exch get exec + end +}bind def +}bind def +setglobal +/@_SaveStackLevels + { + Adobe_CoolType_Data + begin + /@vmState currentglobal def false setglobal + @opStackCountByLevel + @opStackLevel + 2 copy known not + { + 2 copy + 3 dict dup/args + 7 index + 5 add array put + put get + } + { + get dup/args get dup length 3 index lt + { + dup length 5 add array exch + 1 index exch 0 exch putinterval + 1 index exch/args exch put + } + {pop} + ifelse + } + ifelse + begin + count 1 sub + 1 index lt + {pop count} + if + dup/argCount exch def + dup 0 gt + { + args exch 0 exch getinterval + astore pop + } + {pop} + ifelse + count + /restCount exch def + end + /@opStackLevel @opStackLevel 1 add def + countdictstack 1 sub + @dictStackCountByLevel exch @dictStackLevel exch put + /@dictStackLevel @dictStackLevel 1 add def + @vmState setglobal + end + }bind def +/@_RestoreStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + @opStackCountByLevel @opStackLevel get + begin + count restCount sub dup 0 gt + {{pop}repeat} + {pop} + ifelse + args 0 argCount getinterval{}forall + end + /@dictStackLevel @dictStackLevel 1 sub def + @dictStackCountByLevel @dictStackLevel get + end + countdictstack exch sub dup 0 gt + {{end}repeat} + {pop} + ifelse + }bind def +/@_PopStackLevels + { + Adobe_CoolType_Data + begin + /@opStackLevel @opStackLevel 1 sub def + /@dictStackLevel @dictStackLevel 1 sub def + end + }bind def +/@Raise + { + exch cvx exch errordict exch get exec + stop + }bind def +/@ReRaise + { + cvx $error/errorname get errordict exch get exec + stop + }bind def +/@Stopped + { + 0 @#Stopped + }bind def +/@#Stopped + { + @_SaveStackLevels + stopped + {@_RestoreStackLevels true} + {@_PopStackLevels false} + ifelse + }bind def +/@Arg + { + Adobe_CoolType_Data + begin + @opStackCountByLevel @opStackLevel 1 sub get + begin + args exch + argCount 1 sub exch sub get + end + end + }bind def +currentglobal true setglobal +/CTHasResourceForAllBug + Level2? + { + 1 dict dup + /@shouldNotDisappearDictValue true def + Adobe_CoolType_Data exch/@shouldNotDisappearDict exch put + begin + count @_SaveStackLevels + {(*){pop stop}128 string/Category resourceforall} + stopped pop + @_RestoreStackLevels + currentdict Adobe_CoolType_Data/@shouldNotDisappearDict get dup 3 1 roll ne dup 3 1 roll + { + /@shouldNotDisappearDictValue known + { + { + end + currentdict 1 index eq + {pop exit} + if + } + loop + } + if + } + { + pop + end + } + ifelse + } + {false} + ifelse + def +true setglobal +/CTHasResourceStatusBug + Level2? + { + mark + {/steveamerige/Category resourcestatus} + stopped + {cleartomark true} + {cleartomark currentglobal not} + ifelse + } + {false} + ifelse + def +setglobal +/CTResourceStatus + { + mark 3 1 roll + /Category findresource + begin + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + end + }bind def +/CTWorkAroundBugs + { + Level2? + { + /cid_PreLoad/ProcSet resourcestatus + { + pop pop + currentglobal + mark + { + (*) + { + dup/CMap CTHasResourceStatusBug + {CTResourceStatus} + {resourcestatus} + ifelse + { + pop dup 0 eq exch 1 eq or + { + dup/CMap findresource gcheck setglobal + /CMap undefineresource + } + { + pop CTHasResourceForAllBug + {exit} + {stop} + ifelse + } + ifelse + } + {pop} + ifelse + } + 128 string/CMap resourceforall + } + stopped + {cleartomark} + stopped pop + setglobal + } + if + } + if + }bind def +/ds + { + Adobe_CoolType_Core + begin + CTWorkAroundBugs + /mo/moveto load def + /nf/newencodedfont load def + /msf{makefont setfont}bind def + /uf{dup undefinefont ct_VMDictUndef}bind def + /ur/undefineresource load def + /chp/charpath load def + /awsh/awidthshow load def + /wsh/widthshow load def + /ash/ashow load def + /@xshow/xshow load def + /@yshow/yshow load def + /@xyshow/xyshow load def + /@cshow/cshow load def + /sh/show load def + /rp/repeat load def + /.n/.notdef def + end + currentglobal false setglobal + userdict/Adobe_CoolType_Data 2 copy known not + {2 copy 10 dict put} + if + get + begin + /AddWidths? false def + /CC 0 def + /charcode 2 string def + /@opStackCountByLevel 32 dict def + /@opStackLevel 0 def + /@dictStackCountByLevel 32 dict def + /@dictStackLevel 0 def + /InVMFontsByCMap 10 dict def + /InVMDeepCopiedFonts 10 dict def + end + setglobal + }bind def +/dt + { + currentdict Adobe_CoolType_Core eq + {end} + if + }bind def +/ps + { + Adobe_CoolType_Core begin + Adobe_CoolType_GVMFonts begin + Adobe_CoolType_LVMFonts begin + SharedFontDirectory begin + }bind def +/pt + { + end + end + end + end + }bind def +/unload + { + systemdict/languagelevel known + { + systemdict/languagelevel get 2 ge + { + userdict/Adobe_CoolType_Core 2 copy known + {undef} + {pop pop} + ifelse + } + if + } + if + }bind def +/ndf + { + 1 index where + {pop pop pop} + {dup xcheck{bind}if def} + ifelse + }def +/findfont systemdict + begin + userdict + begin + /globaldict where{/globaldict get begin}if + dup where pop exch get + /globaldict where{pop end}if + end + end +Adobe_CoolType_Core_Defined + {/systemfindfont exch def} + { + /findfont 1 index def + /systemfindfont exch def + } +ifelse +/undefinefont + {pop}ndf +/copyfont + { + currentglobal 3 1 roll + 1 index gcheck setglobal + dup null eq{0}{dup length}ifelse + 2 index length add 1 add dict + begin + exch + { + 1 index/FID eq + {pop pop} + {def} + ifelse + } + forall + dup null eq + {pop} + {{def}forall} + ifelse + currentdict + end + exch setglobal + }bind def +/copyarray + { + currentglobal exch + dup gcheck setglobal + dup length array copy + exch setglobal + }bind def +/newencodedfont + { + currentglobal + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + { + FontDirectory 3 index known + {FontDirectory 3 index get/FontReferenced known} + { + SharedFontDirectory 3 index known + {SharedFontDirectory 3 index get/FontReferenced known} + {false} + ifelse + } + ifelse + } + ifelse + dup + { + 3 index findfont/FontReferenced get + 2 index dup type/nametype eq + {findfont} + if ne + {pop false} + if + } + if + dup + { + 1 index dup type/nametype eq + {findfont} + if + dup/CharStrings known + { + /CharStrings get length + 4 index findfont/CharStrings get length + ne + { + pop false + } + if + } + {pop} + ifelse + } + if + { + pop + 1 index findfont + /Encoding get exch + 0 1 255 + {2 copy get 3 index 3 1 roll put} + for + pop pop pop + } + { + currentglobal + 4 1 roll + dup type/nametype eq + {findfont} + if + dup gcheck setglobal + dup dup maxlength 2 add dict + begin + exch + { + 1 index/FID ne + 2 index/Encoding ne and + {def} + {pop pop} + ifelse + } + forall + /FontReferenced exch def + /Encoding exch dup length array copy def + /FontName 1 index dup type/stringtype eq{cvn}if def dup + currentdict + end + definefont ct_VMDictPut + setglobal + } + ifelse + }bind def +/SetSubstituteStrategy + { + $SubstituteFont + begin + dup type/dicttype ne + {0 dict} + if + currentdict/$Strategies known + { + exch $Strategies exch + 2 copy known + { + get + 2 copy maxlength exch maxlength add dict + begin + {def}forall + {def}forall + currentdict + dup/$Init known + {dup/$Init get exec} + if + end + /$Strategy exch def + } + {pop pop pop} + ifelse + } + {pop pop} + ifelse + end + }bind def +/scff + { + $SubstituteFont + begin + dup type/stringtype eq + {dup length exch} + {null} + ifelse + /$sname exch def + /$slen exch def + /$inVMIndex + $sname null eq + { + 1 index $str cvs + dup length $slen sub $slen getinterval cvn + } + {$sname} + ifelse def + end + {findfont} + @Stopped + { + dup length 8 add string exch + 1 index 0(BadFont:)putinterval + 1 index exch 8 exch dup length string cvs putinterval cvn + {findfont} + @Stopped + {pop/Courier findfont} + if + } + if + $SubstituteFont + begin + /$sname null def + /$slen 0 def + /$inVMIndex null def + end + }bind def +/isWidthsOnlyFont + { + dup/WidthsOnly known + {pop pop true} + { + dup/FDepVector known + {/FDepVector get{isWidthsOnlyFont dup{exit}if}forall} + { + dup/FDArray known + {/FDArray get{isWidthsOnlyFont dup{exit}if}forall} + {pop} + ifelse + } + ifelse + } + ifelse + }bind def +/ct_StyleDicts 4 dict dup begin + /Adobe-Japan1 4 dict dup begin + Level2? + { + /Serif + /HeiseiMin-W3-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMin-W3} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMin-W3/CIDFont resourcestatus + {pop pop/HeiseiMin-W3} + {/Ryumin-Light} + ifelse + } + {/Ryumin-Light} + ifelse + } + ifelse + def + /SansSerif + /HeiseiKakuGo-W5-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiKakuGo-W5} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiKakuGo-W5/CIDFont resourcestatus + {pop pop/HeiseiKakuGo-W5} + {/GothicBBB-Medium} + ifelse + } + {/GothicBBB-Medium} + ifelse + } + ifelse + def + /HeiseiMaruGo-W4-83pv-RKSJ-H/Font resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /CIDFont/Category resourcestatus + { + pop pop + /HeiseiMaruGo-W4/CIDFont resourcestatus + {pop pop/HeiseiMaruGo-W4} + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + { + /Jun101-Light-RKSJ-H/Font resourcestatus + {pop pop/Jun101-Light} + {SansSerif} + ifelse + } + ifelse + } + ifelse + /RoundSansSerif exch def + /Default Serif def + } + { + /Serif/Ryumin-Light def + /SansSerif/GothicBBB-Medium def + { + (fonts/Jun101-Light-83pv-RKSJ-H)status + }stopped + {pop}{ + {pop pop pop pop/Jun101-Light} + {SansSerif} + ifelse + /RoundSansSerif exch def + }ifelse + /Default Serif def + } + ifelse + end + def + /Adobe-Korea1 4 dict dup begin + /Serif/HYSMyeongJo-Medium def + /SansSerif/HYGoThic-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-GB1 4 dict dup begin + /Serif/STSong-Light def + /SansSerif/STHeiti-Regular def + /RoundSansSerif SansSerif def + /Default Serif def + end + def + /Adobe-CNS1 4 dict dup begin + /Serif/MKai-Medium def + /SansSerif/MHei-Medium def + /RoundSansSerif SansSerif def + /Default Serif def + end + def +end +def +Level2?{currentglobal true setglobal}if +/ct_BoldRomanWidthProc + { + stringwidth 1 index 0 ne{exch .03 add exch}if setcharwidth + 0 0 + }bind def +/ct_Type0WidthProc + { + dup stringwidth 0 0 moveto + 2 index true charpath pathbbox + 0 -1 + 7 index 2 div .88 + setcachedevice2 + pop + 0 0 + }bind def +/ct_Type0WMode1WidthProc + { + dup stringwidth + pop 2 div neg -0.88 + 2 copy + moveto + 0 -1 + 5 -1 roll true charpath pathbbox + setcachedevice + }bind def +/cHexEncoding +[/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 +/c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 +/c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 +/c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B +/c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E +/c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 +/c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 +/c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 +/c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA +/cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD +/cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 +/cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 +/cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 +/cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def +/ct_BoldBaseFont + 11 dict begin + /FontType 3 def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /Encoding cHexEncoding def + /_setwidthProc/ct_BoldRomanWidthProc load def + /_bcstr1 1 string def + /BuildChar + { + exch begin + _basefont setfont + _bcstr1 dup 0 4 -1 roll put + dup + _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +systemdict/composefont known +{ +/ct_DefineIdentity-H +{ + /Identity-H/CMap resourcestatus + { + pop pop + } + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse +} +def +/ct_BoldBaseCIDFont + 11 dict begin + /CIDFontType 1 def + /CIDFontName/ct_BoldBaseCIDFont def + /FontMatrix[1 0 0 1 0 0]def + /FontBBox[0 0 1 1]def + /_setwidthProc/ct_Type0WidthProc load def + /_bcstr2 2 string def + /BuildGlyph + { + exch begin + _basefont setfont + _bcstr2 1 2 index 256 mod put + _bcstr2 0 3 -1 roll 256 idiv put + _bcstr2 dup _setwidthProc + 3 copy + moveto + show + _basefonto setfont + moveto + show + end + }bind def + currentdict + end +def +}if +Level2?{setglobal}if +/ct_CopyFont{ + { + 1 index/FID ne 2 index/UniqueID ne and + {def}{pop pop}ifelse + }forall +}bind def +/ct_Type0CopyFont +{ + exch + dup length dict + begin + ct_CopyFont + [ + exch + FDepVector + { + dup/FontType get 0 eq + { + 1 index ct_Type0CopyFont + /_ctType0 exch definefont + } + { + /_ctBaseFont exch + 2 index exec + } + ifelse + exch + } + forall + pop + ] + /FDepVector exch def + currentdict + end +}bind def +/ct_MakeBoldFont +{ + dup/ct_SyntheticBold known + { + dup length 3 add dict begin + ct_CopyFont + /ct_StrokeWidth .03 0 FontMatrix idtransform pop def + /ct_SyntheticBold true def + currentdict + end + definefont + } + { + dup dup length 3 add dict + begin + ct_CopyFont + /PaintType 2 def + /StrokeWidth .03 0 FontMatrix idtransform pop def + /dummybold currentdict + end + definefont + dup/FontType get dup 9 ge exch 11 le and + { + ct_BoldBaseCIDFont + dup length 3 add dict copy begin + dup/CIDSystemInfo get/CIDSystemInfo exch def + ct_DefineIdentity-H + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefont exch def + /_Type0Identity/Identity-H 3 -1 roll[exch]composefont + /_basefonto exch def + currentdict + end + /CIDFont defineresource + } + { + ct_BoldBaseFont + dup length 3 add dict copy begin + /_basefont exch def + /_basefonto exch def + currentdict + end + definefont + } + ifelse + } + ifelse +}bind def +/ct_MakeBold{ + 1 index + 1 index + findfont + currentglobal 5 1 roll + dup gcheck setglobal + dup + /FontType get 0 eq + { + dup/WMode known{dup/WMode get 1 eq}{false}ifelse + version length 4 ge + and + {version 0 4 getinterval cvi 2015 ge} + {true} + ifelse + {/ct_Type0WidthProc} + {/ct_Type0WMode1WidthProc} + ifelse + ct_BoldBaseFont/_setwidthProc 3 -1 roll load put + {ct_MakeBoldFont}ct_Type0CopyFont definefont + } + { + dup/_fauxfont known not 1 index/SubstMaster known not and + { + ct_BoldBaseFont/_setwidthProc /ct_BoldRomanWidthProc load put + ct_MakeBoldFont + } + { + 2 index 2 index eq + {exch pop } + { + dup length dict begin + ct_CopyFont + currentdict + end + definefont + } + ifelse + } + ifelse + } + ifelse + pop pop pop + setglobal +}bind def +/?str1 256 string def +/?set + { + $SubstituteFont + begin + /$substituteFound false def + /$fontname 1 index def + /$doSmartSub false def + end + dup + findfont + $SubstituteFont + begin + $substituteFound + {false} + { + dup/FontName known + { + dup/FontName get $fontname eq + 1 index/DistillerFauxFont known not and + /currentdistillerparams where + {pop false 2 index isWidthsOnlyFont not and} + if + } + {false} + ifelse + } + ifelse + exch pop + /$doSmartSub true def + end + { + 5 1 roll pop pop pop pop + findfont + } + { + 1 index + findfont + dup/FontType get 3 eq + { + 6 1 roll pop pop pop pop pop false + } + {pop true} + ifelse + { + $SubstituteFont + begin + pop pop + /$styleArray 1 index def + /$regOrdering 2 index def + pop pop + 0 1 $styleArray length 1 sub + { + $styleArray exch get + ct_StyleDicts $regOrdering + 2 copy known + { + get + exch 2 copy known not + {pop/Default} + if + get + dup type/nametype eq + { + ?str1 cvs length dup 1 add exch + ?str1 exch(-)putinterval + exch dup length exch ?str1 exch 3 index exch putinterval + add ?str1 exch 0 exch getinterval cvn + } + { + pop pop/Unknown + } + ifelse + } + { + pop pop pop pop/Unknown + } + ifelse + } + for + end + findfont + }if + } + ifelse + currentglobal false setglobal 3 1 roll + null copyfont definefont pop + setglobal + }bind def +setpacking +userdict/$SubstituteFont 25 dict put +1 dict + begin + /SubstituteFont + dup $error exch 2 copy known + {get} + {pop pop{pop/Courier}bind} + ifelse def + /currentdistillerparams where dup + { + pop pop + currentdistillerparams/CannotEmbedFontPolicy 2 copy known + {get/Error eq} + {pop pop false} + ifelse + } + if not + { + countdictstack array dictstack 0 get + begin + userdict + begin + $SubstituteFont + begin + /$str 128 string def + /$fontpat 128 string def + /$slen 0 def + /$sname null def + /$match false def + /$fontname null def + /$substituteFound false def + /$inVMIndex null def + /$doSmartSub true def + /$depth 0 def + /$fontname null def + /$italicangle 26.5 def + /$dstack null def + /$Strategies 10 dict dup + begin + /$Type3Underprint + { + currentglobal exch false setglobal + 11 dict + begin + /UseFont exch + $WMode 0 ne + { + dup length dict copy + dup/WMode $WMode put + /UseFont exch definefont + } + if def + /FontName $fontname dup type/stringtype eq{cvn}if def + /FontType 3 def + /FontMatrix[.001 0 0 .001 0 0]def + /Encoding 256 array dup 0 1 255{/.notdef put dup}for pop def + /FontBBox[0 0 0 0]def + /CCInfo 7 dict dup + begin + /cc null def + /x 0 def + /y 0 def + end def + /BuildChar + { + exch + begin + CCInfo + begin + 1 string dup 0 3 index put exch pop + /cc exch def + UseFont 1000 scalefont setfont + cc stringwidth/y exch def/x exch def + x y setcharwidth + $SubstituteFont/$Strategy get/$Underprint get exec + 0 0 moveto cc show + x y moveto + end + end + }bind def + currentdict + end + exch setglobal + }bind def + /$GetaTint + 2 dict dup + begin + /$BuildFont + { + dup/WMode known + {dup/WMode get} + {0} + ifelse + /$WMode exch def + $fontname exch + dup/FontName known + { + dup/FontName get + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + exch + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index/FontName get known + { + pop + Adobe_CoolType_Data/InVMDeepCopiedFonts get + 1 index get + null copyfont + } + {$deepcopyfont} + ifelse + exch 1 index exch/FontBasedOn exch put + dup/FontName $fontname dup type/stringtype eq{cvn}if put + definefont + Adobe_CoolType_Data/InVMDeepCopiedFonts get + begin + dup/FontBasedOn get 1 index def + end + }bind def + /$Underprint + { + gsave + x abs y abs gt + {/y 1000 def} + {/x -1000 def 500 120 translate} + ifelse + Level2? + { + [/Separation(All)/DeviceCMYK{0 0 0 1 pop}] + setcolorspace + } + {0 setgray} + ifelse + 10 setlinewidth + x .8 mul + [7 3] + { + y mul 8 div 120 sub x 10 div exch moveto + 0 y 4 div neg rlineto + dup 0 rlineto + 0 y 4 div rlineto + closepath + gsave + Level2? + {.2 setcolor} + {.8 setgray} + ifelse + fill grestore + stroke + } + forall + pop + grestore + }bind def + end def + /$Oblique + 1 dict dup + begin + /$BuildFont + { + currentglobal exch dup gcheck setglobal + null copyfont + begin + /FontBasedOn + currentdict/FontName known + { + FontName + dup type/stringtype eq{cvn}if + } + {/unnamedfont} + ifelse + def + /FontName $fontname dup type/stringtype eq{cvn}if def + /currentdistillerparams where + {pop} + { + /FontInfo currentdict/FontInfo known + {FontInfo null copyfont} + {2 dict} + ifelse + dup + begin + /ItalicAngle $italicangle def + /FontMatrix FontMatrix + [1 0 ItalicAngle dup sin exch cos div 1 0 0] + matrix concatmatrix readonly + end + 4 2 roll def + def + } + ifelse + FontName currentdict + end + definefont + exch setglobal + }bind def + end def + /$None + 1 dict dup + begin + /$BuildFont{}bind def + end def + end def + /$Oblique SetSubstituteStrategy + /$findfontByEnum + { + dup type/stringtype eq{cvn}if + dup/$fontname exch def + $sname null eq + {$str cvs dup length $slen sub $slen getinterval} + {pop $sname} + ifelse + $fontpat dup 0(fonts/*)putinterval exch 7 exch putinterval + /$match false def + $SubstituteFont/$dstack countdictstack array dictstack put + mark + { + $fontpat 0 $slen 7 add getinterval + {/$match exch def exit} + $str filenameforall + } + stopped + { + cleardictstack + currentdict + true + $SubstituteFont/$dstack get + { + exch + { + 1 index eq + {pop false} + {true} + ifelse + } + {begin false} + ifelse + } + forall + pop + } + if + cleartomark + /$slen 0 def + $match false ne + {$match(fonts/)anchorsearch pop pop cvn} + {/Courier} + ifelse + }bind def + /$ROS 1 dict dup + begin + /Adobe 4 dict dup + begin + /Japan1 [/Ryumin-Light/HeiseiMin-W3 + /GothicBBB-Medium/HeiseiKakuGo-W5 + /HeiseiMaruGo-W4/Jun101-Light]def + /Korea1 [/HYSMyeongJo-Medium/HYGoThic-Medium]def + /GB1 [/STSong-Light/STHeiti-Regular]def + /CNS1 [/MKai-Medium/MHei-Medium]def + end def + end def + /$cmapname null def + /$deepcopyfont + { + dup/FontType get 0 eq + { + 1 dict dup/FontName/copied put copyfont + begin + /FDepVector FDepVector copyarray + 0 1 2 index length 1 sub + { + 2 copy get $deepcopyfont + dup/FontName/copied put + /copied exch definefont + 3 copy put pop pop + } + for + def + currentdict + end + } + {$Strategies/$Type3Underprint get exec} + ifelse + }bind def + /$buildfontname + { + dup/CIDFont findresource/CIDSystemInfo get + begin + Registry length Ordering length Supplement 8 string cvs + 3 copy length 2 add add add string + dup 5 1 roll dup 0 Registry putinterval + dup 4 index(-)putinterval + dup 4 index 1 add Ordering putinterval + 4 2 roll add 1 add 2 copy(-)putinterval + end + 1 add 2 copy 0 exch getinterval $cmapname $fontpat cvs exch + anchorsearch + {pop pop 3 2 roll putinterval cvn/$cmapname exch def} + {pop pop pop pop pop} + ifelse + length + $str 1 index(-)putinterval 1 add + $str 1 index $cmapname $fontpat cvs putinterval + $cmapname length add + $str exch 0 exch getinterval cvn + }bind def + /$findfontByROS + { + /$fontname exch def + $ROS Registry 2 copy known + { + get Ordering 2 copy known + {get} + {pop pop[]} + ifelse + } + {pop pop[]} + ifelse + false exch + { + dup/CIDFont resourcestatus + { + pop pop + save + 1 index/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get} + {false} + ifelse + exch pop + exch restore + {pop} + {exch pop true exit} + ifelse + } + {pop} + ifelse + } + forall + {$str cvs $buildfontname} + { + false(*) + { + save exch + dup/CIDFont findresource + dup/WidthsOnly known + {dup/WidthsOnly get not} + {true} + ifelse + exch/CIDSystemInfo get + dup/Registry get Registry eq + exch/Ordering get Ordering eq and and + {exch restore exch pop true exit} + {pop restore} + ifelse + } + $str/CIDFont resourceforall + {$buildfontname} + {$fontname $findfontByEnum} + ifelse + } + ifelse + }bind def + end + end + currentdict/$error known currentdict/languagelevel known and dup + {pop $error/SubstituteFont known} + if + dup + {$error} + {Adobe_CoolType_Core} + ifelse + begin + { + /SubstituteFont + /CMap/Category resourcestatus + { + pop pop + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + { + $sname null eq + {dup $str cvs dup length $slen sub $slen getinterval cvn} + {$sname} + ifelse + Adobe_CoolType_Data/InVMFontsByCMap get + 1 index 2 copy known + { + get + false exch + { + pop + currentglobal + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + { + FontDirectory 1 index known + {exch pop true exit} + { + GlobalFontDirectory 1 index known + {exch pop true exit} + {pop} + ifelse + } + ifelse + } + ifelse + } + forall + } + {pop pop false} + ifelse + { + exch pop exch pop + } + { + dup/CMap resourcestatus + { + pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + } + { + 128 string cvs + dup(-)search + { + 3 1 roll search + { + 3 1 roll pop + {dup cvi} + stopped + {pop pop pop pop pop $findfontByEnum} + { + 4 2 roll pop pop + exch length + exch + 2 index length + 2 index + sub + exch 1 sub -1 0 + { + $str cvs dup length + 4 index + 0 + 4 index + 4 3 roll add + getinterval + exch 1 index exch 3 index exch + putinterval + dup/CMap resourcestatus + { + pop pop + 4 1 roll pop pop pop + dup/$cmapname exch def + /CMap findresource/CIDSystemInfo get{def}forall + $findfontByROS + true exit + } + {pop} + ifelse + } + for + dup type/booleantype eq + {pop} + {pop pop pop $findfontByEnum} + ifelse + } + ifelse + } + {pop pop pop $findfontByEnum} + ifelse + } + {pop pop $findfontByEnum} + ifelse + } + ifelse + } + ifelse + } + {//SubstituteFont exec} + ifelse + /$slen 0 def + end + } + } + { + { + $SubstituteFont + begin + /$substituteFound true def + dup length $slen gt + $sname null ne or + $slen 0 gt and + {$findfontByEnum} + {//SubstituteFont exec} + ifelse + end + } + } + ifelse + bind readonly def + Adobe_CoolType_Core/scfindfont/systemfindfont load put + } + { + /scfindfont + { + $SubstituteFont + begin + dup systemfindfont + dup/FontName known + {dup/FontName get dup 3 index ne} + {/noname true} + ifelse + dup + { + /$origfontnamefound 2 index def + /$origfontname 4 index def/$substituteFound true def + } + if + exch pop + { + $slen 0 gt + $sname null ne + 3 index length $slen gt or and + { + pop dup $findfontByEnum findfont + dup maxlength 1 add dict + begin + {1 index/FID eq{pop pop}{def}ifelse} + forall + currentdict + end + definefont + dup/FontName known{dup/FontName get}{null}ifelse + $origfontnamefound ne + { + $origfontname $str cvs print + ( substitution revised, using )print + dup/FontName known + {dup/FontName get}{(unspecified font)} + ifelse + $str cvs print(.\n)print + } + if + } + {exch pop} + ifelse + } + {exch pop} + ifelse + end + }bind def + } + ifelse + end + end + Adobe_CoolType_Core_Defined not + { + Adobe_CoolType_Core/findfont + { + $SubstituteFont + begin + $depth 0 eq + { + /$fontname 1 index dup type/stringtype ne{$str cvs}if def + /$substituteFound false def + } + if + /$depth $depth 1 add def + end + scfindfont + $SubstituteFont + begin + /$depth $depth 1 sub def + $substituteFound $depth 0 eq and + { + $inVMIndex null ne + {dup $inVMIndex $AddInVMFont} + if + $doSmartSub + { + currentdict/$Strategy known + {$Strategy/$BuildFont get exec} + if + } + if + } + if + end + }bind put + } + if + } + if + end +/$AddInVMFont + { + exch/FontName 2 copy known + { + get + 1 dict dup begin exch 1 index gcheck def end exch + Adobe_CoolType_Data/InVMFontsByCMap get exch + $DictAdd + } + {pop pop pop} + ifelse + }bind def +/$DictAdd + { + 2 copy known not + {2 copy 4 index length dict put} + if + Level2? not + { + 2 copy get dup maxlength exch length 4 index length add lt + 2 copy get dup length 4 index length add exch maxlength 1 index lt + { + 2 mul dict + begin + 2 copy get{forall}def + 2 copy currentdict put + end + } + {pop} + ifelse + } + if + get + begin + {def} + forall + end + }bind def +end +end +%%EndResource +currentglobal true setglobal +%%BeginResource: procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%Copyright: Copyright 1987-2006 Adobe Systems Incorporated. +%%Version: 1.23 0 +systemdict/languagelevel known dup + {currentglobal false setglobal} + {false} +ifelse +exch +userdict/Adobe_CoolType_Utility 2 copy known + {2 copy get dup maxlength 27 add dict copy} + {27 dict} +ifelse put +Adobe_CoolType_Utility + begin + /@eexecStartData + def + /@recognizeCIDFont null def + /ct_Level2? exch def + /ct_Clone? 1183615869 internaldict dup + /CCRun known not + exch/eCCRun known not + ct_Level2? and or def +ct_Level2? + {globaldict begin currentglobal true setglobal} +if + /ct_AddStdCIDMap + ct_Level2? + {{ + mark + Adobe_CoolType_Utility/@recognizeCIDFont currentdict put + { + ((Hex)57 StartData + 0615 1e27 2c39 1c60 d8a8 cc31 fe2b f6e0 + 7aa3 e541 e21c 60d8 a8c9 c3d0 6d9e 1c60 + d8a8 c9c2 02d7 9a1c 60d8 a849 1c60 d8a8 + cc36 74f4 1144 b13b 77)0()/SubFileDecode filter cvx exec + } + stopped + { + cleartomark + Adobe_CoolType_Utility/@recognizeCIDFont get + countdictstack dup array dictstack + exch 1 sub -1 0 + { + 2 copy get 3 index eq + {1 index length exch sub 1 sub{end}repeat exit} + {pop} + ifelse + } + for + pop pop + Adobe_CoolType_Utility/@eexecStartData get eexec + } + {cleartomark} + ifelse + }} + {{ + Adobe_CoolType_Utility/@eexecStartData get eexec + }} + ifelse bind def +userdict/cid_extensions known +dup{cid_extensions/cid_UpdateDB known and}if + { + cid_extensions + begin + /cid_GetCIDSystemInfo + { + 1 index type/stringtype eq + {exch cvn exch} + if + cid_extensions + begin + dup load 2 index known + { + 2 copy + cid_GetStatusInfo + dup null ne + { + 1 index load + 3 index get + dup null eq + {pop pop cid_UpdateDB} + { + exch + 1 index/Created get eq + {exch pop exch pop} + {pop cid_UpdateDB} + ifelse + } + ifelse + } + {pop cid_UpdateDB} + ifelse + } + {cid_UpdateDB} + ifelse + end + }bind def + end + } +if +ct_Level2? + {end setglobal} +if + /ct_UseNativeCapability? systemdict/composefont known def + /ct_MakeOCF 35 dict def + /ct_Vars 25 dict def + /ct_GlyphDirProcs 6 dict def + /ct_BuildCharDict 15 dict dup + begin + /charcode 2 string def + /dst_string 1500 string def + /nullstring()def + /usewidths? true def + end def + ct_Level2?{setglobal}{pop}ifelse + ct_GlyphDirProcs + begin + /GetGlyphDirectory + { + systemdict/languagelevel known + {pop/CIDFont findresource/GlyphDirectory get} + { + 1 index/CIDFont findresource/GlyphDirectory + get dup type/dicttype eq + { + dup dup maxlength exch length sub 2 index lt + { + dup length 2 index add dict copy 2 index + /CIDFont findresource/GlyphDirectory 2 index put + } + if + } + if + exch pop exch pop + } + ifelse + + + }def + /+ + { + systemdict/languagelevel known + { + currentglobal false setglobal + 3 dict begin + /vm exch def + } + {1 dict begin} + ifelse + /$ exch def + systemdict/languagelevel known + { + vm setglobal + /gvm currentglobal def + $ gcheck setglobal + } + if + ?{$ begin}if + }def + /?{$ type/dicttype eq}def + /|{ + userdict/Adobe_CoolType_Data known + { + Adobe_CoolType_Data/AddWidths? known + { + currentdict Adobe_CoolType_Data + begin + begin + AddWidths? + { + Adobe_CoolType_Data/CC 3 index put + ?{def}{$ 3 1 roll put}ifelse + CC charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore + currentfont/Widths get exch CC exch put + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + end + end + } + {?{def}{$ 3 1 roll put}ifelse} ifelse + } + {?{def}{$ 3 1 roll put}ifelse} + ifelse + }def + /! + { + ?{end}if + systemdict/languagelevel known + {gvm setglobal} + if + end + }def + /:{string currentfile exch readstring pop}executeonly def + end + ct_MakeOCF + begin + /ct_cHexEncoding + [/c00/c01/c02/c03/c04/c05/c06/c07/c08/c09/c0A/c0B/c0C/c0D/c0E/c0F/c10/c11/c12 + /c13/c14/c15/c16/c17/c18/c19/c1A/c1B/c1C/c1D/c1E/c1F/c20/c21/c22/c23/c24/c25 + /c26/c27/c28/c29/c2A/c2B/c2C/c2D/c2E/c2F/c30/c31/c32/c33/c34/c35/c36/c37/c38 + /c39/c3A/c3B/c3C/c3D/c3E/c3F/c40/c41/c42/c43/c44/c45/c46/c47/c48/c49/c4A/c4B + /c4C/c4D/c4E/c4F/c50/c51/c52/c53/c54/c55/c56/c57/c58/c59/c5A/c5B/c5C/c5D/c5E + /c5F/c60/c61/c62/c63/c64/c65/c66/c67/c68/c69/c6A/c6B/c6C/c6D/c6E/c6F/c70/c71 + /c72/c73/c74/c75/c76/c77/c78/c79/c7A/c7B/c7C/c7D/c7E/c7F/c80/c81/c82/c83/c84 + /c85/c86/c87/c88/c89/c8A/c8B/c8C/c8D/c8E/c8F/c90/c91/c92/c93/c94/c95/c96/c97 + /c98/c99/c9A/c9B/c9C/c9D/c9E/c9F/cA0/cA1/cA2/cA3/cA4/cA5/cA6/cA7/cA8/cA9/cAA + /cAB/cAC/cAD/cAE/cAF/cB0/cB1/cB2/cB3/cB4/cB5/cB6/cB7/cB8/cB9/cBA/cBB/cBC/cBD + /cBE/cBF/cC0/cC1/cC2/cC3/cC4/cC5/cC6/cC7/cC8/cC9/cCA/cCB/cCC/cCD/cCE/cCF/cD0 + /cD1/cD2/cD3/cD4/cD5/cD6/cD7/cD8/cD9/cDA/cDB/cDC/cDD/cDE/cDF/cE0/cE1/cE2/cE3 + /cE4/cE5/cE6/cE7/cE8/cE9/cEA/cEB/cEC/cED/cEE/cEF/cF0/cF1/cF2/cF3/cF4/cF5/cF6 + /cF7/cF8/cF9/cFA/cFB/cFC/cFD/cFE/cFF]def + /ct_CID_STR_SIZE 8000 def + /ct_mkocfStr100 100 string def + /ct_defaultFontMtx[.001 0 0 .001 0 0]def + /ct_1000Mtx[1000 0 0 1000 0 0]def + /ct_raise{exch cvx exch errordict exch get exec stop}bind def + /ct_reraise + {cvx $error/errorname get(Error: )print dup( )cvs print + errordict exch get exec stop + }bind def + /ct_cvnsi + { + 1 index add 1 sub 1 exch 0 4 1 roll + { + 2 index exch get + exch 8 bitshift + add + } + for + exch pop + }bind def + /ct_GetInterval + { + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /dst_index 0 def + dup dst_string length gt + {dup string/dst_string exch def} + if + 1 index ct_CID_STR_SIZE idiv + /arrayIndex exch def + 2 index arrayIndex get + 2 index + arrayIndex ct_CID_STR_SIZE mul + sub + { + dup 3 index add 2 index length le + { + 2 index getinterval + dst_string dst_index 2 index putinterval + length dst_index add/dst_index exch def + exit + } + { + 1 index length 1 index sub + dup 4 1 roll + getinterval + dst_string dst_index 2 index putinterval + pop dup dst_index add/dst_index exch def + sub + /arrayIndex arrayIndex 1 add def + 2 index dup length arrayIndex gt + {arrayIndex get} + { + pop + exit + } + ifelse + 0 + } + ifelse + } + loop + pop pop pop + dst_string 0 dst_index getinterval + end + }bind def + ct_Level2? + { + /ct_resourcestatus + currentglobal mark true setglobal + {/unknowninstancename/Category resourcestatus} + stopped + {cleartomark setglobal true} + {cleartomark currentglobal not exch setglobal} + ifelse + { + { + mark 3 1 roll/Category findresource + begin + ct_Vars/vm currentglobal put + ({ResourceStatus}stopped)0()/SubFileDecode filter cvx exec + {cleartomark false} + {{3 2 roll pop true}{cleartomark false}ifelse} + ifelse + ct_Vars/vm get setglobal + end + } + } + {{resourcestatus}} + ifelse bind def + /CIDFont/Category ct_resourcestatus + {pop pop} + { + currentglobal true setglobal + /Generic/Category findresource + dup length dict copy + dup/InstanceType/dicttype put + /CIDFont exch/Category defineresource pop + setglobal + } + ifelse + ct_UseNativeCapability? + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CIDSystemInfo 3 dict dup begin + /Registry(Adobe)def + /Ordering(Identity)def + /Supplement 0 def + end def + /CMapName/Identity-H def + /CMapVersion 1.000 def + /CMapType 1 def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + if + } + { + /ct_Category 2 dict begin + /CIDFont 10 dict def + /ProcSet 2 dict def + currentdict + end + def + /defineresource + { + ct_Category 1 index 2 copy known + { + get + dup dup maxlength exch length eq + { + dup length 10 add dict copy + ct_Category 2 index 2 index put + } + if + 3 index 3 index put + pop exch pop + } + {pop pop/defineresource/undefined ct_raise} + ifelse + }bind def + /findresource + { + ct_Category 1 index 2 copy known + { + get + 2 index 2 copy known + {get 3 1 roll pop pop} + {pop pop/findresource/undefinedresource ct_raise} + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /resourcestatus + { + ct_Category 1 index 2 copy known + { + get + 2 index known + exch pop exch pop + { + 0 -1 true + } + { + false + } + ifelse + } + {pop pop/findresource/undefined ct_raise} + ifelse + }bind def + /ct_resourcestatus/resourcestatus load def + } + ifelse + /ct_CIDInit 2 dict + begin + /ct_cidfont_stream_init + { + { + dup(Binary)eq + { + pop + null + currentfile + ct_Level2? + { + {cid_BYTE_COUNT()/SubFileDecode filter} + stopped + {pop pop pop} + if + } + if + /readstring load + exit + } + if + dup(Hex)eq + { + pop + currentfile + ct_Level2? + { + {null exch/ASCIIHexDecode filter/readstring} + stopped + {pop exch pop(>)exch/readhexstring} + if + } + {(>)exch/readhexstring} + ifelse + load + exit + } + if + /StartData/typecheck ct_raise + } + loop + cid_BYTE_COUNT ct_CID_STR_SIZE le + { + 2 copy cid_BYTE_COUNT string exch exec + pop + 1 array dup + 3 -1 roll + 0 exch put + } + { + cid_BYTE_COUNT ct_CID_STR_SIZE div ceiling cvi + dup array exch 2 sub 0 exch 1 exch + { + 2 copy + 5 index + ct_CID_STR_SIZE + string + 6 index exec + pop + put + pop + } + for + 2 index + cid_BYTE_COUNT ct_CID_STR_SIZE mod string + 3 index exec + pop + 1 index exch + 1 index length 1 sub + exch put + } + ifelse + cid_CIDFONT exch/GlyphData exch put + 2 index null eq + { + pop pop pop + } + { + pop/readstring load + 1 string exch + { + 3 copy exec + pop + dup length 0 eq + { + pop pop pop pop pop + true exit + } + if + 4 index + eq + { + pop pop pop pop + false exit + } + if + } + loop + pop + } + ifelse + }bind def + /StartData + { + mark + { + currentdict + dup/FDArray get 0 get/FontMatrix get + 0 get 0.001 eq + { + dup/CDevProc known not + { + /CDevProc 1183615869 internaldict/stdCDevProc 2 copy known + {get} + { + pop pop + {pop pop pop pop pop 0 -1000 7 index 2 div 880} + } + ifelse + def + } + if + } + { + /CDevProc + { + pop pop pop pop pop + 0 + 1 cid_temp/cid_CIDFONT get + /FDArray get 0 get + /FontMatrix get 0 get div + 7 index 2 div + 1 index 0.88 mul + }def + } + ifelse + /cid_temp 15 dict def + cid_temp + begin + /cid_CIDFONT exch def + 3 copy pop + dup/cid_BYTE_COUNT exch def 0 gt + { + ct_cidfont_stream_init + FDArray + { + /Private get + dup/SubrMapOffset known + { + begin + /Subrs SubrCount array def + Subrs + SubrMapOffset + SubrCount + SDBytes + ct_Level2? + { + currentdict dup/SubrMapOffset undef + dup/SubrCount undef + /SDBytes undef + } + if + end + /cid_SD_BYTES exch def + /cid_SUBR_COUNT exch def + /cid_SUBR_MAP_OFFSET exch def + /cid_SUBRS exch def + cid_SUBR_COUNT 0 gt + { + GlyphData cid_SUBR_MAP_OFFSET cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + 0 1 cid_SUBR_COUNT 1 sub + { + exch 1 index + 1 add + cid_SD_BYTES mul cid_SUBR_MAP_OFFSET add + GlyphData exch cid_SD_BYTES ct_GetInterval + 0 cid_SD_BYTES ct_cvnsi + cid_SUBRS 4 2 roll + GlyphData exch + 4 index + 1 index + sub + ct_GetInterval + dup length string copy put + } + for + pop + } + if + } + {pop} + ifelse + } + forall + } + if + cleartomark pop pop + end + CIDFontName currentdict/CIDFont defineresource pop + end end + } + stopped + {cleartomark/StartData ct_reraise} + if + }bind def + currentdict + end def + /ct_saveCIDInit + { + /CIDInit/ProcSet ct_resourcestatus + {true} + {/CIDInitC/ProcSet ct_resourcestatus} + ifelse + { + pop pop + /CIDInit/ProcSet findresource + ct_UseNativeCapability? + {pop null} + {/CIDInit ct_CIDInit/ProcSet defineresource pop} + ifelse + } + {/CIDInit ct_CIDInit/ProcSet defineresource pop null} + ifelse + ct_Vars exch/ct_oldCIDInit exch put + }bind def + /ct_restoreCIDInit + { + ct_Vars/ct_oldCIDInit get dup null ne + {/CIDInit exch/ProcSet defineresource pop} + {pop} + ifelse + }bind def + /ct_BuildCharSetUp + { + 1 index + begin + CIDFont + begin + Adobe_CoolType_Utility/ct_BuildCharDict get + begin + /ct_dfCharCode exch def + /ct_dfDict exch def + CIDFirstByte ct_dfCharCode add + dup CIDCount ge + {pop 0} + if + /cid exch def + { + GlyphDirectory cid 2 copy known + {get} + {pop pop nullstring} + ifelse + dup length FDBytes sub 0 gt + { + dup + FDBytes 0 ne + {0 FDBytes ct_cvnsi} + {pop 0} + ifelse + /fdIndex exch def + dup length FDBytes sub FDBytes exch getinterval + /charstring exch def + exit + } + { + pop + cid 0 eq + {/charstring nullstring def exit} + if + /cid 0 def + } + ifelse + } + loop + }def + /ct_SetCacheDevice + { + 0 0 moveto + dup stringwidth + 3 -1 roll + true charpath + pathbbox + 0 -1000 + 7 index 2 div 880 + setcachedevice2 + 0 0 moveto + }def + /ct_CloneSetCacheProc + { + 1 eq + { + stringwidth + pop -2 div -880 + 0 -1000 setcharwidth + moveto + } + { + usewidths? + { + currentfont/Widths get cid + 2 copy known + {get exch pop aload pop} + {pop pop stringwidth} + ifelse + } + {stringwidth} + ifelse + setcharwidth + 0 0 moveto + } + ifelse + }def + /ct_Type3ShowCharString + { + ct_FDDict fdIndex 2 copy known + {get} + { + currentglobal 3 1 roll + 1 index gcheck setglobal + ct_Type1FontTemplate dup maxlength dict copy + begin + FDArray fdIndex get + dup/FontMatrix 2 copy known + {get} + {pop pop ct_defaultFontMtx} + ifelse + /FontMatrix exch dup length array copy def + /Private get + /Private exch def + /Widths rootfont/Widths get def + /CharStrings 1 dict dup/.notdef + dup length string copy put def + currentdict + end + /ct_Type1Font exch definefont + dup 5 1 roll put + setglobal + } + ifelse + dup/CharStrings get 1 index/Encoding get + ct_dfCharCode get charstring put + rootfont/WMode 2 copy known + {get} + {pop pop 0} + ifelse + exch + 1000 scalefont setfont + ct_str1 0 ct_dfCharCode put + ct_str1 exch ct_dfSetCacheProc + ct_SyntheticBold + { + currentpoint + ct_str1 show + newpath + moveto + ct_str1 true charpath + ct_StrokeWidth setlinewidth + stroke + } + {ct_str1 show} + ifelse + }def + /ct_Type4ShowCharString + { + ct_dfDict ct_dfCharCode charstring + FDArray fdIndex get + dup/FontMatrix get dup ct_defaultFontMtx ct_matrixeq not + {ct_1000Mtx matrix concatmatrix concat} + {pop} + ifelse + /Private get + Adobe_CoolType_Utility/ct_Level2? get not + { + ct_dfDict/Private + 3 -1 roll + {put} + 1183615869 internaldict/superexec get exec + } + if + 1183615869 internaldict + Adobe_CoolType_Utility/ct_Level2? get + {1 index} + {3 index/Private get mark 6 1 roll} + ifelse + dup/RunInt known + {/RunInt get} + {pop/CCRun} + ifelse + get exec + Adobe_CoolType_Utility/ct_Level2? get not + {cleartomark} + if + }bind def + /ct_BuildCharIncremental + { + { + Adobe_CoolType_Utility/ct_MakeOCF get begin + ct_BuildCharSetUp + ct_ShowCharString + } + stopped + {stop} + if + end + end + end + end + }bind def + /BaseFontNameStr(BF00)def + /ct_Type1FontTemplate 14 dict + begin + /FontType 1 def + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /PaintType 0 def + currentdict + end def + /BaseFontTemplate 11 dict + begin + /FontMatrix [0.001 0 0 0.001 0 0]def + /FontBBox [-250 -250 1250 1250]def + /Encoding ct_cHexEncoding def + /BuildChar/ct_BuildCharIncremental load def + ct_Clone? + { + /FontType 3 def + /ct_ShowCharString/ct_Type3ShowCharString load def + /ct_dfSetCacheProc/ct_CloneSetCacheProc load def + /ct_SyntheticBold false def + /ct_StrokeWidth 1 def + } + { + /FontType 4 def + /Private 1 dict dup/lenIV 4 put def + /CharStrings 1 dict dup/.notdefput def + /PaintType 0 def + /ct_ShowCharString/ct_Type4ShowCharString load def + } + ifelse + /ct_str1 1 string def + currentdict + end def + /BaseFontDictSize BaseFontTemplate length 5 add def + /ct_matrixeq + { + true 0 1 5 + { + dup 4 index exch get exch 3 index exch get eq and + dup not + {exit} + if + } + for + exch pop exch pop + }bind def + /ct_makeocf + { + 15 dict + begin + exch/WMode exch def + exch/FontName exch def + /FontType 0 def + /FMapType 2 def + dup/FontMatrix known + {dup/FontMatrix get/FontMatrix exch def} + {/FontMatrix matrix def} + ifelse + /bfCount 1 index/CIDCount get 256 idiv 1 add + dup 256 gt{pop 256}if def + /Encoding + 256 array 0 1 bfCount 1 sub{2 copy dup put pop}for + bfCount 1 255{2 copy bfCount put pop}for + def + /FDepVector bfCount dup 256 lt{1 add}if array def + BaseFontTemplate BaseFontDictSize dict copy + begin + /CIDFont exch def + CIDFont/FontBBox known + {CIDFont/FontBBox get/FontBBox exch def} + if + CIDFont/CDevProc known + {CIDFont/CDevProc get/CDevProc exch def} + if + currentdict + end + BaseFontNameStr 3(0)putinterval + 0 1 bfCount dup 256 eq{1 sub}if + { + FDepVector exch + 2 index BaseFontDictSize dict copy + begin + dup/CIDFirstByte exch 256 mul def + FontType 3 eq + {/ct_FDDict 2 dict def} + if + currentdict + end + 1 index 16 + BaseFontNameStr 2 2 getinterval cvrs pop + BaseFontNameStr exch definefont + put + } + for + ct_Clone? + {/Widths 1 index/CIDFont get/GlyphDirectory get length dict def} + if + FontName + currentdict + end + definefont + ct_Clone? + { + gsave + dup 1000 scalefont setfont + ct_BuildCharDict + begin + /usewidths? false def + currentfont/Widths get + begin + exch/CIDFont get/GlyphDirectory get + { + pop + dup charcode exch 1 index 0 2 index 256 idiv put + 1 index exch 1 exch 256 mod put + stringwidth 2 array astore def + } + forall + end + /usewidths? true def + end + grestore + } + {exch pop} + ifelse + }bind def + currentglobal true setglobal + /ct_ComposeFont + { + ct_UseNativeCapability? + { + 2 index/CMap ct_resourcestatus + {pop pop exch pop} + { + /CIDInit/ProcSet findresource + begin + 12 dict + begin + begincmap + /CMapName 3 index def + /CMapVersion 1.000 def + /CMapType 1 def + exch/WMode exch def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + { + dup length string copy + exch pop exch pop + } + {pop(Identity)} + ifelse + } + {pop (Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + 3 2 roll pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + setglobal + /ct_MakeIdentity + { + ct_UseNativeCapability? + { + 1 index/CMap ct_resourcestatus + {pop pop} + { + /CIDInit/ProcSet findresource begin + 12 dict begin + begincmap + /CMapName 2 index def + /CMapVersion 1.000 def + /CMapType 1 def + /CIDSystemInfo 3 dict dup + begin + /Registry(Adobe)def + /Ordering + CMapName ct_mkocfStr100 cvs + (Adobe-)search + { + pop pop + (-)search + {dup length string copy exch pop exch pop} + {pop(Identity)} + ifelse + } + {pop(Identity)} + ifelse + def + /Supplement 0 def + end def + 1 begincodespacerange + <0000> + endcodespacerange + 1 begincidrange + <0000>0 + endcidrange + endcmap + CMapName currentdict/CMap defineresource pop + end + end + } + ifelse + composefont + } + { + exch pop + 0 get/CIDFont findresource + ct_makeocf + } + ifelse + }bind def + currentdict readonly pop + end + end +%%EndResource +setglobal +%%BeginResource: procset Adobe_CoolType_Utility_T42 1.0 0 +%%Copyright: Copyright 1987-2004 Adobe Systems Incorporated. +%%Version: 1.0 0 +userdict/ct_T42Dict 15 dict put +ct_T42Dict begin +/Is2015? +{ + version + cvi + 2015 + ge +}bind def +/AllocGlyphStorage +{ + Is2015? + { + pop + } + { + {string}forall + }ifelse +}bind def +/Type42DictBegin +{ +25 dict begin + /FontName exch def + /CharStrings 256 dict +begin + /.notdef 0 def + currentdict +end def + /Encoding exch def + /PaintType 0 def + /FontType 42 def + /FontMatrix[1 0 0 1 0 0]def + 4 array astore cvx/FontBBox exch def + /sfnts +}bind def +/Type42DictEnd +{ + currentdict dup/FontName get exch definefont end +ct_T42Dict exch +dup/FontName get exch put +}bind def +/RD{string currentfile exch readstring pop}executeonly def +/PrepFor2015 +{ +Is2015? +{ + /GlyphDirectory + 16 + dict def + sfnts 0 get + dup + 2 index + (glyx) + putinterval + 2 index + (locx) + putinterval + pop + pop +} +{ + pop + pop +}ifelse +}bind def +/AddT42Char +{ +Is2015? +{ + /GlyphDirectory get + begin + def + end + pop + pop +} +{ + /sfnts get + 4 index + get + 3 index + 2 index + putinterval + pop + pop + pop + pop +}ifelse +}bind def +/T0AddT42Mtx2 +{ +/CIDFont findresource/Metrics2 get begin def end +}bind def +end +%%EndResource +currentglobal true setglobal +%%BeginFile: MMFauxFont.prc +%%Copyright: Copyright 1987-2001 Adobe Systems Incorporated. +%%All Rights Reserved. +userdict /ct_EuroDict 10 dict put +ct_EuroDict begin +/ct_CopyFont +{ + { 1 index /FID ne {def} {pop pop} ifelse} forall +} def +/ct_GetGlyphOutline +{ + gsave + initmatrix newpath + exch findfont dup + length 1 add dict + begin + ct_CopyFont + /Encoding Encoding dup length array copy + dup + 4 -1 roll + 0 exch put + def + currentdict + end + /ct_EuroFont exch definefont + 1000 scalefont setfont + 0 0 moveto + [ + <00> stringwidth + <00> false charpath + pathbbox + [ + {/m cvx} {/l cvx} {/c cvx} {/cp cvx} pathforall + grestore + counttomark 8 add +} +def +/ct_MakeGlyphProc +{ + ] cvx + /ct_PSBuildGlyph cvx + ] cvx +} def +/ct_PSBuildGlyph +{ + gsave + 8 -1 roll pop + 7 1 roll + 6 -2 roll ct_FontMatrix transform 6 2 roll + 4 -2 roll ct_FontMatrix transform 4 2 roll + ct_FontMatrix transform + currentdict /PaintType 2 copy known {get 2 eq}{pop pop false} ifelse + dup 9 1 roll + { + currentdict /StrokeWidth 2 copy known + { + get 2 div + 0 ct_FontMatrix dtransform pop + 5 1 roll + 4 -1 roll 4 index sub + 4 1 roll + 3 -1 roll 4 index sub + 3 1 roll + exch 4 index add exch + 4 index add + 5 -1 roll pop + } + { + pop pop + } + ifelse + } + if + setcachedevice + ct_FontMatrix concat + ct_PSPathOps begin + exec + end + { + currentdict /StrokeWidth 2 copy known + { get } + { pop pop 0 } + ifelse + setlinewidth stroke + } + { + fill + } + ifelse + grestore +} def +/ct_PSPathOps 4 dict dup begin + /m {moveto} def + /l {lineto} def + /c {curveto} def + /cp {closepath} def +end +def +/ct_matrix1000 [1000 0 0 1000 0 0] def +/ct_AddGlyphProc +{ + 2 index findfont dup length 4 add dict + begin + ct_CopyFont + /CharStrings CharStrings dup length 1 add dict copy + begin + 3 1 roll def + currentdict + end + def + /ct_FontMatrix ct_matrix1000 FontMatrix matrix concatmatrix def + /ct_PSBuildGlyph /ct_PSBuildGlyph load def + /ct_PSPathOps /ct_PSPathOps load def + currentdict + end + definefont pop +} +def +systemdict /languagelevel known +{ + /ct_AddGlyphToPrinterFont { + 2 copy + ct_GetGlyphOutline 3 add -1 roll restore + ct_MakeGlyphProc + ct_AddGlyphProc + } def +} +{ + /ct_AddGlyphToPrinterFont { + pop pop restore + Adobe_CTFauxDict /$$$FONTNAME get + /Euro + Adobe_CTFauxDict /$$$SUBSTITUTEBASE get + ct_EuroDict exch get + ct_AddGlyphProc + } def +} ifelse +/AdobeSansMM +{ +556 0 24 -19 541 703 + { + 541 628 m + 510 669 442 703 354 703 c + 201 703 117 607 101 444 c + 50 444 l + 25 372 l + 97 372 l + 97 301 l + 49 301 l + 24 229 l + 103 229 l + 124 67 209 -19 350 -19 c + 435 -19 501 25 509 32 c + 509 131 l + 492 105 417 60 343 60 c + 267 60 204 127 197 229 c + 406 229 l + 430 301 l + 191 301 l + 191 372 l + 455 372 l + 479 444 l + 194 444 l + 201 531 245 624 348 624 c + 433 624 484 583 509 534 c + cp + 556 0 m + } +ct_PSBuildGlyph +} def +/AdobeSerifMM +{ +500 0 10 -12 484 692 + { + 347 298 m + 171 298 l + 170 310 170 322 170 335 c + 170 362 l + 362 362 l + 374 403 l + 172 403 l + 184 580 244 642 308 642 c + 380 642 434 574 457 457 c + 481 462 l + 474 691 l + 449 691 l + 433 670 429 657 410 657 c + 394 657 360 692 299 692 c + 204 692 94 604 73 403 c + 22 403 l + 10 362 l + 70 362 l + 69 352 69 341 69 330 c + 69 319 69 308 70 298 c + 22 298 l + 10 257 l + 73 257 l + 97 57 216 -12 295 -12 c + 364 -12 427 25 484 123 c + 458 142 l + 425 101 384 37 316 37 c + 256 37 189 84 173 257 c + 335 257 l + cp + 500 0 m + } +ct_PSBuildGlyph +} def +end +%%EndFile +setglobal +Adobe_CoolType_Core begin /$None SetSubstituteStrategy end +%%BeginResource: procset Adobe_AGM_Image 1.0 0 +%%Version: 1.0 0 +%%Copyright: Copyright(C)2000-2006 Adobe Systems, Inc. All Rights Reserved. +systemdict/setpacking known +{ + currentpacking + true setpacking +}if +userdict/Adobe_AGM_Image 71 dict dup begin put +/Adobe_AGM_Image_Id/Adobe_AGM_Image_1.0_0 def +/nd{ + null def +}bind def +/AGMIMG_&image nd +/AGMIMG_&colorimage nd +/AGMIMG_&imagemask nd +/AGMIMG_mbuf()def +/AGMIMG_ybuf()def +/AGMIMG_kbuf()def +/AGMIMG_c 0 def +/AGMIMG_m 0 def +/AGMIMG_y 0 def +/AGMIMG_k 0 def +/AGMIMG_tmp nd +/AGMIMG_imagestring0 nd +/AGMIMG_imagestring1 nd +/AGMIMG_imagestring2 nd +/AGMIMG_imagestring3 nd +/AGMIMG_imagestring4 nd +/AGMIMG_imagestring5 nd +/AGMIMG_cnt nd +/AGMIMG_fsave nd +/AGMIMG_colorAry nd +/AGMIMG_override nd +/AGMIMG_name nd +/AGMIMG_maskSource nd +/AGMIMG_flushfilters nd +/invert_image_samples nd +/knockout_image_samples nd +/img nd +/sepimg nd +/devnimg nd +/idximg nd +/ds +{ + Adobe_AGM_Core begin + Adobe_AGM_Image begin + /AGMIMG_&image systemdict/image get def + /AGMIMG_&imagemask systemdict/imagemask get def + /colorimage where{ + pop + /AGMIMG_&colorimage/colorimage ldf + }if + end + end +}def +/ps +{ + Adobe_AGM_Image begin + /AGMIMG_ccimage_exists{/customcolorimage where + { + pop + /Adobe_AGM_OnHost_Seps where + { + pop false + }{ + /Adobe_AGM_InRip_Seps where + { + pop false + }{ + true + }ifelse + }ifelse + }{ + false + }ifelse + }bdf + level2{ + /invert_image_samples + { + Adobe_AGM_Image/AGMIMG_tmp Decode length ddf + /Decode[Decode 1 get Decode 0 get]def + }def + /knockout_image_samples + { + Operator/imagemask ne{ + /Decode[1 1]def + }if + }def + }{ + /invert_image_samples + { + {1 exch sub}currenttransfer addprocs settransfer + }def + /knockout_image_samples + { + {pop 1}currenttransfer addprocs settransfer + }def + }ifelse + /img/imageormask ldf + /sepimg/sep_imageormask ldf + /devnimg/devn_imageormask ldf + /idximg/indexed_imageormask ldf + /_ctype 7 def + currentdict{ + dup xcheck 1 index type dup/arraytype eq exch/packedarraytype eq or and{ + bind + }if + def + }forall +}def +/pt +{ + end +}def +/dt +{ +}def +/AGMIMG_flushfilters +{ + dup type/arraytype ne + {1 array astore}if + dup 0 get currentfile ne + {dup 0 get flushfile}if + { + dup type/filetype eq + { + dup status 1 index currentfile ne and + {closefile} + {pop} + ifelse + }{pop}ifelse + }forall +}def +/AGMIMG_init_common +{ + currentdict/T known{/ImageType/T ldf currentdict/T undef}if + currentdict/W known{/Width/W ldf currentdict/W undef}if + currentdict/H known{/Height/H ldf currentdict/H undef}if + currentdict/M known{/ImageMatrix/M ldf currentdict/M undef}if + currentdict/BC known{/BitsPerComponent/BC ldf currentdict/BC undef}if + currentdict/D known{/Decode/D ldf currentdict/D undef}if + currentdict/DS known{/DataSource/DS ldf currentdict/DS undef}if + currentdict/O known{ + /Operator/O load 1 eq{ + /imagemask + }{ + /O load 2 eq{ + /image + }{ + /colorimage + }ifelse + }ifelse + def + currentdict/O undef + }if + currentdict/HSCI known{/HostSepColorImage/HSCI ldf currentdict/HSCI undef}if + currentdict/MD known{/MultipleDataSources/MD ldf currentdict/MD undef}if + currentdict/I known{/Interpolate/I ldf currentdict/I undef}if + currentdict/SI known{/SkipImageProc/SI ldf currentdict/SI undef}if + /DataSource load xcheck not{ + DataSource type/arraytype eq{ + DataSource 0 get type/filetype eq{ + /_Filters DataSource def + currentdict/MultipleDataSources known not{ + /DataSource DataSource dup length 1 sub get def + }if + }if + }if + currentdict/MultipleDataSources known not{ + /MultipleDataSources DataSource type/arraytype eq{ + DataSource length 1 gt + } + {false}ifelse def + }if + }if + /NComponents Decode length 2 div def + currentdict/SkipImageProc known not{/SkipImageProc{false}def}if +}bdf +/imageormask_sys +{ + begin + AGMIMG_init_common + save mark + level2{ + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + AGMIMG_&imagemask + }{ + BitsPerComponent ImageMatrix/DataSource load + AGMIMG_&image + }ifelse + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + cleartomark restore + end +}def +/overprint_plate +{ + currentoverprint{ + 0 get dup type/nametype eq{ + dup/DeviceGray eq{ + pop AGMCORE_black_plate not + }{ + /DeviceCMYK eq{ + AGMCORE_is_cmyk_sep not + }if + }ifelse + }{ + false exch + { + AGMOHS_sepink eq or + }forall + not + }ifelse + }{ + pop false + }ifelse +}def +/process_mask +{ + level3{ + dup begin + /ImageType 1 def + end + 4 dict begin + /DataDict exch def + /ImageType 3 def + /InterleaveType 3 def + /MaskDict 9 dict begin + /ImageType 1 def + /Width DataDict dup/MaskWidth known{/MaskWidth}{/Width}ifelse get def + /Height DataDict dup/MaskHeight known{/MaskHeight}{/Height}ifelse get def + /ImageMatrix[Width 0 0 Height neg 0 Height]def + /NComponents 1 def + /BitsPerComponent 1 def + /Decode DataDict dup/MaskD known{/MaskD}{[1 0]}ifelse get def + /DataSource Adobe_AGM_Core/AGMIMG_maskSource get def + currentdict end def + currentdict end + }if +}def +/use_mask +{ + dup/Mask known {dup/Mask get}{false}ifelse +}def +/imageormask +{ + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + } + { + save mark + level2 AGMCORE_host_sep not and{ + currentdict + Operator/imagemask eq DeviceN_PS2 not and{ + imagemask + }{ + AGMCORE_in_rip_sep currentoverprint and currentcolorspace 0 get/DeviceGray eq and{ + [/Separation/Black/DeviceGray{}]setcolorspace + /Decode[Decode 1 get Decode 0 get]def + }if + use_mask{ + process_mask image + }{ + DeviceN_NoneName DeviceN_PS2 Indexed_DeviceN level3 not and or or AGMCORE_in_rip_sep and + { + Names convert_to_process not{ + 2 dict begin + /imageDict xdf + /names_index 0 def + gsave + imageDict write_image_file{ + Names{ + dup(None)ne{ + [/Separation 3 -1 roll/DeviceGray{1 exch sub}]setcolorspace + Operator imageDict read_image_file + names_index 0 eq{true setoverprint}if + /names_index names_index 1 add def + }{ + pop + }ifelse + }forall + close_image_file + }if + grestore + end + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }{ + Operator/imagemask eq{ + imagemask + }{ + image + }ifelse + }ifelse + }ifelse + }ifelse + }{ + Width Height + Operator/imagemask eq{ + Decode 0 get 1 eq Decode 1 get 0 eq and + ImageMatrix/DataSource load + /Adobe_AGM_OnHost_Seps where{ + pop imagemask + }{ + currentgray 1 ne{ + currentdict imageormask_sys + }{ + currentoverprint not{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }ifelse + }{ + BitsPerComponent ImageMatrix + MultipleDataSources{ + 0 1 NComponents 1 sub{ + DataSource exch get + }for + }{ + /DataSource load + }ifelse + Operator/colorimage eq{ + AGMCORE_host_sep{ + MultipleDataSources level2 or NComponents 4 eq and{ + AGMCORE_is_cmyk_sep{ + MultipleDataSources{ + /DataSource DataSource 0 get xcheck + { + [ + DataSource 0 get/exec cvx + DataSource 1 get/exec cvx + DataSource 2 get/exec cvx + DataSource 3 get/exec cvx + /AGMCORE_get_ink_data cvx + ]cvx + }{ + DataSource aload pop AGMCORE_get_ink_data + }ifelse def + }{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + /DataSource load + filter_cmyk 0()/SubFileDecode filter def + }ifelse + /Decode[Decode 0 get Decode 1 get]def + /MultipleDataSources false def + /NComponents 1 def + /Operator/image def + invert_image_samples + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + 1 AGMCORE_&setgray + currentdict imageormask_sys + }{ + currentdict ignoreimagedata + }ifelse + }ifelse + }{ + MultipleDataSources NComponents AGMIMG_&colorimage + }ifelse + }{ + true NComponents colorimage + }ifelse + }{ + Operator/image eq{ + AGMCORE_host_sep{ + /DoImage true def + currentdict/HostSepColorImage known{HostSepColorImage not}{false}ifelse + { + AGMCORE_black_plate not Operator/imagemask ne and{ + /DoImage false def + currentdict ignoreimagedata + }if + }if + 1 AGMCORE_&setgray + DoImage + {currentdict imageormask_sys}if + }{ + use_mask{ + process_mask image + }{ + image + }ifelse + }ifelse + }{ + Operator/knockout eq{ + pop pop pop pop pop + currentcolorspace overprint_plate not{ + knockout_unitsq + }if + }if + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/sep_imageormask +{ + /sep_colorspace_dict AGMCORE_gget begin + CSA map_csa + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_avoid_L2_sep_space{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + }if + AGMIMG_ccimage_exists + MappedCSA 0 get/DeviceCMYK eq and + currentdict/Components known and + Name()ne and + Name(All)ne and + Operator/image eq and + AGMCORE_producing_seps not and + level2 not and + { + Width Height BitsPerComponent ImageMatrix + [ + /DataSource load/exec cvx + { + 0 1 2 index length 1 sub{ + 1 index exch + 2 copy get 255 xor put + }for + }/exec cvx + ]cvx bind + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Name findcmykcustomcolor + customcolorimage + }{ + AGMCORE_producing_seps not{ + level2{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne AGMCORE_avoid_L2_sep_space not and currentcolorspace 0 get/Separation ne and{ + [/Separation Name MappedCSA sep_proc_name exch dup 0 get 15 string cvs(/Device)anchorsearch{pop pop 0 get}{pop}ifelse exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + currentdict imageormask + }{ + currentdict + Operator/imagemask eq{ + imageormask + }{ + sep_imageormask_lev1 + }ifelse + }ifelse + }{ + AGMCORE_host_sep{ + Operator/knockout eq{ + currentdict/ImageMatrix get concat + knockout_unitsq + }{ + currentgray 1 ne{ + AGMCORE_is_cmyk_sep Name(All)ne and{ + level2{ + Name AGMCORE_IsSeparationAProcessColor + { + Operator/imagemask eq{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + /sep_tint AGMCORE_gget 1 exch sub AGMCORE_&setcolor + }if + }{ + invert_image_samples + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + [/Separation Name[/DeviceGray] + { + sep_colorspace_proc AGMCORE_get_ink_data + 1 exch sub + }bind + ]AGMCORE_&setcolorspace + /sep_tint AGMCORE_gget AGMCORE_&setcolor + }if + }ifelse + currentdict imageormask_sys + }{ + currentdict + Operator/imagemask eq{ + imageormask_sys + }{ + sep_image_lev1_sep + }ifelse + }ifelse + }{ + Operator/imagemask ne{ + invert_image_samples + }if + currentdict imageormask_sys + }ifelse + }{ + currentoverprint not Name(All)eq or Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{ + currentcolorspace 0 get/Separation ne{ + [/Separation Name MappedCSA sep_proc_name exch 0 get exch load]setcolorspace_opt + /sep_tint AGMCORE_gget setcolor + }if + }if + currentoverprint + MappedCSA 0 get/DeviceCMYK eq and + Name AGMCORE_IsSeparationAProcessColor not and + //Adobe_AGM_Core/AGMCORE_pattern_paint_type get 2 ne{Name inRip_spot_has_ink not and}{false}ifelse + Name(All)ne and{ + imageormask_l2_overprint + }{ + currentdict imageormask + }ifelse + }ifelse + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end +}def +/colorSpaceElemCnt +{ + mark currentcolor counttomark dup 2 add 1 roll cleartomark +}bdf +/devn_sep_datasource +{ + 1 dict begin + /dataSource xdf + [ + 0 1 dataSource length 1 sub{ + dup currentdict/dataSource get/exch cvx/get cvx/exec cvx + /exch cvx names_index/ne cvx[/pop cvx]cvx/if cvx + }for + ]cvx bind + end +}bdf +/devn_alt_datasource +{ + 11 dict begin + /convProc xdf + /origcolorSpaceElemCnt xdf + /origMultipleDataSources xdf + /origBitsPerComponent xdf + /origDecode xdf + /origDataSource xdf + /dsCnt origMultipleDataSources{origDataSource length}{1}ifelse def + /DataSource origMultipleDataSources + { + [ + BitsPerComponent 8 idiv origDecode length 2 idiv mul string + 0 1 origDecode length 2 idiv 1 sub + { + dup 7 mul 1 add index exch dup BitsPerComponent 8 idiv mul exch + origDataSource exch get 0()/SubFileDecode filter + BitsPerComponent 8 idiv string/readstring cvx/pop cvx/putinterval cvx + }for + ]bind cvx + }{origDataSource}ifelse 0()/SubFileDecode filter def + [ + origcolorSpaceElemCnt string + 0 2 origDecode length 2 sub + { + dup origDecode exch get dup 3 -1 roll 1 add origDecode exch get exch sub 2 BitsPerComponent exp 1 sub div + 1 BitsPerComponent 8 idiv{DataSource/read cvx/not cvx{0}/if cvx/mul cvx}repeat/mul cvx/add cvx + }for + /convProc load/exec cvx + origcolorSpaceElemCnt 1 sub -1 0 + { + /dup cvx 2/add cvx/index cvx + 3 1/roll cvx/exch cvx 255/mul cvx/cvi cvx/put cvx + }for + ]bind cvx 0()/SubFileDecode filter + end +}bdf +/devn_imageormask +{ + /devicen_colorspace_dict AGMCORE_gget begin + CSA map_csa + 2 dict begin + dup + /srcDataStrs[3 -1 roll begin + AGMIMG_init_common + currentdict/MultipleDataSources known{MultipleDataSources{DataSource length}{1}ifelse}{1}ifelse + { + Width Decode length 2 div mul cvi + { + dup 65535 gt{1 add 2 div cvi}{exit}ifelse + }loop + string + }repeat + end]def + /dstDataStr srcDataStrs 0 get length string def + begin + AGMIMG_init_common + SkipImageProc{ + currentdict consumeimagedata + }{ + save mark + AGMCORE_producing_seps not{ + level3 not{ + Operator/imagemask ne{ + /DataSource[[ + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + colorSpaceElemCnt/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource 1/string cvx/readstring cvx/pop cvx]cvx colorSpaceElemCnt 1 sub{dup}repeat]def + /MultipleDataSources true def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + }if + }if + currentdict imageormask + }{ + AGMCORE_host_sep{ + Names convert_to_process{ + CSA get_csa_by_name 0 get/DeviceCMYK eq{ + /DataSource + Width BitsPerComponent mul 7 add 8 idiv Height mul 4 mul + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + 4/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + filter_cmyk 0()/SubFileDecode filter def + /MultipleDataSources false def + /Decode[1 0]def + /DeviceGray setcolorspace + currentdict imageormask_sys + }{ + AGMCORE_report_unsupported_color_space + AGMCORE_black_plate{ + /DataSource + DataSource Decode BitsPerComponent currentdict/MultipleDataSources known{MultipleDataSources}{false}ifelse + CSA get_csa_by_name 0 get/DeviceRGB eq{3}{1}ifelse/devicen_colorspace_dict AGMCORE_gget/TintTransform get + devn_alt_datasource + /MultipleDataSources false def + /Decode colorSpaceElemCnt[exch{0 1}repeat]def + currentdict imageormask_sys + }{ + gsave + knockout_unitsq + grestore + currentdict consumeimagedata + }ifelse + }ifelse + } + { + /devicen_colorspace_dict AGMCORE_gget/names_index known{ + Operator/imagemask ne{ + MultipleDataSources{ + /DataSource[DataSource devn_sep_datasource/exec cvx]cvx def + /MultipleDataSources false def + }{ + /DataSource/DataSource load dstDataStr srcDataStrs 0 get filter_devn def + }ifelse + invert_image_samples + }if + currentdict imageormask_sys + }{ + currentoverprint not Operator/imagemask eq and{ + currentdict imageormask_sys + }{ + currentoverprint not + { + gsave + knockout_unitsq + grestore + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + currentdict imageormask + }ifelse + }ifelse + cleartomark restore + }ifelse + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end + end + end +}def +/imageormask_l2_overprint +{ + currentdict + currentcmykcolor add add add 0 eq{ + currentdict consumeimagedata + }{ + level3{ + currentcmykcolor + /AGMIMG_k xdf + /AGMIMG_y xdf + /AGMIMG_m xdf + /AGMIMG_c xdf + Operator/imagemask eq{ + [/DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ]/DeviceCMYK{}]setcolorspace + AGMIMG_c 0 ne{AGMIMG_c}if + AGMIMG_m 0 ne{AGMIMG_m}if + AGMIMG_y 0 ne{AGMIMG_y}if + AGMIMG_k 0 ne{AGMIMG_k}if + setcolor + }{ + /Decode[Decode 0 get 255 mul Decode 1 get 255 mul]def + [/Indexed + [ + /DeviceN[ + AGMIMG_c 0 ne{/Cyan}if + AGMIMG_m 0 ne{/Magenta}if + AGMIMG_y 0 ne{/Yellow}if + AGMIMG_k 0 ne{/Black}if + ] + /DeviceCMYK{ + AGMIMG_k 0 eq{0}if + AGMIMG_y 0 eq{0 exch}if + AGMIMG_m 0 eq{0 3 1 roll}if + AGMIMG_c 0 eq{0 4 1 roll}if + } + ] + 255 + { + 255 div + mark exch + dup dup dup + AGMIMG_k 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 1 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_y 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 2 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_m 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec 4 3 roll pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + AGMIMG_c 0 ne{ + /sep_tint AGMCORE_gget mul MappedCSA sep_proc_name exch pop load exec pop pop pop + counttomark 1 roll + }{ + pop + }ifelse + counttomark 1 add -1 roll pop + } + ]setcolorspace + }ifelse + imageormask_sys + }{ + write_image_file{ + currentcmykcolor + 0 ne{ + [/Separation/Black/DeviceGray{}]setcolorspace + gsave + /Black + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 1 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Yellow/DeviceGray{}]setcolorspace + gsave + /Yellow + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 2 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Magenta/DeviceGray{}]setcolorspace + gsave + /Magenta + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{4 3 roll pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + 0 ne{ + [/Separation/Cyan/DeviceGray{}]setcolorspace + gsave + /Cyan + [{1 exch sub/sep_tint AGMCORE_gget mul}/exec cvx MappedCSA sep_proc_name cvx exch pop{pop pop pop 1 exch sub}/exec cvx] + cvx modify_halftone_xfer + Operator currentdict read_image_file + grestore + }if + close_image_file + }{ + imageormask + }ifelse + }ifelse + }ifelse +}def +/indexed_imageormask +{ + begin + AGMIMG_init_common + save mark + currentdict + AGMCORE_host_sep{ + Operator/knockout eq{ + /indexed_colorspace_dict AGMCORE_gget dup/CSA known{ + /CSA get get_csa_by_name + }{ + /Names get + }ifelse + overprint_plate not{ + knockout_unitsq + }if + }{ + Indexed_DeviceN{ + /devicen_colorspace_dict AGMCORE_gget dup/names_index known exch/Names get convert_to_process or{ + indexed_image_lev2_sep + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }{ + AGMCORE_is_cmyk_sep{ + Operator/imagemask eq{ + imageormask_sys + }{ + level2{ + indexed_image_lev2_sep + }{ + indexed_image_lev1_sep + }ifelse + }ifelse + }{ + currentoverprint not{ + knockout_unitsq + }if + currentdict consumeimagedata + }ifelse + }ifelse + }ifelse + }{ + level2{ + Indexed_DeviceN{ + /indexed_colorspace_dict AGMCORE_gget begin + }{ + /indexed_colorspace_dict AGMCORE_gget dup null ne + { + begin + currentdict/CSDBase known{CSDBase/CSD get_res/MappedCSA get}{CSA}ifelse + get_csa_by_name 0 get/DeviceCMYK eq ps_level 3 ge and ps_version 3015.007 lt and + AGMCORE_in_rip_sep and{ + [/Indexed[/DeviceN[/Cyan/Magenta/Yellow/Black]/DeviceCMYK{}]HiVal Lookup] + setcolorspace + }if + end + } + {pop}ifelse + }ifelse + imageormask + Indexed_DeviceN{ + end + }if + }{ + Operator/imagemask eq{ + imageormask + }{ + indexed_imageormask_lev1 + }ifelse + }ifelse + }ifelse + cleartomark restore + currentdict/_Filters known{_Filters AGMIMG_flushfilters}if + end +}def +/indexed_image_lev2_sep +{ + /indexed_colorspace_dict AGMCORE_gget begin + begin + Indexed_DeviceN not{ + currentcolorspace + dup 1/DeviceGray put + dup 3 + currentcolorspace 2 get 1 add string + 0 1 2 3 AGMCORE_get_ink_data 4 currentcolorspace 3 get length 1 sub + { + dup 4 idiv exch currentcolorspace 3 get exch get 255 exch sub 2 index 3 1 roll put + }for + put setcolorspace + }if + currentdict + Operator/imagemask eq{ + AGMIMG_&imagemask + }{ + use_mask{ + process_mask AGMIMG_&image + }{ + AGMIMG_&image + }ifelse + }ifelse + end end +}def + /OPIimage + { + dup type/dicttype ne{ + 10 dict begin + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /ImageType 1 def + /Decode[0 1 def] + currentdict + end + }if + dup begin + /NComponents 1 cdndf + /MultipleDataSources false cdndf + /SkipImageProc{false}cdndf + /Decode[ + 0 + currentcolorspace 0 get/Indexed eq{ + 2 BitsPerComponent exp 1 sub + }{ + 1 + }ifelse + ]cdndf + /Operator/image cdndf + end + /sep_colorspace_dict AGMCORE_gget null eq{ + imageormask + }{ + gsave + dup begin invert_image_samples end + sep_imageormask + grestore + }ifelse + }def +/cachemask_level2 +{ + 3 dict begin + /LZWEncode filter/WriteFilter xdf + /readBuffer 256 string def + /ReadFilter + currentfile + 0(%EndMask)/SubFileDecode filter + /ASCII85Decode filter + /RunLengthDecode filter + def + { + ReadFilter readBuffer readstring exch + WriteFilter exch writestring + not{exit}if + }loop + WriteFilter closefile + end +}def +/spot_alias +{ + /mapto_sep_imageormask + { + dup type/dicttype ne{ + 12 dict begin + /ImageType 1 def + /DataSource xdf + /ImageMatrix xdf + /BitsPerComponent xdf + /Height xdf + /Width xdf + /MultipleDataSources false def + }{ + begin + }ifelse + /Decode[/customcolor_tint AGMCORE_gget 0]def + /Operator/image def + /SkipImageProc{false}def + currentdict + end + sep_imageormask + }bdf + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_colorAry xddf + /customcolor_tint AGMCORE_gget + << + /Name AGMIMG_colorAry 4 get + /CSA[/DeviceCMYK] + /TintMethod/Subtractive + /TintProc null + /MappedCSA null + /NComponents 4 + /Components[AGMIMG_colorAry aload pop pop] + >> + setsepcolorspace + mapto_sep_imageormask + }ndf + Adobe_AGM_Image/AGMIMG_&customcolorimage/customcolorimage load put + /customcolorimage + { + Adobe_AGM_Image/AGMIMG_override false put + current_spot_alias{dup 4 get map_alias}{false}ifelse + { + false set_spot_alias + /customcolor_tint AGMCORE_gget exch setsepcolorspace + pop + mapto_sep_imageormask + true set_spot_alias + }{ + //Adobe_AGM_Image/AGMIMG_&customcolorimage get exec + }ifelse + }bdf +}def +/snap_to_device +{ + 6 dict begin + matrix currentmatrix + dup 0 get 0 eq 1 index 3 get 0 eq and + 1 index 1 get 0 eq 2 index 2 get 0 eq and or exch pop + { + 1 1 dtransform 0 gt exch 0 gt/AGMIMG_xSign? exch def/AGMIMG_ySign? exch def + 0 0 transform + AGMIMG_ySign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + AGMIMG_xSign?{floor 0.1 sub}{ceiling 0.1 add}ifelse exch + itransform/AGMIMG_llY exch def/AGMIMG_llX exch def + 1 1 transform + AGMIMG_ySign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + AGMIMG_xSign?{ceiling 0.1 add}{floor 0.1 sub}ifelse exch + itransform/AGMIMG_urY exch def/AGMIMG_urX exch def + [AGMIMG_urX AGMIMG_llX sub 0 0 AGMIMG_urY AGMIMG_llY sub AGMIMG_llX AGMIMG_llY]concat + }{ + }ifelse + end +}def +level2 not{ + /colorbuf + { + 0 1 2 index length 1 sub{ + dup 2 index exch get + 255 exch sub + 2 index + 3 1 roll + put + }for + }def + /tint_image_to_color + { + begin + Width Height BitsPerComponent ImageMatrix + /DataSource load + end + Adobe_AGM_Image begin + /AGMIMG_mbuf 0 string def + /AGMIMG_ybuf 0 string def + /AGMIMG_kbuf 0 string def + { + colorbuf dup length AGMIMG_mbuf length ne + { + dup length dup dup + /AGMIMG_mbuf exch string def + /AGMIMG_ybuf exch string def + /AGMIMG_kbuf exch string def + }if + dup AGMIMG_mbuf copy AGMIMG_ybuf copy AGMIMG_kbuf copy pop + } + addprocs + {AGMIMG_mbuf}{AGMIMG_ybuf}{AGMIMG_kbuf}true 4 colorimage + end + }def + /sep_imageormask_lev1 + { + begin + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + { + 255 mul round cvi GrayLookup exch get + }currenttransfer addprocs settransfer + currentdict imageormask + }{ + /sep_colorspace_dict AGMCORE_gget/Components known{ + MappedCSA 0 get/DeviceCMYK eq{ + Components aload pop + }{ + 0 0 0 Components aload pop 1 exch sub + }ifelse + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + AGMIMG_y 0.0 eq AGMIMG_m 0.0 eq and AGMIMG_c 0.0 eq and{ + {AGMIMG_k mul 1 exch sub}currenttransfer addprocs settransfer + currentdict imageormask + }{ + currentcolortransfer + {AGMIMG_k mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_y mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_m mul 1 exch sub}exch addprocs 4 1 roll + {AGMIMG_c mul 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }{ + MappedCSA 0 get/DeviceGray eq{ + {255 mul round cvi ColorLookup exch get 0 get}currenttransfer addprocs settransfer + currentdict imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 2 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 1 get}exch addprocs 4 1 roll + {255 mul round cvi ColorLookup exch get 0 get}exch addprocs 4 1 roll + setcolortransfer + currentdict tint_image_to_color + }ifelse + }ifelse + }ifelse + }ifelse + end + }def + /sep_image_lev1_sep + { + begin + /sep_colorspace_dict AGMCORE_gget/Components known{ + Components aload pop + Adobe_AGM_Image/AGMIMG_k xddf + Adobe_AGM_Image/AGMIMG_y xddf + Adobe_AGM_Image/AGMIMG_m xddf + Adobe_AGM_Image/AGMIMG_c xddf + {AGMIMG_c mul 1 exch sub} + {AGMIMG_m mul 1 exch sub} + {AGMIMG_y mul 1 exch sub} + {AGMIMG_k mul 1 exch sub} + }{ + {255 mul round cvi ColorLookup exch get 0 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 1 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 2 get 1 exch sub} + {255 mul round cvi ColorLookup exch get 3 get 1 exch sub} + }ifelse + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end + }def + /indexed_imageormask_lev1 + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + currentdict + MappedCSA 0 get dup/DeviceRGB eq exch/DeviceCMYK eq or has_color not and{ + {HiVal mul round cvi GrayLookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceGray eq{ + {HiVal mul round cvi Lookup exch get HiVal div}currenttransfer addprocs settransfer + imageormask + }{ + MappedCSA 0 get/DeviceCMYK eq{ + currentcolortransfer + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }{ + currentcolortransfer + {pop 1}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 2 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi 1 add Lookup exch get HiVal div}exch addprocs 4 1 roll + {3 mul HiVal mul round cvi Lookup exch get HiVal div}exch addprocs 4 1 roll + setcolortransfer + tint_image_to_color + }ifelse + }ifelse + }ifelse + end end + }def + /indexed_image_lev1_sep + { + /indexed_colorspace_dict AGMCORE_gget begin + begin + {4 mul HiVal mul round cvi Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 1 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 2 add Lookup exch get HiVal div 1 exch sub} + {4 mul HiVal mul round cvi 3 add Lookup exch get HiVal div 1 exch sub} + AGMCORE_get_ink_data currenttransfer addprocs settransfer + currentdict imageormask_sys + end end + }def +}if +end +systemdict/setpacking known +{setpacking}if +%%EndResource +currentdict Adobe_AGM_Utils eq {end} if +%%EndProlog +%%BeginSetup +Adobe_AGM_Utils begin +2 2010 Adobe_AGM_Core/ds gx +Adobe_CoolType_Core/ds get exec +Adobe_AGM_Image/ds gx +[/NamespacePush pdfmark_5 +[/_objdef {Doc_Metadata} /type /stream /OBJ pdfmark_5 +[{Doc_Metadata} 4392 (% &end XMP packet& %) ReadBypdfmark_5_string + + + + + + + + + + + + Do Brain Networks Evolve by Maximizing Their Information Flow Capacity? + + + + + Chris G. Antonopoulos, Shambhavi Srivastava, Sandro E. de S. Pinto, Murilo S. Baptista + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + +% &end XMP packet& % + +[{Doc_Metadata} 2 dict begin /Type /Metadata def /Subtype /XML def currentdict end /PUT pdfmark_5 +[/Document 1 dict begin /Metadata {Doc_Metadata} def currentdict end /BDC pdfmark_5 +[/NamespacePop pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +%%EndSetup +%%Page: 1 1 +%%EndPageComments +%%BeginPageSetup +Adobe_AGM_Utils begin +Adobe_AGM_Core/ps gx +Adobe_AGM_Core/capture_mysetup gx +Adobe_AGM_Utils/capture_cpd gx +Adobe_CoolType_Core/ps get exec +Adobe_AGM_Image/ps gx +Adobe_AGM_Core/ps gx +gsave +/0 +[/DeviceCMYK] /CSA add_res +grestore +Adobe_AGM_Core/pt gx +%%EndPageSetup +1 -1 scale 0 -12.96 translate +pgsv +[1 0 0 1 0 0 ]ct +gsave +np +gsave +0 0 mo +0 12.96 li +11.52 12.96 li +11.52 0 li +cp +clp +11.52 12.96 mo +0 12.96 li +0 0 li +11.52 0 li +11.52 12.96 li +false sop +/0 /CSA get_res setcolorspace +gsave +clp +[1 0 0 -1 0 12.96 ]ct +[12 0 0 13.44 -.24 -.24 ]ct +snap_to_device +Adobe_AGM_Image/AGMIMG_fl cf /ASCII85Decode fl /RunLengthDecode filter ddf +<< +/T 1 +/W 50 +/H 56 +/M[50 0 0 -56 0 56 ] +/BC 8 +/D[0 1 0 1 0 1 0 1 ] +/DS [ +[AGMIMG_fl 50 string /rs cvx /pop cvx] cvx +[AGMIMG_fl 50 string /rs cvx /pop cvx] cvx +[AGMIMG_fl 50 string /rs cvx /pop cvx] cvx +[AGMIMG_fl 50 string /rs cvx /pop cvx] cvx +] +/O 3 +>> +%%BeginBinary: 1 +img +mf3D$/joV2#>.0'$N^;.!o3hX%444:6jH(:)[HHE!!1mU!Y$J()>jKq +!!!*!!##B.TsqP=[^EZS[(3W%2uip[!!;?a!!2ut&jMA[Z*LX>YHY=:VfaEg!!*'#l2Ukc!!2ut&itrH +U7e3RUnaTWUh_@Y!!*'#i;a6Xio8qViT0%Xj0ofa!#>S8!rrZ*0Z>jT#EUUTL5brh97b#c+,eUna]] +R3),'m/[.E"68D"ir%gAjPAhViSrpHjT$)_['mio9"Yi8iqV +jCn/coDfmJYe%$QYdq3WP=co1'ddLc[C`lT]!])+"98H&!pot*&YH86Xg>48XaN,F%M'XVNNo[lZ*1C8 +F9;FA!!2He%2,5.T;\BXUT/]()%R8d)GZ3aV50f\USMr4rVup!li7^[#<3!1+Z2Us-1[+lFD5Eo$Tq\hKVYE=UnLuX!!Z`gjPf1Z!V69q3TK2\j5L4.!!F.G[^`dJ]WMS6 +!"/r17_-(<\@%_-!!DZi!>;[:YQD#!#5%s(!rt9`YHb=9KE;,Tmf3S+USFQZV4.\^!"/l/32E@DUni;< +!!;Qg"l&(sioG^]!!VECioB&Oli75O[CN]U[ZU4_$NU5/#dV"O\$rRB"RZ6k0YZ*CLXU8"HVTi_*kpAbDVTqnBUWX%kj"leP&iSjt0!!Q-VjPo.S +li75t\%&oT[pA\-%0?M3!!JCr[^3KG%KHP*!;?Hn9)Pmn8bN,l!<<0$!d_&TZEL26m/R>\USO]\UdXnV +$NU5/!!7GBTqJ3P$L@cjj7WKM!!OV.io&mhli75r\@8lT[UAV*#9HlD=Ah'X!U]pg8?r,t!(ub]"W'Kk +6prQr!;c`s7\]jV!(l\\"W0Wi6Tlma!!)$Wj4+,6?a[GP[C0B4!9=+a9!PS)Z*6gN!!YlcUnOKW8([h@ +!!M9AiSrnO!!!&u!!Z`;\[],W?/#>Z!We%,OZaj5n!!!&u!!Z$"Z*(@89%s=G!W%(NgXpU:+3s1/-;"gteK\[K'B[K&\g!!"leS%jQ#=pirL/#pAb:(\@B*C[LK^S\@8uX +\[AlR[^N`VppL/ip&G1&Z*CM)YR@_?Z*CL;Yd(F:YHdl,!'BlS!t1itV"CDiU8+HWUnOQWUSFWZpnIgM +p&G1)io9%kisXl,io9%Yj5T+ZjPosp!$1b5!t;]L\bZ*LU=Yd+/2!3u:&!'BlS!t1itV"^ViTqJ0STVJ3UUA^heUA(D_3q`OU%cZL/pYuJ;iSrkUj5C%! +ir.m;iqMI5*VKI8%(NgXpU1UC\$i]R[C3KR[^NZU[^NR=[K&\g!!\@M@B +!k5SGrO2m;\[f-N[^irYppL/ip&G1&Z*CM(YQ1s-YQh;7Yct=7Z1tO'48&XV$_jAko:l;ZrhB[nUna]\ +Un[XZ!'9fR!=n)iioK^k!9*n:"m"_(jQ#7pirC+n!!\@M@B!k#SErj`?F\[T8^[_'&[\GM +jS.[8iT1!V$HL!'^>7f/jPo7[q;VGqp&G7)\@B)X[e[?A\%PZ//q>^[4 +j5T+ZiqVO6*VKI8%(NgXpU1.2^E*1O#'%&W^UUhbq6g8jp&G1&Z*CM0Yl1d-Z)nf=!!Z`6ZE:C8YPGC& +48&XV$_jAkpS.e`Wu(X5#$[doW1p)`q4dpNp&G1)io9%nirS-$q>^^&io0%ZjQ-0t!TP3o!!\@M=A +!OX6N!!RSS\[K&YppL/ip&G1&Z*CM+YQ;!KqZ$e,Z*1C8Z1tO'48&XV$_jAkpS.ebU`K=4"^RgtUSOXZ +UB!@K!!<_jioKgn!9*bS"U3lGj5f4pirC+n!!\@M=A!OX6N!!RSS\[K&YppL5k!!)co!t2B=YP,1$ +YoNW@"^eO,YQ-cY!!!;lg#"l\P&jPosp +!$1b5!t;]L\b\@M=A!OX6O!!WFI[CN`V\G3K4 +6hUK^$aHt?p94S&*;]^>?a6f=YHdl,!'BlS!t1itV"UPaU`K=4"^RgtUSOXZUB!@L!!E93io9%mirJ'7 +!!NPbjQ#=\pu;>pp&G1'\@B*C[K3c^qZ$eD[CN`V\G3K46hUK^$aHt?p94S&*;]^;?a6d9Yck>,YQ-cY +!!pp&G.&\@;OLp9k"0-2RZG +GI=ui\[_FC!(6G[!t2B=YP,1$YoNW@"^eO,YQ-cY!!Z/3q>^[&iT0%[iqVO6*VKI8%(NgXp9k"0-2RZGGI=ui\[_FC!(6G[!t2B=YPtd%YQ;!KqZ$e, +Z*1C8Z1tO'48&XV$_jAkp7hYa*W#g??(n'hUn[XZ!'9fR!tO>MjS%U6iVENX"l\P&jPp*trSmkup&G1' +\@B*C[K3c^qZ$eD[CN`V\G3K46hUK^$aHt?p94S&*;]^>?a6f=YHdl,!'BuVrW!$.U8"IWUB./2qZ$e* +TqnHZUA1J`3q`OU%cZL/p>Z/3q>^[&iT0%[iqVO6*VKI:$bE^V[CQ+A!kGuiqZ$V<%_9*[[^N]R\%&rV +[^Wb6p&G7'YHb:8YPGC(YH/]?!!Q`5Z*1C9r3?7*!O4]Z!!N_*USOZ\q4e"eWZ:m9$=Ta)Una]ZTqS3T +rhBLg3VEFQ$3]GLjQ#=sirS5sq>^j,jPo7\j5T(Wio9st!TG*m!!E_=[C!F<[MZEaW26;dUnsfj\@8rU +\[]/[\[])W\[b*$!!YHb@9YHb=9YHL%]!!EY)TqeFYUDT]$P)kWb +O,o6kU7n?WUnXTZUnXWZUng'F!!!N.iqMIHiT+KL;HQn!:6absj5]4[ioK.Zro4%?*VKI9%(3UO\H'&4 +[f3c?[^N]S\[h^J$b<^V\%0&Y[^N`W6hUK[$i[C3YHdl,rilX2Yd(F9YPta0YHY47YHRr0!jAdhp&G7' +Tq\9io9st!oi5" +ro+1Aj5].Zj5T)#j5M*Q!!Ne?\[K#Uq6gL;[C*KP\[_XI%_9$Y\[AlU[^ETS[^EG*p&G4'[BQm=posb& +"0f#5Z2Us;YHY46Z*:L;Z*:L;Z*?1[!!EXuU84U\UBdQgTqS6VUn[j`%]#kqUnOQXUS4KXUS4G?p&G4* +^#S,5pu;S^XD +SYN!Vq4ee#US4HXU8+EWTqeBVUS=HWUnjc]USOdqoDerNj5Tjo'&qs2j5].ZioB%Yj5K"WiT&tZro4%? +bk1r="TV9$\+mB9[CN`V\@K-S\[AiS[^EOA[KX4P[CW:[Ka7M[_'&B:%82b."SGeYl(^0Z*:I9WJ`q0!!4U"Vs0r\U8+K[V27D*!!+e"l/Ms, +j5]4:7e$H\!"'_ljWssQ*tRlA!=0S(+T`c*%.O;u#T;kLq]GnX%.F5t$7Y'f!@82e!.k3&!.k3&!.k3& +!.k3q!.Y~> + +%%EndBinary +grestore +np +grestore +grestore +pgrs +%%PageTrailer +[ +[/CSA [/0 ]] +] del_res +Adobe_AGM_Image/pt gx +Adobe_CoolType_Core/pt get exec +Adobe_AGM_Core/restore_mysetup gx +Adobe_AGM_Core/pt gx +currentdict Adobe_AGM_Utils eq {end} if +%%Trailer +Adobe_AGM_Utils begin +[/EMC pdfmark_5 +currentdict Adobe_AGM_Utils eq {end} if +Adobe_AGM_Image/dt get exec +Adobe_CoolType_Core/dt get exec +Adobe_AGM_Core/dt get exec +%%Pages: 1 +%%DocumentNeededResources: +%%DocumentSuppliedResources: procset Adobe_AGM_Image 1.0 0 +%%+ procset Adobe_CoolType_Utility_T42 1.0 0 +%%+ procset Adobe_CoolType_Utility_MAKEOCF 1.23 0 +%%+ procset Adobe_CoolType_Core 2.31 0 +%%+ procset Adobe_AGM_Core 2.0 0 +%%+ procset Adobe_AGM_Utils 1.0 0 +%%DocumentNeededFeatures: +%%DocumentSuppliedFeatures: +%%DocumentCustomColors: +%%CMYKCustomColor: +%%RGBCustomColor: +%%EOF diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/openaccess3.pdf b/inst/rmarkdown/templates/opmi_article/skeleton/openaccess3.pdf new file mode 100755 index 000000000..6322db7d1 Binary files /dev/null and b/inst/rmarkdown/templates/opmi_article/skeleton/openaccess3.pdf differ diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/opmi.bib b/inst/rmarkdown/templates/opmi_article/skeleton/opmi.bib new file mode 100755 index 000000000..cd05b8fc0 --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/opmi.bib @@ -0,0 +1,374 @@ +@incollection{antibayes, +Address = {Cambridge}, +Author = {G. Baggio and K. Stenning and M. van Lambalgen}, +Booktitle = {Cambridge {H}andbook of {F}ormal {S}emantics}, +Date-Added = {2014-02-06 15:25:25 +0100}, +Date-Modified = {2014-02-06 15:28:59 +0100}, +Editor = {M. Aloni and P. Dekker}, +Publisher = {Cambridge {U}niversity {P}ress}, +Title = {The {C}ognitive {I}nterface}, +Year = {in press}} + +@article{pijnacker2, +Author = {J. Pijnacker and B. Geurts and M. van Lambalgen and J. Buitelaar and P. Hagoort}, +Date-Added = {2014-02-06 15:14:32 +0100}, +Date-Modified = {2014-02-06 15:17:39 +0100}, +Journal = {Journal of {C}ognitive {N}euroscience}, +Number = {2}, +Pages = {471--480}, +Title = {Reasoning with Exceptions: An Event-related Brain Potentials Study}, +Volume = {23}, +Year = {2010}} + +@article{baggio, +Author = {R. Baggio and M. van Lambalgen and P. Hagoort}, +Date-Added = {2014-02-06 14:22:28 +0100}, +Date-Modified = {2014-02-06 14:24:02 +0100}, +Journal = {Journal of {M}emory and {L}anguage}, +Pages = {36--53}, +Title = {Computing and recomputing discourse models: An {ERP} study}, +Volume = {59}, +Year = {2008}} + +@inproceedings{kowalski_sadri, +Author = {R. Kowalski and F. Sadri}, +Booktitle = {Web Reasoning and Rule Systems}, +Date-Added = {2014-02-05 15:43:59 +0100}, +Date-Modified = {2014-02-05 16:29:50 +0100}, +Editor = {Polleres, Axel and Swift, Terrance}, +Pages = {1--23}, +Publisher = {Springer Berlin Heidelberg}, +Series = {Lecture Notes in Computer Science}, +Title = {Integrating Logic Programming and Production Systems in Abductive Logic Programming Agents}, +Volume = {5837}, +Year = {2009}} + +@book{anderson, +Address = {Mahwah, New Jersey}, +Author = {J. R. Anderson}, +Date-Added = {2014-02-05 15:27:59 +0100}, +Date-Modified = {2014-02-05 16:10:22 +0100}, +Publisher = {Lawrence {E}rlbaum {A}ssociates}, +Title = {The architecture of cognition}, +Year = {1983}} + +@article{simul2, +Author = {V. Gallese and A. Goldman}, +Date-Added = {2014-02-03 19:31:33 +0100}, +Date-Modified = {2014-02-03 19:32:35 +0100}, +Journal = {Trends in {C}ognitive {S}ciences}, +Number = {12}, +Pages = {493--501}, +Title = {Mirror neurons and the simulation theory of mind-reading}, +Volume = {2}, +Year = {1998}} + +@article{simul, +Author = {K. Zentgraf and J. Munzert and M. Bischoff and R.D. Newman-Norlund}, +Date-Added = {2014-02-03 19:25:43 +0100}, +Date-Modified = {2014-02-03 19:27:24 +0100}, +Journal = {Vision {R}esearch}, +Pages = {827--835}, +Title = {Simulation during observation of human actions -- Theories, empirical studies, applications}, +Volume = {51}, +Year = {2011}} + +@incollection{integrity_const, +Author = {Godfrey, P. and Grant, J. and Gryz, J. and Minker, J.}, +Booktitle = {Logics for {D}atabases and {I}nformation {S}ystems}, +Date-Added = {2014-02-03 15:27:38 +0100}, +Date-Modified = {2014-02-08 11:53:32 +0100}, +Editor = {Chomicki, J. and Saake, G.}, +Pages = {265--306}, +Publisher = {Springer {US}}, +Series = {The {K}luwer {I}nternational {S}eries in {E}ngineering and {C}omputer {S}cience}, +Title = {Integrity Constraints: Semantics and Applications}, +Volume = {436}, +Year = {1998},} + +@inproceedings{reiterIC, +Address = {{S}an {F}rancisco, {CA}, {USA}}, +Author = {Reiter, R.}, +Booktitle = {Proceedings of the 2nd conference on {T}heoretical {A}spects of {R}easoning about {K}nowledge, {TARK}'88}, +Date-Added = {2014-02-03 15:27:27 +0100}, +Date-Modified = {2014-02-05 17:29:27 +0100}, +Keywords = {integrity constraints, epistemic}, +Pages = {97--111}, +Publisher = {Morgan {K}aufmann {P}ublishers}, +Title = {On integrity constraints}, +Year = {1988}} + +@article{etzioni_cwr, +Author = {Etzioni, O. and Golden, K. and Weld, D.S.}, +Date-Added = {2014-02-03 12:37:30 +0100}, +Date-Modified = {2014-02-03 23:49:41 +0100}, +Journal = {Artificial {I}ntelligence}, +Keywords = {closed world reasoning, planning algorithms}, +Number = {1--2}, +Pages = {113--148}, +Title = {Sound and efficient closed-world reasoning for planning}, +Volume = {89}, +Year = {1997}} + +@article{lifschitz2002, +Author = {Lifschitz, V.}, +Date-Added = {2014-02-03 12:36:43 +0100}, +Date-Modified = {2014-02-03 12:36:43 +0100}, +Journal = {Artificial {I}ntelligence}, +Keywords = {planning, nonmonotonic reasoning}, +Month = {June}, +Number = {1--2}, +Pages = {39--54}, +Title = {Answer set programming and plan generation}, +Volume = {138}, +Year = {2002}} + +@article{beller, +Author = {S. Beller}, +Date-Added = {2014-01-31 16:47:38 +0100}, +Date-Modified = {2014-01-31 16:50:29 +0100}, +Journal = {Thinking \& Reasoning}, +Number = {4}, +Pages = {305--341}, +Title = {Deontic norms, deontic reasoning, and deontic conditionals}, +Volume = {14}, +Year = {2008}} + +@article{paulus_kiraly, +Author = {M. Paulus and I. Kir\'{a}ly}, +Date-Added = {2014-01-31 16:16:10 +0100}, +Date-Modified = {2014-01-31 16:17:44 +0100}, +Journal = {Journal of {E}xperimental {C}hild {P}sychology}, +Number = {2}, +Pages = {407--414}, +Title = {Early rationality in action perception and production? A theoretical exposition}, +Volume = {116}, +Year = {2013}} + +@article{luo_baillargeon, +Author = {Y. Luo and R. Baillargeon}, +Date-Added = {2014-01-31 16:08:03 +0100}, +Date-Modified = {2014-01-31 16:12:03 +0100}, +Journal = {Psychological {S}cience}, +Number = {8}, +Pages = {601--608}, +Title = {Can a Self-Propelled Box Have a Goal?: Psychological Reasoning in 5-Month-Old Infants}, +Volume = {16}, +Year = {2005}} + +@inproceedings{baker_tenenbaum_saxe06, +Author = {C. L. Baker and J. Tenenbaum and R. Saxe}, +Booktitle = {Advances in Neural Information Processing Systems}, +Date-Added = {2014-01-30 12:16:28 +0100}, +Date-Modified = {2014-02-01 00:11:49 +0100}, +Publisher = {MIT Press}, +Title = {Bayesian models of human action understanding}, +Volume = {18}, +Year = {2006}} + +@article{baker_saxe_tenenbaum09, +Author = {C. L. Baker and J. Tenenbaum and R. Saxe}, +Date-Added = {2014-01-30 12:11:35 +0100}, +Date-Modified = {2014-02-05 23:44:19 +0100}, +Journal = {Cognition}, +Number = {3}, +Pages = {329--349}, +Title = {Action Understanding as Inverse Planning}, +Volume = {113}, +Year = {2009}} + +@article{lombrozo_carey, +Author = {T. Lombrozo and S. Carey}, +Date-Added = {2014-01-30 11:55:36 +0100}, +Date-Modified = {2014-01-30 11:56:51 +0100}, +Journal = {Cognition}, +Number = {2}, +Pages = {167--204}, +Title = {Functional explanation and the function of explanation}, +Volume = {99}, +Year = {2006}} + +@article{csibra_gergely07, +Author = {Csibra, G. and Gergely, G.}, +Date-Added = {2014-01-30 11:53:57 +0100}, +Date-Modified = {2014-01-31 11:19:59 +0100}, +Journal = {Acta {P}sychologica}, +Keywords = {teleological reasoning, inverse problem, prediction, means selection}, +Number = {1}, +Pages = {60--78}, +Title = {`{O}bsessed with goals': Functions and mechanisms of teleological interpretation of actions in humans}, +Volume = {124}, +Year = {2007}} + +@article{causality_infancy, +Author = {Saxe, R. and Carey, S.}, +Date-Added = {2014-01-29 19:08:02 +0100}, +Date-Modified = {2014-01-31 11:20:20 +0100}, +Journal = {Acta {P}sychologica}, +Keywords = {Cause; Infancy; Empiricism; Rationalism; Innateness; Intervention}, +Number = {1-2}, +Pages = {144--165}, +Title = {The perception of causality in infancy}, +Volume = {123}, +Year = {2006}} + +@inproceedings{mccarthy_hayes_philosAI, +Author = {McCarthy, J. and Hayes, P.}, +Booktitle = {Machine {I}ntelligence}, +Date-Added = {2014-01-29 16:37:34 +0100}, +Date-Modified = {2014-02-01 00:55:14 +0100}, +Editor = {B. Meltzer and D. Michie}, +Pages = {463--502}, +Publisher = {Edinburgh {U}niversity {P}ress}, +Title = {Some Philosophical Problems from the Standpoint of Artificial Intelligence}, +Volume = {4}, +Year = {1969}} + +@book{kowalski2011, +Address = {{N}ew {Y}ork}, +Author = {Kowalski, R.}, +Date-Added = {2014-01-29 16:36:59 +0100}, +Date-Modified = {2014-02-05 16:38:25 +0100}, +Keywords = {computational logic, proactive agents, reasoning}, +Publisher = {Cambridge {U}niversity {P}ress}, +Read = {0}, +Title = {Computational Logic and Human Thinking: How to be Artificially Intelligent}, +Year = {2011}} + +@book{mueller_commonsense, +Address = {{S}an {F}rancisco, {CA}}, +Author = {Mueller, E.T.}, +Date-Added = {2014-01-29 16:11:31 +0100}, +Date-Modified = {2014-02-05 17:35:16 +0100}, +Publisher = {Morgan {K}aufmann {P}ublishers}, +Title = {Commonsense {R}easoning}, +Year = {2006}} + +@inproceedings{williams81, +Address = {Cambridge}, +Author = {Williams, B.}, +Booktitle = {{M}oral {Lu}ck}, +Date-Added = {2014-01-29 15:45:40 +0100}, +Date-Modified = {2014-02-05 17:28:16 +0100}, +Editor = {Williams, B.}, +Pages = {101--113}, +Publisher = {Cambridge {U}niversity {P}ress}, +Title = {Internal and {E}xternal {R}easons}, +Year = {1981}} + +@article{braas, +Author = {M. Brass and R.M. Schmitt and S. Spengler and G. Gergely}, +Date-Added = {2014-01-27 00:01:07 +0100}, +Date-Modified = {2014-01-31 11:20:30 +0100}, +Journal = {Current {B}iology}, +Number = {24}, +Pages = {2117--2121}, +Title = {Investigating Action Understanding: Inferential Processes versus Action Simulation}, +Volume = {17}, +Year = {2007}} + +@article{pollock97, +Author = {J. Pollock}, +Date-Added = {2014-01-26 23:49:36 +0100}, +Date-Modified = {2014-01-31 11:18:59 +0100}, +Journal = {Nous}, +Number = {2}, +Pages = {143--169}, +Title = {Reasoning about change and persistence: A solution to the frame problem}, +Volume = {31}, +Year = {1997}} + +@book{pollock95, +Address = {{MA}, {USA}}, +Author = {Pollock, J.L.}, +Date-Added = {2014-01-26 23:49:08 +0100}, +Date-Modified = {2014-02-05 17:30:05 +0100}, +Publisher = {{MIT} {P}ress {C}ambridge}, +Title = {Cognitive {C}arpentry: A {B}lueprint for {H}ow to {B}uild a {P}erson}, +Year = {1995}} + +@article{hickok, +Author = {G. Hickok}, +Date-Added = {2014-01-26 23:46:54 +0100}, +Date-Modified = {2014-01-31 11:19:43 +0100}, +Journal = {Journal of Cognitive Neuroscience}, +Number = {7}, +Pages = {1229--1243}, +Title = {Eight Problems for the Mirror Neuron Theory of Action Understanding in Monkeys and Humans}, +Volume = {21}, +Year = {2009}} + +@article{nature2002, +Author = {Gergely, G. and Bekkering, H. and Kir\'{a}ly, I.}, +Date-Added = {2014-01-26 23:43:16 +0100}, +Date-Modified = {2014-01-26 23:43:16 +0100}, +Journal = {Nature}, +Keywords = {rational, selective imitation}, +Pages = {755}, +Title = {Rational imitation in preverbal infants}, +Volume = {415}, +Year = {2002}} + +@article{kiraly2013, +Author = {Kir\'{a}ly, I. and Csibra, G. and Gergely, G.}, +Date-Added = {2014-01-26 23:41:16 +0100}, +Date-Modified = {2014-01-31 11:19:33 +0100}, +Journal = {Journal of {E}xperimental {C}hild {P}sychology}, +Number = {2}, +Pages = {471--486}, +Title = {Beyond rational imitation: Learning arbitrary means actions from communicative demonstrations}, +Volume = {116}, +Year = {2013}} + +@book{PToE, +Address = {Malden}, +Author = {van Lambalgen, M. and Hamm, F.}, +Date-Added = {2014-01-26 23:40:14 +0100}, +Date-Modified = {2014-02-01 01:57:52 +0100}, +Publisher = {Blackwell {P}ublishing}, +Title = {The {P}roper {T}reatment of {E}vents}, +Year = {2005}} + +@book{HRCS, +Author = {Stenning, K. and van Lambalgen, M.}, +Date-Added = {2014-01-26 23:39:49 +0100}, +Date-Modified = {2014-01-26 23:39:49 +0100}, +Keywords = {closed world reasoning, neural networks, wason task}, +Publisher = {Bradford {B}ook, {T}he {MIT} {P}ress, {C}ambridge, {M}assachussets}, +Title = {Human {R}easoning and {C}ognitive {S}cience}, +Year = {2008}} + +@phdthesis{ada_doc, +Author = {A. Varga}, +Date-Added = {2014-01-11 09:20:59 +0100}, +Date-Modified = {2014-01-11 09:24:15 +0100}, +School = {Department of Philosophy, Central European University, Budapest}, +Title = {A Formal Model of Infants' Acquisition of Practical Knowledge from Observation}, +Type = {Doctoral dissertation}, +Year = {2013}} + +@article{chater_vitany, +Author = {N. Chater and P. Vitanyi}, +Date-Modified = {2014-01-31 11:20:09 +0100}, +Journal = {Trends in Cognitive Sciences}, +Number = {1}, +Pages = {19--22}, +Title = {Simplicity: a unifying principle in cognitive science?}, +Volume = 7, +Year = 2003} + +@phdthesis{varga, +Author = {A. Varga}, +Date-Modified = {2014-01-26 23:34:02 +0100}, +School = {Department of Philosophy, Central European University, Budapest}, +Title = {A Formal Model of Infants' Acquisition of Practical Knowledge from Observation}, +Type = {Doctoral dissertation}, +Year = {2013}} + +@book{schueler2005, +Address = {New York, NY}, +Author = {G.F. Schueler}, +Date-Modified = {2014-02-05 17:34:27 +0100}, +Publisher = {Oxford University Press Inc.}, +Title = {Reasons and Purposes: Human Rationality and the Teleological Explanation of Action}, +Year = 2003} \ No newline at end of file diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/opmi_article/skeleton/skeleton.Rmd new file mode 100755 index 000000000..2b7bd637e --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/skeleton.Rmd @@ -0,0 +1,87 @@ +--- +title: Title of Article +## Remove this if not required +subtitle: Subtitle Here +short_title: Title of Article + +## 'OpenMind' or 'manuscript' +class_option: OpenMind +## Only needed if you use 'manuscript' option +journal_name: Open Mind + +author: + - name: Author Name + affiliation: 1 + - name: Another Name + affiliation: 2 + - name: Still another Name + affiliation: 2 + - name: and Final Name + affiliation: 1 + +affiliation: + - code: 1 + address: Department, Institution, City, Country + - code: 2 + address: Another Department, Institution, City, Country + +corresponding_author: + name: Author Name + email: Email address + +short_author: Author Names + +supplements_links: | + Links to Supplementary Materials. + +## Remove this if not required +conflicts_of_interest: | + Please declare any conflict of interest here. + +keywords: + - one + - two + - three + +abstract: | + Abstract text here. + +supportive_information: | + Here you enter further sources of information, if desired. A possible entry might be: No supportive information is available at this time. + +acknowledgments: | + Enter your acknowledgments here. + +author_contributions: | + Who helped formulate the project, who supplied data, analyses and experiments, etc. + +## Remove this if not required +appendix: | + Optional appendix + \section{Sample appendix section} + +bibliography: opmi.bib +output: rticles::opmi_article +--- + + +# Sample Section +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +## Sample Subsection +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + +### Sample Subsubsection +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. +Text here. Text here. Text here. Text here. + + +# References diff --git a/inst/rmarkdown/templates/opmi_article/skeleton/stjour.cls b/inst/rmarkdown/templates/opmi_article/skeleton/stjour.cls new file mode 100755 index 000000000..5453a391a --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/skeleton/stjour.cls @@ -0,0 +1,2363 @@ +\def\currversion{April 8, 2016} + + %****************************************************************% + %* *% + %* MIT Press Science/Technology Journal Style *% + %* *% + %* Amy Hendrickson, TeXnology Inc. *% + %* *% + %* amyh@texnology.com *% + %* 617 738-8029 *% + %* http://www.texnology.com *% + %* *% + %****************************************************************% + +%% Journals: +%% 1. Journal of Computational Psychiatry +%% 2. Open Mind: Discoveries in Cognitive Science + +%%%%%%%%%%% +%% Journal of Computational Psychiatry + +%% Peter Dayan and Read Montague, Editors +%% Journal Description: +%% Computational Psychiatry publishes original research articles and +%% reviews that involve the application, analysis, or invention of +%% theoretical, computational and statistical approaches to mental +%% function and dysfunction. Topics include brain modeling over multiple +%% scales and levels of analysis, and the use of these models to +%% understand psychiatric dysfunction, its remediation, and the +%% sustenance of healthy cognition through the lifespan. The journal also +%% has a special interest in computational issues pertaining to related +%% areas such as law and education. +%% +%% Computational Psychiatry is an Open Access journal. +%% +%% Visit computationalpsychiatry.org. +%% Press Release: +%% http://www.mitpressjournals.org/userimages/ContentEditor/1444762890059/CPSY_Press_Release.pdf + +%%%%%%%%%%% +%% Open Mind: Discoveries in Cognitive Science +%% +%% Journal Description: +%% The broad array of content areas within cognitive science will be +%% covered, including learning and memory, attention, linguistics, +%% language processing and development, causal reasoning, judgment and +%% decision-making, and many others. These content areas will be studied +%% using methods from cognitive psychology, computer science and +%% mathematical psychology, cognitive neuroscience and neuropsychology, +%% comparative psychology and behavioral anthropology, and decision +%% science. The sole format of the journal will be novel empirical and/or +%% computational contributions (no reviews, opinion pieces, or +%% commentaries), with a 5,000-word limit plus supplemental materials. +%% +%% -- Dr. Richard Aslin, Editor +%% Director of Rochester Center for Brain Imaging +%% https://mitpress.mit.edu/blog/open-mind +%% +%% Open Mind is an Open Access Journal + +\ProvidesClass{stjour} + [4/08/2016] + + %% Comment + %% \typeout makes content appear on the screen as you run LaTeX on + %% the file. ^^J ends the line, thus ^^J^^J will produce a blank + %% line making it easier to read. + %% Content will also appear in the .log file, which is helpful to + %% determine what version of .cls file is being used if someone has + %% a problem, and needs to send in a .log file + +\typeout{^^J^^J +MIT Press^^J^^J +Science and Technology Journal Style,^^J +^^J +Copyright MIT Press^^J +Designed and Implemented by^^J +Amy Hendrickson, TeXnology, Inc., 3/2016^^J +^^J +This version is dated \currversion^^J^^J} + +%% SEARCH BELOW FOR THE NUMBER TO FIND PARTICULAR MACRO GROUP + + %% Macro Contents: + %% 0) Usepackage graphicx, colorx, other .sty files which we'll need to have available. + + %% 1) Setting Default Dimensions + + %% 2) Global Parameters + + %% 3) Setting and Using Options + + %% 4) Font Family declarations + + %% 5) Running heads, Footnotes + + %% 6) Title Page: Journal Name, + %% Title, Authors, Affils, Corresponding Authors, Author Notes, Key Points; abstract + + %% 7) Section Commands + + %% 8) Figure and Table Captions + + %% 9) Listing + + %% 10) Etc.: Hyphenation Library, Quote, Extract + + %% 11) End Article: Appendix, Glossary, Acronyms, Notation, Acknowledgments + + %% 12) Bibliography, References + + %% 13) Track Changes + + + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% 0) Bringing in packages that we will need: + +%% Nicer font choice than Computer Modern +\usepackage{times} + +%% always will want this available +\usepackage{graphicx} + +%% to get illustrations to print, in spite of being in Draft mode: +\setkeys{Gin}{draft=false} + +%% used for running head which is in light gray +\usepackage[table]{xcolor} + +\definecolor{ltgray}{cmyk}{.12,0,0,.3} +\definecolor{veryltgray}{cmyk}{.12,0,0,.2} +\definecolor{dkgray}{cmyk}{.12,0,0,.8} +\definecolor{ltcyan}{cmyk}{.12,0,0,0} +\definecolor{ltRoyalBlue}{cmyk}{.25,.12,0,0} +%\definecolor{dkRoyalBlue}{cmyk}{1,.97,.12,.08} +\definecolor{dkRoyalBlue}{cmyk}{.8,.77,.02,.04} +\definecolor{newdkRoyalBlue}{cmyk}{.8,.6,.02,.04} +\definecolor{dkcyan}{cmyk}{1,0,0,.25} +\definecolor{verydkcyan}{cmyk}{1,0,0,.7} +\definecolor{newverydkcyan}{cmyk}{1,0,0,.4} +\definecolor{mdcyan}{cmyk}{.16,0,0,0} +\definecolor{notsoltcyan}{cmyk}{.2,0,0,0} + +%% Line numbering +\usepackage{lineno} +%% add more space between text and number: +\advance\linenumbersep -2pt + + + +%% Defines \sidewaystable and \sidewaysfigure, preferred by AGU +\usepackage{rotating} +\newif\ifturnofflinenums +\let\savesidewaystable\sidewaystable +\let\savesidewaysfigure\sidewaysfigure +%% turns off line numbers in rotated tables and figures, aesthetic consideration, +%% not necessary. +\def\sidewaystable{\turnofflinenumstrue\savesidewaystable\centering} +\def\sidewaysfigure{\turnofflinenumstrue\savesidewaysfigure\centering} + +\PassOptionsToPackage{normalem}{ulem} +\usepackage{ulem} + +\usepackage{amssymb} +\usepackage{amsmath} +\usepackage{xfrac} + +\usepackage{multicol} + +\definecolor{shadecolor}{cmyk}{.1,0,0,.01} +\definecolor{outsideshadecolor}{cmyk}{1,0,0,0} + +%% + + +%% <== End \usepackages + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% 1) Setting Default Dimensions + +%%% Basic Page Dimensions + %% Comment + %% \textwidth= Width of text in normal page. Can change this width locally + %% with either \leftskip/\rightskip or change in \hsize, but will + %% still be able to return to the normal width by setting \hsize=\textwidth + %% Running head normally uses \textwidth as its width so that a change + %% in \hsize in text will not change width of running head or feet. + + %% \textheight is distance from bottom of text, exclusive of running + %% foot, to top of text, exclusive of running head. + +\textwidth=5.25in +\textheight=8.5in +\advance\textheight by 24pt +\advance\oddsidemargin 101pt +\evensidemargin=\oddsidemargin + + %% Comment + %% parindent= indentation for every new paragraph + %% parskip= distance between paragraphs. Giving `plus .1pt' allows + %% a little stretch between paragraphs. If you don't like this stretch + %% you can set \parskip=0pt + +\parindent=24pt +\parskip=8pt % plus .1pt + + %% Comment + %% \voffset moves the printed page up or down on the physical page. +\advance\voffset-.25in + + %% Comment + %% \hoffset moves the printed page left or right on the physical page. +\advance\hoffset.35in + + %% Comment + %% Setting page dimensions + %% See p. 84-- 85 in LaTeX Companion, Goosins, Mittlebach and Samarin + %% or p. 555--556 in A Guide to LaTeX, Kopka and Daly, both Addison Wesley + %% books. + + %% \topmargin space between top of page and running head + + %% \headheight height of running head + + %% \headsep space between running head and text + + %% \topskip space between top of text and baseline of first line + %% of text + + %% \footskip space between text and baseline of page number + + %% \columnsep space between two column text + + %% \columnseprule width of optional rule between columns, usually set to 0pt + + %% \footnotesep Distance between two footnotes + + %% \skip\footins Distance between text and footnote + + %% \floatsep Distance between float and another + %% float for single col floats. + + %% \textfloatsep Distance between float and text at top + %% or bottom of page. + + %% \intextsep Distance between float and text if float is mid page + %% or mid column + + %% \dblfloatsep For float spanning both columns in two column text, + %% above or below both columns, space between float and and float. + + +\topmargin0pt +\headheight 30pt +\headsep 6pt +\topskip 10pt +\footskip 36pt + +\columnsep 10pt +\columnseprule 0pt + +\footnotesep 6.65pt +\skip\footins 24pt plus .1pt minus .1pt + +\floatsep 12pt plus 2pt minus 2pt +\textfloatsep 36pt plus 2pt minus 4pt +\intextsep 24pt plus 2pt minus 2pt + +\dblfloatsep 12pt plus 2pt minus 2pt +\dbltextfloatsep 20pt plus 2pt minus 4pt + +%% float placement, used by output routine +\@fptop 0pt plus 1fil +\@fpsep 8pt plus 2fil +\@fpbot 0pt plus 1fil +\@dblfptop 0pt plus 1fil +\@dblfpsep 8pt plus 2fil +\@dblfpbot 0pt plus 1fil + + %% When using \marginpar, how wide can marginal note be? + +\marginparwidth .75in + + %% When using \marginpar, how much horizontal space between marginal + %% note and text + + \setlength\marginparsep{40\p@} + + %% When to push marginal note on to next page, minimum vertical space between + %% two marginal notes + +\setlength\marginparpush{5\p@} + + %% space added before trivlist, which is used in many other + %% macros, (for instance, verbatim environment) + %% if macro is called in vertical mode, otherwise only parskip + %% is added. Can set this without stretch if you don't like + %% the stretchy space added. + +\setlength\partopsep{2\p@ \@plus 1\p@ \@minus 1\p@} + + %% Comment + %% Setting parameters that control float placement + %% + %% \topnumber counter holds the maximum number of + %% floats that can appear on the top of a text page. + %% + %% \topfraction indicates the maximum part of a text page that can be + %% occupied by floats at the top. + %% + %% \bottomnumber counter holds the maximum number of + %% floats that can appear on the bottom of a text page. + %% + %% \bottomfraction indicates the maximum part of a text page that can be + %% occupied by floats at the bottom. + %% + %% \totalnumber indicates the maximum number of floats that can appear on + %% any text page. + %% + %% \textfraction indicates the minimum part of a text page that has to be + %% occupied by text. + %% + %% \floatpagefraction indicates the minimum part of a page that has to be + %% occupied by floating objects before a `float page' is produced. + %% + %% \dbltopnumber counter holds the maximum number of + %% two column floats that can appear on the top of a two column text + %% page. + %% + %% \dbltopfraction indicates the maximum part of a two column text page that + %% can be occupied by two column floats at the top. + %% + %% \dblfloatpagefraction indicates the minimum part of a page that has to be + %% occupied by two column wide floating objects before a `float + %% page' is produced. + %%% + +\setcounter{topnumber}{10} +\def\topfraction{.9} +\setcounter{bottomnumber}{10} +\def\bottomfraction{.1} +\setcounter{totalnumber}{10} +\def\textfraction{.2} +\def\floatpagefraction{.5} +\setcounter{dbltopnumber}{2} +\def\dbltopfraction{.7} +\def\dblfloatpagefraction{.5} + + %% Setting Array and Table Spacing + %% distance between columns in array +\setlength\arraycolsep{5\p@} + + %% distance between columns in tabular +\tabcolsep 6pt + + %% width of lines in array +\setlength\arrayrulewidth{.4\p@} + + %% horizontal space between two lines in array +\setlength\doublerulesep{2\p@} + + %% space between two lines in tabular +\setlength\tabbingsep{\labelsep} + + %% Minipage + %% minipage space +\skip\@mpfootins = \skip\footins + + %% Framebox \fbox{} or \framebox{} + %% space between line in framebox and text within it +\setlength\fboxsep{6\p@} + + %% width of ruled line in framebox +\setlength\fboxrule{.6\p@} + + +%%%%%%%%%%%%%%% <<== end dimensions + +% 2) %%% Global parameters ==>> + + %% Makes sure that there will not be any widow or club lines, + %% smaller numbers allow them occassionally, but you probably need + %% these set to 10000 so that there are never any + +\widowpenalty10000 +\clubpenalty10000 + + %% How many levels deep do you want sections to be numbered-- higher number + %% means more levels will be numbered. Here was are asking only for + %% sections to be numbered, not subsections, or subsubsection etc. +\setcounter{secnumdepth}{0} + + + %% To make left and right page position differently, and have + %% running heads be different on even and odd pages +\@twosidetrue + + %% Marginal notes should be on the left on even numbered pages; on + %% right on odd numbered pages. +\@mparswitchtrue + + %% Starting with one column text +\@twocolumnfalse + + %% openbib will allow separate lines for parts of bibliography + %% entries, default is to run different parts of bib entry into a + %% paragraph form. + +\newif\if@openbib +\@openbibfalse + + %% Conditionals that we can set and use later +\newif\if@openright +\newif\if@mainmatter +\newif\if@restonecol +\newif\if@titlepage +\newif\ifxdraft %% xdraft rather than draft to prevent hyperref from turning off +\newif\ifnumlines + + %% Comment + %% Set Names, to be used later, usually in more than one + %% macro. +\newcommand{\bibname}{Bibliography} +\newcommand{\figurename}{Figure} +\newcommand{\tablename}{Table} + +%%% <== end global parameters + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% 3) Declare Options and Use Default Options + +\definecolor{ltgray}{gray}{.9}% .89 +\font\bighelv=phvr at 2in % +\def\setwatermarkfontsize#1{\font\bighelv=phvr at #1} + +\def\watermark#1{\def\thewatermark{ +\vtop to +1.1\textheight{\vskip1in +\hskip-24pt\rotatebox{60} +{\hbox{\bighelv \color{ltgray} +\uppercase{#1}}}}}} + +\watermark{D R A F T} + +\newif\iftrack +\DeclareOption{manuscript}{\global\xdrafttrue +%% tracking changes only in manuscript mode +\global\tracktrue +\textwidth=7in +\textheight=9in +\advance\oddsidemargin -1.75in +\evensidemargin=\oddsidemargin +\advance\voffset -.25in +\raggedright +\advance\headsep 12pt +\numlinestrue +} + +\newif\iffinalfonts +\DeclareOption{finalfonts}{\global\finalfontstrue} + +%% Journal Computational Psychiatry +\newif\ifCompPsych +\DeclareOption{CompPsych} + {\global\CompPsychtrue +\gdef\thejournalname{Computational Psychiatry} +} + +%% Open Mind Journal +\newif\ifOpenMind +\DeclareOption{OpenMind} + {\global\OpenMindtrue +\gdef\thejournalname{Open Mind: Discoveries in Cognitive Science} +} + + + +\DeclareOption{linenumbers}{\global\numlinestrue} + +\DeclareOption{final}{\setlength\overfullrule{0pt}\global\xdraftfalse} + +\ExecuteOptions{letterpaper,10pt,onecolumn,final,openright} +\ProcessOptions + +\ifnumlines +\linenumbers*[1] +\else +\nolinenumbers +\fi + + +%% <==== End Setting Options + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% 4) Font Family Info + +%% Comment +%% When \ifxdraft is true it will make the baselineskip = \draftskip + +\newcount\draftskip +\draftskip=22 + +\newcommand{\@ptsize}{} + + %% Comment + %% Set font sizes, normal baselineskip, for the range of sizes, + %% changing baselineskip to be larger if draft option is true + %% \setfontsize takes the first arg as the size of the font and + %% the second as the size of the baselineskip + %% \abovedisplayskip and \belowdisplayskip is the space before and + %% after an equation, adjusted in some sizes. + + %% \Huge 25pt + %% \huge 20pt + %% \LARGE 17pt + %% \Large 14pt + %% \large 12pt + %% \normalsize 10 pt font + %% \small 9pt + %% \footnotesize 8pt + %% \scriptsize 7pt font + %% \tiny 5pt font + +\renewcommand\normalsize{% +\ifxdraft + \@setfontsize\normalsize\@xiipt{\draftskip} +\else + \@setfontsize\normalsize{9.5pt}{13pt} +\fi + \abovedisplayskip 10\p@ \@plus2\p@ %\@minus2\p@ + \abovedisplayshortskip \z@ \@plus3\p@ + \belowdisplayshortskip 4\p@ \@plus3\p@ \@minus3\p@ + \belowdisplayskip \abovedisplayskip + \let\@listi\@listI} +\normalsize + +\newcommand\bignormalsize{\ifxdraft +\@setfontsize\bignormalsize{10.5pt}{\draftskip} +\else +\@setfontsize\bignormalsize{10.5pt}{14}\fi} + + +\newcommand\small{% +\ifxdraft + \@setfontsize\small\@xpt{\draftskip} +\else + \@setfontsize\small\@ixpt{11}% +\fi + \abovedisplayskip 8.5\p@ \@plus3\p@ \@minus4\p@ + \abovedisplayshortskip \z@ \@plus2\p@ + \belowdisplayshortskip 4\p@ \@plus2\p@ \@minus2\p@ + \def\@listi{\leftmargin\leftmargini + \topsep 4\p@ \@plus2\p@ \@minus2\p@ + \parsep 2\p@ \@plus\p@ \@minus\p@ + \itemsep \parsep}% + \belowdisplayskip \abovedisplayskip +} + +\newcommand\footnotesize{% +\ifxdraft + \@setfontsize\footnotesize\@viiipt{\draftskip}% +\else + \@setfontsize\footnotesize\@viiipt{9.5}% +\fi + \abovedisplayskip 6\p@ \@plus2\p@ \@minus4\p@ + \abovedisplayshortskip \z@ \@plus\p@ + \belowdisplayshortskip 3\p@ \@plus\p@ \@minus2\p@ + \def\@listi{\leftmargin\leftmargini + \topsep 3\p@ \@plus\p@ \@minus\p@ + \parsep 2\p@ \@plus\p@ \@minus\p@ + \itemsep \parsep}% + \belowdisplayskip \abovedisplayskip +} +\newcommand\scriptsize{\@setfontsize\scriptsize\@viipt\@viiipt} +\newcommand\tiny{\@setfontsize\tiny\@vpt\@vipt} + +%%% above 10 pt: +\newcommand\large{\@setfontsize\large\@xiipt{14}} +\newcommand\Large{\ifxdraft +\@setfontsize\Large\@xivpt{\draftskip} +\else +\@setfontsize\Large\@xivpt{18} +\fi} +\newcommand\LARGE{\@setfontsize\LARGE\@xviipt{22}} +\newcommand\huge{\@setfontsize\huge\@xxpt{25}} +\newcommand\Huge{\@setfontsize\Huge\@xxvpt{30}} + +%%%%%%%%%%%%%%%%%%%%%%%%%% + +%% These definitions accomodate older font typeface commands, +%% that are still in use. + +\DeclareOldFontCommand{\rm}{\normalfont\rmfamily}{\mathrm} +\DeclareOldFontCommand{\sf}{\normalfont\sffamily}{\mathsf} +\DeclareOldFontCommand{\tt}{\normalfont\ttfamily}{\mathtt} +\DeclareOldFontCommand{\bf}{\normalfont\bfseries}{\mathbf} +\DeclareOldFontCommand{\it}{\normalfont\itshape}{\mathit} +\DeclareOldFontCommand{\sl}{\normalfont\slshape}{\@nomath\sl} +\DeclareOldFontCommand{\sc}{\normalfont\scshape}{\@nomath\sc} +\DeclareRobustCommand{\cal}{\@fontswitch{\relax}{\mathcal}} +\DeclareRobustCommand{\mit}{\@fontswitch{\relax}{\mathnormal}} + +%% end font family declarations +%%%%%%%%%%%%%%%%%%%%%%%% + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% 5) Running heads and footnotes + +%% Running heads ===>>> + + %% unless we need these, leave these uncommented + \let\@mkboth\@gobbletwo + \let\chaptermark\@gobble + \let\sectionmark\@gobble + %% +\newif\iftitle + +\ifxdraft +\def\ps@headings{ +%% +\def\@oddhead{\ifxdraft\iftitle +\vbox to 0pt{\vss +\small +\centerline{\footnotesize\tt == D R A F T\qquad\today\qquad\expandafter\ifx\csname +thereceived\endcsname\relax\else(Received \thereceived)\fi \ ==} +\vskip3pt +\centerline{\expandafter\ifx\csname titlejournalname\endcsname\relax + \else{\Large\bf{\large\bfseries\itshape Journal:} \titlejournalname}\fi}\vskip6pt +\color{veryltgray}\hrule height 2pt +\vskip14pt} +\else + \vbox to0pt{\vss\xdraftfalse\small\parskip=0pt +\centerline{\footnotesize\tt == D R A F T\qquad\today\qquad\expandafter\ifx\csname +thereceived\endcsname\relax\else(Received \thereceived)\fi \ ==} +\vskip5pt +\centerline{\expandafter\ifx\csname titlejournalname\endcsname\relax + \else Journal: \titlejournalname\fi \qquad/\qquad {\expandafter\ifx\csname thetitle\endcsname\relax\else +{Title: \thetitle}\fi}}\vskip5pt +\centerline{\expandafter\ifx\csname theauthorshortlist\endcsname\relax\else {Authors:} +\theauthorshortlist\fi}% +\vskip4pt +\color{veryltgray}\hrule height 2pt +\vskip12pt +}\fi% end ifdraft +\fi% end if title +}\let\@evenhead\@oddhead +\def\@oddfoot{ +\ifxdraft\iftitle\global\titlefalse +\centerline{\footnotesize\bf Copyright \copyright \the\year\ The +Author(s). Published by MIT Press. All Rights +Reserved.}\else\centerline{--\the\c@page--}\fi\else\hfill\fi} +\let\@evenfoot\@oddfoot +} + +%% After ps@headings is defined for draft version, now we use it to activate the definitions +\ps@headings + +\fi + +%%% Footnotes + + %% save these definitions so that we can use them if + %% we don't like the redefinition +\let\savefootnote\footnote +\let\savefootnotetext\footnotetext + + %%% ruled line above footnote + + \renewcommand{\footnoterule}{% + \kern-3\p@ + \hrule width .4\columnwidth + \kern 2.6\p@} + + \let\savefootnoterule\footnoterule + +% turn off footnote rule, line at bottom of page above footnotes + \let\footnoterule\relax + +% can turn it back on by uncommenting +\let\footnoterule\savefootnoterule + +% Making footnote indent 1em +\long\def\@makefntext#1{% +\noindent\hspace*{1em}\@makefnmark\,#1} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% 6) Title Page: + %% Journal Name, running heads; + %% Title, Authors, Affils, Corresponding Authors, Author Notes, Key Points; + %% Starting article with abstract. + +\gdef\openmind{Open Mind} +\gdef\cpsy{Computational Psychiatry} + +\def\@listi{\leftmargin\leftmargini + \parsep 0\p@ %\@plus2\p@ \@minus0\p@ + \topsep 4\p@ %\@plus2\p@ \@minus0\p@ + \itemsep1\p@ %\@plus2\p@ \@minus0\p@ +} + + +\def\thebibliography#1{} + + \def\setbibstyle{% + \ifx\thejournalname\openmind + \bibliographystyle{apacite} + \def\doi##1{\href{https://doi.org/##1}{##1}} + \def\url##1{\href{##1}{\saveurl{##1}}} + \def\APACrefYearMonthDay##1##2##3{(##1)} + \else +\ifx\thejournalname\cpsy + \def\doi##1{\href{https://doi.org/##1}{##1}} + \def\url##1{\href{##1}{\saveurl{##1}}} + \usepackage{natbib} + \bibliographystyle{mit-chicago} + \fi\fi} + +%% default, here because it doesn't work within a conditional(??) +%% overwritten if cpsy is the style, in which case natbib is used. +\usepackage[natbibapa]{apacite} + +\def\journalname#1{\gdef\thejournalname{#1} +\gdef\titlejournalname{\uppercase{#1}} +\setbibstyle +} + +\def\authors{\@ifnextchar[{\xauthor}{\yauthor}} +\let\author\authors + +\def\xauthor[#1]#2{{\centering \authorfont #2\vskip12pt} +\gdef\theauthorshortlist{#1}} + +%% if a short list of authors is not specified with [] all the authors +%% will be used for the shortauthor list. +\def\yauthor#1{{\centering \authorfont #1\vskip12pt} +\gdef\theauthorshorlist{#1}} + +\def\affil#1{$^{#1}$\ignorespaces} + +\long\def\affiliation#1#2{\vskip2pt\relax{\centering{\scriptsize +$^{#1}$#2\relax}\vskip-\parskip}} + +\def\correspondingauthor#1#2{{\let\@thefnmark\relax\@footnotetext{\noindent\vrule +height 18pt width0pt\relax\hbox to-8pt{}{\small +Corresponding author: #1, +{\tt #2}}}}} + +%% Used to send footnote to bottom of page when entered in \authors{} field. +\def\thanks#1{{\renewcommand\thefootnote{\@fnsymbol\c@footnote}% + \def\@makefnmark{\rlap{\@textsuperscript{\normalfont\@thefnmark}}}% + \long\def\@makefntext##1{\noindent\hskip-9pt\hb@xt@1.8em{% + \hss\@textsuperscript{\normalfont\@thefnmark}}##1}\footnote{#1}\ + }} + +\def\keypoints{\vskip24pt\vskip1sp\subsection*{Key Points:} +\begin{itemize}} +\def\endkeypoints{\end{itemize}} + +\def\abstract{\vskip12pt\noindent{\bf Abstract}\vskip-\parskip +\global\c@footnote=0\relax% +\noindent\ignorespaces} +\def\endabstract{\vskip18pt} + + +%% <== End Title page and Abstract + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% 7) Section Commands + +% SectionCounters, Header Level Counters ===>> + + %% the argument in square brackets is for the command that will reset + %% counter to zero +\newcounter {section} +\newcounter {subsection}[section] +\newcounter {subsubsection}[subsection] +\newcounter {paragraph}[subsubsection] +\newcounter {subparagraph}[paragraph] + + + %% Header Level Counters ==>> + %% Change to any level will change the levels below + + +\renewcommand{\thesection} {\arabic{section}} +\renewcommand{\thesubsection} {\thesection.\arabic{subsection}} +\renewcommand{\thesubsubsection}{\thesubsection.\arabic{subsubsection}} +\renewcommand{\theparagraph} {\thesubsubsection.\arabic{paragraph}} +\renewcommand{\thesubparagraph} {\theparagraph.\arabic{subparagraph}} + +\newcommand{\@chapapp}{\chaptername} + + %%% <<== End Header Level Counters + + %% Definition printed here so that you can see what the various arguments are + %% when used for \section, \subsection, etc, below + %% \newcommand{\section}{\@startsection {section}{1}{\z@}...} + + +% \@startsection {NAME}{LEVEL}{INDENT}{BEFORESKIP}{AFTERSKIP}{STYLE} +% optional * [ALTHEADING]{HEADING} +% Generic command to start a section. +% NAME : e.g., 'subsection' +% LEVEL : a number, denoting depth of section -- e.g., chapter=1, +% section = 2, etc. +% INDENT : Indentation of heading from left margin +% BEFORESKIP : Absolute value = skip to leave above the heading. +% If negative, then paragraph indent of text following +% heading is suppressed. +% AFTERSKIP : if positive, then skip to leave below heading, else +% negative of skip to leave to right of run-in heading. +% STYLE : commands to set style +% If '*' missing, then increments the counter. If it is present, then +% there should be no [ALTHEADING] argument. +% Uses the counter 'secnumdepth' whose value is the highest section +% level that is to be numbered. + + %% Startsection calls \@sect, the engine that formats each section + + %% the minus dimensions are used to tell LaTeX not to indent + %% the text following the section head + %% (silly, isn't it? but built into LaTeX) + %% You can add things like underline or uppercase to the last arg + %% to get those effects in a section head + +%% adds a little space after the section number, before following text. +\def\@seccntformat#1{\csname the#1\endcsname\ \ } + +\newskip\aftersectionskip +\def\aftersectionskip{1sp\vskip-4pt} + +\newcommand\section{\@startsection {section}{1}{\z@}% + {\ifxdraft -18pt \else -12pt \fi}% + {\aftersectionskip} + {\bignormalsize\bfseries\boldmath\sectionfont\MakeUppercase}} + + +\newcommand\subsection{\@startsection{subsection}{2}{\z@}% + {\ifxdraft -12pt \else -6pt \fi}% + {\aftersectionskip}% + {\noindent\normalfont\boldmath\vrule height + 16pt width 0pt + \subsectionfont\ifxdraft\else\MakeUppercase\fi}} + +\newcommand\subsubsection{\@startsection{subsubsection}{3}{\z@}% + {\ifxdraft 18pt\else 9pt\fi}% + {-1.5em}% + {\normalfont\boldmath\subsubsectionfont}} + +\newcommand\paragraph{\@startsection{paragraph}{4}{\parindent}% + {-3pt plus 1pt minus 1pt}% + {-1.5em}% + {\boldmath\paragraphfont}} + +\newcommand\subparagraph{\@startsection{subparagraph}{5}{\parindent}% + {3pt plus 1pt minus 1pt}% + {-1em}% + {\normalfont\normalsize\itshape\subparagraphfont}} + + %%% <<=== end section commands + + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% 8) Figure and Table Captions ==>>> + +\long\def\@caption#1[#2]#3{% + \par + \begingroup + \@parboxrestore +\linenumbers + \@makecaption{\csname fnum@#1\endcsname}{\ignorespaces #3}\par + \endgroup} +\def\@float#1{% + \@ifnextchar[% + {\@xfloat{#1}}% + {\edef\reserved@a{\noexpand\@xfloat{#1}[\csname fps@#1\endcsname]}% + \reserved@a}} +\def\@dblfloat{% + \if@twocolumn\let\reserved@a\@dbflt\else\let\reserved@a\@float\fi + \reserved@a} + + %% Name of Figure or Table is set with \figurename or \tablename above + %% \@float is what puts the text at the top or bottom of the page + %% \@dblfloat is for floats in two column text + +\newcounter{figure} +\renewcommand{\thefigure}{\arabic{figure}} + +\def\fps@figure{tbp} % position figure at top, bottom, or on its own page +\def\ftype@figure{1} % used for placing float in page +\def\ext@figure{lof} % send info to .lof file +\def\fnum@figure{\figurename~~\thefigure} % \figurename, defined above, + %% and the current state of figure counter + + %% \begin{figure} calls up float and gives it the {figure} argument, + %% which is then used to call up the definitions above, by using + %% \csname fps@\captype\endcsname, for instance, to get \fps@figure; + %% adjusting the macro to do different things depending on whether + %% figure, table, environment, or other term is used. + +\newenvironment{figure} + {\@float{figure}} + {\end@float} + + %% figure in two column text +\newenvironment{figure*} + {\@dblfloat{figure}} + {\end@dblfloat} + + %% Similar as the sequence of definitions above used for figure +\newcounter{table} +\renewcommand{\thetable}{\@arabic\c@table} +\def\fps@table{tbp} +\def\ftype@table{2} +\def\ext@table{lot} +\def\fnum@table{\tablename~\thetable} +\newenvironment{table} + {\@float{table}} + {\end@float} +\newenvironment{table*} + {\@dblfloat{table}} + {\end@dblfloat} + + %%%%%%%%%%%%%%%% + %% Setting space between caption in table or figure and the + %% table or figure +\newlength\abovecaptionskip +\newlength\belowcaptionskip +\setlength\abovecaptionskip{10\p@} +\setlength\belowcaptionskip{10\p@} + + %% to test in caption to see whether it is a figure or table +\def\xfigure{figure} + + %% Variation on LaTeX code + %% Skips below caption + %% an extra 3pt if it is a table to give extra space between caption + %% and table, since caption for table goes above table. + + %% \sbox\@tempboxa sets a temporary box so that we can measure + %% the width of the caption; if width is greater than .9\hsize + %% then make it format in a paragraph, otherwise center it. + + %% Test to see if it a figure or table: \ifx\@captype\xfigure + %% If figure, \vskip\belowcaptionskip + +\long\def\@makecaption#1#2{% +{\ifxdraft\footnotesize\else \small\fi +\ifx\@captype\xfigure +\vskip\abovecaptionskip\fi +{\ifturnofflinenums\else\ifnumlines\internallinenumbers\fi\fi + \sbox\@tempboxa{\bf#1.\quad \rm #2}% + \ifdim \wd\@tempboxa >.9\hsize +\bf #1.\quad\rm\relax #2\par + \else +{\centering + \bf #1.\rm\quad #2 +\vskip1sp} + \fi} +%% +\ifx\@captype\xfigure\else + \vskip\belowcaptionskip\fi +}} + + + %% Code to get text in tables to extend all the way to left and right + %% of table. The LaTeX table macros are made to allow space to the + %% left and the right of tables to accomodate vertical ruled lines. But + %% most publishers don't want vertical ruled lines. If the authors + %% don't use the ruled lines there would be extra white space without + %% the changes below. This code is very complicated, but you can see + %% the changed part. + +\def\xtable{table} +\def\@array[#1]#2{\setbox\@arstrutbox=\hbox{\vrule + height\arraystretch \ht\strutbox + depth\arraystretch \dp\strutbox + width\z@}\@mkpream{#2}\edef\@preamble{\halign \noexpand\@halignto +\bgroup% +\tabskip\z@\@arstrut\@preamble +\ifx\@captype\xtable\hskip-\tabcolsep\fi %% <==== Changed +\tabskip\z@ \cr}% +\let\@startpbox\@@startpbox \let\@endpbox\@@endpbox% + \if #1t\vtop \else \if#1b\vbox \else \vcenter \fi\fi% + \bgroup\let\par\relax% + \let\@sharp##\let\protect\relax \lineskip\z@\baselineskip\z@\@preamble} + + + %% Variation on code found in Latex.tex +\def\new@tabacol{\edef\@preamble{\@preamble\hskip0pt}} + +\def\@tabclassz{\ifcase \@lastchclass\@acolampacol% +\or \@ampacol \or + \or \or \@addamp \or \@acolampacol\or \@firstampfalse +\ifx\@captype\xtable \new@tabacol\else\@tabacol \fi% +\fi% +\edef\@preamble{\@preamble% + \ifcase \@chnum% + \hfil\ignorespaces\@sharp\unskip\hfil% + \or \ignorespaces\@sharp\unskip\hfil% + \or \hfil\hskip\z@ \ignorespaces\@sharp\unskip\fi}} + + %% This puts extra space between horizontal lines in tables. + %% If you want to use vertical lines in tables, you should use + %% \savehline rather than \hline, otherwise the vertical and + %% horizontal lines will not abutt. + + %% \noalign is a command that allows the uses to put something + %% between lines in a table. +\let\savehline\hline +% ??? this prevents vertical lines and horizontal lines from meeting up. +\def\hline{\noalign{\vskip3pt}\savehline\noalign{\vskip3pt}} + + %% Simple macro for table notes, that makes sure that there is + %% a little space between the table and the notes, and that they + %% print in footnotesize. +\def\tablenotes{\vskip2pt\footnotesize} +\let\endtablenotes\relax + + %%% <<=== end Figure and Table Captions + + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +% 9) Listing, ==>> +\def\@listI{\leftmargin\leftmargini + \parsep 0\p@ %\@plus2\p@ \@minus0\p@ + \topsep 4\p@ %\@plus2\p@ \@minus0\p@ + \itemsep1\p@ %\@plus2\p@ \@minus0\p@ +} +\let\@listi\@listI +\@listi + +\def\@listii {\leftmargin\leftmarginii + \labelwidth\leftmarginii + \advance\labelwidth-\labelsep + \topsep 4\p@ \@plus2\p@ \@minus\p@ + \parsep 2\p@ \@plus\p@ \@minus\p@ + \itemsep \parsep} +\def\@listiii{\leftmargin\leftmarginiii + \labelwidth\leftmarginiii + \advance\labelwidth-\labelsep + \topsep 2\p@ \@plus\p@\@minus\p@ + \parsep \z@ + \partopsep \p@ \@plus\z@ \@minus\p@ + \itemsep \topsep} +\def\@listiv {\leftmargin\leftmarginiv + \labelwidth\leftmarginiv + \advance\labelwidth-\labelsep} +\def\@listv {\leftmargin\leftmarginv + \labelwidth\leftmarginv + \advance\labelwidth-\labelsep} +\def\@listvi {\leftmargin\leftmarginvi + \labelwidth\leftmarginvi + \advance\labelwidth-\labelsep} + + %% amount left edge of text is indented relative to normal text + %% i is for first level in, ii is for second level in, etc. +\setlength\leftmargini {24pt} +\setlength\leftmarginii {11pt} +\setlength\leftmarginiii {1.87em} +\setlength\leftmarginiv {1.7em} +\setlength\leftmarginv {1em} +\setlength\leftmarginvi {1em} + + + %% default indentation for first level itemized lists +\setlength\leftmargin {\leftmargini} + + %% horizontal distance between item and following text +\setlength \labelsep {6pt} + + %% how wide should item be? +\setlength \labelwidth{\leftmargini} + + %% subtract width of label separation +\addtolength\labelwidth{-\labelsep} + + %% more listing defaults +\leftmargin\leftmargini +\labelwidth\leftmargini\advance\labelwidth-\labelsep + + +\@beginparpenalty -\@lowpenalty +\@endparpenalty -\@lowpenalty +\@itempenalty -\@lowpenalty + + %% defining listing markers for enumerate +\renewcommand{\theenumi}{\arabic{enumi}} +\renewcommand{\theenumii}{\alph{enumii}} +\renewcommand{\theenumiii}{\roman{enumiii}} +\renewcommand{\theenumiv}{\Alph{enumiv}} + + %% using listing markers for enumerate +\newcommand{\labelenumi}{\theenumi.\hskip-2pt} +\newcommand{\labelenumii}{(\theenumii)} +\newcommand{\labelenumiii}{\theenumiii.} +\newcommand{\labelenumiv}{\theenumiv.} + + %% crossreferencing for listing markers +\renewcommand{\p@enumii}{\theenumi} +\renewcommand{\p@enumiii}{\theenumi(\theenumii)} +\renewcommand{\p@enumiv}{\p@enumiii\theenumiii} + +\def\sqbullet{\vrule height 2.5pt depth0pt width 2.5pt\relax} + %% listing markers for itemize (no crossreferencing needed) +\newcommand{\labelitemi}{\raise.4ex\hbox{\sqbullet}} +\newcommand{\labelitemii}{\normalfont\bfseries --} +\newcommand{\labelitemiii}{$\m@th\ast$} +\newcommand{\labelitemiv}{$\m@th\cdot$} + + %% Setting up description listing environment +\newenvironment{description} + {\list{}{\labelwidth\z@ \itemindent-\leftmargin + \let\makelabel\descriptionlabel}} + {\endlist} + +\newcommand*{\descriptionlabel}[1]{\hspace\labelsep + \normalfont\bfseries #1} + +%%% <<=== end of listing commands + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%% 10) ETC.: Month/year, Hyphenation Library, Quote, Quotation, Extract + +%% Month and Year + +% Nice example of \ifcase which takes a counter and activates +% the slot following the counter that matches the same number; +% \month expands to a number, so ifcase will activate the slot +% matching that number. Can use it for setting date in draft +% footnote if desired. Not activated at this time. + +\newcommand{\today}{\ifcase\month\or + January\or February\or March\or April\or May\or June\or + July\or August\or September\or October\or November\or December\fi + \space\number\day, \number\year} + +% Hyphenation Library +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% Hyphenation Library, add to this +%% list if desired + +\hyphenation{ +dem-o-graph-ics +mi-cro-ec-o-nom-ic +or-gan-i-za-tion +or-gan-i-za-tions +ra-tion-ale +sys-tem-at-i-cal-ly +} + + +%%%% Quote, Quotation, Extract + %% \newenvironment produces a \begin{}..\end{} macro set. + %% \newenvironment{}{} + %% {} + + %% For long quotation which runs more than one paragraph, + %% uses list environment to indent text, supplies dummy + %% item, \item[], since one item is required for every listing + %% environment or you will get an error message. + + %% quotation indents new paragraphs, while quote does not. + +\newenvironment{quotation} + {\small +\list{}{\listparindent 1.5em% + \itemindent \listparindent + \rightmargin \leftmargin + \parsep \z@ \@plus\p@}% + \item[]} + {\endlist} +\newenvironment{quote} + {\small +\list{}{\rightmargin\leftmargin}% + \item[]} + {\endlist} + + %% If \begin{extract}...\end{extract} is used you will get the same + %% results as \begin{quotation}...\end{quotation} + +\let\extract\quotation +\let\endextract\endquotation + + %% <<== end ETC.: Month/year, Hyphenation Library, Quote, Quotation, Extract + +%%%%%%%%% +% 11) End Article: Appendix, Glossary, Acronyms, Acknowledgments + +% Appendix: +\newcounter{appendnum} + +\newif\ifappendon +\newif\ifupperappend + + +\def\appendix{ +\ifxdraft\else +\everydisplay{\hskip-2.25in} +\leftskip=-2.25in +\linewidth=\fullpagewidth +\advance\linewidth by 6pt + \@totalleftmargin=-2.25in +\fi +\nolinenumbers +\setcounter{secnumdepth}{1} +\def\@currentlabel{\Alph{section}:} +\@addtoreset{equation}{section} +\@addtoreset{table}{section} +\@addtoreset{figure}{section} +%% +\renewcommand{\thesection}{\Alph{section}} +\renewcommand{\theequation}{\Alph{section}.\arabic{equation}} +\renewcommand{\thefigure}{\Alph{section}.\arabic{figure}} +\renewcommand{\thetable}{\Alph{section}.\arabic{table}} +\global\appendontrue\goodbreak +\global\c@section=0 +\global\c@equation=0 +\def\thesection{\Alph{section}: } +\def\thesubsection{\Alph{section}.\@arabic{\c@subsection}} +\def\thesubsubsection{\thesubsection.\@arabic{\c@subsubsection}} +\def\thesubsubsubsection{\thesubsubsection.\@arabic{\c@subsubsection}} +%% +%% +\ifxdraft\else +\let\eqnarray\wideeqnarray +\let\endeqnarray\endwideeqnarray +\def\[{$$} +\def\]{$$} +\fi +} + +\def\wideeqnarray{% +\vskip\abovedisplayskip + \stepcounter{equation}% + \def\@currentlabel{\p@equation\theequation}% + \global\@eqnswtrue + \m@th + \global\@eqcnt\z@ + \tabskip\@centering + \let\\\@eqncr + %$$ +\everycr{}\halign to\textwidth\bgroup +\hskip-2.25in +% \hskip\@centering +$\displaystyle\tabskip\z@skip{##}$\@eqnsel + &\global\@eqcnt\@ne\hskip \tw@\arraycolsep \hfil${##}$\hfil + &\global\@eqcnt\tw@ \hskip \tw@\arraycolsep + $\displaystyle{##}$\hfil\tabskip\@centering + &\global\@eqcnt\thr@@ \hb@xt@\z@\bgroup\hss##\egroup + \tabskip\z@skip + \cr +} + +\def\endwideeqnarray{% + \@@eqncr + \egroup + \global\advance\c@equation\m@ne + %$$ +\vskip\belowdisplayskip +\hskip-\parindent\@ignoretrue} + + + +%%%%% end appendix + +%% Glossary + + +\def\glossary{\bgroup +\nolinenumbers +\parskip=0pt +\def\symbol##1{\vskip3pt\noindent\hskip-.2\textwidth\hbox to +.2\textwidth{##1\hfill}\ignorespaces} +\ifxdraft\else\footnotesize\fi +\raggedright +\leftskip=.2\textwidth +\symbol{\bf Symbol}{\bf Meaning}\vskip3pt\hrule\vskip3pt} + +\def\endglossary{\vskip1sp\egroup} +%% + +%% Acknowledgments +\def\acknowledgments{\vskip12pt\noindent{\bf +Acknowledgments\vrule depth 6pt +width0pt\relax}\\*\noindent\ignorespaces} + +%%% <<=== end Appendix, Glossary, Acronyms, Notation, Acknowledgments + + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% 12) %% Bibliography, References ===>> + + +%% In case you want to enter bib entries without using bibtex +\def\references{\thebibliography{}\item[]} +\let\endreferences\endthebibliography + +\def\@cite#1#2{{#1\if@tempswa , #2\fi}} + +\def\@citex[#1]#2{% + \let\@citea\@empty + \@cite{\@for\@citeb:=#2\do + {\@citea\def\@citea{,\penalty\@m\ }% + \edef\@citeb{\expandafter\@firstofone\@citeb}% + \if@filesw\immediate\write\@auxout{\string\citation{\@citeb}}\fi + \@ifundefined{b@\@citeb}{\mbox{\reset@font\bfseries ?}% + \G@refundefinedtrue + \@latex@warning + {Citation `\@citeb' on page \thepage \space undefined}}% + %% + %% This is changed from the default so that lengthy citations can + %% be broken across lines + {%\hbox{ +\csname b@\@citeb\endcsname%} +}}}{#1}} + + +\def\newblock{\hskip .11em\@plus.33em\@minus.07em} + +%% end Bibliography, and References + +%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%% +%% 13) Track Changes +%% Amy Hendrickson, Nov 2015 +%% Change Jan 2016, to allow list of changes +%% to give line and page numbers for more than one entry on the same line. +%% Change Feb 2016, to allow optional argument for time/date, and/or editor initials, etc. + +\providecolor{trackchange}{rgb}{1,0,0} +\providecolor{explain}{rgb}{.5,0,.5} + +\newcount\refchangenumber +\def\added{\@ifnextchar[{\xadded}{\yadded}} + +\long\def\xadded[#1]#2{% +\iftrack {\global\advance\refchangenumber by 1\relax% +\vtop to 0pt{\vss +\hypertarget{link\the\refchangenumber}{} +\vskip14pt} +\ifnumlines +\xdef\doit{\noexpand\linelabel{\the\refchangenumber}}\doit\else% +\xdef\doit{\noexpand\label{\the\refchangenumber}{}{}{}}\doit\fi% +\color{trackchange}(Added: #2)}%% +\expandafter\gdef\csname +changenum\the\refchangenumber\endcsname{Added: [#1] +\textcolor{trackchange}{#2}, }\else#2\fi} + +\long\def\yadded#1{% +\iftrack{\global\advance\refchangenumber by 1\relax% +\vtop to 0pt{\vss +\hypertarget{link\the\refchangenumber}{} +\vskip14pt} +\ifnumlines +\xdef\doit{\noexpand\linelabel{\the\refchangenumber}}\doit\else% +\xdef\doit{\noexpand\label{\the\refchangenumber}{}{}{}}\doit\fi% +\color{trackchange}(Added: #1)}%% +\expandafter\gdef\csname changenum\the\refchangenumber\endcsname{Added: +\textcolor{trackchange}{#1}, }\else#1\fi} + +\def\deleted{\@ifnextchar[{\xdeleted}{\ydeleted}} +\let\delete\deleted + +\long\def\xdeleted[#1]#2{ +\iftrack +\global\advance\refchangenumber by 1 +\vtop to 0pt{\vss +\hypertarget{link\the\refchangenumber}{} +\vskip14pt} +\ifnumlines\xdef\doit{\noexpand\linelabel{\the\refchangenumber}}\doit\else% +\xdef\doit{\noexpand\label{\the\refchangenumber}}\doit\fi% +{\color{trackchange}(Deleted: \sout{#2})}% +\expandafter\def\csname +changenum\the\refchangenumber\endcsname{Deleted: [#1] +{\color{trackchange}\sout{#2}}, }\fi} + +\long\def\ydeleted#1{ +\iftrack +\global\advance\refchangenumber by 1 +\vtop to 0pt{\vss +\hypertarget{link\the\refchangenumber}{} +\vskip14pt} +\ifnumlines\xdef\doit{\noexpand\linelabel{\the\refchangenumber}}\doit\else% +\xdef\doit{\noexpand\label{\the\refchangenumber}}\doit\fi% +{\color{trackchange}(Deleted: \sout{#1})}% +\expandafter\def\csname changenum\the\refchangenumber\endcsname{Deleted: +{\color{trackchange}\sout{#1}}, }\fi} + +\def\replaced{\@ifnextchar[{\xreplaced}{\yreplaced}} + +\long\def\xreplaced[#1]#2#3{% +\iftrack +\global\advance\refchangenumber by 1 +\vtop to 0pt{\vss +\hypertarget{link\the\refchangenumber}{} +\vskip14pt} +\ifnumlines\xdef\doit{\noexpand\linelabel{\the\refchangenumber}}\doit\else% +\xdef\doit{\noexpand\label{\the\refchangenumber}}\doit\fi% +{\color{trackchange}(Replaced: \sout{#2}} +{\color{black}replaced with:} {\color{trackchange} #3)}% +\expandafter\gdef\csname +changenum\the\refchangenumber\endcsname{Replaced: [#1] +{\color{trackchange}\sout{#2}} {\color{black} replaced with:} +{\color{trackchange}#3}, }\else#3\fi} + +\long\def\yreplaced#1#2{% +\iftrack +\global\advance\refchangenumber by 1 +\vtop to 0pt{\vss +\hypertarget{link\the\refchangenumber}{} +\vskip14pt} +\ifnumlines\xdef\doit{\noexpand\linelabel{\the\refchangenumber}}\doit\else% +\xdef\doit{\noexpand\label{\the\refchangenumber}}\doit\fi% +{\color{trackchange}(Replaced: \sout{#1}} +{\color{black}replaced with:} {\color{trackchange} #2)}% +\expandafter\gdef\csname changenum\the\refchangenumber\endcsname{Replaced: +{\color{trackchange}\sout{#1}} {\color{black} replaced with:} +{\color{trackchange}#2}, }\else#2\fi} + +\def\explain{\@ifnextchar[{\xexplain}{\yexplain}} + +\def\xexplain[#1]#2{\iftrack\ {\it\color{explain} [Explanation of change: +#2 (#1)]\ }\fi} + +\def\yexplain#1{\iftrack\ {\it\color{explain} [Explanation of change: +#1]\ }\fi} + +\newcount\listchangenum + +\def\listofchanges{ +\clearpage +\iftrack +\ifnum\refchangenumber>0 +\ifnumlines\nolinenumbers\else +\hypersetup{linkcolor=black} +\fi +\vskip36pt +%\vtop{ +\hrule +\noindent{\vrule height 14pt width0pt depth 6pt\large\bf List of Changes} +\hrule +\vskip18pt%} +\nobreak +{\parskip=4pt \parindent=0pt +\loop +\vskip-1pt\relax +\global\advance\listchangenum by 1\relax +\expandafter\ifx\csname changenum\the\listchangenum\endcsname\relax +\else +\csname changenum\the\listchangenum\endcsname\ +on page +%% can't get hyperlink to work correctly for page numbers, yet: +%\hyperlink{link\the\listchangenum}{ +\pageref{\the\listchangenum}%}% +\ifnumlines +\setbox0=\hbox{\lineref{\the\listchangenum}}% +\ifdim\wd0>20pt% +\else +, line\ +\hyperlink{link\the\listchangenum}{\lineref{\the\listchangenum}}% +\fi\fi. +\repeat} +\fi\fi +\thispagestyle{empty} +} + +\PassOptionsToPackage{normalem}{ulem} +\usepackage{ulem} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%% Start page numbering, formatting + +\pagenumbering{arabic} +\widowpenalty=10000 +\clubpenalty=10000 + + +%%%%%%%%%%%%%%%%%%%%%%%%%% +\newcount\articlenumber + +\def\keywords#1{\vskip24pt{\small\noindent{\bf Keywords: +}{#1}}\vskip6pt} + +\let\saveenddocument\enddocument + +\def\endarticle{\ifxdraft\clearpage +\listofchanges +\fi} + +\def\enddocument{\endarticle\saveenddocument} + +\newcount\footnum +\newcount\savefootnum +\def\endnote#1{\global\advance\footnum by 1\relax$^{\the\footnum}$% +\long\expandafter\gdef\csname foot\the\footnum\endcsname{% +\vtop{\footnotesize\hsize=\textwidth\leftskip=12pt\relax\parindent=-12pt +\indent\hbox to12pt{\the\footnum.\hfill}{#1\strut\vskip1sp}}\vskip1pt}} + +\def\endnotetext#1{\global\advance\footnum by 1\relax +\long\expandafter\gdef\csname foot\the\footnum\endcsname{% +\vtop{\footnotesize\hsize=\textwidth\leftskip=12pt\relax\parindent=-12pt +\indent\hbox to12pt{\the\footnum.\hfill}{#1\strut\vskip1sp}}\vskip1pt}} + +\def\endnotes{\ifnum\footnum=0\else +\section*{Endnotes} +\savefootnum=\footnum +\footnum=0 +\noindent\loop\ifnum\savefootnum>\footnum% +\global\advance\footnum by1\relax% +\csname foot\the\footnum\endcsname\relax% +\expandafter\gdef\csname foot\the\footnum\endcsname{\relax}\relax% +\repeat\global\footnum=0\relax\fi} + +%\let\footnote\endnote + +%% Article Type Choices: +%% Research Article +%% Commentary +%% Review Article +%% Modification +%% Retraction + +\def\articletype#1{\gdef\topline{\ifxdraft\vglue24pt +\ifx\thejournalname\cpsy +{\noindent\toplinefont +\uppercase{#1}\vskip18pt}\fi\fi}} + +% default: +\articletype{Research Article} + + +\def\toplinefont{\normalsize\sf} + +\def\setdoi#1{\def\thedoi{\href{http://dx.doi.org/#1}{http://dx.doi.org/#1}}} + +%% for OpenMind +\def\supplementslinks#1{\def\thesupplementslink{\href{http://#1}{http://#1}}} + +%% for CPSY +\def\supportinginfo#1{\def\thesupportinginfo{\href{http://#1}{http://#1}}} + +%% if none, this command doesn't need to be used +\def\conflictsofinterest#1{\gdef\theconflict{#1}} +\conflictsofinterest{The\\ authors have +declared that no\\ competing interests exist.} + + +%%%%%%%%%%% to be supplied by MIT Press, only %%%%%%%%%%%%% + +\def\citation#1{\long\def\thecitation{#1}} +\def\received#1{\def\thereceived{#1}} +\def\accepted#1{\def\theaccepted{#1}} +\def\published#1{\def\thepublished{#1}} + +%%%%%%%%%% end MIT Press commands %%%%%%%%%%%%%%%%%%%%%%%%% + + +\long\def\boxedtext{\vskip-\lastskip\vskip12pt\setbox0=\vtop\bgroup\hsize=\textwidth +\advance\hsize-24pt +\advance\hsize-1.2pt +\advance\hsize-2pt +\small} + +\def\endboxedtext{\egroup +{\fboxsep=12.3pt\noindent\hskip1.2pt\fcolorbox{cyan}{white}{\copy0}}\vskip12pt} + +\long\def\wideboxedtext{\vskip-\lastskip\vskip12pt\setbox0=\vtop\bgroup\hsize=\fullpagewidth +\advance\hsize-24pt +\advance\hsize-1.2pt +} + +\def\endwideboxedtext{\egroup +{\fboxsep=12pt +\hbox to\textwidth{\hss\fcolorbox{cyan}{white}{\copy0}}}\vskip12pt} + + +%%%%%%% + +\def\abbreviations{} + +\def\authorcontributions{\section*{Author Contributions}} +\def\acknowledgments{\section*{Acknowledgments}} + +\def\and{\ {and}\ } + + +%%%%%%%%%%%% Fonts %%%%%%%%%%%%%%%%%%%%%%%%%%% +%%% Using Berry naming conventions, should +%%% work the same on Mac as on PC +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +%% Helvetica +\def\helvetica{phvr} +\def\helveticaoblique{phvro} +\def\helveticabold{phvb} +\def\helveticaboldoblique{phvbo} + +\xdef\helvetica{\helvetica\space} +\xdef\helveticaoblique{\helveticaoblique\space} +\xdef\helveticabold{\helveticabold\space} +\xdef\helveticaboldoblique{\helveticaboldoblique\space} + +%% Courier +\def\courier{pcrr} +\xdef\courier{\courier\space} +\font\boldtt=pcrb at 8pt + +\newdimen\fullpagewidth +\ifOpenMind +\fullpagewidth=7.5in +\else +\fullpagewidth=7.5in % ?? +\fi + +%%%%%% Fonts %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +\ifxdraft\else +\usepackage{mathpazo} + +\def\palroman{pplr\space} +\def\palbold{pplb\space} +\def\palitalic{pplri\space} +\def\palbolditalic{pplbi\space} + +\let\timesroman\palroman +\let\timesbold\palbold +\let\timesitalic\palitalic +\let\timesbolditalic\palbolditalic +\fi + +%% Draft Fonts +\ifxdraft +\usepackage{natbib} + \usepackage[bookmarks=false, % show bookmarks bar? + pdfnewwindow=true, % links in new window + colorlinks=true, % false: boxed links; true: colored links + linkcolor=cyan, % color of internal links + citecolor=cyan, % color of links to bibliography + filecolor=cyan, % color of file links + urlcolor=cyan, % color of external links + ]{hyperref} + +\def\bighrulefill{\leavevmode\leaders\hrule height 1pt\hfill\kern\z@} +\fi + +\ifxdraft +\usepackage{times} + +%% Times-Roman +\def\timesroman{ptmr\space} +\def\timesbold{ptmb\space} +\def\timesitalic{ptmri\space} +\def\timesbolditalic{ptmbi\space} + +%% Special Use Fonts +%% Running heads +\font\runningheadfont=\timesitalic at 11pt +\font\foliofont=\timesbold at 12pt % was times roman +\font\dropfoliofont=\timesroman at 11pt + +%% Journal Title Page +\font\journaltitlefont=\timesbold at 16pt %34.5pt +\font\journalsubtitlefont=\timesbold at 16pt +\def\authorfont{\small\bf} + +%% Section heads +\font\sectionfont=\timesbold at 12pt +\font\subsectionfont=\timesbolditalic at 11pt +\font\subsubsectionfont=\timesitalic at 11pt +\font\paragraphfont=cmcsc10 at 10pt + +%% Appendix title +\font\appendixtitlefont=\timesbold at 14pt + +%% Caption +\font\fignumfont=\timesbolditalic at 9pt +\font\tabnumfont=\timesbolditalic at 9pt +\font\figtextfont=\timesitalic at 9pt +\font\realtabtextfont=\timesitalic at 9pt +\def\tabtextfont{\small\realtabtextfont} + +%% Table fonts +\def\tablefontsize{\normalsize} +\def\tablefootnotesize{\footnotesize} + +%% References/Bibliography +\def\bibfontsize{\normalsize} +\fi %%%%%%%%%%%%% <<<=== end fonts for manuscript style + + +\let\bibfont\small + +%% Article Title + +\def\title{\ifOpenMind\else\vglue-.75in\topline\fi +\ifxdraft\else +\ifOpenMind +\vglue-57pt\fi\fi +\global\advance\articlenumber by 1 +\expandafter\gdef\csname +firstpage\the\articlenumber\endcsname{\the\c@page} +\bgroup\centering +\global\titletrue +\@ifnextchar[{\xtitle}{\ytitle}} + +\def\xsubtitle{\subtitle} +\long\def\lookahead#1{\def\one{#1}\ifx\one\xsubtitle{\journaltitlefont +:}\else\vskip12pt\egroup\fi#1} + +\def\xtitle[#1]#2{\global\c@footnote=0\relax% +\gdef\thetitle{#1} +{\journaltitlefont #2}\lookahead} + +\def\ytitle#1{\gdef\thetitle{#1} +{\journaltitlefont #1}\lookahead} + +\def\subtitle#1{\ \journalsubtitlefont +#1\vskip1pt\egroup\vskip12pt} + +\let\thetitle\relax +\let\theauthorshortlist\relax + +\pdfpagewidth=8.5in +\pdfpageheight=11in +\paperheight=11in +\paperwidth=8.5in + + +%% Open Mind + +\long\def\savethebibliography#1{\bibfont %\list +\def\makelabel#1{}% get rid of error message about no list +{\@biblabel {\the \c@NAT@ctr}} +{\@bibsetup {#1}\global \c@NAT@ctr \z@ } +\ifNAT@openbib \renewcommand\newblock {\par }\else \renewcommand +\newblock {\hskip .11em \@plus .33em \@minus .07em}\fi +\sloppy \clubpenalty 4000\widowpenalty 4000 \sfcode `\.\@m +\let\NAT@bibitem@first@sw \@firstoftwo +\let \citeN \cite \let \shortcite\cite \let\citeasnoun\cite +} + +\newskip\bibskip + +\ifOpenMind + + \usepackage[bookmarks=false, % show bookmarks bar? + pdfnewwindow=true, % links in new window + colorlinks=true, % false: boxed links; true: colored links + linkcolor=gray, % color of internal links + citecolor=gray, % color of links to bibliography + filecolor=gray, % color of file links + urlcolor=gray, % color of external links + ]{hyperref} + +%%%%%%%%%%%%% +%% Open Mind Fonts + +\iffinalfonts %% ===>>> +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%% Final Fonts +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +\usepackage{fontspec} +\defaultfontfeatures{Ligatures=TeX} + +%% caption +\def\captionnamefont{\fontsize{10}{11} +\fontspec{OptimaLTStd-Bold}} + +\def\captiontextfont{\fontsize{9}{11}% +\fontspec{OptimaLTStd}} + +\def\sectionfont{\fontsize{9.5}{12}% +\fontspec{OptimaLTStd-Bold}}% + +\def\subsectionfont{\fontsize{8.5}{12}% +\fontspec{OptimaLTStd-BoldItalic}}% + +\def\subsubsectionfont{\fontsize{8.5}{12}% +\fontspec{OptimaLTStd-Bold}}% + +\def\paragraphfont{\fontsize{8.5}{12}% +\fontspec{OptimaLTStd-BoldItalic}}% + +\let\subparagraphfont\subsubsectionfont + +\def\Optima{\setmainfont[Ligatures=TeX, Mapping=tex-text, +BoldFont=OptimaLTStd-Bold, +ItalicFont=OptimaLTStd-Italic] +{OptimaLTStd}} + +\def\optimatext{\normalsize\Optima} +\def\Optimatext{\normalsize\Optima} +\Optimatext % default fonts + +\def\OPNtitlefont{\fontsize{16}{22} +\fontspec{HelveticaNeueLTStd-Bd} +\addfontfeature{LetterSpace=12} +} +\def\OPNsubtitlefont{\fontsize{16}{22} +\fontspec{HelveticaNeueLTStd-Bd} +\addfontfeature{LetterSpace=12} +} + +\def\normalsf{\fontsize{11}{11} +\fontspec{HelveticaNeueLTStd-Roman}} + +\def\verbatim@font{\fontspec{CourierStd}} + +\def\journaltitlefont{\OPNtitlefont} +\def\journalsubtitlefont{\OPNsubtitlefont} +\def\authorfont{\small\bf} +\font\runningheadfont=\palbolditalic at 10pt +\font\runningheadrmfont=\palroman at 8pt +\font\runningfootfont=\helveticaoblique at 9pt +\font\dropfoliofont=\helvetica at 11pt +%% +\else +%% +\font\opntitlefont=\helveticabold at 16pt +\def\journaltitlefont{\opntitlefont \baselineskip=22pt} +\let\journalsubtitlefont\journaltitlefont +\def\authorfont{\small\bf} +\font\runningheadfont=\palbolditalic at 10pt +\font\runningheadrmfont=\palroman at 8pt +\font\runningfootfont=\helveticaoblique at 8pt +\font\dropfoliofont=\helvetica at 10pt +\font\sectionfont=\palbold at 9.5pt +\font\subsectionfont=\palbolditalic at 8.5 pt +\font\subsubsectionfont=\palbold at 8.5pt +\font\paragraphfont=\palbolditalic at 8.5 pt +\let\subparagraphfont\subsubsectionfont +\fi +%% for banner +\font\sfb=\helveticabold at 6.5pt +\font\bigsfb=\helveticabold at 7.5pt +\font\tinytt=cmtt8 at 7pt +%% end fonts +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +\usepackage[natbibapa]{apacite} +\bibliographystyle{apacite} +%\let\savethebibliography\thebibliography +\let\endsavethebibliography\endthebibliography +\let\saveurl\url +\def\thebibliography{ +\def\doi##1{\href{https://doi.org/##1}{##1}} +\def\url##1{\href{##1}{\saveurl{##1}}} +\def\APACrefYearMonthDay##1##2##3{(##1)} +\renewcommand{\APACrefauthstyle}{\noindent\hskip-10pt\relax}% +\bgroup +\begin{savethebibliography}{} +\small +\linewidth=\fullpagewidth +\newdimen\bibindentwidth +\bibindentwidth=150pt %2.25in = 162pt +\leftskip=-\bibindentwidth +\advance\bibindentwidth12pt +\rightskip=\bibindentwidth +\columnsep=24pt +\parskip=0pt +\begin{multicols}{2}[\hbox to \textwidth{\hss\hbox to +\fullpagewidth{\sectionfont REFERENCES\hfill}}]% +\clubpenalty9000 +\@clubpenalty\clubpenalty +\widowpenalty9000 +} +\def\endthebibliography{\end{multicols}\end{savethebibliography}% +\egroup} + +\newdimen\colorboxwidth +\colorboxwidth=1.35in +\advance\colorboxwidth-12pt + +\def\ps@headings{ +%% +\def\@oddhead{\iftitle +\iffinalfonts\else +\hbox to \textwidth{\hfill\hbox to0pt{\hss\thewatermark}}\fi +\else +%% ODD HEAD NOT TITLE PAGE +\vtop to 0pt{\vglue-36pt +\hbox to \textwidth{\hss\hbox to 7.5in{\runningheadfont\thetitle\ \ \ +\ \runningheadrmfont\theauthorshortlist\hfill}} +\vskip3pt\hbox to \textwidth{\hss\color{cyan}\hbox to7.5in{\hrulefill}} +\vskip24pt +\vss} +\fi} +\let\@evenhead\@oddhead +\def\@oddfoot{ +\iftitle\global\titlefalse +%\lower6pt +\hbox to\textwidth{\hss +\hbox to\fullpagewidth{% +\hskip-23pt\vtop to 0pt{\vss +\fboxsep=10pt +\colorbox{mdcyan}{ +\vbox to 10.25in{\hsize=142pt +\advance\hsize-2\fboxsep +\baselineskip=7.5pt +\vskip-9pt +\hbox to\hsize{\hskip-13pt\includegraphics[width=144pt]{OPMI_logo}\hss} +\vskip102pt +\sfb + \raggedright + \parindent=0pt + \noindent\hbox to 121.3pt{\color{red}\bigsfb% + a\,n\hfill o\,p\,e\,n\hfill a\,c\,c\,e\,s\,s\hfill \lower1.5pt\hbox{\includegraphics[width + =.1in]{openaccess3}}\hfill j\,o\,u\,r\,n\,a\,l} + \vskip24pt + \includegraphics[width=121.3pt]{CrossMark} + \vskip26pt\hyphenpenalty=10000 + {\sfb Citation:} \thecitation +\vfill + {\sfb DOI:}\\ \thedoi + \vfill +{\sfb Supplemental Materials:}\\[2pt] +\thesupplementslink +\vfill + {\sfb Received:} \thereceived\\[2pt] + {\sfb Accepted:} \theaccepted\\[2pt] + {\sfb Published:} \thepublished + \vfill + {\sfb Competing Interests:} + \theconflict + \vfill + {\sfb Corresponding Author:}\theCorrespondingauthor + \vskip6pt +{\color{cyan}\hbox to -24pt{}\hrule height 1pt width 122pt} +\vskip12pt +{\sfb Copyright:} {\footnotesize\copyright} \the\year\ \\[1pt] +Massachusetts Institute of Technology\\[1pt] +Published under a Creative Commons Attribution 4.0 +International\\[1pt] (CC BY 4.0) license +\vfill +\vskip12pt +\fboxsep=6pt +\colorbox{dkcyan}{\hbox to 110pt{% +\hfill +\includegraphics[width=.5in]{colophon} +\raise 8pt\hbox{\color{white}\small\sf\ The MIT +Press}\hfill}} +}%% end vbox to 10.5 in +}%% end color box +%\vglue-23pt +}%% end vtop to 0pt +\hfill}%% end hbox to full page width +\hfill}%% end hbox to textwidth +\else +%%% ODD FOOT, NOT TITLE PAGE +\noindent\hskip-2.5in\vtop{\vbox to 0pt{\vss\vbox to 9in{\vss +\parskip=0pt\hsize=7.5in\color{cyan} +\vskip1pt%\hbox to\hsize{\hrulefill}\vskip-24pt +\color{dkcyan} +\runningfootfont OPEN MIND: Discoveries in +Cognitive Science\hfill %\color{black} +\dropfoliofont\the\c@page}}}\fi} +\let\@evenfoot\@oddfoot +} + +\ps@headings + +\def\bighrulefill{\leavevmode\leaders\hrule height 1pt\hfill\kern\z@} + +\def\abstract{\vskip6pt +\global\c@footnote=0\relax% +\hbox to \textwidth{\color{cyan}\bighrulefill} +\section*{ABSTRACT}\raggedright +\noindent\ignorespaces} + +\def\endabstract{\vskip1pt +\hbox to \textwidth{\color{cyan}\bighrulefill} +\vskip18pt} + +\def\correspondingauthor#1#2{\def\theCorrespondingauthor{\\[1pt]#1\\[1pt] +\href{mailto:#2}{#2}}} + +\fi %% end OpenMind Specs + + + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +++ +\ifCompPsych + \usepackage[bookmarks=false, % show bookmarks bar? + pdfnewwindow=true, % links in new window + colorlinks=true, % false: boxed links; true: colored links + linkcolor=dkcyan, % color of internal links + citecolor=dkcyan, % color of links to bibliography + filecolor=dkcyan, % color of file links + urlcolor=dkcyan, % color of external links + ]{hyperref} + +%%%%%%%%%%%%% +%% Fonts + +\iffinalfonts %% ===>>> +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%%% Final Fonts +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +\usepackage{fontspec} +\defaultfontfeatures{Ligatures=TeX} + +%% caption +\def\captionnamefont{\fontsize{10}{11} +\fontspec{OptimaLTStd-Bold}} + +\def\captiontextfont{\fontsize{9}{11}% +\fontspec{OptimaLTStd}} + +\def\sectionfont{\fontsize{9}{12}% +\fontspec{OptimaLTStd-Bold}}% + +\def\subsectionfont{\fontsize{8.5}{12}% +\fontspec{OptimaLTStd-BoldItalic}}% + +\def\subsubsectionfont{\fontsize{8.5}{12}% +\fontspec{OptimaLTStd-Bold}}% + +\def\paragraphfont{\fontsize{8.5}{12}% +\fontspec{OptimaLTStd-BoldItalic}}% + +\let\subparagraphfont\subsubsectionfont + +\def\Optima{\setmainfont[Ligatures=TeX, Mapping=tex-text, +BoldFont=OptimaLTStd-Bold, +ItalicFont=OptimaLTStd-Italic] +{OptimaLTStd}} + +\def\optimatext{\normalsize\Optima} +\def\Optimatext{\normalsize\Optima} +\Optimatext % default fonts + +%\def\journaltitlefont{\fontsize{22}{31} +%\fontspec{HelveticaNeueLTStd-Bd}} +\def\journaltitlefont{\fontsize{16}{22} +\fontspec{HelveticaNeueLTStd-Roman}} + +\def\journalsubtitlefont{\fontsize{16}{22} +\fontspec{HelveticaNeueLTStd-Roman} +%\addfontfeature{LetterSpace=12} +} + +\def\normalsf{\fontsize{11}{11} +\fontspec{HelveticaNeueLTStd-Roman}} + +\def\verbatim@font{\fontspec{CourierStd}} +\font\runningheadfont=\palbolditalic at 10pt +\font\runningheadrmfont=\palroman at 8pt +\font\runningfootfont=\helveticaoblique at 9pt +\font\dropfoliofont=\helvetica at 11pt +\def\authorfont{\small\bf} +%% +\else +%% +\font\xjournaltitlefont=\helveticabold at 16pt +\font\xjournalsubtitlefont=\helveticabold at 16pt% +\def\journaltitlefont{\xjournaltitlefont \baselineskip=22pt} +\let\journalsubtitlefont\journaltitlefont +\def\authorfont{\small\bf} +\font\foliofont=\helvetica at 8pt +\font\runningheadfont=\palbolditalic at 10pt +\font\runningheadrmfont=\palroman at 8pt +\font\runningfootfont=\helveticaoblique at 9pt +\font\dropfoliofont=\helvetica at 9pt +\font\sectionfont=\palbold at 9.5pt +\font\subsectionfont=\palbolditalic at 8.5 pt +\font\subsubsectionfont=\palbold at 8.5pt +\font\paragraphfont=\palbolditalic at 8.5 pt +\fi %% <<<=== end if final fonts +%% for banner +\font\sfb=\helveticabold at 6.5pt +\font\bigsfb=\helveticabold at 7.5pt +\font\logosfb=\helveticabold at 9pt +\font\tinytt=cmtt8 at 7pt +%% end fonts +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% + +\newdimen\colorboxwidth +\colorboxwidth=1.35in +\advance\colorboxwidth-12pt + +\def\ps@headings{ +%% +\def\@oddhead{\iftitle +\iffinalfonts\else +\hbox to \textwidth{\hfill\hbox to0pt{\hss\thewatermark}}\fi +\else +%% ODD HEAD NOT TITLE PAGE +\vtop to 0pt{\vglue-36pt +\hbox to \textwidth{\hss\hbox to 7.5in{\runningheadfont\thetitle\ \ \ +\ \runningheadrmfont\theauthorshortlist\hfill}} +\vskip3pt\hbox to \textwidth{\hss\color{cyan}\hbox to7.5in{\hrulefill}} +\vskip24pt +\vss} +\fi} +\let\@evenhead\@oddhead +\def\@oddfoot{ +\iftitle\global\titlefalse +%\lower6pt +\hbox to\textwidth{\hss +\hbox to\fullpagewidth{% +\hskip-23pt\vtop to 0pt{\vss +\fboxsep=10pt +\colorbox{mdcyan}{ +\vbox to 10.25in{\hsize=142pt +\advance\hsize-2\fboxsep +\baselineskip=7.5pt +\vskip-9pt +\vskip1in +\hbox to\hsize{%\hskip-13pt%\includegraphics[width=144pt]{OPMI_logo.jpg} +\hss\colorbox{white}{\sectionfont CPSY WordMark to Come} +\hss} +\vskip6pt +\vskip1.25in +\vskip102pt +\sfb + \raggedright + \parindent=0pt + \noindent\hbox to 121.3pt{\color{red}\bigsfb% + a\,n\hfill o\,p\,e\,n\hfill a\,c\,c\,e\,s\,s\hfill \lower1.5pt\hbox{\includegraphics[width + =.1in]{openaccess3}}\hfill j\,o\,u\,r\,n\,a\,l} + \vskip24pt + \includegraphics[width=121.3pt]{CrossMark} + \vskip26pt\hyphenpenalty=10000 + {\sfb Citation:} \thecitation +\vfill + {\sfb DOI:}\\ \thedoi + \vfill +{\sfb Supporting Information:}\\[2pt] +\thesupportinginfo +\vfill + {\sfb Received:} \thereceived\\[2pt] + {\sfb Accepted:} \theaccepted\\[2pt] + {\sfb Published:} \thepublished + \vfill + {\sfb Competing Interests:} + \theconflict + \vfill + {\sfb Corresponding Author:}\theCorrespondingauthor + \vskip6pt +{\color{cyan}\hbox to -24pt{}\hrule height 1pt width 122pt} +\vskip12pt +{\sfb Copyright:} {\footnotesize\copyright} \the\year\ \\[1pt] +Massachusetts Institute of Technology\\[1pt] +Published under a Creative Commons Attribution 4.0 +International\\[1pt] (CC BY 4.0) license +\vfill +\vskip12pt +\fboxsep=6pt +\colorbox{dkcyan}{\hbox to 110pt{% +\hfill +\includegraphics[width=.5in]{colophon} +\raise 8pt\hbox{\color{white}\small\sf\ The MIT +Press}\hfill}} +}%% end vbox to 10.5 in +}%% end color box +%\vglue-23pt +}%% end vtop to 0pt +\hfill}%% end hbox to full page width +\hfill}%% end hbox to textwidth +\else +%%% ODD FOOT, NOT TITLE PAGE +\noindent\hskip-2.5in\vtop{\vbox to 0pt{\vss\vbox to 9in{\vss +\parskip=0pt\hsize=7.5in\color{cyan} +\vskip1pt%\hbox to\hsize{\hrulefill}\vskip-24pt +\color{dkcyan} +\runningfootfont Computational Psychiatry +\hfill %\color{black} +\dropfoliofont\the\c@page}}}\fi} +\let\@evenfoot\@oddfoot +} + +\ps@headings + +\def\abstract{\vskip6pt +\global\c@footnote=0\relax% +\hbox to \textwidth{\color{cyan}\bighrulefill} +\section*{ABSTRACT}\raggedright +\noindent\ignorespaces} + +\def\endabstract{\vskip1pt} + + +\def\correspondingauthor#1#2{\def\theCorrespondingauthor{\\[1pt]#1\\[1pt] +{#2}}} + +\def\bighrulefill{\leavevmode\leaders\hrule height 1pt\hfill\kern\z@} + + +%% chicago 16 author-date bib style + +\usepackage{natbib} +\bibliographystyle{mit-chicago} + +%% This makes all bibitems have hang indent +\bibskip=-13pt plus 2pt + +%% can't use this definition of @lbibitem with apacite.bst, or it will kill the & between authors. +\def\@lbibitem[#1]#2{\if\relax\@extra@b@citeb\relax \else \@ifundefined{br@#2\@extra@b@citeb }{} +{\@namedef {br@#2}{\@nameuse {br@#2\@extra@b@citeb }}}\fi +\@ifundefined {b@#2\@extra@b@citeb }{\def \NAT@num {}}{\NAT@parse {#2}}\def \NAT@tmp {#1} +\expandafter \let \expandafter \bibitemOpen \csname NAT@b@open@#2\endcsname +\expandafter \let \expandafter \bibitemShut \csname NAT@b@shut@#2\endcsname +\@ifnum {\NAT@merge >\@ne }{\NAT@bibitem@first@sw {\@firstoftwo }{\@ifundefined {NAT@b*@#2} +{\@firstoftwo }{\expandafter \def \expandafter \NAT@num \expandafter{\the \c@NAT@ctr }\@secondoftwo }}} +{\@firstoftwo }{\global \advance\c@NAT@ctr \@ne \@ifx {\NAT@tmp \@empty } +{\@firstoftwo}{\@secondoftwo }{\expandafter \def \expandafter \NAT@num\expandafter {\the \c@NAT@ctr } +\global \NAT@stdbsttrue }{}\bibitem@fin %\item [\hfil +\NAT@anchor{#2}{\NAT@num }%] +% +\parskip=0pt +\vskip\bibskip +\noindent\hskip-12pt +\global\let\NAT@bibitem@first@sw \@secondoftwo \NAT@bibitem@init }{\NAT@anchor{#2}{} +\NAT@bibitem@cont \bibitem@fin }\@ifx {\NAT@tmp \@empty}{\NAT@wrout {\the \c@NAT@ctr }{}{}{}{#2}} +{\expandafter \NAT@ifcmd\NAT@tmp (@)(@)\@nil {#2}}} + +\long\def\savethebibliography#1{\bibfont %\list +\def\makelabel#1{}% get rid of error message about no list +{\@biblabel {\the \c@NAT@ctr}} +{\@bibsetup {#1}\global \c@NAT@ctr \z@ } +\ifNAT@openbib \renewcommand\newblock {\par }\else \renewcommand +\newblock {\hskip .11em \@plus .33em \@minus .07em}\fi +\sloppy \clubpenalty 4000\widowpenalty 4000 \sfcode `\.\@m +\let\NAT@bibitem@first@sw \@firstoftwo +\let \citeN \cite \let \shortcite\cite \let\citeasnoun\cite +} + +\let\thebibliography\savethebibliography +\let\endsavethebibliography\endthebibliography +\let\saveurl\url +\def\thebibliography#1{ +\def\doi##1{\href{https://doi.org/##1}{##1}} +\def\url##1{\href{##1}{\saveurl{##1}}} +\bgroup +\linewidth=\fullpagewidth +\newdimen\bibindentwidth +\bibindentwidth=150pt %2.25in = 162pt +\leftskip=-\bibindentwidth +\advance\bibindentwidth12pt +\rightskip=\bibindentwidth +\columnsep=24pt +\parskip=0pt +\begin{savethebibliography}{} +\begin{multicols}{2}[\hbox to \textwidth{\hss\hbox to +\fullpagewidth{\sectionfont REFERENCES\hfill}}]% +\clubpenalty10000 +\@clubpenalty\clubpenalty +\widowpenalty10000 +} +\def\endthebibliography{\end{multicols}\end{savethebibliography}% +\egroup} + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +\def\jargon{\@ifnextchar[{\xjargon}{\yjargon}} + +\def\yjargon#1#2{ +\vadjust{\vtop to 0pt{\vskip-3.5pt\vskip-\baselineskip\noindent\hskip-.25in\llap{\vtop to 0pt{\small\raggedright\hsize 2in\noindent #1:\\ +#2\vss}}\vss}}} + +\def\xjargon[#1]#2#3{ \vadjust{\vtop to +0pt{\vskip#1\vskip-3.5pt\vskip-\baselineskip\noindent\hskip-.25in\llap{\vtop +to 0pt{\small\raggedright\hsize 2in\noindent #2:\\ +#3\vss}}\vss}}} + +\def\correspondingauthor#1#2{\def\theCorrespondingauthor{\\[1pt]#1\\[1pt] +\href{mailto:#2}{#2}}} + +\fi %% end CompPsych + +\def\authorsummary{\bgroup\section*{AUTHOR SUMMARY}\raggedright} + +\def\endauthorsummary{\vskip1pt +\hbox to\textwidth{\color{cyan}\bighrulefill} +\egroup} + + +\@afterindentfalse\@afterheading + + +\def\widefigure#1#2{ +\hbox +to\textwidth{\hss\includegraphics[width=#1]{#2}\hfill} +\let\caption\widecaption +} + +\long\def\widetable{\setbox0=\vtop\bgroup\hsize=\fullpagewidth +\let\caption\widecaption +} + +\def\endwidetable{\egroup +\hbox +to\textwidth{\hss\copy0}} + +\let\savecaption\caption +\long\def\widecaption#1{\hbox +to\textwidth{\hss\vtop{\hsize=\fullpagewidth \savecaption{#1}}}} + +\usepackage{colortbl} +\usepackage{longtable} +\usepackage{amsbsy} +\def\arraystretch{1.1} + +\usepackage{algorithm} %% wrapper +\let\savealgorithm\algorithm +\let\saveendalgorithm\endalgorithm +\def\algorithm{\vskip-\lastskip\vskip-12pt\savealgorithm} +\def\endalgorithm{\saveendalgorithm\vskip-12pt} +\usepackage{algorithmicx} +\usepackage{algpseudocode} + + +\def\code{\bgroup\begin{itemize}\item[]\footnotesize} +\def\endcode{\end{itemize}\egroup} + +%% space following longtable: +\LTpost=-24pt + +\renewcommand{\thealgorithm}{\vrule height 9pt depth 4pt width 0pt\arabic{algorithm}} + +%% This definition allows for links and other commands that need to be \protect ed from +%% having a problem. it makes every caption the equivalent of \caption[]{caption text} +\def\@caption#1[#2]#3{\small\expandafter \ifx \csname if@capstart\expandafter \endcsname +\csname iftrue\endcsname \global \let \@currentHref \hc@currentHref \else \hyper@makecurrent {\@captype }\fi +\@ifundefined {NR@gettitle}{\def \@currentlabelname{\thesection\relax #2}} +{\NR@gettitle {#2}}\par +%\addcontentsline {\csname ext@#1\endcsname }{#1}{\protect \numberline {\csname the#1\endcsname }{\ignorespaces #2}} +\begingroup \@parboxrestore \if@minipage \@setminipage \fi \normalsize +\expandafter\ifx \csname if@capstart\expandafter \endcsname +\csname iftrue\endcsname \global \@capstartfalse +\@makecaption {\csname fnum@#1\endcsname }{\ignorespaces #3} +\else \@makecaption {\csname fnum@#1\endcsname }{\ignorespaces \ifHy@nesting +\expandafter \hyper@@anchor \expandafter {\@currentHref }{#3}\else +\Hy@raisedlink {\expandafter \hyper@@anchor \expandafter +{\@currentHref }{\relax }}#3\fi }\fi \par \endgroup} + + + +\def\endtrivlist{% + \if@inlabel + \leavevmode + \global \@inlabelfalse + \fi + \if@newlist + \@noitemerr + \global \@newlistfalse + \fi + \ifhmode\unskip \par\fi +% \@endparenv +} + + +\endinput \ No newline at end of file diff --git a/inst/rmarkdown/templates/opmi_article/template.yaml b/inst/rmarkdown/templates/opmi_article/template.yaml new file mode 100644 index 000000000..58c8f211a --- /dev/null +++ b/inst/rmarkdown/templates/opmi_article/template.yaml @@ -0,0 +1,4 @@ +name: OpenMind article +description: > + Template for creating a OpenMind article +create_dir: true diff --git a/inst/rmarkdown/templates/tacl_article/resources/template.tex b/inst/rmarkdown/templates/tacl_article/resources/template.tex new file mode 100644 index 000000000..ecbe7ae10 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/resources/template.tex @@ -0,0 +1,52 @@ +% File tacl2018.tex +% Aug 3, 2018 + +% The English content of this file was modified from various *ACL instructions +% by Lillian Lee and Kristina Toutanova +% +% LaTeXery is all adapted from acl2018.sty. + +\documentclass[11pt,a4paper]{article} +\usepackage[hyperref]{tacl2018} % use ``nohyperref'' to disable hyperref +\usepackage{times,latexsym} +\usepackage{url} +\usepackage[T1]{fontenc} +\usepackage{graphicx} + +$for(header-includes)$ +$header-includes$ +$endfor$ + +$if(taclfinal)$ +\taclfinalcopy +$else$ +\taclfinalfalse +$endif$ + +\title{$title$} + +\author{ + $for(author)$ + $author.name$ \\ $author.affiliation$ \\ {\sf $author.email$} $sep$\And + $endfor$ +} + + % $author.name$ \\ $author.affiliation$ \\ {\tt {\normalsize $author.email$}} + +\date{} + +\begin{document} +\maketitle +\begin{abstract} +$abstract$ +\end{abstract} + +$body$ + +$for(include-after)$ +$include-after$ +$endfor$ + +\bibliographystyle{acl_natbib} + +\end{document} diff --git a/inst/rmarkdown/templates/tacl_article/skeleton/acl_natbib.bst b/inst/rmarkdown/templates/tacl_article/skeleton/acl_natbib.bst new file mode 100644 index 000000000..8940466b8 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/skeleton/acl_natbib.bst @@ -0,0 +1,1976 @@ +%%% Modification of BibTeX style file acl_natbib_nourl.bst +%%% ... by urlbst, version 0.7 (marked with "% urlbst") +%%% See +%%% Added webpage entry type, and url and lastchecked fields. +%%% Added eprint support. +%%% Added DOI support. +%%% Added PUBMED support. +%%% Added hyperref support. +%%% Original headers follow... + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% - fixed a bug with format.chapter - error given in chapter is empty +% with inbook. +% Shay Cohen 2018/02/16 + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +% BibTeX style file acl_natbib.bst +% +% intended as input to urlbst script +% +% adapted from compling.bst +% in order to mimic the style files for ACL conferences prior to 2017 +% by making the following three changes: +% - for @incollection, page numbers now follow volume title. +% - for @inproceedings, address now follows conference name. +% (address is intended as location of conference, +% not address of publisher.) +% - for papers with three authors, use et al. in citation +% Dan Gildea 2017/06/08 + +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +% +% BibTeX style file compling.bst +% +% Intended for the journal Computational Linguistics (ACL/MIT Press) +% Created by Ron Artstein on 2005/08/22 +% For use with for author-year citations. +% +% I created this file in order to allow submissions to the journal +% Computational Linguistics using the package for author-year +% citations, which offers a lot more flexibility than , CL's +% official citation package. This file adheres strictly to the official +% style guide available from the MIT Press: +% +% http://mitpress.mit.edu/journals/coli/compling_style.pdf +% +% This includes all the various quirks of the style guide, for example: +% - a chapter from a monograph (@inbook) has no page numbers. +% - an article from an edited volume (@incollection) has page numbers +% after the publisher and address. +% - an article from a proceedings volume (@inproceedings) has page +% numbers before the publisher and address. +% +% Where the style guide was inconsistent or not specific enough I +% looked at actual published articles and exercised my own judgment. +% I noticed two inconsistencies in the style guide: +% +% - The style guide gives one example of an article from an edited +% volume with the editor's name spelled out in full, and another +% with the editors' names abbreviated. I chose to accept the first +% one as correct, since the style guide generally shuns abbreviations, +% and editors' names are also spelled out in some recently published +% articles. +% +% - The style guide gives one example of a reference where the word +% "and" between two authors is preceded by a comma. This is most +% likely a typo, since in all other cases with just two authors or +% editors there is no comma before the word "and". +% +% One case where the style guide is not being specific is the placement +% of the edition number, for which no example is given. I chose to put +% it immediately after the title, which I (subjectively) find natural, +% and is also the place of the edition in a few recently published +% articles. +% +% This file correctly reproduces all of the examples in the official +% style guide, except for the two inconsistencies noted above. I even +% managed to get it to correctly format the proceedings example which +% has an organization, a publisher, and two addresses (the conference +% location and the publisher's address), though I cheated a bit by +% putting the conference location and month as part of the title field; +% I feel that in this case the conference location and month can be +% considered as part of the title, and that adding a location field +% is not justified. Note also that a location field is not standard, +% so entries made with this field would not port nicely to other styles. +% However, if authors feel that there's a need for a location field +% then tell me and I'll see what I can do. +% +% The file also produces to my satisfaction all the bibliographical +% entries in my recent (joint) submission to CL (this was the original +% motivation for creating the file). I also tested it by running it +% on a larger set of entries and eyeballing the results. There may of +% course still be errors, especially with combinations of fields that +% are not that common, or with cross-references (which I seldom use). +% If you find such errors please write to me. +% +% I hope people find this file useful. Please email me with comments +% and suggestions. +% +% Ron Artstein +% artstein [at] essex.ac.uk +% August 22, 2005. +% +% Some technical notes. +% +% This file is based on a file generated with the package +% by Patrick W. Daly (see selected options below), which was then +% manually customized to conform with certain CL requirements which +% cannot be met by . Departures from the generated file +% include: +% +% Function inbook: moved publisher and address to the end; moved +% edition after title; replaced function format.chapter.pages by +% new function format.chapter to output chapter without pages. +% +% Function inproceedings: moved publisher and address to the end; +% replaced function format.in.ed.booktitle by new function +% format.in.booktitle to output the proceedings title without +% the editor. +% +% Functions book, incollection, manual: moved edition after title. +% +% Function mastersthesis: formatted title as for articles (unlike +% phdthesis which is formatted as book) and added month. +% +% Function proceedings: added new.sentence between organization and +% publisher when both are present. +% +% Function format.lab.names: modified so that it gives all the +% authors' surnames for in-text citations for one, two and three +% authors and only uses "et. al" for works with four authors or more +% (thanks to Ken Shan for convincing me to go through the trouble of +% modifying this function rather than using unreliable hacks). +% +% Changes: +% +% 2006-10-27: Changed function reverse.pass so that the extra label is +% enclosed in parentheses when the year field ends in an uppercase or +% lowercase letter (change modeled after Uli Sauerland's modification +% of nals.bst). RA. +% +% +% The preamble of the generated file begins below: +%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%% +%% +%% This is file `compling.bst', +%% generated with the docstrip utility. +%% +%% The original source files were: +%% +%% merlin.mbs (with options: `ay,nat,vonx,nm-revv1,jnrlst,keyxyr,blkyear,dt-beg,yr-per,note-yr,num-xser,pre-pub,xedn,nfss') +%% ---------------------------------------- +%% *** Intended for the journal Computational Linguistics *** +%% +%% Copyright 1994-2002 Patrick W Daly + % =============================================================== + % IMPORTANT NOTICE: + % This bibliographic style (bst) file has been generated from one or + % more master bibliographic style (mbs) files, listed above. + % + % This generated file can be redistributed and/or modified under the terms + % of the LaTeX Project Public License Distributed from CTAN + % archives in directory macros/latex/base/lppl.txt; either + % version 1 of the License, or any later version. + % =============================================================== + % Name and version information of the main mbs file: + % \ProvidesFile{merlin.mbs}[2002/10/21 4.05 (PWD, AO, DPC)] + % For use with BibTeX version 0.99a or later + %------------------------------------------------------------------- + % This bibliography style file is intended for texts in ENGLISH + % This is an author-year citation style bibliography. As such, it is + % non-standard LaTeX, and requires a special package file to function properly. + % Such a package is natbib.sty by Patrick W. Daly + % The form of the \bibitem entries is + % \bibitem[Jones et al.(1990)]{key}... + % \bibitem[Jones et al.(1990)Jones, Baker, and Smith]{key}... + % The essential feature is that the label (the part in brackets) consists + % of the author names, as they should appear in the citation, with the year + % in parentheses following. There must be no space before the opening + % parenthesis! + % With natbib v5.3, a full list of authors may also follow the year. + % In natbib.sty, it is possible to define the type of enclosures that is + % really wanted (brackets or parentheses), but in either case, there must + % be parentheses in the label. + % The \cite command functions as follows: + % \citet{key} ==>> Jones et al. (1990) + % \citet*{key} ==>> Jones, Baker, and Smith (1990) + % \citep{key} ==>> (Jones et al., 1990) + % \citep*{key} ==>> (Jones, Baker, and Smith, 1990) + % \citep[chap. 2]{key} ==>> (Jones et al., 1990, chap. 2) + % \citep[e.g.][]{key} ==>> (e.g. Jones et al., 1990) + % \citep[e.g.][p. 32]{key} ==>> (e.g. Jones et al., p. 32) + % \citeauthor{key} ==>> Jones et al. + % \citeauthor*{key} ==>> Jones, Baker, and Smith + % \citeyear{key} ==>> 1990 + %--------------------------------------------------------------------- + +ENTRY + { address + author + booktitle + chapter + edition + editor + howpublished + institution + journal + key + month + note + number + organization + pages + publisher + school + series + title + type + volume + year + eprint % urlbst + doi % urlbst + pubmed % urlbst + url % urlbst + lastchecked % urlbst + } + {} + { label extra.label sort.label short.list } +INTEGERS { output.state before.all mid.sentence after.sentence after.block } +% urlbst... +% urlbst constants and state variables +STRINGS { urlintro + eprinturl eprintprefix doiprefix doiurl pubmedprefix pubmedurl + citedstring onlinestring linktextstring + openinlinelink closeinlinelink } +INTEGERS { hrefform inlinelinks makeinlinelink + addeprints adddoiresolver addpubmedresolver } +FUNCTION {init.urlbst.variables} +{ + % The following constants may be adjusted by hand, if desired + + % The first set allow you to enable or disable certain functionality. + #1 'addeprints := % 0=no eprints; 1=include eprints + #1 'adddoiresolver := % 0=no DOI resolver; 1=include it + #1 'addpubmedresolver := % 0=no PUBMED resolver; 1=include it + #2 'hrefform := % 0=no crossrefs; 1=hypertex xrefs; 2=hyperref refs + #1 'inlinelinks := % 0=URLs explicit; 1=URLs attached to titles + + % String constants, which you _might_ want to tweak. + "URL: " 'urlintro := % prefix before URL; typically "Available from:" or "URL": + "online" 'onlinestring := % indication that resource is online; typically "online" + "cited " 'citedstring := % indicator of citation date; typically "cited " + "[link]" 'linktextstring := % dummy link text; typically "[link]" + "http://arxiv.org/abs/" 'eprinturl := % prefix to make URL from eprint ref + "arXiv:" 'eprintprefix := % text prefix printed before eprint ref; typically "arXiv:" + "https://doi.org/" 'doiurl := % prefix to make URL from DOI + "doi:" 'doiprefix := % text prefix printed before DOI ref; typically "doi:" + "http://www.ncbi.nlm.nih.gov/pubmed/" 'pubmedurl := % prefix to make URL from PUBMED + "PMID:" 'pubmedprefix := % text prefix printed before PUBMED ref; typically "PMID:" + + % The following are internal state variables, not configuration constants, + % so they shouldn't be fiddled with. + #0 'makeinlinelink := % state variable managed by possibly.setup.inlinelink + "" 'openinlinelink := % ditto + "" 'closeinlinelink := % ditto +} +INTEGERS { + bracket.state + outside.brackets + open.brackets + within.brackets + close.brackets +} +% ...urlbst to here +FUNCTION {init.state.consts} +{ #0 'outside.brackets := % urlbst... + #1 'open.brackets := + #2 'within.brackets := + #3 'close.brackets := % ...urlbst to here + + #0 'before.all := + #1 'mid.sentence := + #2 'after.sentence := + #3 'after.block := +} +STRINGS { s t} +% urlbst +FUNCTION {output.nonnull.original} +{ 's := + output.state mid.sentence = + { ", " * write$ } + { output.state after.block = + { add.period$ write$ + newline$ + "\newblock " write$ + } + { output.state before.all = + 'write$ + { add.period$ " " * write$ } + if$ + } + if$ + mid.sentence 'output.state := + } + if$ + s +} + +% urlbst... +% The following three functions are for handling inlinelink. They wrap +% a block of text which is potentially output with write$ by multiple +% other functions, so we don't know the content a priori. +% They communicate between each other using the variables makeinlinelink +% (which is true if a link should be made), and closeinlinelink (which holds +% the string which should close any current link. They can be called +% at any time, but start.inlinelink will be a no-op unless something has +% previously set makeinlinelink true, and the two ...end.inlinelink functions +% will only do their stuff if start.inlinelink has previously set +% closeinlinelink to be non-empty. +% (thanks to 'ijvm' for suggested code here) +FUNCTION {uand} +{ 'skip$ { pop$ #0 } if$ } % 'and' (which isn't defined at this point in the file) +FUNCTION {possibly.setup.inlinelink} +{ makeinlinelink hrefform #0 > uand + { doi empty$ adddoiresolver uand + { pubmed empty$ addpubmedresolver uand + { eprint empty$ addeprints uand + { url empty$ + { "" } + { url } + if$ } + { eprinturl eprint * } + if$ } + { pubmedurl pubmed * } + if$ } + { doiurl doi * } + if$ + % an appropriately-formatted URL is now on the stack + hrefform #1 = % hypertex + { "\special {html: }{" * 'openinlinelink := + "\special {html:}" 'closeinlinelink := } + { "\href {" swap$ * "} {" * 'openinlinelink := % hrefform=#2 -- hyperref + % the space between "} {" matters: a URL of just the right length can cause "\% newline em" + "}" 'closeinlinelink := } + if$ + #0 'makeinlinelink := + } + 'skip$ + if$ % makeinlinelink +} +FUNCTION {add.inlinelink} +{ openinlinelink empty$ + 'skip$ + { openinlinelink swap$ * closeinlinelink * + "" 'openinlinelink := + } + if$ +} +FUNCTION {output.nonnull} +{ % Save the thing we've been asked to output + 's := + % If the bracket-state is close.brackets, then add a close-bracket to + % what is currently at the top of the stack, and set bracket.state + % to outside.brackets + bracket.state close.brackets = + { "]" * + outside.brackets 'bracket.state := + } + 'skip$ + if$ + bracket.state outside.brackets = + { % We're outside all brackets -- this is the normal situation. + % Write out what's currently at the top of the stack, using the + % original output.nonnull function. + s + add.inlinelink + output.nonnull.original % invoke the original output.nonnull + } + { % Still in brackets. Add open-bracket or (continuation) comma, add the + % new text (in s) to the top of the stack, and move to the close-brackets + % state, ready for next time (unless inbrackets resets it). If we come + % into this branch, then output.state is carefully undisturbed. + bracket.state open.brackets = + { " [" * } + { ", " * } % bracket.state will be within.brackets + if$ + s * + close.brackets 'bracket.state := + } + if$ +} + +% Call this function just before adding something which should be presented in +% brackets. bracket.state is handled specially within output.nonnull. +FUNCTION {inbrackets} +{ bracket.state close.brackets = + { within.brackets 'bracket.state := } % reset the state: not open nor closed + { open.brackets 'bracket.state := } + if$ +} + +FUNCTION {format.lastchecked} +{ lastchecked empty$ + { "" } + { inbrackets citedstring lastchecked * } + if$ +} +% ...urlbst to here +FUNCTION {output} +{ duplicate$ empty$ + 'pop$ + 'output.nonnull + if$ +} +FUNCTION {output.check} +{ 't := + duplicate$ empty$ + { pop$ "empty " t * " in " * cite$ * warning$ } + 'output.nonnull + if$ +} +FUNCTION {fin.entry.original} % urlbst (renamed from fin.entry, so it can be wrapped below) +{ add.period$ + write$ + newline$ +} + +FUNCTION {new.block} +{ output.state before.all = + 'skip$ + { after.block 'output.state := } + if$ +} +FUNCTION {new.sentence} +{ output.state after.block = + 'skip$ + { output.state before.all = + 'skip$ + { after.sentence 'output.state := } + if$ + } + if$ +} +FUNCTION {add.blank} +{ " " * before.all 'output.state := +} + +FUNCTION {date.block} +{ + new.block +} + +FUNCTION {not} +{ { #0 } + { #1 } + if$ +} +FUNCTION {and} +{ 'skip$ + { pop$ #0 } + if$ +} +FUNCTION {or} +{ { pop$ #1 } + 'skip$ + if$ +} +FUNCTION {new.block.checkb} +{ empty$ + swap$ empty$ + and + 'skip$ + 'new.block + if$ +} +FUNCTION {field.or.null} +{ duplicate$ empty$ + { pop$ "" } + 'skip$ + if$ +} +FUNCTION {emphasize} +{ duplicate$ empty$ + { pop$ "" } + { "\emph{" swap$ * "}" * } + if$ +} +FUNCTION {tie.or.space.prefix} +{ duplicate$ text.length$ #3 < + { "~" } + { " " } + if$ + swap$ +} + +FUNCTION {capitalize} +{ "u" change.case$ "t" change.case$ } + +FUNCTION {space.word} +{ " " swap$ * " " * } + % Here are the language-specific definitions for explicit words. + % Each function has a name bbl.xxx where xxx is the English word. + % The language selected here is ENGLISH +FUNCTION {bbl.and} +{ "and"} + +FUNCTION {bbl.etal} +{ "et~al." } + +FUNCTION {bbl.editors} +{ "editors" } + +FUNCTION {bbl.editor} +{ "editor" } + +FUNCTION {bbl.edby} +{ "edited by" } + +FUNCTION {bbl.edition} +{ "edition" } + +FUNCTION {bbl.volume} +{ "volume" } + +FUNCTION {bbl.of} +{ "of" } + +FUNCTION {bbl.number} +{ "number" } + +FUNCTION {bbl.nr} +{ "no." } + +FUNCTION {bbl.in} +{ "in" } + +FUNCTION {bbl.pages} +{ "pages" } + +FUNCTION {bbl.page} +{ "page" } + +FUNCTION {bbl.chapter} +{ "chapter" } + +FUNCTION {bbl.techrep} +{ "Technical Report" } + +FUNCTION {bbl.mthesis} +{ "Master's thesis" } + +FUNCTION {bbl.phdthesis} +{ "Ph.D. thesis" } + +MACRO {jan} {"January"} + +MACRO {feb} {"February"} + +MACRO {mar} {"March"} + +MACRO {apr} {"April"} + +MACRO {may} {"May"} + +MACRO {jun} {"June"} + +MACRO {jul} {"July"} + +MACRO {aug} {"August"} + +MACRO {sep} {"September"} + +MACRO {oct} {"October"} + +MACRO {nov} {"November"} + +MACRO {dec} {"December"} + +MACRO {acmcs} {"ACM Computing Surveys"} + +MACRO {acta} {"Acta Informatica"} + +MACRO {cacm} {"Communications of the ACM"} + +MACRO {ibmjrd} {"IBM Journal of Research and Development"} + +MACRO {ibmsj} {"IBM Systems Journal"} + +MACRO {ieeese} {"IEEE Transactions on Software Engineering"} + +MACRO {ieeetc} {"IEEE Transactions on Computers"} + +MACRO {ieeetcad} + {"IEEE Transactions on Computer-Aided Design of Integrated Circuits"} + +MACRO {ipl} {"Information Processing Letters"} + +MACRO {jacm} {"Journal of the ACM"} + +MACRO {jcss} {"Journal of Computer and System Sciences"} + +MACRO {scp} {"Science of Computer Programming"} + +MACRO {sicomp} {"SIAM Journal on Computing"} + +MACRO {tocs} {"ACM Transactions on Computer Systems"} + +MACRO {tods} {"ACM Transactions on Database Systems"} + +MACRO {tog} {"ACM Transactions on Graphics"} + +MACRO {toms} {"ACM Transactions on Mathematical Software"} + +MACRO {toois} {"ACM Transactions on Office Information Systems"} + +MACRO {toplas} {"ACM Transactions on Programming Languages and Systems"} + +MACRO {tcs} {"Theoretical Computer Science"} +FUNCTION {bibinfo.check} +{ swap$ + duplicate$ missing$ + { + pop$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ pop$ + } + { swap$ + pop$ + } + if$ + } + if$ +} +FUNCTION {bibinfo.warn} +{ swap$ + duplicate$ missing$ + { + swap$ "missing " swap$ * " in " * cite$ * warning$ pop$ + "" + } + { duplicate$ empty$ + { + swap$ "empty " swap$ * " in " * cite$ * warning$ + } + { swap$ + pop$ + } + if$ + } + if$ +} +STRINGS { bibinfo} +INTEGERS { nameptr namesleft numnames } + +FUNCTION {format.names} +{ 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + duplicate$ #1 > + { "{ff~}{vv~}{ll}{, jj}" } + { "{ff~}{vv~}{ll}{, jj}" } % first name first for first author +% { "{vv~}{ll}{, ff}{, jj}" } % last name first for first author + if$ + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + namesleft #1 > + { ", " * t * } + { + numnames #2 > + { "," * } + 'skip$ + if$ + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal * + } + { + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} +FUNCTION {format.names.ed} +{ + 'bibinfo := + duplicate$ empty$ 'skip$ { + 's := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{ff~}{vv~}{ll}{, jj}" + format.name$ + bibinfo bibinfo.check + 't := + nameptr #1 > + { + namesleft #1 > + { ", " * t * } + { + numnames #2 > + { "," * } + 'skip$ + if$ + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + + " " * bbl.etal * + } + { + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ + } if$ +} +FUNCTION {format.key} +{ empty$ + { key field.or.null } + { "" } + if$ +} + +FUNCTION {format.authors} +{ author "author" format.names +} +FUNCTION {get.bbl.editor} +{ editor num.names$ #1 > 'bbl.editors 'bbl.editor if$ } + +FUNCTION {format.editors} +{ editor "editor" format.names duplicate$ empty$ 'skip$ + { + "," * + " " * + get.bbl.editor + * + } + if$ +} +FUNCTION {format.note} +{ + note empty$ + { "" } + { note #1 #1 substring$ + duplicate$ "{" = + 'skip$ + { output.state mid.sentence = + { "l" } + { "u" } + if$ + change.case$ + } + if$ + note #2 global.max$ substring$ * "note" bibinfo.check + } + if$ +} + +FUNCTION {format.title} +{ title + duplicate$ empty$ 'skip$ + { "t" change.case$ } + if$ + "title" bibinfo.check +} +FUNCTION {format.full.names} +{'s := + "" 't := + #1 'nameptr := + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{vv~}{ll}" format.name$ + 't := + nameptr #1 > + { + namesleft #1 > + { ", " * t * } + { + s nameptr "{ll}" format.name$ duplicate$ "others" = + { 't := } + { pop$ } + if$ + t "others" = + { + " " * bbl.etal * + } + { + numnames #2 > + { "," * } + 'skip$ + if$ + bbl.and + space.word * t * + } + if$ + } + if$ + } + 't + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ +} + +FUNCTION {author.editor.key.full} +{ author empty$ + { editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.full.names } + if$ + } + { author format.full.names } + if$ +} + +FUNCTION {author.key.full} +{ author empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { author format.full.names } + if$ +} + +FUNCTION {editor.key.full} +{ editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.full.names } + if$ +} + +FUNCTION {make.full.names} +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.key.full + { type$ "proceedings" = + 'editor.key.full + 'author.key.full + if$ + } + if$ +} + +FUNCTION {output.bibitem.original} % urlbst (renamed from output.bibitem, so it can be wrapped below) +{ newline$ + "\bibitem[{" write$ + label write$ + ")" make.full.names duplicate$ short.list = + { pop$ } + { * } + if$ + "}]{" * write$ + cite$ write$ + "}" write$ + newline$ + "" + before.all 'output.state := +} + +FUNCTION {n.dashify} +{ + 't := + "" + { t empty$ not } + { t #1 #1 substring$ "-" = + { t #1 #2 substring$ "--" = not + { "--" * + t #2 global.max$ substring$ 't := + } + { { t #1 #1 substring$ "-" = } + { "-" * + t #2 global.max$ substring$ 't := + } + while$ + } + if$ + } + { t #1 #1 substring$ * + t #2 global.max$ substring$ 't := + } + if$ + } + while$ +} + +FUNCTION {word.in} +{ bbl.in capitalize + " " * } + +FUNCTION {format.date} +{ year "year" bibinfo.check duplicate$ empty$ + { + } + 'skip$ + if$ + extra.label * + before.all 'output.state := + after.sentence 'output.state := +} +FUNCTION {format.btitle} +{ title "title" bibinfo.check + duplicate$ empty$ 'skip$ + { + emphasize + } + if$ +} +FUNCTION {either.or.check} +{ empty$ + 'pop$ + { "can't use both " swap$ * " fields in " * cite$ * warning$ } + if$ +} +FUNCTION {format.bvolume} +{ volume empty$ + { "" } + { bbl.volume volume tie.or.space.prefix + "volume" bibinfo.check * * + series "series" bibinfo.check + duplicate$ empty$ 'pop$ + { swap$ bbl.of space.word * swap$ + emphasize * } + if$ + "volume and number" number either.or.check + } + if$ +} +FUNCTION {format.number.series} +{ volume empty$ + { number empty$ + { series field.or.null } + { series empty$ + { number "number" bibinfo.check } + { output.state mid.sentence = + { bbl.number } + { bbl.number capitalize } + if$ + number tie.or.space.prefix "number" bibinfo.check * * + bbl.in space.word * + series "series" bibinfo.check * + } + if$ + } + if$ + } + { "" } + if$ +} + +FUNCTION {format.edition} +{ edition duplicate$ empty$ 'skip$ + { + output.state mid.sentence = + { "l" } + { "t" } + if$ change.case$ + "edition" bibinfo.check + " " * bbl.edition * + } + if$ +} +INTEGERS { multiresult } +FUNCTION {multi.page.check} +{ 't := + #0 'multiresult := + { multiresult not + t empty$ not + and + } + { t #1 #1 substring$ + duplicate$ "-" = + swap$ duplicate$ "," = + swap$ "+" = + or or + { #1 'multiresult := } + { t #2 global.max$ substring$ 't := } + if$ + } + while$ + multiresult +} +FUNCTION {format.pages} +{ pages duplicate$ empty$ 'skip$ + { duplicate$ multi.page.check + { + bbl.pages swap$ + n.dashify + } + { + bbl.page swap$ + } + if$ + tie.or.space.prefix + "pages" bibinfo.check + * * + } + if$ +} +FUNCTION {format.journal.pages} +{ pages duplicate$ empty$ 'pop$ + { swap$ duplicate$ empty$ + { pop$ pop$ format.pages } + { + ":" * + swap$ + n.dashify + "pages" bibinfo.check + * + } + if$ + } + if$ +} +FUNCTION {format.vol.num.pages} +{ volume field.or.null + duplicate$ empty$ 'skip$ + { + "volume" bibinfo.check + } + if$ + number "number" bibinfo.check duplicate$ empty$ 'skip$ + { + swap$ duplicate$ empty$ + { "there's a number but no volume in " cite$ * warning$ } + 'skip$ + if$ + swap$ + "(" swap$ * ")" * + } + if$ * + format.journal.pages +} + +FUNCTION {format.chapter} +{ chapter empty$ + %'skip$ %% SC + { "" } + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + } + if$ +} + +FUNCTION {format.chapter.pages} +{ chapter empty$ + 'format.pages + { type empty$ + { bbl.chapter } + { type "l" change.case$ + "type" bibinfo.check + } + if$ + chapter tie.or.space.prefix + "chapter" bibinfo.check + * * + pages empty$ + 'skip$ + { ", " * format.pages * } + if$ + } + if$ +} + +FUNCTION {format.booktitle} +{ + booktitle "booktitle" bibinfo.check + emphasize +} +FUNCTION {format.in.booktitle} +{ format.booktitle duplicate$ empty$ 'skip$ + { + word.in swap$ * + } + if$ +} +FUNCTION {format.in.ed.booktitle} +{ format.booktitle duplicate$ empty$ 'skip$ + { + editor "editor" format.names.ed duplicate$ empty$ 'pop$ + { + "," * + " " * + get.bbl.editor + ", " * + * swap$ + * } + if$ + word.in swap$ * + } + if$ +} +FUNCTION {format.thesis.type} +{ type duplicate$ empty$ + 'pop$ + { swap$ pop$ + "t" change.case$ "type" bibinfo.check + } + if$ +} +FUNCTION {format.tr.number} +{ number "number" bibinfo.check + type duplicate$ empty$ + { pop$ bbl.techrep } + 'skip$ + if$ + "type" bibinfo.check + swap$ duplicate$ empty$ + { pop$ "t" change.case$ } + { tie.or.space.prefix * * } + if$ +} +FUNCTION {format.article.crossref} +{ + word.in + " \cite{" * crossref * "}" * +} +FUNCTION {format.book.crossref} +{ volume duplicate$ empty$ + { "empty volume in " cite$ * "'s crossref of " * crossref * warning$ + pop$ word.in + } + { bbl.volume + capitalize + swap$ tie.or.space.prefix "volume" bibinfo.check * * bbl.of space.word * + } + if$ + " \cite{" * crossref * "}" * +} +FUNCTION {format.incoll.inproc.crossref} +{ + word.in + " \cite{" * crossref * "}" * +} +FUNCTION {format.org.or.pub} +{ 't := + "" + address empty$ t empty$ and + 'skip$ + { + t empty$ + { address "address" bibinfo.check * + } + { t * + address empty$ + 'skip$ + { ", " * address "address" bibinfo.check * } + if$ + } + if$ + } + if$ +} +FUNCTION {format.publisher.address} +{ publisher "publisher" bibinfo.warn format.org.or.pub +} + +FUNCTION {format.organization.address} +{ organization "organization" bibinfo.check format.org.or.pub +} + +% urlbst... +% Functions for making hypertext links. +% In all cases, the stack has (link-text href-url) +% +% make 'null' specials +FUNCTION {make.href.null} +{ + pop$ +} +% make hypertex specials +FUNCTION {make.href.hypertex} +{ + "\special {html: }" * swap$ * + "\special {html:}" * +} +% make hyperref specials +FUNCTION {make.href.hyperref} +{ + "\href {" swap$ * "} {\path{" * swap$ * "}}" * +} +FUNCTION {make.href} +{ hrefform #2 = + 'make.href.hyperref % hrefform = 2 + { hrefform #1 = + 'make.href.hypertex % hrefform = 1 + 'make.href.null % hrefform = 0 (or anything else) + if$ + } + if$ +} + +% If inlinelinks is true, then format.url should be a no-op, since it's +% (a) redundant, and (b) could end up as a link-within-a-link. +FUNCTION {format.url} +{ inlinelinks #1 = url empty$ or + { "" } + { hrefform #1 = + { % special case -- add HyperTeX specials + urlintro "\url{" url * "}" * url make.href.hypertex * } + { urlintro "\url{" * url * "}" * } + if$ + } + if$ +} + +FUNCTION {format.eprint} +{ eprint empty$ + { "" } + { eprintprefix eprint * eprinturl eprint * make.href } + if$ +} + +FUNCTION {format.doi} +{ doi empty$ + { "" } + { doiprefix doi * doiurl doi * make.href } + if$ +} + +FUNCTION {format.pubmed} +{ pubmed empty$ + { "" } + { pubmedprefix pubmed * pubmedurl pubmed * make.href } + if$ +} + +% Output a URL. We can't use the more normal idiom (something like +% `format.url output'), because the `inbrackets' within +% format.lastchecked applies to everything between calls to `output', +% so that `format.url format.lastchecked * output' ends up with both +% the URL and the lastchecked in brackets. +FUNCTION {output.url} +{ url empty$ + 'skip$ + { new.block + format.url output + format.lastchecked output + } + if$ +} + +FUNCTION {output.web.refs} +{ + new.block + inlinelinks + 'skip$ % links were inline -- don't repeat them + { + output.url + addeprints eprint empty$ not and + { format.eprint output.nonnull } + 'skip$ + if$ + adddoiresolver doi empty$ not and + { format.doi output.nonnull } + 'skip$ + if$ + addpubmedresolver pubmed empty$ not and + { format.pubmed output.nonnull } + 'skip$ + if$ + } + if$ +} + +% Wrapper for output.bibitem.original. +% If the URL field is not empty, set makeinlinelink to be true, +% so that an inline link will be started at the next opportunity +FUNCTION {output.bibitem} +{ outside.brackets 'bracket.state := + output.bibitem.original + inlinelinks url empty$ not doi empty$ not or pubmed empty$ not or eprint empty$ not or and + { #1 'makeinlinelink := } + { #0 'makeinlinelink := } + if$ +} + +% Wrapper for fin.entry.original +FUNCTION {fin.entry} +{ output.web.refs % urlbst + makeinlinelink % ooops, it appears we didn't have a title for inlinelink + { possibly.setup.inlinelink % add some artificial link text here, as a fallback + linktextstring output.nonnull } + 'skip$ + if$ + bracket.state close.brackets = % urlbst + { "]" * } + 'skip$ + if$ + fin.entry.original +} + +% Webpage entry type. +% Title and url fields required; +% author, note, year, month, and lastchecked fields optional +% See references +% ISO 690-2 http://www.nlc-bnc.ca/iso/tc46sc9/standard/690-2e.htm +% http://www.classroom.net/classroom/CitingNetResources.html +% http://neal.ctstateu.edu/history/cite.html +% http://www.cas.usf.edu/english/walker/mla.html +% for citation formats for web pages. +FUNCTION {webpage} +{ output.bibitem + author empty$ + { editor empty$ + 'skip$ % author and editor both optional + { format.editors output.nonnull } + if$ + } + { editor empty$ + { format.authors output.nonnull } + { "can't use both author and editor fields in " cite$ * warning$ } + if$ + } + if$ + new.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ + format.title "title" output.check + inbrackets onlinestring output + new.block + year empty$ + 'skip$ + { format.date "year" output.check } + if$ + % We don't need to output the URL details ('lastchecked' and 'url'), + % because fin.entry does that for us, using output.web.refs. The only + % reason we would want to put them here is if we were to decide that + % they should go in front of the rather miscellaneous information in 'note'. + new.block + note output + fin.entry +} +% ...urlbst to here + + +FUNCTION {article} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + crossref missing$ + { + journal + "journal" bibinfo.check + emphasize + "journal" output.check + possibly.setup.inlinelink format.vol.num.pages output% urlbst + } + { format.article.crossref output.nonnull + format.pages output + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {book} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.edition output + crossref missing$ + { format.bvolume output + new.block + format.number.series output + new.sentence + format.publisher.address output + } + { + new.block + format.book.crossref output.nonnull + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {booklet} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + howpublished "howpublished" bibinfo.check output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {inbook} +{ output.bibitem + author empty$ + { format.editors "author and editor" output.check + editor format.key output + } + { format.authors output.nonnull + crossref missing$ + { "author and editor" editor either.or.check } + 'skip$ + if$ + } + if$ + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.edition output + crossref missing$ + { + format.bvolume output + format.number.series output + format.chapter "chapter" output.check + new.sentence + format.publisher.address output + new.block + } + { + format.chapter "chapter" output.check + new.block + format.book.crossref output.nonnull + } + if$ + new.block + format.note output + fin.entry +} + +FUNCTION {incollection} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + crossref missing$ + { format.in.ed.booktitle "booktitle" output.check + format.edition output + format.bvolume output + format.number.series output + format.chapter.pages output + new.sentence + format.publisher.address output + } + { format.incoll.inproc.crossref output.nonnull + format.chapter.pages output + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {inproceedings} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + crossref missing$ + { format.in.booktitle "booktitle" output.check + format.bvolume output + format.number.series output + format.pages output + address "address" bibinfo.check output + new.sentence + organization "organization" bibinfo.check output + publisher "publisher" bibinfo.check output + } + { format.incoll.inproc.crossref output.nonnull + format.pages output + } + if$ + new.block + format.note output + fin.entry +} +FUNCTION {conference} { inproceedings } +FUNCTION {manual} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.edition output + organization address new.block.checkb + organization "organization" bibinfo.check output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {mastersthesis} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title + "title" output.check + new.block + bbl.mthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + month "month" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {misc} +{ output.bibitem + format.authors output + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title output + new.block + howpublished "howpublished" bibinfo.check output + new.block + format.note output + fin.entry +} +FUNCTION {phdthesis} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle + "title" output.check + new.block + bbl.phdthesis format.thesis.type output.nonnull + school "school" bibinfo.warn output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {proceedings} +{ output.bibitem + format.editors output + editor format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.btitle "title" output.check + format.bvolume output + format.number.series output + new.sentence + publisher empty$ + { format.organization.address output } + { organization "organization" bibinfo.check output + new.sentence + format.publisher.address output + } + if$ + new.block + format.note output + fin.entry +} + +FUNCTION {techreport} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title + "title" output.check + new.block + format.tr.number output.nonnull + institution "institution" bibinfo.warn output + address "address" bibinfo.check output + new.block + format.note output + fin.entry +} + +FUNCTION {unpublished} +{ output.bibitem + format.authors "author" output.check + author format.key output + format.date "year" output.check + date.block + title empty$ 'skip$ 'possibly.setup.inlinelink if$ % urlbst + format.title "title" output.check + new.block + format.note "note" output.check + fin.entry +} + +FUNCTION {default.type} { misc } +READ +FUNCTION {sortify} +{ purify$ + "l" change.case$ +} +INTEGERS { len } +FUNCTION {chop.word} +{ 's := + 'len := + s #1 len substring$ = + { s len #1 + global.max$ substring$ } + 's + if$ +} +FUNCTION {format.lab.names} +{ 's := + "" 't := + s #1 "{vv~}{ll}" format.name$ + s num.names$ duplicate$ + #2 > + { pop$ + " " * bbl.etal * + } + { #2 < + 'skip$ + { s #2 "{ff }{vv }{ll}{ jj}" format.name$ "others" = + { + " " * bbl.etal * + } + { bbl.and space.word * s #2 "{vv~}{ll}" format.name$ + * } + if$ + } + if$ + } + if$ +} + +FUNCTION {author.key.label} +{ author empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {author.editor.key.label} +{ author empty$ + { editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.lab.names } + if$ + } + { author format.lab.names } + if$ +} + +FUNCTION {editor.key.label} +{ editor empty$ + { key empty$ + { cite$ #1 #3 substring$ } + 'key + if$ + } + { editor format.lab.names } + if$ +} + +FUNCTION {calc.short.authors} +{ type$ "book" = + type$ "inbook" = + or + 'author.editor.key.label + { type$ "proceedings" = + 'editor.key.label + 'author.key.label + if$ + } + if$ + 'short.list := +} + +FUNCTION {calc.label} +{ calc.short.authors + short.list + "(" + * + year duplicate$ empty$ + short.list key field.or.null = or + { pop$ "" } + 'skip$ + if$ + * + 'label := +} + +FUNCTION {sort.format.names} +{ 's := + #1 'nameptr := + "" + s num.names$ 'numnames := + numnames 'namesleft := + { namesleft #0 > } + { s nameptr + "{ll{ }}{ ff{ }}{ jj{ }}" + format.name$ 't := + nameptr #1 > + { + " " * + namesleft #1 = t "others" = and + { "zzzzz" * } + { t sortify * } + if$ + } + { t sortify * } + if$ + nameptr #1 + 'nameptr := + namesleft #1 - 'namesleft := + } + while$ +} + +FUNCTION {sort.format.title} +{ 't := + "A " #2 + "An " #3 + "The " #4 t chop.word + chop.word + chop.word + sortify + #1 global.max$ substring$ +} +FUNCTION {author.sort} +{ author empty$ + { key empty$ + { "to sort, need author or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { author sort.format.names } + if$ +} +FUNCTION {author.editor.sort} +{ author empty$ + { editor empty$ + { key empty$ + { "to sort, need author, editor, or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ + } + { author sort.format.names } + if$ +} +FUNCTION {editor.sort} +{ editor empty$ + { key empty$ + { "to sort, need editor or key in " cite$ * warning$ + "" + } + { key sortify } + if$ + } + { editor sort.format.names } + if$ +} +FUNCTION {presort} +{ calc.label + label sortify + " " + * + type$ "book" = + type$ "inbook" = + or + 'author.editor.sort + { type$ "proceedings" = + 'editor.sort + 'author.sort + if$ + } + if$ + #1 entry.max$ substring$ + 'sort.label := + sort.label + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ + 'sort.key$ := +} + +ITERATE {presort} +SORT +STRINGS { last.label next.extra } +INTEGERS { last.extra.num number.label } +FUNCTION {initialize.extra.label.stuff} +{ #0 int.to.chr$ 'last.label := + "" 'next.extra := + #0 'last.extra.num := + #0 'number.label := +} +FUNCTION {forward.pass} +{ last.label label = + { last.extra.num #1 + 'last.extra.num := + last.extra.num int.to.chr$ 'extra.label := + } + { "a" chr.to.int$ 'last.extra.num := + "" 'extra.label := + label 'last.label := + } + if$ + number.label #1 + 'number.label := +} +FUNCTION {reverse.pass} +{ next.extra "b" = + { "a" 'extra.label := } + 'skip$ + if$ + extra.label 'next.extra := + extra.label + duplicate$ empty$ + 'skip$ + { year field.or.null #-1 #1 substring$ chr.to.int$ #65 < + { "{\natexlab{" swap$ * "}}" * } + { "{(\natexlab{" swap$ * "})}" * } + if$ } + if$ + 'extra.label := + label extra.label * 'label := +} +EXECUTE {initialize.extra.label.stuff} +ITERATE {forward.pass} +REVERSE {reverse.pass} +FUNCTION {bib.sort.order} +{ sort.label + " " + * + year field.or.null sortify + * + " " + * + title field.or.null + sort.format.title + * + #1 entry.max$ substring$ + 'sort.key$ := +} +ITERATE {bib.sort.order} +SORT +FUNCTION {begin.bib} +{ preamble$ empty$ + 'skip$ + { preamble$ write$ newline$ } + if$ + "\begin{thebibliography}{" number.label int.to.str$ * "}" * + write$ newline$ + "\expandafter\ifx\csname natexlab\endcsname\relax\def\natexlab#1{#1}\fi" + write$ newline$ +} +EXECUTE {begin.bib} +EXECUTE {init.urlbst.variables} % urlbst +EXECUTE {init.state.consts} +ITERATE {call.type$} +FUNCTION {end.bib} +{ newline$ + "\end{thebibliography}" write$ newline$ +} +EXECUTE {end.bib} +%% End of customized bst file +%% +%% End of file `compling.bst'. diff --git a/inst/rmarkdown/templates/tacl_article/skeleton/skeleton.Rmd b/inst/rmarkdown/templates/tacl_article/skeleton/skeleton.Rmd new file mode 100755 index 000000000..c639bb934 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/skeleton/skeleton.Rmd @@ -0,0 +1,37 @@ +--- +title: Template for TACL Papers + +author: + - name: Alice Anonymous + affiliation: Some Institute of Technology + email: alice@institute.edu + - name: Bob Security + affiliation: Another University + email: bob@security.org + +abstract: | + Dolor rerum beatae doloremque animi qui fugit. Dolor ut sed consequatur rem facilis. Unde quisquam id et voluptate et natus. Amet assumenda rerum autem reiciendis. Et sed et deserunt possimus cupiditate aut totam fuga. + +taclfinal: true +bibliography: tacl2018.bib +output: rticles::tacl_article +--- + + +# Paper goes here + +Tempore et aliquid occaecati et sed non optio. In sit et laboriosam doloremque error dolor quam est. Quis maxime cupiditate sit velit illo impedit consequatur. Reprehenderit et sed perferendis. Ut et dolorum perferendis molestiae aut eaque impedit veritatis. Officia error repellat eaque libero eveniet deleniti. + +Dolorem dignissimos itaque saepe earum. Officia consequuntur adipisci enim. Molestiae iusto provident ullam labore consequatur ipsam perferendis. + +```{r, echo=FALSE} +plot(cars) +``` + +Fugit ullam aperiam harum. Dolores facilis maiores rerum sint vero enim. Et facilis impedit possimus ut. Eaque facilis suscipit unde quasi facere. Unde explicabo quibusdam maiores deleniti placeat id voluptas. + +Vitae aut molestiae itaque possimus ipsam. Et qui repudiandae sint et ad. Fugit quam est dignissimos provident nam. Ducimus et ducimus eius qui voluptatem. + +Debitis et fuga ea. Rerum ut odit officiis consequuntur quis voluptatem sit tempore. A a assumenda veniam aperiam doloribus nulla. + +# References diff --git a/inst/rmarkdown/templates/tacl_article/skeleton/tacl2018.bib b/inst/rmarkdown/templates/tacl_article/skeleton/tacl2018.bib new file mode 100644 index 000000000..e743ef5f8 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/skeleton/tacl2018.bib @@ -0,0 +1,53 @@ +@article{DBLP:journals/corr/cs-CL-0108005, + author = {Joshua Goodman}, + title = {A Bit of Progress in Language Modeling}, + journal = {CoRR}, + volume = {cs.CL/0108005v1}, + year = {2001}, + url = {http://arxiv.org/abs/cs.CL/0108005v1}, + timestamp = {Wed, 07 Jun 2017 14:40:38 +0200}, + biburl = {https://dblp.org/rec/bib/journals/corr/cs-CL-0108005}, + bibsource = {dblp computer science bibliography, https://dblp.org} +} + +@article{GOODMAN2001403, +title = "A bit of progress in language modeling", +journal = "Computer Speech \& Language", +volume = "15", +number = "4", +pages = "403-434", +year = "2001", +issn = "0885-2308", +doi = "10.1006/csla.2001.0174", +OPTurl = "http://www.sciencedirect.com/science/article/pii/S0885230801901743", +author = "Joshua T. Goodman" +} + +@article{DBLP:journals/corr/cs-CL-9905001, + author = {Rebecca Hwa}, + title = {Supervised Grammar Induction Using Training Data with Limited Constituent Information}, + journal = {CoRR}, + volume = {cs.CL/9905001}, + note = {Version 1}, + year = {1999}, + url = {http://arxiv.org/abs/cs.CL/9905001}, + timestamp = {Wed, 07 Jun 2017 14:41:01 +0200}, + biburl = {https://dblp.org/rec/bib/journals/corr/cs-CL-9905001}, + bibsource = {dblp computer science bibliography, https://dblp.org} +} + +@InProceedings{P99-1010, + author = "Hwa, Rebecca", + title = "Supervised Grammar Induction using Training Data with Limited Constituent Information", + booktitle = "Proceedings of the 37th Annual Meeting of the Association for Computational Linguistics", + year = "1999", + url = "http://www.aclweb.org/anthology/P99-1010" +} + +@book{Jurafsky+Martin:2009a, + author = {Jurafsky, Daniel and Martin, James H.}, + title = {Speech and Language Processing: An Introduction to Natural Language Processing, Computational Linguistics, and Speech Recognition}, + publisher = {Pearson Prentice Hall}, + year = 2009, + edition = {Second} +} \ No newline at end of file diff --git a/inst/rmarkdown/templates/tacl_article/skeleton/tacl2018.sty b/inst/rmarkdown/templates/tacl_article/skeleton/tacl2018.sty new file mode 100644 index 000000000..824f31592 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/skeleton/tacl2018.sty @@ -0,0 +1,517 @@ +% tacl2018.sty +% July 31, 2018 +% +% This is a modified version of ACL 2018 that replaces conference-specific +% information with TACL-specific information; removes some outdated comments; +% and corrects some minor spelling issues. --Lillian Lee (llee@cs.cornell.edu) +% +% ACL 2018: modified line numbering to be in gainsboro gray color so one +% can write comments on the margins. -- Shay Cohen / Kevin Gimpel / Wei Lu + +% 2017: modified to support DOI links in bibliography. Now uses +% natbib package rather than defining citation commands in this file. +% Use with acl_natbib.bst bib style. -- Dan Gildea + +% This [was] the LaTeX style for ACL 2016. It contains Margaret Mitchell's +% line number adaptations (ported by Hai Zhao and Yannick Versley). +% It is nearly identical to the style files for ACL 2015, +% ACL 2014, EACL 2006, ACL2005, ACL 2002, ACL 2001, ACL 2000, +% EACL 95 and EACL 99. +% This [was] the LaTeX style file for ACL 2000. It is nearly identical to the +% style files for EACL 95 and EACL 99. Minor changes include editing the +% instructions to reflect use of \documentclass rather than \documentstyle +% and removing the white space before the title on the first page +% -- John Chen, June 29, 2000 +% This [was] the LaTeX style file for EACL-95. It is identical to the +% style file for ANLP '94 except that the margins are adjusted for A4 +% paper. -- abney 13 Dec 94 +% The ANLP '94 style file is a slightly modified +% version of the style used for AAAI and IJCAI, using some changes +% prepared by Fernando Pereira and others and some minor changes +% by Paul Jacobs. +% Prior version prepared by Peter F. Patel-Schneider, + +% Papers are to be prepared using the ``acl_natbib'' bibliography style, +% as follows: +% \documentclass[11pt]{article} +% \usepackage{acl2000} +% \title{Title} +% \author{Author 1 \and Author 2 \\ Address line \\ Address line \And +% Author 3 \\ Address line \\ Address line} +% \begin{document} +% ... +% \bibliography{bibliography-file} +% \bibliographystyle{acl_natbib} +% \end{document} + +% Author information can be set in various styles: +% For several authors from the same institution: +% \author{Author 1 \and ... \and Author n \\ +% Address line \\ ... \\ Address line} +% if the names do not fit well on one line use +% Author 1 \\ {\bf Author 2} \\ ... \\ {\bf Author n} \\ +% For authors from different institutions: +% \author{Author 1 \\ Address line \\ ... \\ Address line +% \And ... \And +% Author n \\ Address line \\ ... \\ Address line} +% To start a separate ``row'' of authors use \AND, as in +% \author{Author 1 \\ Address line \\ ... \\ Address line +% \AND +% Author 2 \\ Address line \\ ... \\ Address line \And +% Author 3 \\ Address line \\ ... \\ Address line} + +% If the title and author information does not fit in the area allocated, +% place \setlength\titlebox{} right after +% \usepackage{tacl2018} +% where can be something larger than 5cm + +% include hyperref, unless user specifies nohyperref option like this: +% \usepackage[nohyperref]{tacl2018} +\newif\iftacl@hyperref +\DeclareOption{hyperref}{\tacl@hyperreftrue} +\DeclareOption{nohyperref}{\tacl@hyperreffalse} +\ExecuteOptions{hyperref} % default is to use hyperref +\ProcessOptions\relax +\iftacl@hyperref + \RequirePackage{hyperref} + \usepackage{xcolor} % make links dark blue + \definecolor{darkblue}{rgb}{0, 0, 0.5} + \hypersetup{colorlinks=true,citecolor=darkblue, linkcolor=darkblue, urlcolor=darkblue} +\else + % This definition is used if the hyperref package is not loaded. + % It provides a backup, no-op definiton of \href. + % This is necessary because \href command is used in the acl_natbib.bst file. + \def\href#1#2{{#2}} + % We still need to load xcolor in this case because the lighter line numbers require it. (SC/KG/WL) + \usepackage{xcolor} +\fi + + + +\newif\iftaclfinal +\taclfinalfalse +\def\taclfinalcopy{\global\taclfinaltrue} + + +\iftaclfinal + \typeout{Camera-ready settings for TACL} + \else + \typeout{Submission settings for TACL} + \fi + +\newcommand{\Thanks}[1]{\thanks{\ #1}} + +% A4 modified by Eneko; again modified by Alexander for 5cm titlebox +\setlength{\paperwidth}{21cm} % A4 +\setlength{\paperheight}{29.7cm}% A4 +\setlength\topmargin{-0.5cm} +\setlength\oddsidemargin{0cm} +\setlength\textheight{24.7cm} +\setlength\textwidth{16.0cm} +\setlength\columnsep{0.6cm} +\newlength\titlebox +\setlength\titlebox{5cm} +\setlength\headheight{5pt} +\setlength\headsep{0pt} +\thispagestyle{empty} +\pagestyle{empty} + + +\flushbottom \twocolumn \sloppy + +% We're never going to need a table of contents, so just flush it to +% save space --- suggested by drstrip@sandia-2 +\def\addcontentsline#1#2#3{} + +%% ----- Set up hooks to repeat content on every page of the output doc, +%% necessary for the line numbers in the submitted version. --MM +%% +%% Copied from CVPR 2015's cvpr_eso.sty, which appears to be largely copied from everyshi.sty. +%% +%% Original cvpr_eso.sty available at: http://www.pamitc.org/cvpr15/author_guidelines.php +%% Original evershi.sty available at: https://www.ctan.org/pkg/everyshi +%% +%% Copyright (C) 2001 Martin Schr\"oder: +%% +%% Martin Schr"oder +%% Cr"usemannallee 3 +%% D-28213 Bremen +%% Martin.Schroeder@ACM.org +%% +%% This program may be redistributed and/or modified under the terms +%% of the LaTeX Project Public License, either version 1.0 of this +%% license, or (at your option) any later version. +%% The latest version of this license is in +%% CTAN:macros/latex/base/lppl.txt. +%% +%% Happy users are requested to send [Martin] a postcard. :-) +%% +\newcommand{\@EveryShipoutTACL@Hook}{} +\newcommand{\@EveryShipoutTACL@AtNextHook}{} +\newcommand*{\EveryShipoutTACL}[1] + {\g@addto@macro\@EveryShipoutTACL@Hook{#1}} +\newcommand*{\AtNextShipoutACL@}[1] + {\g@addto@macro\@EveryShipoutTACL@AtNextHook{#1}} +\newcommand{\@EveryShipoutTACL@Shipout}{% + \afterassignment\@EveryShipoutTACL@Test + \global\setbox\@cclv= % + } +\newcommand{\@EveryShipoutTACL@Test}{% + \ifvoid\@cclv\relax + \aftergroup\@EveryShipoutTACL@Output + \else + \@EveryShipoutTACL@Output + \fi% + } +\newcommand{\@EveryShipoutTACL@Output}{% + \@EveryShipoutTACL@Hook% + \@EveryShipoutTACL@AtNextHook% + \gdef\@EveryShipoutTACL@AtNextHook{}% + \@EveryShipoutTACL@Org@Shipout\box\@cclv% + } +\newcommand{\@EveryShipoutTACL@Org@Shipout}{} +\newcommand*{\@EveryShipoutTACL@Init}{% + \message{ABD: EveryShipout initializing macros}% + \let\@EveryShipoutTACL@Org@Shipout\shipout + \let\shipout\@EveryShipoutTACL@Shipout + } +\AtBeginDocument{\@EveryShipoutTACL@Init} + +%% ----- Set up for placing additional items into the submitted version --MM +%% +%% Based on eso-pic.sty +%% +%% Original available at: https://www.ctan.org/tex-archive/macros/latex/contrib/eso-pic +%% Copyright (C) 1998-2002 by Rolf Niepraschk +%% +%% Which may be distributed and/or modified under the conditions of +%% the LaTeX Project Public License, either version 1.2 of this license +%% or (at your option) any later version. The latest version of this +%% license is in: +%% +%% http://www.latex-project.org/lppl.txt +%% +%% and version 1.2 or later is part of all distributions of LaTeX version +%% 1999/12/01 or later. +%% +%% In contrast to the original, we do not include the definitions for/using: +%% gridpicture, div[2], isMEMOIR[1], gridSetup[6][], subgridstyle{dotted}, labelfactor{}, gap{}, gridunitname{}, gridunit{}, gridlines{\thinlines}, subgridlines{\thinlines}, the {keyval} package, evenside margin, nor any definitions with 'color'. +%% +%% These are beyond what is needed for the NAACL style. +%% +\newcommand\LenToUnit[1]{#1\@gobble} +\newcommand\AtPageUpperLeft[1]{% + \begingroup + \@tempdima=0pt\relax\@tempdimb=\ESO@yoffsetI\relax + \put(\LenToUnit{\@tempdima},\LenToUnit{\@tempdimb}){#1}% + \endgroup +} +\newcommand\AtPageLowerLeft[1]{\AtPageUpperLeft{% + \put(0,\LenToUnit{-\paperheight}){#1}}} +\newcommand\AtPageCenter[1]{\AtPageUpperLeft{% + \put(\LenToUnit{.5\paperwidth},\LenToUnit{-.5\paperheight}){#1}}} +\newcommand\AtPageLowerCenter[1]{\AtPageUpperLeft{% + \put(\LenToUnit{.5\paperwidth},\LenToUnit{-\paperheight}){#1}}}% +\newcommand\AtPageLowishCenter[1]{\AtPageUpperLeft{% + \put(\LenToUnit{.5\paperwidth},\LenToUnit{-.96\paperheight}){#1}}} +\newcommand\AtTextUpperLeft[1]{% + \begingroup + \setlength\@tempdima{1in}% + \advance\@tempdima\oddsidemargin% + \@tempdimb=\ESO@yoffsetI\relax\advance\@tempdimb-1in\relax% + \advance\@tempdimb-\topmargin% + \advance\@tempdimb-\headheight\advance\@tempdimb-\headsep% + \put(\LenToUnit{\@tempdima},\LenToUnit{\@tempdimb}){#1}% + \endgroup +} +\newcommand\AtTextLowerLeft[1]{\AtTextUpperLeft{% + \put(0,\LenToUnit{-\textheight}){#1}}} +\newcommand\AtTextCenter[1]{\AtTextUpperLeft{% + \put(\LenToUnit{.5\textwidth},\LenToUnit{-.5\textheight}){#1}}} +\newcommand{\ESO@HookI}{} \newcommand{\ESO@HookII}{} +\newcommand{\ESO@HookIII}{} +\newcommand{\AddToShipoutPicture}{% + \@ifstar{\g@addto@macro\ESO@HookII}{\g@addto@macro\ESO@HookI}} +\newcommand{\ClearShipoutPicture}{\global\let\ESO@HookI\@empty} +\newcommand{\@ShipoutPicture}{% + \bgroup + \@tempswafalse% + \ifx\ESO@HookI\@empty\else\@tempswatrue\fi% + \ifx\ESO@HookII\@empty\else\@tempswatrue\fi% + \ifx\ESO@HookIII\@empty\else\@tempswatrue\fi% + \if@tempswa% + \@tempdima=1in\@tempdimb=-\@tempdima% + \advance\@tempdimb\ESO@yoffsetI% + \unitlength=1pt% + \global\setbox\@cclv\vbox{% + \vbox{\let\protect\relax + \pictur@(0,0)(\strip@pt\@tempdima,\strip@pt\@tempdimb)% + \ESO@HookIII\ESO@HookI\ESO@HookII% + \global\let\ESO@HookII\@empty% + \endpicture}% + \nointerlineskip% + \box\@cclv}% + \fi + \egroup +} +\EveryShipoutTACL{\@ShipoutPicture} +\newif\ifESO@dvips\ESO@dvipsfalse +\newif\ifESO@grid\ESO@gridfalse +\newif\ifESO@texcoord\ESO@texcoordfalse +\newcommand*\ESO@griddelta{}\newcommand*\ESO@griddeltaY{} +\newcommand*\ESO@gridDelta{}\newcommand*\ESO@gridDeltaY{} +\newcommand*\ESO@yoffsetI{}\newcommand*\ESO@yoffsetII{} +\ifESO@texcoord + \def\ESO@yoffsetI{0pt}\def\ESO@yoffsetII{-\paperheight} + \edef\ESO@griddeltaY{-\ESO@griddelta}\edef\ESO@gridDeltaY{-\ESO@gridDelta} +\else + \def\ESO@yoffsetI{\paperheight}\def\ESO@yoffsetII{0pt} + \edef\ESO@griddeltaY{\ESO@griddelta}\edef\ESO@gridDeltaY{\ESO@gridDelta} +\fi + + +%% ----- Submitted version markup: Page numbers, ruler, and confidentiality. Using ideas/code from cvpr.sty 2015. --MM + +\font\naaclhv = phvb at 8pt + +%% Define vruler %% + +%\makeatletter +\newbox\aclrulerbox +\newcount\aclrulercount +\newdimen\aclruleroffset +\newdimen\cv@lineheight +\newdimen\cv@boxheight +\newbox\cv@tmpbox +\newcount\cv@refno +\newcount\cv@tot +% NUMBER with left flushed zeros \fillzeros[] +\newcount\cv@tmpc@ \newcount\cv@tmpc +\def\fillzeros[#1]#2{\cv@tmpc@=#2\relax\ifnum\cv@tmpc@<0\cv@tmpc@=-\cv@tmpc@\fi +\cv@tmpc=1 % +\loop\ifnum\cv@tmpc@<10 \else \divide\cv@tmpc@ by 10 \advance\cv@tmpc by 1 \fi + \ifnum\cv@tmpc@=10\relax\cv@tmpc@=11\relax\fi \ifnum\cv@tmpc@>10 \repeat +\ifnum#2<0\advance\cv@tmpc1\relax-\fi +\loop\ifnum\cv@tmpc<#1\relax0\advance\cv@tmpc1\relax\fi \ifnum\cv@tmpc<#1 \repeat +\cv@tmpc@=#2\relax\ifnum\cv@tmpc@<0\cv@tmpc@=-\cv@tmpc@\fi \relax\the\cv@tmpc@}% +% \makevruler[][][][][] +\def\makevruler[#1][#2][#3][#4][#5]{\begingroup\offinterlineskip +\textheight=#5\vbadness=10000\vfuzz=120ex\overfullrule=0pt% +\global\setbox\aclrulerbox=\vbox to \textheight{% +{\parskip=0pt\hfuzz=150em\cv@boxheight=\textheight +\cv@lineheight=#1\global\aclrulercount=#2% +\cv@tot\cv@boxheight\divide\cv@tot\cv@lineheight\advance\cv@tot2% +\cv@refno1\vskip-\cv@lineheight\vskip1ex% +\loop\setbox\cv@tmpbox=\hbox to0cm{{\naaclhv\hfil\fillzeros[#4]\aclrulercount}}% +\ht\cv@tmpbox\cv@lineheight\dp\cv@tmpbox0pt\box\cv@tmpbox\break +\advance\cv@refno1\global\advance\aclrulercount#3\relax +\ifnum\cv@refno<\cv@tot\repeat}}\endgroup}% +%\makeatother + +\def\confidentialtext{Confidential TACL submission. DO NOT DISTRIBUTE.} +%% TODO: restore +%\def\confidential{\confidentialtext} +\def\confidential{} + +%% Page numbering, Vruler and Confidentiality %% +% \makevruler[][][][][] + +% SC/KG/WL - changed line numbering to gainsboro +\definecolor{gainsboro}{rgb}{0.8, 0.8, 0.8} +%\def\aclruler#1{\makevruler[14.17pt][#1][1][3][\textheight]\usebox{\aclrulerbox}} %% old line +\def\aclruler#1{\textcolor{gainsboro}{\makevruler[14.17pt][#1][1][3][\textheight]\usebox{\aclrulerbox}}} + +\def\leftoffset{-2.1cm} %original: -45pt +\def\rightoffset{17.5cm} %original: 500pt +\iftaclfinal\else\pagenumbering{arabic} +\AddToShipoutPicture{% +\iftaclfinal\else +\AtPageLowishCenter{\thepage} +\aclruleroffset=\textheight +\advance\aclruleroffset4pt + \AtTextUpperLeft{% + \put(\LenToUnit{\leftoffset},\LenToUnit{-\aclruleroffset}){%left ruler + \aclruler{\aclrulercount}} + \put(\LenToUnit{\rightoffset},\LenToUnit{-\aclruleroffset}){%right ruler + \aclruler{\aclrulercount}} + } + \AtTextUpperLeft{%confidential + \put(0,\LenToUnit{1cm}){\parbox{\textwidth}{\centering\naaclhv\confidential}} + } +\fi +} + +%%%% ----- End settings for placing additional items into the submitted version --MM ----- %%%% + +%%%% ----- Begin settings for both submitted and camera-ready version ----- %%%% + +%% Title and Authors %% + +\newcommand\outauthor{ + \begin{tabular}[t]{c} + \iftaclfinal + \bf\@author + \else + % Avoiding common accidental de-anonymization issue. --MM + %TODO: restore + \bf Anonymous TACL submission + % \bf (No author info supplied here, for consistency with TACL-submission + % anonymization requirements) + \fi + \end{tabular}} + +% Changing the expanded titlebox for submissions to 2.5 in (rather than 6.5cm) +% and moving it to the style sheet, rather than within the example tex file. --MM +\iftaclfinal +\else + \addtolength\titlebox{.25in} +\fi +% Mostly taken from deproc. +\def\maketitle{\par + \begingroup + \def\thefootnote{\fnsymbol{footnote}} + \def\@makefnmark{\hbox to 0pt{$^{\@thefnmark}$\hss}} + \twocolumn[\@maketitle] \@thanks + \endgroup + \setcounter{footnote}{0} + \let\maketitle\relax \let\@maketitle\relax + \gdef\@thanks{}\gdef\@author{}\gdef\@title{}\let\thanks\relax} +\def\@maketitle{\vbox to \titlebox{\hsize\textwidth + \linewidth\hsize \vskip 0.125in minus 0.125in \centering + {\Large\bf \@title \par} \vskip 0.2in plus 1fil minus 0.1in + {\def\and{\unskip\enspace{\rm and}\enspace}% + \def\And{\end{tabular}\hss \egroup \hskip 1in plus 2fil + \hbox to 0pt\bgroup\hss \begin{tabular}[t]{c}\bf}% + \def\AND{\end{tabular}\hss\egroup \hfil\hfil\egroup + \vskip 0.25in plus 1fil minus 0.125in + \hbox to \linewidth\bgroup\large \hfil\hfil + \hbox to 0pt\bgroup\hss \begin{tabular}[t]{c}\bf} + \hbox to \linewidth\bgroup\large \hfil\hfil + \hbox to 0pt\bgroup\hss + \outauthor + \hss\egroup + \hfil\hfil\egroup} + \vskip 0.3in plus 2fil minus 0.1in +}} + +% margins for abstract +\renewenvironment{abstract}{\centerline{\large\bf + Abstract}\vspace{0.5ex}\begin{quote} \small}{\par\end{quote}\vskip 1ex} + +\RequirePackage{natbib} +% for citation commands in the .tex, authors can use: +% \citep, \citet, and \citeyearpar for compatibility with natbib, or +% \cite, \newcite, and \shortcite for compatibility with older ACL .sty files +\renewcommand\cite{\citep} % to get "(Author Year)" with natbib +\newcommand\shortcite{\citeyearpar}% to get "(Year)" with natbib +\newcommand\newcite{\citet} % to get "Author (Year)" with natbib + + +% bibliography + +\def\@up#1{\raise.2ex\hbox{#1}} + +% Don't put a label in the bibliography at all. Just use the unlabeled format +% instead. +\def\thebibliography#1{\vskip\parskip% +\vskip\baselineskip% +\def\baselinestretch{1}% +\ifx\@currsize\normalsize\@normalsize\else\@currsize\fi% +\vskip-\parskip% +\vskip-\baselineskip% +\section*{References\@mkboth + {References}{References}}\list + {}{\setlength{\labelwidth}{0pt}\setlength{\leftmargin}{\parindent} + \setlength{\itemindent}{-\parindent}} + \def\newblock{\hskip .11em plus .33em minus -.07em} + \sloppy\clubpenalty4000\widowpenalty4000 + \sfcode`\.=1000\relax} +\let\endthebibliography=\endlist + + +% Allow for a bibliography of sources of attested examples +\def\thesourcebibliography#1{\vskip\parskip% +\vskip\baselineskip% +\def\baselinestretch{1}% +\ifx\@currsize\normalsize\@normalsize\else\@currsize\fi% +\vskip-\parskip% +\vskip-\baselineskip% +\section*{Sources of Attested Examples\@mkboth + {Sources of Attested Examples}{Sources of Attested Examples}}\list + {}{\setlength{\labelwidth}{0pt}\setlength{\leftmargin}{\parindent} + \setlength{\itemindent}{-\parindent}} + \def\newblock{\hskip .11em plus .33em minus -.07em} + \sloppy\clubpenalty4000\widowpenalty4000 + \sfcode`\.=1000\relax} +\let\endthesourcebibliography=\endlist + +% sections with less space +\def\section{\@startsection {section}{1}{\z@}{-2.0ex plus + -0.5ex minus -.2ex}{1.5ex plus 0.3ex minus .2ex}{\large\bf\raggedright}} +\def\subsection{\@startsection{subsection}{2}{\z@}{-1.8ex plus + -0.5ex minus -.2ex}{0.8ex plus .2ex}{\normalsize\bf\raggedright}} +%% changed by KO to - values to get teh initial parindent right +\def\subsubsection{\@startsection{subsubsection}{3}{\z@}{-1.5ex plus + -0.5ex minus -.2ex}{0.5ex plus .2ex}{\normalsize\bf\raggedright}} +\def\paragraph{\@startsection{paragraph}{4}{\z@}{1.5ex plus + 0.5ex minus .2ex}{-1em}{\normalsize\bf}} +\def\subparagraph{\@startsection{subparagraph}{5}{\parindent}{1.5ex plus + 0.5ex minus .2ex}{-1em}{\normalsize\bf}} + +% Footnotes +\footnotesep 6.65pt % +\skip\footins 9pt plus 4pt minus 2pt +\def\footnoterule{\kern-3pt \hrule width 5pc \kern 2.6pt } +\setcounter{footnote}{0} + +% Lists and paragraphs +\parindent 1em +\topsep 4pt plus 1pt minus 2pt +\partopsep 1pt plus 0.5pt minus 0.5pt +\itemsep 2pt plus 1pt minus 0.5pt +\parsep 2pt plus 1pt minus 0.5pt + +\leftmargin 2em \leftmargini\leftmargin \leftmarginii 2em +\leftmarginiii 1.5em \leftmarginiv 1.0em \leftmarginv .5em \leftmarginvi .5em +\labelwidth\leftmargini\advance\labelwidth-\labelsep \labelsep 5pt + +\def\@listi{\leftmargin\leftmargini} +\def\@listii{\leftmargin\leftmarginii + \labelwidth\leftmarginii\advance\labelwidth-\labelsep + \topsep 2pt plus 1pt minus 0.5pt + \parsep 1pt plus 0.5pt minus 0.5pt + \itemsep \parsep} +\def\@listiii{\leftmargin\leftmarginiii + \labelwidth\leftmarginiii\advance\labelwidth-\labelsep + \topsep 1pt plus 0.5pt minus 0.5pt + \parsep \z@ \partopsep 0.5pt plus 0pt minus 0.5pt + \itemsep \topsep} +\def\@listiv{\leftmargin\leftmarginiv + \labelwidth\leftmarginiv\advance\labelwidth-\labelsep} +\def\@listv{\leftmargin\leftmarginv + \labelwidth\leftmarginv\advance\labelwidth-\labelsep} +\def\@listvi{\leftmargin\leftmarginvi + \labelwidth\leftmarginvi\advance\labelwidth-\labelsep} + +\abovedisplayskip 7pt plus2pt minus5pt% +\belowdisplayskip \abovedisplayskip +\abovedisplayshortskip 0pt plus3pt% +\belowdisplayshortskip 4pt plus3pt minus3pt% + +% Less leading in most fonts (due to the narrow columns) +% The choices were between 1-pt and 1.5-pt leading +% \def\@normalsize{\@setsize\normalsize{11pt}\xpt\@xpt} +% \def\small{\@setsize\small{10pt}\ixpt\@ixpt} +% \def\footnotesize{\@setsize\footnotesize{10pt}\ixpt\@ixpt} +% \def\scriptsize{\@setsize\scriptsize{8pt}\viipt\@viipt} +% \def\tiny{\@setsize\tiny{7pt}\vipt\@vipt} +% \def\large{\@setsize\large{14pt}\xiipt\@xiipt} +\def\Large{\@setsize\Large{16pt}\xivpt\@xivpt} +% \def\LARGE{\@setsize\LARGE{20pt}\xviipt\@xviipt} +% \def\huge{\@setsize\huge{23pt}\xxpt\@xxpt} +% \def\Huge{\@setsize\Huge{28pt}\xxvpt\@xxvpt} + + +\let\@@makecaption\@makecaption +\renewcommand{\@makecaption}[1]{\@@makecaption{\small #1}} + diff --git a/inst/rmarkdown/templates/tacl_article/skeleton/widetext.sty b/inst/rmarkdown/templates/tacl_article/skeleton/widetext.sty new file mode 100644 index 000000000..a8f805e98 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/skeleton/widetext.sty @@ -0,0 +1,86 @@ +\NeedsTeXFormat{LaTeX2e} +\ProvidesPackage{widetext} + +%% Mimics the widetext environment of revtex4 for any other class package +%% Eg: article.cls +%% +%% Compiled by: Anjishnu Sarkar +%% +%% Advantages: +%% *) Supports float (eg: figure) in two column format (Advantage over +%% multicol package) +%% *) One and twocolumn exist on the same page +%% *) Flow of text shown via rule +%% *) Equal height of text when in two column format +%% +%% Acknowledgment(s): +%% 1. Instead of re-inventing the wheel, two packages (flushend, cuted) of +%% the sttools bundle are used. The sttools bundle is available from CTAN. +%% Lisence of these packages rests with their corresponding author. +%% Any bug/problem with flushend and cuted should be forwarded to their +%% corresponding package authors. +%% 2. The idea of the rule came from the following latex community website +%% http://www.latex-community.org/forum/viewtopic.php?f=5&t=2770 +%% +%% This package just defines the widetext environment and the rules. +%% +%% Usage: +%% \documentclass[a4paper,12pt,twocolumn]{article} +%% \usepackage{widetext} +%% +%% \begin{document} +%% +%% Some text in twocolumn +%% +%% \begin{widetext} +%% Text in onecolumn format. +%% \end{widetext} +%% +%% Some more text in twocolumn +%% +%% \end{document} +%%%%%%%%%%%%%%%%%%%% + +%% Package required for equal height while in 2 columns format +\IfFileExists{flushend.sty} + {\RequirePackage{flushend}} + {\typeout{} + \typeout{Package widetext error: Install the flushend package which is + a part of sttools bundle. Available from CTAN.} + \typeout{} + \stop + } + +%% Package required for onecolumn and twocolumn to exist on the same page. +%% and also required for widetext environment. +\IfFileExists{cuted.sty} + {\RequirePackage{cuted}} + {\typeout{} + \typeout{Package widetext error: Install the cuted package which is + a part of sttools bundle. Available from CTAN.} + \typeout{} + \stop + } + + +\newlength\@parindent +\setlength\@parindent{\parindent} + +\if@twocolumn + \newenvironment{widetext} + {% + \begin{strip} + \rule{\dimexpr(0.5\textwidth-0.5\columnsep-0.4pt)}{0.4pt}% + \rule{0.4pt}{6pt} + \par %\vspace{6pt} + \parindent \@parindent + }% + {% + \par + \hfill\rule[-6pt]{0.4pt}{6.4pt}% + \rule{\dimexpr(0.5\textwidth-0.5\columnsep-1pt)}{0.4pt} + \end{strip} + } +\else + \newenvironment{widetext}{}{} +\fi \ No newline at end of file diff --git a/inst/rmarkdown/templates/tacl_article/template.yaml b/inst/rmarkdown/templates/tacl_article/template.yaml new file mode 100644 index 000000000..173550e22 --- /dev/null +++ b/inst/rmarkdown/templates/tacl_article/template.yaml @@ -0,0 +1,4 @@ +name: TACL Paper +description: > + Template for creating a TACL-style paper +create_dir: true diff --git a/man/acl_article.Rd b/man/acl_article.Rd new file mode 100644 index 000000000..ef7f5a0ed --- /dev/null +++ b/man/acl_article.Rd @@ -0,0 +1,28 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/acl_article.R +\name{acl_article} +\alias{acl_article} +\title{ACL paper format} +\usage{ +acl_article(..., keep_tex = TRUE) +} +\arguments{ +\item{...}{Additional arguments to \code{rmarkdown::pdf_document}} + +\item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF} +} +\value{ +R Markdown output format to pass to + \code{\link[rmarkdown:render]{render}} +} +\description{ +ACL paper format +} +\examples{ + +\dontrun{ +library(rmarkdown) +draft("MyArticle.Rmd", template = "conll_article", package = "rticles") +} + +} diff --git a/man/copernicus_article.Rd b/man/copernicus_article.Rd index e5526c678..451c60e2d 100644 --- a/man/copernicus_article.Rd +++ b/man/copernicus_article.Rd @@ -20,7 +20,9 @@ copernicus_journal_abbreviations(journal_name = "*") \item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF} \item{citation_package}{The LaTeX package to process citations, \code{natbib} -or \code{biblatex}. Use \code{none} if neither package is to be used.} +or \code{biblatex}. Use \code{default} if neither package is to be used, +which means citations will be processed via the command +\command{pandoc-citeproc}.} \item{md_extensions}{Markdown extensions to be added or removed from the default definition or R Markdown. See the \code{\link[rmarkdown]{rmarkdown_format}} for diff --git a/man/jss_article.Rd b/man/jss_article.Rd index 9be2185f2..65e51430e 100644 --- a/man/jss_article.Rd +++ b/man/jss_article.Rd @@ -12,7 +12,9 @@ jss_article(..., keep_tex = TRUE, citation_package = "natbib") \item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF} \item{citation_package}{The LaTeX package to process citations, \code{natbib} -or \code{biblatex}. Use \code{none} if neither package is to be used.} +or \code{biblatex}. Use \code{default} if neither package is to be used, +which means citations will be processed via the command +\command{pandoc-citeproc}.} } \description{ Format for creating a Journal of Statistical Software (JSS) articles. Adapted diff --git a/man/opmi_article.Rd b/man/opmi_article.Rd new file mode 100644 index 000000000..149077d3d --- /dev/null +++ b/man/opmi_article.Rd @@ -0,0 +1,28 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/opmi_article.R +\name{opmi_article} +\alias{opmi_article} +\title{OpenMind article format} +\usage{ +opmi_article(..., keep_tex = TRUE) +} +\arguments{ +\item{...}{Additional arguments to \code{rmarkdown::pdf_document}} + +\item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF} +} +\value{ +R Markdown output format to pass to + \code{\link[rmarkdown:render]{render}} +} +\description{ +OpenMind article format +} +\examples{ + +\dontrun{ +library(rmarkdown) +draft("MyArticle.Rmd", template = "opmi_article", package = "rticles") +} + +} diff --git a/man/rss_article.Rd b/man/rss_article.Rd index 64de695b7..e2c632c3b 100644 --- a/man/rss_article.Rd +++ b/man/rss_article.Rd @@ -12,7 +12,9 @@ rss_article(..., keep_tex = TRUE, citation_package = "natbib") \item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF} \item{citation_package}{The LaTeX package to process citations, \code{natbib} -or \code{biblatex}. Use \code{none} if neither package is to be used.} +or \code{biblatex}. Use \code{default} if neither package is to be used, +which means citations will be processed via the command +\command{pandoc-citeproc}.} } \description{ Format for creating articles for Royal Statistical Society Adapted from diff --git a/man/tacl_article.Rd b/man/tacl_article.Rd new file mode 100644 index 000000000..a89643793 --- /dev/null +++ b/man/tacl_article.Rd @@ -0,0 +1,28 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/tacl_article.R +\name{tacl_article} +\alias{tacl_article} +\title{TACL paper format} +\usage{ +tacl_article(..., keep_tex = TRUE) +} +\arguments{ +\item{...}{Additional arguments to \code{rmarkdown::pdf_document}} + +\item{keep_tex}{Keep the intermediate tex file used in the conversion to PDF} +} +\value{ +R Markdown output format to pass to + \code{\link[rmarkdown:render]{render}} +} +\description{ +TACL paper format +} +\examples{ + +\dontrun{ +library(rmarkdown) +draft("MyArticle.Rmd", template = "conll_article", package = "rticles") +} + +}