[Phylobase-commits] r722 - in pkg: R inst/doc src

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Tue Jan 26 16:28:06 CET 2010


Author: francois
Date: 2010-01-26 16:28:06 +0100 (Tue, 26 Jan 2010)
New Revision: 722

Added:
   pkg/src/ncl/
Modified:
   pkg/R/checkdata.R
   pkg/R/formatData.R
   pkg/R/methods-phylo4.R
   pkg/R/prune.R
   pkg/R/treewalk.R
   pkg/inst/doc/developer.pdf
Log:
bringing ncl-2.1.09 into the main branch

Modified: pkg/R/checkdata.R
===================================================================
--- pkg/R/checkdata.R	2010-01-26 15:26:14 UTC (rev 721)
+++ pkg/R/checkdata.R	2010-01-26 15:28:06 UTC (rev 722)
@@ -84,7 +84,7 @@
     if (is.null(names(object at label))) {
         stop(c("Tip and node labels must have names matching node IDs. ",
             lab.msg))
-             
+
     } else {
         if (!all(tips %in% names(na.omit(object at label)))) {
             stop(c("All tips must have associated tip labels. ",
@@ -123,11 +123,11 @@
     }
 
     ## make sure that tip and node labels are unique
-    lb <- labels(object, "all")
-    lb <- lb[nchar(lb) > 0]
-    lb <- na.omit(lb)
-    if(any(table(lb) > 1))
-        stop("All labels must be unique")
+    #lb <- labels(object, "all")
+    #lb <- lb[nchar(lb) > 0]
+    #lb <- na.omit(lb)
+    #if(any(table(lb) > 1))
+    #    stop("All labels must be unique")
 
     ## all done with fatal errors.  Now construct a list
     ##  of warnings and paste them together

Modified: pkg/R/formatData.R
===================================================================
--- pkg/R/formatData.R	2010-01-26 15:26:14 UTC (rev 721)
+++ pkg/R/formatData.R	2010-01-26 15:28:06 UTC (rev 722)
@@ -31,30 +31,72 @@
     if (any(dim(dt)==0)) {
         return(data.frame(row.names=ids.out))
     }
-        
+
     label.type <- match.arg(label.type)
-    stopifnot(label.column %in% 1:ncol(dt))
+    ## TODO -- needs testing
+    if (label.type == "column") {
+        if (is.numeric(label.column))
+            stopifnot(label.column %in% 1:ncol(dt))
+        else
+            stopifnot(label.column %in% names(dt))
+    }
+
     missing.data <- match.arg(missing.data)
     extra.data <- match.arg(extra.data)
 
     if(match.data) {
+        
+        
         ## extract values to be matched to nodes
         ndNames <- switch(label.type,
                           rownames = rownames(dt),
                           column = dt[,label.column])
+        ## Deal with duplicated labels
+        if (any(duplicated(labels(phy, type)))) {
+            tmpDt <- getNode(phy, ndNames)
+            
+        }
+        
+        ## check whether labels are unique
+        ##if (any(duplicated(labels(phy, type)))) {
+        ##    if (allowDuplicateLabels) {
+        ##       lb <- as(phy, "data.frame")[nodeId(phy, type), 1:2]
+        ##        if (label.type == "rownames") {
+        ##            dt <- data.frame(lbl=rownames(dt), dt)
+        ##            label.column <- 1 # just to be safe
+        ##            label.type <- "column"
+        ##        }
+        ##        dt <- merge(x=lb, y=dt, by.x=1, by.y=label.column)
+        ##        dt <- dt[,-1]
+        ##        ndNames <- dt$node
+        ##    }
+        ##    else stop("All labels must be unique")
+        ##}
         ## either force matching on labels, or match on node
         ## numbers for any number-like elements and labels otherwise
         if (rownamesAsLabels) {
             ids.in <- getNode(phy, as.character(ndNames), missing="OK")
-        } else {
-            ids.in <- as.numeric(rep(NA, length(ndNames)))
-            treatAsNumber <- nchar(gsub("[0-9]", "", ndNames))==0
-            ids.in[treatAsNumber] <- getNode(phy,
-                as.integer(ndNames[treatAsNumber]), missing="OK")
-            ids.in[!treatAsNumber] <- getNode(phy,
-                as.character(ndNames[!treatAsNumber]), missing="OK")
         }
+        else {
+           ids.in <- lapply(ndNames, function(ndnm) {
+                if (nchar(gsub("[0-9]", "", ndnm)) == 0) {
+                    getNode(phy, as.integer(ndnm), missing="OK")
+                }
+                else {
+                    getNode(phy, as.character(ndnm), missing="OK")
+                }
+            })
+            ids.in <- unlist(ids.in)
 
+            #ids.in <- as.numeric(rep(NA, length(ndNames)))
+            #treatAsNumber <- nchar(gsub("[0-9]", "", ndNames))==0
+            #ids.in[treatAsNumber] <- getNode(phy,
+            #    as.integer(ndNames[treatAsNumber]), missing="OK")
+            #ids.in[!treatAsNumber] <- getNode(phy,
+            #    as.character(ndNames[!treatAsNumber]), missing="OK")
+            browser()
+        }
+
         ## Make sure that data are matched to appropriate nodes
         if (type=="tip" && any(na.omit(ids.in) %in% nodeId(phy,
             "internal"))) {
@@ -90,6 +132,9 @@
                    fail = stop(msg))
         }
         ## Format data to have correct dimensions
+        ## TODO -- here build empty dataframe to match in case
+        ## of duplicates.
+        browser()
         dt <- dt[!is.na(ids.in), , drop=FALSE]
         rownames(dt) <- ids.in[!is.na(ids.in)]
         dt.out <- dt[match(ids.out, rownames(dt)), , drop=FALSE]
@@ -97,7 +142,6 @@
         if(label.type == "column") dt.out <- dt.out[, -label.column, drop=FALSE]
 
     } else {
-
         ## Check if too many or not enough rows in input data
         expected.nrow <- length(nodeId(phy, type))
         diffNr <- nrow(dt) - expected.nrow

Modified: pkg/R/methods-phylo4.R
===================================================================
--- pkg/R/methods-phylo4.R	2010-01-26 15:26:14 UTC (rev 721)
+++ pkg/R/methods-phylo4.R	2010-01-26 15:28:06 UTC (rev 722)
@@ -507,6 +507,7 @@
 
 orderIndex <- function(x, order=c("preorder", "postorder")) {
 
+    browser()
     order <- match.arg(order)
     if(!isRooted(x)){
         stop("Tree must be rooted to reorder")
@@ -596,7 +597,7 @@
     order   <- match.arg(order)
     index   <- orderIndex(x, order)
     x at order <- order
-    x at edge  <- x at edge[index, ]
+    x at edge  <- edges(x)[index, ]
     if(hasEdgeLabels(x)) {
         x at edge.label  <- x at edge.label[index]
     }

Modified: pkg/R/prune.R
===================================================================
--- pkg/R/prune.R	2010-01-26 15:26:14 UTC (rev 721)
+++ pkg/R/prune.R	2010-01-26 15:28:06 UTC (rev 722)
@@ -26,6 +26,7 @@
         if (edgeOrder(x) == "postorder") {
             edge.post <- edges(x)
         } else {
+            browser()
             edge.post <- edges(reorder(x, "postorder"))
         }
         for (i in seq_along(edge.post[,2])) {
@@ -59,6 +60,7 @@
         edge.length.new <- edge.length.new[-match(edge.names.drop,
             names(edge.length.new))]
         edge.label.new[edge.name.new] <- NA
+        browser()
         edge.label.new <- edge.label.new[-match(edge.names.drop,
             names(edge.label.new))]
 

Modified: pkg/R/treewalk.R
===================================================================
--- pkg/R/treewalk.R	2010-01-26 15:26:14 UTC (rev 721)
+++ pkg/R/treewalk.R	2010-01-26 15:28:06 UTC (rev 722)
@@ -20,7 +20,10 @@
 
     ## match node to tree
     if (is.character(node)) {
-        irval <- match(node, labels(x, type))
+        ndTmp <- paste("^", node, "$", sep="")
+        irval <- lapply(ndTmp, function(ND) grep(ND, labels(x, type)))
+        irval <- unlist(irval)
+        ##irval <- match(node, labels(x, type))
     } else if (is.numeric(node) && all(floor(node) == node, na.rm=TRUE)) {
         irval <- match(as.character(node), names(labels(x, type)))
     } else {
@@ -293,7 +296,7 @@
             ## hack to return NA for tip nodes when type='ancestor'
             if(length(res)==0) res <- NA
             names(res) <- rep(nid, length(res))
-        }   
+        }
         names(res) <- rep(nid, length(res))
         res
     })

Modified: pkg/inst/doc/developer.pdf
===================================================================
--- pkg/inst/doc/developer.pdf	2010-01-26 15:26:14 UTC (rev 721)
+++ pkg/inst/doc/developer.pdf	2010-01-26 15:28:06 UTC (rev 722)
@@ -1,937 +1,912 @@
 %PDF-1.4
 %ÐÔÅØ
-1 0 obj
+5 0 obj
 << /S /GoTo /D (section.1) >>
 endobj
-4 0 obj
+8 0 obj
 (Introduction)
 endobj
-5 0 obj
+9 0 obj
 << /S /GoTo /D (section.2) >>
 endobj
-8 0 obj
+12 0 obj
 (R-Forge)
 endobj
-9 0 obj
+13 0 obj
 << /S /GoTo /D (section.3) >>
 endobj
-12 0 obj
+16 0 obj
 (Building phylobase)
 endobj
-13 0 obj
+17 0 obj
 << /S /GoTo /D (section.4) >>
 endobj
-16 0 obj
+20 0 obj
 (Coding standards)
 endobj
-17 0 obj
+21 0 obj
 << /S /GoTo /D (section.5) >>
 endobj
-20 0 obj
+24 0 obj
 (Release procedure)
 endobj
-21 0 obj
+25 0 obj
 << /S /GoTo /D (section.6) >>
 endobj
-24 0 obj
+28 0 obj
 (Unit testing with RUnit)
 endobj
-25 0 obj
+29 0 obj
 << /S /GoTo /D (section.7) >>
 endobj
-28 0 obj
+32 0 obj
 (Non-exported functions)
 endobj
-29 0 obj
+33 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-32 0 obj
+36 0 obj
 (.chnumsort)
 endobj
-33 0 obj
+37 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-35 0 obj
+39 0 obj
 (.createEdge)
 endobj
-36 0 obj
+40 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-38 0 obj
+42 0 obj
 (.createLabels)
 endobj
-39 0 obj
+43 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-41 0 obj
+45 0 obj
 (.genlab)
 endobj
-42 0 obj
+46 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-44 0 obj
+48 0 obj
 (.phylo4Data)
 endobj
-45 0 obj
+49 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-47 0 obj
+51 0 obj
 (.phylo4ToDataFrame)
 endobj
-48 0 obj
+52 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-50 0 obj
+54 0 obj
 (.bubLegendGrob)
 endobj
-51 0 obj
+55 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-53 0 obj
+57 0 obj
 (drawDetails.bubLegend)
 endobj
-54 0 obj
+58 0 obj
 << /S /GoTo /D (section*.2) >>
 endobj
-56 0 obj
+60 0 obj
 (orderIndex)
 endobj
-57 0 obj
+61 0 obj
 << /S /GoTo /D (section.8) >>
 endobj
-60 0 obj
+64 0 obj
 (The Nexus Class Library and Rcpp)
 endobj
-61 0 obj
+65 0 obj
 << /S /GoTo /D (section.9) >>
 endobj
-64 0 obj
+68 0 obj
 (S4 classes and methods)
 endobj
-65 0 obj
+69 0 obj
 << /S /GoTo /D (section.10) >>
 endobj
-68 0 obj
+72 0 obj
 (Grid graphics)
 endobj
-69 0 obj
+73 0 obj
 << /S /GoTo /D (section.11) >>
 endobj
-72 0 obj
+76 0 obj
 (Converting between tree formats and ``round-trip'' issues)
 endobj
-73 0 obj
+77 0 obj
 << /S /GoTo /D (appendix.A) >>
 endobj
-76 0 obj
+80 0 obj
 (Subversion)
 endobj
-77 0 obj
+81 0 obj
 << /S /GoTo /D (subsection.A.1) >>
 endobj
-80 0 obj
+84 0 obj
 (Organization of the phylobase repository)
 endobj
-81 0 obj
+85 0 obj
 << /S /GoTo /D (subsection.A.2) >>
 endobj
-84 0 obj
+88 0 obj
 (Using subversion for the first time)
 endobj
-85 0 obj
+89 0 obj
 << /S /GoTo /D (subsection.A.3) >>
 endobj
-88 0 obj
+92 0 obj
 (Subversion patches)
 endobj
-89 0 obj
+93 0 obj
 << /S /GoTo /D (subsection.A.4) >>
 endobj
-92 0 obj
+96 0 obj
 (Branching and merging with svn)
 endobj
-93 0 obj
-<< /S /GoTo /D [94 0 R  /Fit ] >>
+97 0 obj
+<< /S /GoTo /D [98 0 R  /Fit ] >>
 endobj
-121 0 obj <<
-/Length 1180      
+125 0 obj <<
+/Length 1179      
 /Filter /FlateDecode
 >>
 stream
-xÚíYÝSÛ8ç¯ðÜÍ=sÖéË’õÈGazÇp7>µ÷àÄ"ñ4ØYÚ¿þV–H-%P˜”Û‘åýíîO»+mp0
-pp´ƒï¹ïvþ<$I@$¢$áÁè< *A2Uà)Cyð1<З¡žWu»ÓD1Ã4œ¶E®ý£­¢ÿF8±"ŽD¨´NP=û2¯ÆY£û¹2 ©$¡nnLRŠ¸L‚˜¦(UÔòoDe¨­6 Ðû•û}å.Yù‡ÛÓeÿPÍ?wÓûÉ¿»›+;[Œäι°Dö–À‹êüFý•(Ohõ@õ9EÌŽ)Cœ'þ““N_zÑ4nºÔö&PŒ•JSpb\ôBF˜‚O@¸ÂÊݯʈ‘ÐjkÜ—@*¯ÁEq¸€˜ÏÁ`èoàØPH	*œ|Ú‚	`I'˜D±¢Iø䣦rÊ…y;± z¿rŽ°tðâÇ« ¶ô{ìÔ‹ û4>Œða¦ú¹™GÜk‹y^”Sï†o¹GÀ朗ؚGçH²M´ä«Zr¯å~O†S4f)›•yfòfÕM!™JÁ?€ŒW!“ž
-=×ÎÚ®îWÃDç­ÑCLœ¨0…ÇüPÖZÝØ"ŠI¸0øª°3ÿtê–g7sM
-*1O×G¨ÑG€ôjœTe¬¯ëÎâÊX{àó¶ìb¡3Æ€ª	ÄôÖªWˆïò‰ðª ‰Ë³Ò]Û‹ÔXG…„¢(N0¾÷ÆÕw§lÃíf®ù*Ò
-Q‹røЕâÓý‚£3«ßåÓA4™>“1[DÖ3órœõ•v>Ö”—[Ž¯þ6ä…>
-/S]΁”AåH~¹”ô\D=Q Õ3Wr`¯Ã2›­ãpFÞêË+àfÁ†¤rF)Mv1¨CœÓ­\ù/˜Ì{³q;>֐Ñò#S
-ršLé[©ÿ	¥>7™‹†«m³bÞܐ2Ø(3±Í•à§¦ ÊäÚ¼/s}=€À”þrn~±”´ÖwˆGÈÛ‡êÔŸfG³þ¢¯[×ð‚z±?ϚƏc“™/þGÖ¹#æ~Þ餮§]¤“
-NûÊ+vÆ=èÄ)£{Ͳ²?m_h;ë»w¸Ø8&œô	Ñ	LÑãMMVÏŠÉ°¡B™H62—Õ5îhxé.Úؾ—Ã]SvUÚºvÞU÷RGŽ…î¥5º§ï¼2™]wÓ'¸©Ú2­)êßü`Ñ4­n†Ê$ÙÈ’Ý( äY;¾eHsO{pÙ9K݉™"ËÕ´‹ÀŸRÒð3ÍÊâkÖõ'cׂ©ÎÝœ6ÓwôóH¡ô¾~îmÜ#¦–ú]w‡Éª)l‘²~Þ‡¿ÊÄuW
-HSb"D¬ó@=¿”Áñ
-¬ðÔeÔu¹›%1°vo˜éF>Á1õ?l1ܾ*.·£Ý$ž`ǹ‹˜÷õÙÒÁrÅÁuf}Ãpö³·6”YùÛŸ]Ä={&+½Ã—kߧdæ*—™ö£Ë¾µ‹ËrxTH¶ÊÅéš‹û·$MgÆ¹@LˆÕ?Güœw£ÿA9Þ3
+xÚíYMsÛ6½ûWpzè3%‚/äѱ'©'íØÊ)éa‰™ä€ íô×wA@²$ÚM,Û‰Gñ…¤@pßþXá`ààdßs?í½9&I@$¢$áÁè" Y‚dš‚c”ah*‚OᑺŠ¨Õ¼n¢Ø>è6Š¦á´+åMý3zæÄš9N¡ õ†šÙ×y=Î[åûÊ€”%	µ}c’RÄeÄ4EiFÝ'GT†Ê(
+0 }XÛß×ö’W¸¶Uù‡zþ¥ïî;ÿno2¬ÍlÑRØ‘ÈÅH¤	¼¨/néßR¢<EÀê;éƒË° ö1âÙ¿Ï+‹×åú«Ã¡‰'M1ÁÎMÁMˆqáÍ
+îË‚˜SP svë*b$4ÊÝZû%ȈÁOpÉ8\ÀÌ—`Ðô'(þÏP&¨°ö1Ò$u†Ig4	߁]ÐP×–\XtS¢q±p,†`ñ¾   cñ;l¹0ÑcŸÅÇQ
+è©z6D?Zæºr^”ÕÔùŸá÷ø‚/‰mx”qŽ${K¾Î’;–‡^K4f)[“WE®‹vÝMŸ`þ±,}òF$^
+5Wv´=\ã£a¢ŠN«!&N2pèö˜Âa~¬J㠍jMÅ$\øº43÷tfóï¹AƒJÌSðØö4¤£ñ¡®buÓô#®µQ…¾èª~.´C`Æ؃€ß§+QS>ã ¼[A4‰hÎ*{í.[ ±‰
+Bˆ¢8ÁøÞϾÙenÿ3Ì
+ŸAºj‘ ¿7RÖåÑ*7êm1Ì!Óg̉õ̺œæcÈé)$÷ÁdM	ùyáøâoC]($„'Ðeªª9ˆ2ÈÉ/·$=—Pìi„jf6åÀ^‡å&ßÄጼæ—®h3Š`CR[…Ž£”‡:¿ä!ÎéNFþXÌÆÝøTÁŠVœèz°¦É”¾¦úo¤ú§P¡Ð¹
+×GÊäå¼½e°Qfb—3ÁMµ.”~Wêf )ýåÜüÓ–¤ºC¼8B®žfSwšÍü!þƒºél‰òÅá<o[×zZŽµ+IÁ¼?rG$,\¿³IÓN»„I¹$½Í1;sÄιX2Ê3Ë+Ú¾Tfæ«w¸Ø8>†Á`:Áá‰.=ÞTçͬœ*”‰-±|m‹‡Õîhxe/J_Ëá!U`W¥Œ-ç]÷/UdUè_­¼|µ¾Ìͦ›>ÆuÝUEltÙüæ˶íT;œ¡L’Gym?Š<ïÆ+iï).+gbëÂHÌ2‚°\_‚öøSJþ¥§yUþ›÷õÉØ–`ê{§ÍÔõ<V(½¯‚»Š›`IJ%­šþ0Y·¥©a¦lž÷Áá/ráº+ˆmr at LA‚ˆõÝè>¢N‡­ep|‘žº²½0»·Êô-Ÿ!@tkÜS·¯—»QnOv÷s¾>_:X®9¸É+§½À쵌i6}¸Óá@ç•sø2öÝ’ÌlæÒSߺ¬[Û¹qU
+
+ÉN¹8Ûp±KÒqË8¢jñoÓjß·£½ÿ 2Û
 endstream
 endobj
-94 0 obj <<
+98 0 obj <<
 /Type /Page
-/Contents 121 0 R
-/Resources 120 0 R
+/Contents 125 0 R
+/Resources 124 0 R
 /MediaBox [0 0 612 792]
-/Parent 132 0 R
-/Annots [ 95 0 R 96 0 R 97 0 R 98 0 R 99 0 R 100 0 R 101 0 R 102 0 R 103 0 R 104 0 R 105 0 R 106 0 R 107 0 R 108 0 R 109 0 R 110 0 R 111 0 R 112 0 R 113 0 R 114 0 R 115 0 R 116 0 R 117 0 R 118 0 R 119 0 R ]
+/Parent 136 0 R
+/Annots [ 99 0 R 100 0 R 101 0 R 102 0 R 103 0 R 104 0 R 105 0 R 106 0 R 107 0 R 108 0 R 109 0 R 110 0 R 111 0 R 112 0 R 113 0 R 114 0 R 115 0 R 116 0 R 117 0 R 118 0 R 119 0 R 120 0 R 121 0 R 122 0 R 123 0 R ]
 >> endobj
-95 0 obj <<
+99 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 522.744 179.452 531.655]
+/Rect [99.35 522.877 179.452 531.788]
+/Subtype /Link
 /A << /S /GoTo /D (section.1) >>
 >> endobj
-96 0 obj <<
+100 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 498.889 156.379 509.655]
+/Rect [99.35 499.022 156.379 509.787]
+/Subtype /Link
 /A << /S /GoTo /D (section.2) >>
 >> endobj
-97 0 obj <<
+101 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 476.695 209.7 487.82]
+/Rect [99.35 476.828 209.7 487.953]
+/Subtype /Link
 /A << /S /GoTo /D (section.3) >>
 >> endobj
-98 0 obj <<
+102 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 455.054 204.514 465.902]
+/Rect [99.35 455.187 204.514 466.035]
+/Subtype /Link
 /A << /S /GoTo /D (section.4) >>
 >> endobj
-99 0 obj <<
+103 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 433.136 207.895 443.984]
+/Rect [99.35 433.269 207.895 444.117]
+/Subtype /Link
 /A << /S /GoTo /D (section.5) >>
 >> endobj
-100 0 obj <<
+104 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 411.218 237.887 422.066]
+/Rect [99.35 411.351 237.887 422.199]
+/Subtype /Link
 /A << /S /GoTo /D (section.6) >>
 >> endobj
-101 0 obj <<
+105 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 389.3 235.057 400.148]
+/Rect [99.35 389.433 235.057 400.281]
+/Subtype /Link
 /A << /S /GoTo /D (section.7) >>
 >> endobj
-102 0 obj <<
+106 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 379.282 164.523 388.193]
+/Rect [114.294 379.415 164.523 388.326]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-103 0 obj <<
+107 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 365.39 166.819 376.238]
+/Rect [114.294 365.523 166.819 376.371]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-104 0 obj <<
+108 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 355.372 173.24 364.283]
+/Rect [114.294 355.505 173.24 364.416]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-105 0 obj <<
+109 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 341.48 147.282 352.328]
+/Rect [114.294 341.612 147.282 352.461]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-106 0 obj <<
+110 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 329.524 169.283 340.373]
+/Rect [114.294 329.657 169.283 340.505]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-107 0 obj <<
+111 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 317.569 207.916 328.417]
+/Rect [114.294 317.702 207.916 328.55]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-108 0 obj <<
+112 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 305.614 189.028 316.462]
+/Rect [114.294 305.747 189.028 316.595]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-109 0 obj <<
+113 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 293.659 218.487 304.507]
+/Rect [114.294 293.792 218.487 304.64]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-110 0 obj <<
+114 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 283.641 163.388 292.552]
+/Rect [114.294 283.774 163.388 292.685]
+/Subtype /Link
 /A << /S /GoTo /D (section*.2) >>
 >> endobj
-111 0 obj <<
+115 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 259.786 294.386 270.634]
+/Rect [99.35 259.919 294.386 270.767]
+/Subtype /Link
 /A << /S /GoTo /D (section.8) >>
 >> endobj
-112 0 obj <<
+116 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 239.805 233.339 248.716]
+/Rect [99.35 239.938 233.339 248.849]
+/Subtype /Link
 /A << /S /GoTo /D (section.9) >>
 >> endobj
-113 0 obj <<
+117 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 215.95 184.919 226.798]
+/Rect [99.35 216.083 184.919 226.931]
+/Subtype /Link
 /A << /S /GoTo /D (section.10) >>
 >> endobj
-114 0 obj <<
+118 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 194.032 404.038 204.881]
+/Rect [99.35 194.165 404.038 205.013]
+/Subtype /Link
 /A << /S /GoTo /D (section.11) >>
 >> endobj
-115 0 obj <<
+119 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 174.052 170.556 182.963]
+/Rect [99.35 174.185 170.556 183.096]
+/Subtype /Link
 /A << /S /GoTo /D (appendix.A) >>
 >> endobj
-116 0 obj <<
+120 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 159.883 321.738 171.008]
+/Rect [114.294 160.015 321.738 171.14]
+/Subtype /Link
 /A << /S /GoTo /D (subsection.A.1) >>
 >> endobj
-117 0 obj <<
+121 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 148.204 288.115 159.052]
+/Rect [114.294 148.337 288.115 159.185]
+/Subtype /Link
 /A << /S /GoTo /D (subsection.A.2) >>
 >> endobj
-118 0 obj <<
+122 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 136.249 221.808 147.097]
+/Rect [114.294 136.382 221.808 147.23]
+/Subtype /Link
 /A << /S /GoTo /D (subsection.A.3) >>
 >> endobj
-119 0 obj <<
+123 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [114.294 124.294 281.971 135.142]
+/Rect [114.294 124.427 281.971 135.275]
+/Subtype /Link
 /A << /S /GoTo /D (subsection.A.4) >>
 >> endobj
-122 0 obj <<
-/D [94 0 R /XYZ 99.346 730.572 null]
+126 0 obj <<
+/D [98 0 R /XYZ 100.346 717.616 null]
 >> endobj
-123 0 obj <<
-/D [94 0 R /XYZ 100.346 692.71 null]
+127 0 obj <<
+/D [98 0 R /XYZ 100.346 692.71 null]
 >> endobj
-128 0 obj <<
-/D [94 0 R /XYZ 100.346 535.793 null]
+132 0 obj <<
+/D [98 0 R /XYZ 100.346 535.925 null]
 >> endobj
-120 0 obj <<
-/Font << /F15 124 0 R /F16 125 0 R /F17 126 0 R /F28 127 0 R /F29 129 0 R /F30 130 0 R /F8 131 0 R >>
+124 0 obj <<
+/Font << /F15 128 0 R /F16 129 0 R /F17 130 0 R /F28 131 0 R /F29 133 0 R /F30 134 0 R /F8 135 0 R >>
 /ProcSet [ /PDF /Text ]
 >> endobj
-159 0 obj <<
-/Length 3021      
+163 0 obj <<
+/Length 3025      
 /Filter /FlateDecode
 >>
 stream
-xÚµY[ÛÆ~÷¯üPSÀj–ÃáeX4
-Ã.Ü85j/Ž‘rEJb—"e^¼»@|ύ©eÖÞuò"
-g†3ç~¾sè.¶wñ'®üÿxñäü¥gÚWƽÅÅf¡]Ç‹Ðz*ò£ÅEºøàèåJk/p^•K£¶®–+øO»u›WåòãÅ?Ï_ÚE¬âÐñw±ò´²žæ·/vy³\ù¾ç|ηeÖ¶>§ŸÍË¥g6+Ó,噤á	?n»<Íx¸©j^jw2“fŸñõ¬¨ûNŠœ–ª
-SfÜi^d”¡Ë¤v·Eu™4Ù]&O×ô“²'¯¯³ÃrwUMÞVõ-Oò‹•ñzñ„¦â àÚltîÊ|(?ã”U›58$biêPçûÏÃÉ^0uÖ´¼ÜV²Ò>kxfÄ>ƒZN$ŠqGÕî–Úii§_œÉ6˜£µmÅ×ãÑm’òÊÿøï|KlºSþÖZ'D¬ñYEÆY=£«U<XG#³шð²}U÷·mø?)yE˜E£…ÿ´a¬Qd»´ó/ü×5Yý¬?.¡·º¤PLÏÔKVÚøÊ
-êZŞǔyâ&oW/—±ïTõ6û¢s¼éj¼Qì8:Ú±uZ^ÈË
-Ê´oëzw•(ΐJ¬sËóx³5tó^
-žî*ÃOìÃ0qµ¸3õhª82–|ÄÞb½0*ÔA ø0S†"YqÜͦG¤¯‹.%7äÍ8ù®##b³­Ñ‚'.e.…“¿ºÛ ¶²ìü€ˆ
-ÈŒkb¢?ÄGÊ4¿—ՁóıÅšüð«>0CV"7#¢%:ŽÎ×ÎG`Iãå¡3¸°©ºzñx-v*`ˆÉ6ë#ÛLš lÏWËÞãqëpÜe·åÁ Òº•=Çðî,!sšñä:ûÔA`hoAÆ‚sxcòî5 mâ»äÚÙ£!@ór‹sžSä
-rƒCâ÷Í&ZÈ›u×°‘áÃɃs8»?š#tRn3¹ /e7†2œè5E»+Ji¦/¨ÐS®5cI™{$µ21„Bˆ::PA4¤W48ÚÊűÈÁ Yç±dƐ4]ÖgÈ—ú÷P+£EŸ²BÀºÎ/Ùù¦lW¡°¯ùóšoÃq䉄×	©æj€	÷¼u
-Ùnýä5Ïž†Kœ{#‰YëHáIT8$u›¯»"A[
-c'ßN“”¤kœløŸ
-MÆà,Àuè&·—ØNqG³ã{émBÅï\/éŽ+Ù\õç'-ni½ãJX‰Ü²®öû¼íŽ;ãÊ„£¥0š2_•€¢mô™~ˆPœ6‰e·vCQ|æ~í°þŒ5Ÿg°$Xz¹H¶`ìT¢Kk@—Þ”ß7t¡¢<Dì89òcˉɎŒ,d#ÃÉ™¬‰–èÕ¢`;–£5€ª"C)ÒóH²c–?VÑWÁÒ•	}FójdT6-Çx&Ík0ØB`¦®ösúÀ°¢½žŠ·3† ¼‡	02Þ˜:í¹P6x„q"Ëÿ¾\€Š„b¾ñ6hONŸžñ.wÕðð;þ{ºkÛÃ_ÏÏëÕU§êÕ¡®þÜ(x|JÙt¡¹ShfšýØåEŠöJ¯@|½bcå[ý5: ÷ŠüÈoñ!!ô\‡²å¥èŽtǐ±ÇdM•âCpÖækaò।c:œsÖâMÉ»ÎÉ>`Tf=IŒÚä&Ùg2Å_q-@ {JÅ!;@`±ÈÐeÆæÞ*Ú{,ÍÓQ¿ž·MVlÚƒùŽ!ßÀ"†AÊéxÝõ€8‚2ü÷u	5ÜHSPÐ
-T#WÑ
-`¼dèÆç—rÌé>/{ÔI;,ž”	Ã ¾U¾7AKÁ½Ù5Œ§pû•d7ß
-”võTG}#ú!YÁ îÊ’£6€›Ÿ!îÑì›wüÿžÿäÕgd#ð,6#Ò.¼¹KŽá^Vv2Hûšó´<å7&õxÁy±¯l8Oὂóƒ‰Ü(Y ©¿äezâ¿Ç8Wö.„m梯\Ý¿ÚùJE¹!’41f?kŸ>Z Ú×ʇÅOÑý…Zx‚³…œ	>K{nNIx½’Z'rd~ì+ß÷9ÂÂÑôðíZ¶M^sqÞÝœI,<è…½|ÃSŽBH°ý.)‘ÁSRÔY’ÊÃUÙCJ|ºæ
-£Éû¨K$‘q.–Štžæ8ECf}£¡‘»JÙðš£Õć!íÈœ€æ}#Åæݘ¶hg5ÚtAlCÖóÚ÷yþÅh§E_”­G"…ØÕ÷á@»& 5Ûß“ $	ú0‡ÆVMu3H½n„F­CÈuö^*ý#•ð^Š±2¿ìŽ}–"¿Zñ	„ÄcÙÍã ð|ÌŽJ
-û…NÅ´0¡RˆáÅ@øÖsO$®^çŸG´Ë{þØ€¹ùT³<êúœþœÿħ½|® ~µ?æ7¾—_kƒ~}3Žyèµà
-o¨ÖÁµ£µÀ†øcoÃôW€+Ž‚ºïMq‚?X™BëÁòÉA¸¯–f2D±ÇÊHm`ÔñICõ”e·ó°É„*îA0€½7mV ÝLËæÇg(ë«ØL2»vOôu§¯èBtÐóÁ­¢¾Øfðú\úî>£Àñ–iR§ÍÛŒ$,Â> Œ¨Œ	­€4;UÎïdg_éñ…°r¼Ö©²‚és‰HU‰ªú’ºïšœÊì¾î£6p^8Éjÿà
-	>“@N]CÞ `ª³£ê?/nÅw«\×N­mÓ•b ¾õ  ôU!}²°žt045‘žjvUWÈòP™áC^Îá|«©ÔÙÈÄóYœïGʍFe”#€NåRT	ÑÃ]`t->B’¬où©¬ÊÕÀJÝö(Çó xAî˜@Ã.šÔ¦aEﯮöoØÑáÆ 6Œ´óõn
-ã¡Ûƒ°AjbT …M×¢›ÕÃY9««•‰“{I¨°_®:V¼p[	2‘Pu-Ï“,ÆÝ‘pòÉâظål
-—PÃ0„ò dX€ØÑQ­0>ª|Y‡—š\®˜N¶Éeó…דXUù€žq@ÄDèÂþ°·À†ÞÐ5Ùly•z<„¿¿­f+>ÔúC…µé—‰c¨¼NZdIÓ êÑ*ÎêiçP$”:`Øón"°MK‰¦±c•4ò÷ÿÓì†7;ú½éCv`»€D¢°½©æ˜\0Û!¦§›ž4¼3^¸Å×ãï{wOi`ûé$7Ù'$F÷‡Ë?\~lFLÒ°Qž7´Ù(”U;בƒh6¡ŽrC3ø5÷eM{Ê;¶‚½3 r¦qA®v«ž‹!⾸xòé	ŠÊ]èᱧÁÄüh±Þ?ùðÑ]¤°¦XÝ5mÝ/4¶ªbä¼X¼{òoþܬc@ŒqIÇ	*üžkUèN>6ÁMtÌÕ¢aª0PMA•KxZØjƒ•6´Š°IVB}U¯À²mÑ«ú羉„ûêíI†™¹’{B2…Ñ猇‘h&$ôc+$yΨ¯uŽß'®2Œçßoëª;ü–§ßé;©ðw	Õã¯	&¡û$/οGŸ|•ÞøkŸIå[žz‰ë¿ýœ”X­ÒÍ¥|3ë:Á–Ó©V¨èíyZ­AžH\ÓSœ`×IíÚ}ñ@™†ßìEiö
-°¨Y­’áÈòó6[ïʪ@’··ç7ë*ÍC_ôͲ¼¾¾FïÝw5ÈmÇm:îòÕDt"÷m[AArþ@MÛ?Šº¶ÛŠ›¬ÛìæüBŠ¿Y‰½ò+¸ž(¹—(!oŒIŠå+hwÿ £ÏnÚæË65¢UO*…o¡õ:§/Âj³[×k’×e>¯°úíjtTs
-´þŸ`-€ª¹•àÊÚ¹OâcÿÁ»QQ
+xÚµYoÜÆùÝ¿‚ðCMÚg†Ç°h$A\¤‰kÔŽ‘RKî.+.¹áaI@‘ßÞï˜á’kZ¶ääe9óÍõÝ×ÞÖ¼<	ì÷ÛË'Ï•ñd(t+ïrãÉ À±%’0ñ.sï­/ÏVRªÈÿ¡>ÓÒïÛælß|X÷eSŸ½»üçÅsã¥"UŒwÞJIa”äÓ—»²;[…¡òß—ÛºèûgÚwв>SÆï‹:/r†dïÈxºʼàá¦iy©ßYH^¼ÇãEÕöÜ”ø=/4ÆLÔT¢…†aÀ¨vwUs•uŇDDJè@»YíPãçÛâp¶‚·š®ì›öŽü¢·Ò*±J=`šH£ˆoè‹5⹫ËuV!ÿ´_7}Ñᐐ%С-÷Þ‡@ǘ¶èz^î»Ò?ë2!‚Ako$ŒqGÓïΤÜ’¾[›^\Øm £µmÃÏãÕ}VVöÈÿøs…¾#2ƒ9}ë†/m3BV‡,"­	ƒ¢]†‘"‰,Š£áݨDøؾiÝkþf5¯XbQiá›ÀŒ52ƒt—vþ…?CW´ÏÜu²J0>s+YIŠ Ò(k‘*Ř)k&¯VÏÏÒÐoÚmñIãx9´ø¢Õãä¨ÇÆïy¡¬7ÈÓ¬mp4î+8M"1þÃñe£éås|,=&…Ÿ4„ âÚû ô#8Ä‹EšhC6¢€¶TzZÄ2r€/c·1'(‰	Çݬz„úºrÒqMÖŒÀ×)«mÛY)(kRæhRü%ˆ‚¥U X¬Ç \3ýæ`m¤ÎËÛß¿™ÑË¿¿}Èo™3#ääÆw€>øN¦ì¸tjü®ÚuÁÀµÕI;¥Ë¶…“þ98¡A‘㸦gÈŠAƒ»Ù­©5ly0:¦¶·{X¸¹ÈHƒŒ·-~ÀtWmÀÔTgÔ½:#uú¡Î¨Hú{$üYÖ[„)¿*;¤‡D1î[ôû´Pvë¡c½ÂãÍÌÉÄ¿.ánw5;å¬Þö²¶»Ñ{!À	Œv7ÄܼgT¬D`ô”SúNäÀû£‘‘ˆ’1¢bð3ÉÑށ¢­…‘ëJ|ôsh‹f
+q2`yÆühx–©ÐÒÊÓî«_·åÛ[ǘídö
+O0”…&žú=d¼~pjE~æh:Ò	Üò)[†žzH„½´±XÊDDñ‰#8dm_®‡*C]ŠS¿Ü[×ÓöYM²F`Ç_Vtç; O_ n!±žâŽnÇ6Ö;wCÃgnÎèk»¹q÷g=îh}à	Ũ̾²nöû²wG]0eJ4'HùHJVÌ…4uÃ÷££¢HI$ãpÙ›krÜïË@ƒöùW÷~!}M!üØ-èB…•¥Ñ K5§÷%=hFï“Äæ fyÓñÈL”,f%CàB J¬”èhU±Û«-äQU\¤ù„vÇb&ªÃT$Ÿ•‰®tŠ8Y³µ0›Õ]èq
+“—-(le3ƒMÛì—änE*‡Å«EjL½l.¤Õ;©¨¥5‰á?[EY|°ùØÛ¡R<)}zλ€ßMÇïøót×÷‡¿^\´«
+ŠN´«CÛü¨0}JAu!)æÙ˜¶ÙØ·CY娯tüÓäˆIEhäçÈÀîœån?PÒ>±[œd¤ƒ*ð)ÊP\šä٩ͳ1bOÑš%ç,õçfÆ£•’ŒérŽY爈š£wS’~À¨.Jœ¨Ê]¶/,ˆ
+¾áô?¥ô)·†Ñë‚Fƶ¤ðFÈØÜ£iˆNÜzÙwEµ¨!Æ;Nùf1rÇëÁe D,“áëJKx‘@PÃRúME¢+€1¦=Å¾É÷e
+¹G›õãâIeð¸ 4"T³l)º7ºÆé<ÃþÁF·0ˆ„ä\GycöC¼‚A;Ô5{mHn^€ß#èË×ü}Ã{ôéÌ­ŽÀˆ¤'wÙÑÝÛ•ä®Ì<­HùäQ¥Ï8•†Âijä)¾—qa4ã@õç²ÎNüc„s1€»zÉûʩÕ®Þ•þ/PÚ&¦äýÓG3@†R„°8¡)¹¿6‹Oòl‹Î,?Ë5'„d¼ÞØ2'ñ-|j«0ÙÂÂQõðtk·U&?q=>Üž[_qPÅŽ¿ñ©
+ǐ	¶àý®(Á,«Ú"Ëíäºfóì†ctœÌÏ£,Ñ‘„±IÙ ƒÙOѐ	†ë-tö­Únø‰½Õ̆e*‚$ñ ›µ­/?ôi ;í¬&›.‰lˆº:D¸C†?Â#ÁV^o~ÏYq¬“ƒÂ0s]7ã<PcžÒÎß«Ñ–•í")5Ñ^ÅÕ9|=)c!Óä#†Þ¢‡,¯ë#Ök×N[`Άø^Ü>^íÙ¡’ÓrÄÜ«ö±Ñ³r„e ïzü5ÉùÁ÷
+”ËÕOåèß`ÕUSÍÅV]$ÞÜè“ãEù#_÷æñQ"©§4§÷ÒlL´@s¨§Þí5Ê©ÊÁµ£²À»9:w×fÅáĝ‡jž!„cîI:"×\š|rîkmç˜."¯ŽµH$éI÷ôgäe[öË	“ŽEÝŸZDјæ}Ûõ˜žëyÁüøØdB‘êYL—Á‰¼>h"à$&ø`U‰+³9mýÎ6ÙÙq&‘ì­ó¬Í»Oö‰YÖ£õTÀÄƦgf.„;ßçj<~VŽÒ:ÕT þ¶´©©ñ€¦ý‚p†GÎyv_«Qj¸/žÅ³AÊ
+¡F«LbÐ^¬åÚ"»qãܸ™Ôýeug72"Ì\Û6Cm44
+<‚«éÿ	£lïBRǸcP·k†Ê.5NÊz)Ã7’š@®¼F"¾[Ìðâ̤ ƒBòRû(Š„ðáX`tcm„&6Lßñ¬nêÕHJÛ»dͦ9JAzd‘[jÖÚlÆPõþÈð–í.!׆‘ôÿ#žÁƒq:¶{0Ø¢eéÂfèÑÚÚñ®’¥Ö[ÀÉ»È[Ø^Ù§Ž%/¼Vë&(4CÏpbÉ´=Ïþ¦x?vS9¦ÂcÀÛ8Ž¡>Ègqrìä(]¥“ЮC…K]®ÀjûìªûÄñl̬,s+é2	Zr8î­°c„/]±X_A©žŽ^ðo«…Î
+dÇkã˜NS(½NXÖuMšÑÚHkI‰ôUF†Žv€†lzŠ Æ–UÖÙsäãüæÅ-ož\v47:QÄîÀ~±D`S, ¶£kÏ7o•í*¨wÆÙK(§ÿé}x#pûO']¦®ø
+‘‘îrû…Ǐ݈Y4ÖB©±Ïv΁¦nú¥–8µþK˜kêÑ
+4Kÿ¦I%Ô±0"¬ÎÉ…ÎAB‰œó+ŽŠÑñ~ùä·'ȪÀ“ãŸÂJ‚Š…‰·Þ?yû.ðrX´î†¶î=‰½ª)¯¼×OþÍ1ËòÆ4IlË	Jðÿ*0"f0ÁKt͵çF1´„ä&M Ì¥„ZFØk…µ}Û+Â.	h	5JD»û¡Ôm‹.ËÍ]	÷µÛ“@3Cre߉I&ÿg<E=C‘° ¿0¶%åO[øÅuŽñâëmÛ‡_Ëü+ùADü(¢rúwŸ‰è>+«‹¯Ñ&¥šþðgbùŠAÏqý×Yåê!ß<›Ñã¹n3ì9*aƒ‚Þ^äÍø‰ÈuãÛNb×ï«ò4þb+Ê‹÷¨€Us(Z‘U!À‘_ôÅzW7¢¼½»¸]7yñü’/æåÍÍ
+Zï~ho;fh7p›¯­À£º¯úê’‹JÚüQØõÃ֚ɺ/n/Ȥô‹…è˜T^Ãó„ɽ(@åqcŠ‚-\>{öPúâ¶ï>­S\å¬`ø\oJúKXlvëvMüº*Áſt~}”^#n§ß“\Ë@B­±…É•1Kÿ‰CŒý?ËÛPx
 endstream
 endobj
-158 0 obj <<
+162 0 obj <<
 /Type /Page
-/Contents 159 0 R
-/Resources 157 0 R
+/Contents 163 0 R
+/Resources 161 0 R
 /MediaBox [0 0 612 792]
-/Parent 132 0 R
-/Annots [ 133 0 R 135 0 R 136 0 R 137 0 R 139 0 R 141 0 R 143 0 R 145 0 R 147 0 R 149 0 R 151 0 R 153 0 R 155 0 R 134 0 R 138 0 R 140 0 R 142 0 R 144 0 R 146 0 R 148 0 R 150 0 R 152 0 R 154 0 R 156 0 R ]
+/Parent 136 0 R
+/Annots [ 137 0 R 139 0 R 140 0 R 141 0 R 143 0 R 145 0 R 147 0 R 149 0 R 151 0 R 153 0 R 155 0 R 157 0 R 159 0 R 138 0 R 142 0 R 144 0 R 146 0 R 148 0 R 150 0 R 152 0 R 154 0 R 156 0 R 158 0 R 160 0 R ]
 >> endobj
-133 0 obj <<
+137 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [323.441 578.786 329.903 591.379]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.1) >>
 >> endobj
-135 0 obj <<
+139 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [99.35 566.831 155.293 578.786]
+/Rect [99.35 566.831 156.137 578.786]
+/Subtype /Link
 /A << /S /GoTo /D (appendix.A) >>
 >> endobj
-136 0 obj <<
+140 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [160.205 566.831 209.05 578.786]
+/Rect [161.894 566.831 210.738 578.786]
+/Subtype /Link
 /A << /S /GoTo /D (appendix.A) >>
 >> endobj
-137 0 obj <<
+141 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [137.402 555.429 143.864 567.468]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.2) >>
 >> endobj
-139 0 obj <<
+143 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [506.623 555.429 513.085 567.468]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.3) >>
 >> endobj
-141 0 obj <<
+145 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [207.596 543.474 214.058 555.513]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.4) >>
 >> endobj
-143 0 obj <<
+147 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [494.757 409.113 501.219 419.215]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.5) >>
 >> endobj
-145 0 obj <<
+149 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [394.213 395.22 400.675 407.26]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.6) >>
 >> endobj
-147 0 obj <<
+151 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [240.844 383.265 247.306 395.305]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.7) >>
 >> endobj
-149 0 obj <<
+153 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
-/Rect [339.681 359.147 346.143 371.394]
+/Rect [340.502 359.147 346.964 371.394]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.8) >>
 >> endobj
-151 0 obj <<
+155 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [137.264 347.4 143.726 359.439]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.9) >>
 >> endobj
-153 0 obj <<
+157 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [229.391 335.445 239.824 347.484]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.10) >>
 >> endobj
-155 0 obj <<
+159 0 obj <<
 /Type /Annot
-/Subtype /Link
 /Border[0 0 0]/H/I/C[1 0 0]
 /Rect [343.462 280.702 353.895 292.741]
+/Subtype /Link
 /A << /S /GoTo /D (Hfootnote.11) >>
 >> endobj
-134 0 obj <<
+138 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 201.957 278.481 213.454]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://phylobase.r-forge.r-project.org)>>
 >> endobj
-138 0 obj <<
+142 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 192.453 329.291 203.949]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://r-forge.r-project.org/tracker/?group_id=111)>>
 >> endobj
-140 0 obj <<
+144 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 182.948 316.589 194.445]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://r-forge.r-project.org/mail/?group_id=111)>>
 >> endobj
-142 0 obj <<
+146 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 173.444 317.087 184.941]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://r-forge.r-project.org/R-Forge_Manual.pdf)>>
 >> endobj
-144 0 obj <<
+148 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 163.939 329.291 175.436]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://cran.r-project.org/doc/manuals/R-admin.html)>>
 >> endobj
-146 0 obj <<
+150 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 154.435 319.827 165.932]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://developer.apple.com/technology/xcode.html)>>
 >> endobj
-148 0 obj <<
+152 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 144.931 290.685 156.428]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://www.murdoch-sutherland.com/Rtools/)>>
 >> endobj
-150 0 obj <<
+154 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 135.426 226.675 146.923]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://www.tug.org/mactex/)>>
 >> endobj
-152 0 obj <<
+156 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 125.922 209.738 137.419]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://www.miktex.org/)>>
 >> endobj
-154 0 obj <<
+158 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 116.418 325.057 127.914]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://cran.r-project.org/doc/manuals/R-exts.html)>>
 >> endobj
-156 0 obj <<
+160 0 obj <<
 /Type /Annot
 /Border[0 0 0]/H/I/C[0 1 1]
 /Rect [114.593 106.913 298.656 118.41]
 /Subtype/Link/A<</Type/Action/S/URI/URI(http://wiki.fhcrc.org/bioc/Coding_Standards)>>
 >> endobj
-160 0 obj <<
-/D [158 0 R /XYZ 99.346 730.572 null]
+164 0 obj <<
+/D [162 0 R /XYZ 100.346 717.616 null]
 >> endobj
-2 0 obj <<
-/D [158 0 R /XYZ 100.346 692.71 null]
->> endobj
 6 0 obj <<
-/D [158 0 R /XYZ 100.346 619.813 null]
+/D [162 0 R /XYZ 100.346 692.71 null]
 >> endobj
 10 0 obj <<
-/D [158 0 R /XYZ 100.346 459.604 null]
+/D [162 0 R /XYZ 100.346 619.813 null]
 >> endobj
 14 0 obj <<
-/D [158 0 R /XYZ 100.346 321.452 null]
+/D [162 0 R /XYZ 100.346 459.604 null]
 >> endobj
-164 0 obj <<
-/D [158 0 R /XYZ 115.59 215.257 null]
+18 0 obj <<
+/D [162 0 R /XYZ 100.346 321.452 null]
 >> endobj
-166 0 obj <<
-/D [158 0 R /XYZ 115.59 205.753 null]
->> endobj
-167 0 obj <<
-/D [158 0 R /XYZ 115.59 196.248 null]
->> endobj
 168 0 obj <<
-/D [158 0 R /XYZ 115.59 186.744 null]
+/D [162 0 R /XYZ 115.59 215.257 null]
 >> endobj
-169 0 obj <<
-/D [158 0 R /XYZ 115.59 177.24 null]
->> endobj
 170 0 obj <<
-/D [158 0 R /XYZ 115.59 167.735 null]
+/D [162 0 R /XYZ 115.59 205.753 null]
 >> endobj
 171 0 obj <<
-/D [158 0 R /XYZ 115.59 158.231 null]
+/D [162 0 R /XYZ 115.59 196.248 null]
 >> endobj
 172 0 obj <<
-/D [158 0 R /XYZ 115.59 148.726 null]
+/D [162 0 R /XYZ 115.59 186.744 null]
 >> endobj
 173 0 obj <<
-/D [158 0 R /XYZ 115.59 139.222 null]
+/D [162 0 R /XYZ 115.59 177.24 null]
 >> endobj
 174 0 obj <<
-/D [158 0 R /XYZ 115.59 129.718 null]
+/D [162 0 R /XYZ 115.59 167.735 null]
 >> endobj
 175 0 obj <<
-/D [158 0 R /XYZ 115.59 120.213 null]
+/D [162 0 R /XYZ 115.59 158.231 null]
 >> endobj
-157 0 obj <<
-/Font << /F28 127 0 R /F8 131 0 R /F30 130 0 R /F7 161 0 R /F32 162 0 R /F16 125 0 R /F19 163 0 R /F31 165 0 R >>
-/ProcSet [ /PDF /Text ]
+176 0 obj <<
+/D [162 0 R /XYZ 115.59 148.726 null]
 >> endobj
+177 0 obj <<
+/D [162 0 R /XYZ 115.59 139.222 null]
+>> endobj
 178 0 obj <<
-/Length 2286      
+/D [162 0 R /XYZ 115.59 129.718 null]
+>> endobj
+179 0 obj <<
+/D [162 0 R /XYZ 115.59 120.213 null]
+>> endobj
+161 0 obj <<
[TRUNCATED]

To get the complete diff run:
    svnlook diff /svnroot/phylobase -r 722


More information about the Phylobase-commits mailing list