[Rsiena-commits] r134 - in pkg: RSiena RSiena/R RSiena/inst/doc RSiena/man RSiena/src/model/ml RSiena/src/model/variables RSiena/tests RSienaTest RSienaTest/R RSienaTest/doc RSienaTest/man RSienaTest/src/model/ml RSienaTest/src/model/variables RSienaTest/tests
noreply at r-forge.r-project.org
noreply at r-forge.r-project.org
Sat Feb 5 19:59:23 CET 2011
Author: ripleyrm
Date: 2011-02-05 19:59:22 +0100 (Sat, 05 Feb 2011)
New Revision: 134
Modified:
pkg/RSiena/DESCRIPTION
pkg/RSiena/R/iwlsm.R
pkg/RSiena/R/phase2.r
pkg/RSiena/R/siena08.r
pkg/RSiena/R/sienaDataCreate.r
pkg/RSiena/R/sienaDataCreateFromSession.r
pkg/RSiena/R/sienaTimeTest.r
pkg/RSiena/changeLog
pkg/RSiena/inst/doc/s_man400.pdf
pkg/RSiena/man/RSiena-package.Rd
pkg/RSiena/man/iwlsm.Rd
pkg/RSiena/man/print.sienaMeta.Rd
pkg/RSiena/man/siena08.Rd
pkg/RSiena/src/model/ml/MLSimulation.cpp
pkg/RSiena/src/model/ml/NetworkChange.cpp
pkg/RSiena/src/model/variables/DependentVariable.cpp
pkg/RSiena/src/model/variables/NetworkVariable.cpp
pkg/RSiena/tests/parallel.R
pkg/RSiena/tests/parallel.Rout.save
pkg/RSienaTest/DESCRIPTION
pkg/RSienaTest/NAMESPACE
pkg/RSienaTest/R/iwlsm.R
pkg/RSienaTest/R/siena08.r
pkg/RSienaTest/R/sienaDataCreate.r
pkg/RSienaTest/R/sienaDataCreateFromSession.r
pkg/RSienaTest/R/sienaTimeTest.r
pkg/RSienaTest/changeLog
pkg/RSienaTest/doc/s_man400.tex
pkg/RSienaTest/man/RSiena-package.Rd
pkg/RSienaTest/man/iwlsm.Rd
pkg/RSienaTest/man/print.sienaMeta.Rd
pkg/RSienaTest/man/siena08.Rd
pkg/RSienaTest/src/model/ml/MLSimulation.cpp
pkg/RSienaTest/src/model/ml/NetworkChange.cpp
pkg/RSienaTest/src/model/variables/DependentVariable.cpp
pkg/RSienaTest/src/model/variables/NetworkVariable.cpp
pkg/RSienaTest/tests/parallel.R
pkg/RSienaTest/tests/parallel.Rout.save
Log:
Enhancements to siena08, ML for bipartite networks.
Modified: pkg/RSiena/DESCRIPTION
===================================================================
--- pkg/RSiena/DESCRIPTION 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/DESCRIPTION 2011-02-05 18:59:22 UTC (rev 134)
@@ -1,8 +1,8 @@
Package: RSiena
Type: Package
Title: Siena - Simulation Investigation for Empirical Network Analysis
-Version: 1.0.12.133
-Date: 2011-01-25
+Version: 1.0.12.134
+Date: 2011-02-05
Author: Various
Depends: R (>= 2.9.0), xtable
Imports: Matrix
Modified: pkg/RSiena/R/iwlsm.R
===================================================================
--- pkg/RSiena/R/iwlsm.R 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/R/iwlsm.R 2011-02-05 18:59:22 UTC (rev 134)
@@ -73,7 +73,7 @@
}
##@iwlsm.default iwlsm
iwlsm.default <-
- function(x, y, weights, ses, ..., w = rep(1, nrow(x)),
+ function(x, y, weights, ses, ..., w = rep(1/nrow(x), nrow(x)),
init = "ls", psi = psi.iwlsm,
scale.est = c("MAD", "Huber", "proposal 2"), k2 = 1.345,
method = c("M", "MM"), wt.method = c("inv.var", "case"),
@@ -146,6 +146,7 @@
} else stop("'init' method is unknown")
coef <- temp$coefficient
resid <- temp$residuals
+ hh <- hatvalues(lm(y ~ -1 + x, weights=w))
} else {
if(is.list(init)) coef <- init$coef
else coef <- init
@@ -193,11 +194,12 @@
}
}
## w <- psi(resid/scale)###
- w <- psi(resid, w=w, sj2=ses)
+ w <- psi(resid, w=w, sj2=ses, hh=hh)
if(!is.null(wt)) w <- w * weights
temp <- lm.wfit(x, y, w, method="qr")
coef <- temp$coefficients
resid <- temp$residuals ## w * res* res
+ hh <- hatvalues(lm(y ~ -1 + x, weights=w))
if(!is.null(test.vec)) convi <- irls.delta(testpv, get(test.vec))
else convi <- irls.rrxwr(x, w, resid)
conv <- c(conv, convi)
@@ -428,15 +430,15 @@
so$stddev^2 * so$cov.unscaled
}
##@psi.iwlsm iwlsm
-psi.iwlsm <- function(u, k, deriv=0, w, sj2)
+psi.iwlsm <- function(u, k, deriv=0, w, sj2, hh)
{
if (!deriv)
{
- v <- sum(w * u^2) / (1 - sum(w * w))
+ v <- sum(w * u^2) / (1 - sum(w * hh))
v1 <- max(0, v - weighted.mean(sj2, w))
ww <- 1 /(v1 + sj2)
ww / sum(ww)
- }
+ }
else ## dummy: I have removed the call with deriv = 1
{
rep(1, length(u))
Modified: pkg/RSiena/R/phase2.r
===================================================================
--- pkg/RSiena/R/phase2.r 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/R/phase2.r 2011-02-05 18:59:22 UTC (rev 134)
@@ -285,7 +285,7 @@
}
if (x$maxlike)
{
- z$phase2fras[subphase, ,z$nit] <- fra
+ # z$phase2fras[subphase, ,z$nit] <- fra
# z$rejectprops[subphase, , z$nit] <- zz$rejectprop
}
if (z$nit %% 2 == 1)
@@ -464,7 +464,7 @@
}
if (x$maxlike)
{
- z$phase2fras[subphase, ,z$nit] <- fra
+ # z$phase2fras[subphase, ,z$nit] <- fra
## z$rejectprops[subphase, , z$nit] <- zz$rejectprop
}
if (z$nit %% 2 == 1)
Modified: pkg/RSiena/R/siena08.r
===================================================================
--- pkg/RSiena/R/siena08.r 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/R/siena08.r 2011-02-05 18:59:22 UTC (rev 134)
@@ -90,6 +90,14 @@
x1 <- x[!is.na(x$theta) & !is.na(x$se) & x$se < bound,]
if (any(x1$theta != 0))
{
+ if (sum((x1$se < bound)) >= 3)
+ {
+ check.correl <- cor.test(x1$theta, x1$se)
+ }
+ else
+ {
+ check.correl <- data.frame(estimate=NA, p.value=NA)
+ }
regfit <- iwlsm(theta ~ 1, psi=psi.iwlsm, data=x1,
ses=x1$se^2)
regfit$terms <- NA
@@ -105,7 +113,9 @@
cjminus <- -2 * sum(pnorm(x1$theta / x1$se, log=TRUE))
cjplusp <- 1 - pchisq(cjplus, 2 * nrow(x1))
cjminusp <- 1 - pchisq(cjminus, 2 * nrow(x1))
- ret1 <- list(regfit=regfit, regsummary=regsummary,
+ ret1 <- list(cor.est=check.correl$estimate,
+ cor.pval=check.correl$p.value,
+ regfit=regfit, regsummary=regsummary,
Tsq=Tsq, pTsq=1 - pchisq(Tsq, nrow(x1) - 1),
tratio=tratio,
ptratio=2 * pnorm(abs(tratio), lower.tail=FALSE),
@@ -145,7 +155,7 @@
meta$thetadf <- mydf
class(meta) <- "sienaMeta"
meta$projname <- projname
- meta$bound <- 5
+ meta$bound <- bound
## count the score tests
meta$scores <- by(mydf, mydf$effects, function(x)
any(!is.na(x$scoretests)))
@@ -181,7 +191,7 @@
nProjects <- length(projnames)
effects <- unique(x$thetadf$effects)
nEffects <- length(effects)
-## results
+ ## results
## estimates
@@ -208,16 +218,39 @@
Report(c(" ", y$n1, " datasets used.\n\n"), sep="", outf)
if (y$n1 > 0)
{
- Report(c("\nTest that all parameters are 0 : \n"), outf)
+ Report("Test that estimates and standard errors are uncorrelated",
+ outf)
+ if (is.na(y$cor.est))
+ {
+ Report("\ncannot be performed.\n\n", outf)
+ }
+ else
+ {
+ Report(c(": \nPearson correlation =", format(round(y$cor.est, 4),
+ width=9),
+ ", two-sided ",reportp(y$cor.pval,3), "\n\n"), sep="",
+ outf)
+ }
+ Report(c("Test that all parameters are 0 : \n"), outf)
Report(c("chi-squared =", format(round(y$Tsq, 4), width=9),
", d.f. = ", y$n1, ", ",
reportp(y$pTsq, 3), "\n\n"), sep="", outf)
Report(c("Estimated mean parameter",
- format(round(y[[2]]$coefficients[1, 1], 4), width=9),
- " (s.e.", format(round(y[[2]]$coefficients[1, 2], 4),
+ format(round(y$regsummary$coefficients[1, 1], 4), width=9),
+ " (s.e.", format(round(y$regsummary$coefficients[1, 2], 4),
width=9), "), two-sided ",
- reportp(2 * pt(-abs(y[[2]]$coefficients[1, 3]),
- y$n1 - 1), 3), "\n\n"), sep="", outf)
+ reportp(2 * pt(-abs(y$regsummary$coefficients[1, 3]),
+ y$n1 - 1), 3), "\n"), sep="", outf)
+ Report(c("based on IWLS modification of Snijders & Baerveldt (2003). ",
+ "\n\n"), sep="", outf)
+ Report(c("Residual standard error",
+ format(round(y$regsummary$stddev, 4), width=9)), outf)
+ Report("\nTest that variance of parameter is 0 :\n", outf)
+ Report(c("Chi-squared = ", format(round(y$Qstat, 4), width=9),
+ " (d.f. = ", y$n1-1, "), ", reportp(y$pttilde, 3),
+ "\n"), sep="", outf)
+ Report(c("based on IWLS modification of Snijders & Baerveldt (2003). ",
+ "\n\n"), sep="", outf)
Report("Fisher's combination of one-sided tests\n", outf)
Report("----------------------------------------\n", outf)
Report("Combination of right one-sided p-values:\n", outf)
@@ -232,8 +265,8 @@
else
{
Report(c("There were no data sets satisfying the bounds for",
- "this parameter.\n No combined output is given.\n"), outf)
- }
+ "this parameter.\n No combined output is given.\n"), outf)
+ }
}, y=x)
##score tests
if (any(x$scores))
@@ -252,8 +285,9 @@
as.character(x$effects[1]), "\n"), sep="", outf)
tmp <- paste("Data set ", 1:nrow(x), ", ", format(x$projname),
" : z = ", ifelse(is.na(x$scoretests), "NA",
- format(round(x$scoretests, 4), width=12)),
- "\n", sep="")
+ format(round(x$scoretests, 4),
+ width=12)),
+ "\n", sep="")
Report(c(tmp, "\n"), sep="", outf)
Report("Combination of right one-sided p-values:\n", outf)
Report(c("Chi-squared = ", format(round(y$scoreplus, 4),
@@ -296,14 +330,14 @@
plot.sienaMeta <- function(x, ...)
{
library(lattice)
- tmp <- xyplot(se ~ theta|effects, data=x$thetadf, xlab="estimates",
- ylab="standard errors", layout=c(4,4),
- panel=function(x, y)
- {
- panel.xyplot(x, y)
- panel.abline(0, 2)
- panel.abline(0, -2)
- }, scales="free")
+ tmp <- xyplot(theta ~ se|effects, data=x$thetadf, ylab="estimates",
+ xlab="standard errors", layout=c(4,4),
+ panel=function(x, y)
+ {
+ panel.xyplot(x, y)
+ panel.abline(0, qnorm(0.025))
+ panel.abline(0, qnorm(0.975))
+ }, scales="free")
tmp[!sapply(tmp$y.limits, function(x)all(is.na(x)))]
}
@@ -397,7 +431,7 @@
}
Report(c("================================= SIENA08 ",
"================================================\n",
- "Multilevel use of Siena algorithms according to",
+ "Multilevel use of Siena algorithms according to ",
"Snijders & Baerveldt (2003) with extension\n",
"=================================================",
"=========================================\n\n"), sep="", outf)
@@ -423,9 +457,9 @@
{
Report("-> No extra output requested\n", outf)
}
- ### RSiena version
+ ## RSiena version
Report(c("\nThe RSiena Version of the first fit object is ",
- x$thetadf$version[1], ".\n\n"), sep="", outf)
+ x$thetadf$version[1], ".\n\n"), sep="", outf)
## project names
by(x$thetadf, x$thetadf$projname, function(x)
{
@@ -433,20 +467,23 @@
nrow(x), " parameters.\n"), sep="", outf)
Report(c("The number of valid score tests found was ",
sum(is.na(x$scoretests)), ".\n"),
- sep="",outf);
+ sep="", outf);
})
##parameters:
Report(c("\nA total of", nEffects, "parameters in", nProjects,
"projects :\n"), outf)
Report(paste(format(1:length(effects)), ". " , effects, "\n", sep=""),
- sep="", outf)
+ sep="", outf)
Report(c("\nThe projects contain the parameters as follows",
- "(1=present, 0=absent):\n\n"), outf)
+ "(1=present, 0=absent):\n\n"), outf)
row1 <- c(1:nEffects)
rows <- do.call(rbind, tapply(x$thetadf$effects,
- x$thetadf$projname, function(x){
- as.numeric(effects %in% x)
- }))
+ x$thetadf$projname, function(x)
+ {
+ as.numeric(effects %in% x)
+ }
+ )
+ )
rows <- format(rbind(row1, rows), width=3)
row2 <- rep(paste(rep("-", nchar(rows[1, 1])), collapse=""), nEffects)
rows <- rbind(rows[1,], row2, rows[-1, ])
@@ -469,7 +506,7 @@
format(round(max(abs(x$tconv)), 4), width=9), "\n"), outf)
## score tests
})
-## results
+ ## results
## estimates
Report(c("\n\n", paste(rep("=", 29), collapse=""),
@@ -501,25 +538,48 @@
{
if (extra)
{
- Report(c("Snijders-Baerveldt (2003) method of combining",
- "estimates"), outf)
- Report(c("\n---------------------------------------",
- "----------------\n"), sep="", outf)
+ Report(c("IWLS modification of Snijders-Baerveldt (2003) method ",
+ "of combining estimates"), outf)
+ Report(c("\n--------------------------------------------",
+ "---------------------------------\n"), sep="", outf)
Report(c("This method assumes that true parameters and",
" standard errors are uncorrelated.\n",
- "This can be checked from the plots.\n"), sep="",
- outf)
+ "This can be checked by the plot method ",
+ "and the test below.\n\n"), sep="", outf)
}
- Report(c("\nTest that all parameters are 0 : \n"), outf)
+ Report("Test that estimates and standard errors are uncorrelated",
+ outf)
+ if (is.na(y$cor.est))
+ {
+ Report("\ncannot be performed.\n\n", outf)
+ }
+ else
+ {
+ Report(c(": \nPearson correlation =", format(round(y$cor.est, 4),
+ width=9),
+ ", two-sided ",reportp(y$cor.pval,3), "\n\n"),
+ sep="", outf)
+ }
+ Report(c("Test that all parameters are 0 : \n"), outf)
Report(c("chi-squared =", format(round(y$Tsq, 4), width=9),
", d.f. = ", y$n1, ", ",
reportp(y$pTsq, 3), "\n\n"), sep="", outf)
Report(c("Estimated mean parameter",
- format(round(y[[2]]$coefficients[1, 1], 4), width=9),
- " (s.e.", format(round(y[[2]]$coefficients[1, 2], 4),
+ format(round(y$regsummary$coefficients[1, 1], 4), width=9),
+ " (s.e.", format(round(y$regsummary$coefficients[1, 2], 4),
width=9), "), two-sided ",
- reportp(pt(y[[2]]$coefficients[1, 3],
- y$n1 - 1), 3), "\n\n"), sep="", outf)
+ reportp(pt(y$regsummary$coefficients[1, 3],
+ y$n1 - 1), 3), "\n"), sep="", outf)
+ Report(c("based on IWLS modification of Snijders & Baerveldt (2003). ",
+ "\n\n"), sep="", outf)
+ Report(c("Residual standard error",
+ format(round(y$regsummary$stddev, 4), width=9)), outf)
+ Report("\nTest that variance of parameter is 0 :\n",outf)
+ Report(c("Chi-squared = ", format(round(y$Qstat, 4), width=9),
+ " (d.f. = ", y$n1-1, "), ", reportp(y$pttilde, 3),
+ "\n"), sep="", outf)
+ Report("based on IWLS modification of Snijders & Baerveldt (2003).",
+ "\n\n", sep="", outf)
Report("Fisher's combination of one-sided tests\n", outf)
Report("----------------------------------------\n", outf)
Report("Combination of right one-sided p-values:\n", outf)
@@ -534,8 +594,8 @@
else
{
Report(c("There were no data sets satisfying the bounds for",
- "this parameter.\n No combined output is given.\n"), outf)
- }
+ "this parameter.\n No combined output is given.\n"), outf)
+ }
}, y=x)
##score tests
if (any(x$scores))
@@ -553,9 +613,10 @@
Report(c("\n", "(", i, ") ",
as.character(x$effects[1]), "\n"), sep="", outf)
tmp <- paste("Data set ", 1:nrow(x), ", ", format(x$projname),
- " : z = ", ifelse(is.na(x$scoretests), "NA",
- format(round(x$scoretests, 4), width=12)),
- "\n", sep="")
+ " : z = ",
+ ifelse(is.na(x$scoretests), "NA",
+ format(round(x$scoretests, 4), width=12)),
+ "\n", sep="")
Report(c(tmp, "\n"), sep="", outf)
Report("Combination of right one-sided p-values:\n", outf)
Report(c("Chi-squared = ", format(round(y$scoreplus, 4),
@@ -570,6 +631,5 @@
}
}, y=x)
}
-
}
Modified: pkg/RSiena/R/sienaDataCreate.r
===================================================================
--- pkg/RSiena/R/sienaDataCreate.r 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/R/sienaDataCreate.r 2011-02-05 18:59:22 UTC (rev 134)
@@ -753,13 +753,13 @@
vals <- lapply(depvars[[i]], function(x)
c(x at x[!(is.na(x at x) |
x at x %in% c(10, 11))] , 0))
- attr(depvars[[i]], "range") <-
+ attr(depvars[[i]], "range2") <-
do.call(range, vals)
}
else
{
tmp <- depvars[[i]]
- attr(depvars[[i]], "range") <-
+ attr(depvars[[i]], "range2") <-
range(tmp[!(is.na(tmp) | tmp %in% c(10, 11))])
}
## average degree
@@ -903,7 +903,7 @@
disjoint <- namedVector(FALSE, pairsNames )
## identify any nets which may relate. These are those that
- ## share a node set and type.
+ ## share both node sets and type.
relates <- data.frame(name=names(z$depvars), type=types,
nodeSets=sapply(nodeSets, paste, collapse=","),
tn=paste(types, sapply(nodeSets, paste,
@@ -2077,16 +2077,17 @@
netNames <- names(z$depvars)
netTypes <- sapply(z$depvars, function(x)attr(x, "type"))
netActorSet <- sapply(z$depvars, function(x)
+ {
if (attr(x, "type") == "bipartite")
- {
- attr(x, "nodeSet")[2]
- }
+ {
+ attr(x, "nodeSet")[2]
+ }
else
- {
- attr(x, "nodeSet")
+ {
+ attr(x, "nodeSet")
+ }
}
)
- ## find the constant covariates
for (i in seq(along=z$cCovars))
{
nodeSet <- attr(z$cCovars[[i]], "nodeSet")
@@ -2160,7 +2161,7 @@
}
else
{
- dep <- depvar[, , i]
+ dep <- depvar[, , i, drop=FALSE]
dep[dep %in% c(10, 11)] <- dep[dep %in% c(10, 11)] - 10
}
vi <- apply(dep, 1, function(x)
Modified: pkg/RSiena/R/sienaDataCreateFromSession.r
===================================================================
--- pkg/RSiena/R/sienaDataCreateFromSession.r 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/R/sienaDataCreateFromSession.r 2011-02-05 18:59:22 UTC (rev 134)
@@ -569,6 +569,11 @@
"ActorSet"], " ")[[1]]
miss <- namesession$MissingValues
miss <- strsplit(miss, " ")
+ if (observations - 1 != nrow(namesession))
+ {
+ stop("observations and periods don't match ",
+ "for dyadic covariate")
+ }
if (namesession$Format[1] == "matrix")
{
myarray <- array(NA, dim=c(dim(namefiles[[1]]),
@@ -587,11 +592,6 @@
{
if (nrow(namesession) > 1)
{
- if (observations - 1 != nrow(namesession))
- {
- stop("observations and periods don't match",
- "for dyadic covariate")
- }
mylist <- vector("list", observations - 1)
nActors <-
as.numeric(strsplit(namesession$
Modified: pkg/RSiena/R/sienaTimeTest.r
===================================================================
--- pkg/RSiena/R/sienaTimeTest.r 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/R/sienaTimeTest.r 2011-02-05 18:59:22 UTC (rev 134)
@@ -555,6 +555,13 @@
# " for network effects of type eval or for RateX.")
# effects$timeDummy[!implemented] <- ","
# }
+ structuralRate <- effects$type == "rate" & effects$rateType %in% "structural"
+ if (any(effects$timeDummy[structuralRate] != ","))
+ {
+ warning("Time dummy effects are not implemented",
+ " for structural rate effects.")
+ effects$timeDummy[structuralRate] <- ","
+ }
behaviorNonRateX <- effects$netType =="behavior" & effects$type != "rate"
if (any(effects$timeDummy[behaviorNonRateX] != ","))
{
Modified: pkg/RSiena/changeLog
===================================================================
--- pkg/RSiena/changeLog 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/changeLog 2011-02-05 18:59:22 UTC (rev 134)
@@ -1,5 +1,23 @@
-2011-01-25 R-forge revision 133
- * changes to RSienaTest only
+2011-02-05 R-forge revision 134
+
+ * R/phase2.r, R/siena08.r, man/siena08.Rd, man/print.sienaMeta.Rd:
+ changes as in revision 133 copied to RSiena.
+ * R/siena08.r, man/siena08.Rd, man/print.sienaMeta.Rd: changes to
+ format of new code, reinstate object in summary method help page.
+ * R/iwlsm.r, man/iwlsm.Rd: correct calculation of variance estimate
+ * R/sienaDataCreate.r: minor amendments
+ * R/sienaDataCreateFromSession.r: message from siena01Gui if
+ changing dyadic covariates do not match number of observations.
+ * R/sienaTimeTest.r: message that timedummies are not implemented
+ for structural rate effects.
+ * src/model/ml/MLSimulation.cpp, src/model/ml/NetworkChange.cpp,
+ src/model/variables/NetworkVariable.cpp: changes for ML, should now run OK
+ for bipartite networks.
+ * src/model/variables/DependentVariable.cpp: added some error trapping.
+ * tests/parallel.R, tests/parallel.Rout.save: removed multiple
+ processes from tests as they were failing on R-forge.
+
+2011-01-25 R-forge revision 133 (RSienaTest only)
* R/phase2.r: comment out two test lines causing a crash of the ML
estimation when model specifications get so large that subphases
exceed 1000 iterations.
@@ -7,7 +25,7 @@
analysis.
* man/siena08.Rd: explain new features in help function
* man/print.sienaMeta.Rd: explain new features in help function
-
+
2011-01-17 R-forge revision 132
* Changing revision 131 to conform with coding standards
2011-01-17 R-forge revision 131
Modified: pkg/RSiena/inst/doc/s_man400.pdf
===================================================================
--- pkg/RSiena/inst/doc/s_man400.pdf 2011-01-24 23:35:15 UTC (rev 133)
+++ pkg/RSiena/inst/doc/s_man400.pdf 2011-02-05 18:59:22 UTC (rev 134)
@@ -505,19 +505,21 @@
(References)
endobj
348 0 obj <<
-/Length 1102
+/Length 1106
/Filter /FlateDecode
>>
stream
-xÚ}VKsÛ6¾ëWàÍ0@x´''±ÛdÆîÔVOI0EK¬ùP)*þ}Xкã\ì~ûú°'ÂÉoþÎúaµ¸¼¤ÓF²z"B¦LÚhaY*YÉWzëÚeªèÁÕËDò>uýòïÕ°Õ[¡ ÕÃç뻫¨7ñ¡S¦Ô«Úw]öûªk=cÜ[½Fyy#J½y¢S9IrÎ@ûðc ºe~Õô¾ÚÕåq3®$1,O5IRÎd*aµ4)í4¾bÂ=´Õ?knÌæ9&8@
-Haȵ¤¨Cߺ{ÂõPÎõ/Ë$9ýTî\?4eëSEM7TKA÷ËDÀ U±ÿî߸Pe½F]]r4.7µaÂо¸àçàúP¸I¹³9_¯6"tÎ×DrͤѤhÿ.d8ÄÿA0jGÁåM#ȧnñ'ücªÉ@®JC³Je¾Ü©L
-I¦llãÕã~è]1¼×/{bèJ"ÀPùµRO¼1¥³´ßxÎ_oÁUøó×;P5Úܶôsû½ÜÕæDôÔ-SC{ü¸nvU_xÑ,½+1¾xÎïúg<¸j]}ÜWû¹@EʲÓ@rX,Ó¢kv ÑPö(Øõݦw
-*
-[jtÉ/ÖzrÑã@(\ßW¥TvOTQ½g*¤yÀçÜ9{'´hº%ð®Ë:bùN±Êï!ùú ÖnÇ <¥E5zjO+Ö?GXWpǪvrâ1ÉY.ýf}l]SþÊU]tnërJ
-zÐñ"\·¯A:;?âçÐîç²WÌÏ}¯RÎ¥~"ø
-
ÕÕlù° özÞ!¸ °v===+ò[R©_gBðâùó:µÚV{\#m\è¾^ðýν5ñ,y¼¦·Ë2a²·Ë¾½]ùù©SHÌ3ÓKàÔåzơѧ¯¯àýÌÍ9T,×rTð/[ '¸ÞNSvxe%Ì*ã¡Óò·¯Ä©ÍèÎþ¢</sM<A8tqÝBÏ£lr£à¸Êf¶à¿å5Rά϶ÑÑi³ü·Oͯn?íkñEÒõuåÇØÀ|·ßn£íIÿ§é\Í7=7T^Ä)Óú÷×»»Pu-®j÷'± Å/}5eÄ)Ò0Ã.¤e"áûÑQýÖ
g¤¿ª=h^ÄÑaOR¼Äq~nÉLÒH$ UÁÑcÌe¿)ûTÄì²~Üö
-® C¹©#*;ûáf
"¦
-3¸Ä$±93&Åp¦Ã~\üêÄ¡
+xÚ}VÉrã6½ë+pªL
ÉÉ3c'*;K9Íä Q°ÄBRvô÷i,´E
+r6º_o
+Q´Cý² ¬Öë;&Q¥Cë'ÄxJx!År2Ö[ô
+ßfJ|4Õ2á4ÅOm·ükýت-D² ½ÕêëíÃMÔøP)òMíÅAÛ®/Û& g:«·(¯ï¸D,#<©3O¤&R DP¢YÀx<{0 {âV
ËCeOqE&"U(I)á)ë¥Nq[ãò¸USþ½
àfB`äBÀ
pî"ùϦOqpSnÂúû¿PÎíOË$ã±Ó
+µmâp®¨ðj0C¹d¸_&Î.þçpôpüN´Õ6X|n«Êîì$hÄ ]!5¤
+éç1í;¶ÝtGÓ¸
+)el6ëÛõÁ"DR
8U$ÍsTÔÜÿ^0jGÁõ]ÍÐvñü]bªÉA{¶r4É¥Ì\ÁSÍgQ Ó2¤t³éÎÃG-ËÏ &ÐÂÀ°ù¸\MÜ©²·ß© oaÊ S·kPÖÇ
+:èã¯Íírw&zj©Æ]ø¸eWá®åøÁirüê4Z·ëÃÁMcªS_ös²dç²`Ê~5°0¶>Gíàе»ÎÔAiØ_C Ð$ ¿ëy at -L×ÖJÛ£ãªLÁÈIïÈ
+i<@àr®ÇÉS°¨Û%0om±\M§XöÅ'_ÁÂmÂq O ÇE9zjÎ+Ö=GXSpÍÊfçs¢ÓdÀÈr\ºÍöÔº,Ü«Ú.i!ÝÆvêàBßÑäÆ}óÒÙÏ.äpñ(»]ýh;Eq©èzý²àê=
+ï*äWS9äÂÚ«yàÀíôô¢Èï!p)}n ÁçC`tÎ?Ìjk½/#ö¸FI\ß¹ðÁ÷÷VKB31ó~MoWÃ&;{¾ò÷ç°37 at U
+9f: ÜÊngjEhúö>®`fΡ$BñQ-¿îàz?MÙ+ËaVi÷ùÄg¼h»rsô$NóLá.ÊóR(làÍð¡ëzeí§~°õlÁ)}Ïk&%Ar5 ·ÞGGçÍrß.5·nL?íjâ6ÖtUéÆØÀ|·×n.ÆÚÿ5Êù¦ùU2{])C÷aç«£ÅM&û QüÚÃ`#` õcØï|Z:¾7äÔï@úë±ìAó*îö$ÅûHãæÏ8^E"ø«O¬ô6~0Ûng»« ²ËRüyß9*&vWETrñÛM£Ê@Aà£$ÀÎÈÊé°_ÿG¢k
endstream
endobj
347 0 obj <<
@@ -662,49 +664,49 @@
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [282.619 177.458 316.685 188.417]
+/Rect [282.619 177.414 316.685 188.372]
/A << /S /GoTo /D (cite.Snijders01) >>
>> endobj
340 0 obj <<
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [322.744 177.458 343.167 188.417]
+/Rect [322.744 177.414 343.167 188.372]
/A << /S /GoTo /D (cite.Snijders01) >>
>> endobj
341 0 obj <<
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [348.202 177.458 368.625 188.417]
+/Rect [348.202 177.414 368.625 188.372]
/A << /S /GoTo /D (cite.Snijders05) >>
>> endobj
342 0 obj <<
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [377.593 177.458 438.005 188.417]
+/Rect [377.593 177.414 438.005 188.372]
/A << /S /GoTo /D (cite.SnijdersEA07) >>
>> endobj
343 0 obj <<
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [444.064 177.458 464.487 188.417]
+/Rect [444.064 177.414 464.487 188.372]
/A << /S /GoTo /D (cite.SnijdersEA07) >>
>> endobj
344 0 obj <<
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [112.918 166.499 170.956 177.458]
+/Rect [112.918 166.455 170.956 177.414]
/A << /S /GoTo /D (cite.SnijdersEA10a) >>
>> endobj
345 0 obj <<
/Type /Annot
/Subtype /Link
/Border[0 0 0]/H/I/C[0 1 0]
-/Rect [175.828 166.499 196.252 177.458]
+/Rect [175.828 166.455 196.252 177.414]
/A << /S /GoTo /D (cite.SnijdersEA10a) >>
>> endobj
349 0 obj <<
@@ -3415,35 +3417,37 @@
/ProcSet [ /PDF /Text ]
>> endobj
759 0 obj <<
-/Length 3172
+/Length 3182
/Filter /FlateDecode
>>
stream
-xÚµÛÛÆõ=_¡æX³rxKP´¶Nk§XoIQp¥Y1Eª¼x½ßs¤(Û¤O99÷å¯v+õÃW¾ü¾¸ýêúñWZ«,Õíý*Í匿$ÖÊõêv»úůÖZ÷Cñ¡¨vWë0¼ÆÞÛÆVÛ^ýûöÇëWé*SYÄÆ_uªÂ4c?ïm/e×·ø>üÑQ¬oà=:ÿîõ÷oc
- S»CÏcÑáoê-ïóã±±"ïìtû¼ãGWAêÕ=|wµ;éò
-ÏöyÉOòj;=ZWuÃCݤ±¥ýpEãèÕ:5*"Ê:fF\Dz¿Ðap°Ý.,[9R¥=4 9$`Å¿ò^毴×Ô»&?¨«uf|ïÖa®j÷f!ç snD¬72â³p_el>^Õp¨Ì>qS ÅWi
-Ô»é»=¬bã½Q"ñ"ä]Uü¶µM+ð[|>ð³çê
âUàk&¼7#Eá£{Ôa"¢åduÅ £|^üêGþ|üôG'æ:~¶Ä:P¡FJüÄûé#ܽýl ͼVÅ·Cl
-ÈE
-ã/F.ñ¾³Ç¼éH©h.p ¾ëò®h»bÓ~(óÞö¿ú:¶å¿ùÛU.HùiìÜeßuÇo®¯TH[Ejû¨òêß_·
òës[¡¯´ ¦:Á&ðîò¶ØðrdW¸%5àL24¡WIÂRh-äÍ{>´}¬ò°È»X¼-y_P|Öê:KYzjÁA[¾ÃP{|ûÇÜ-Ýhï¢sbOãhı3åe±dð À+;êúÙ}ã½M½¶duÙwbî¥;çO<1;´»¨·÷§
£ÀÕ
-²d¤"a7 ü¬&wÍ\êPeÅ!"æÔxFnècpËÔÃÑæM9Ã] IûôjôD,ÞËwà5Ö,ÜòTEùɶE^ñcÈEU°{ÂLz«Û÷EEVIY:ºlÅÚ<QàMÐ
-aÈ!ÿX(tP,&öËOGÜQMÔ¥Ó7ÙÚ HBý%b,ÞÙs7Ã'ª¯]rß7\ c´G¾oS@¨6 tâÝxhÁíü;8 äOá¯gí%Rk vChoMÁäñèÜOí&ú«l+\`b´é!èÕñ8wΟ÷,Cª"ÁÙEÆCO3hÄFÀWOc¾¿Ã'TÁ/äÍj7[>f¦nÚñ WàÍ©rã'Çz½TL¸ì´ó
-À1ÅhïÕUj¸Ö§yÛ¸Ç-¹$,@PúvÃÀayµ·
ÐV¶`í":ô¥À^´5)ªg4zàO32l¡ÂÝ8Çs²©«¶ õüÈ}ÁÅ\±,9|ðïu{,ªºå
Á(NkçFáâl¸FÊÎ/w÷ÅêàÛOÒzþÐüAÁä9sÓõ`5!¡Y*Îà:Úl-ÿ¾èÙº1"R8IHd·ÃCëºnúIãúIÛuCC¹·åW¶¸:6õ4<o1_£ÉC=Ô9ÚãÌñ'pÖôUµÜj£UéÍ;,ZÓT%:µ¦&J<°À¼[oyÕíºßí
- 4RB}1Äz¯æWZ+¯Â2·@¼8Ãf⫪ÿYÁmÈ°fYCh¡W!ɨªÑ>LèÖ1ÜFa
+xÚµZYÛÈ~÷¯Pö¬6Ù¼v$>Nbo0`ìG긦H-ëߧ.R$E=çIÝÅfuW×õUQîb»p?>så÷åͳ«·Æ]h ð7w8Q®/¢P+7ÔÍâÇSÚ_®´öçÇì>+¶ËNeïleµÿ¹ùÛÕÛx¨$ôBdã.V:V~0w¶Èik|Öîà
TÆ5ðÿøîÍç\½Î©»EÏcÖàoìd5ÏÓá²ë,mì4»´áGÇ¥;eËd:>Ó²[Ù1Ù§®mÓ¤Åf¼´,,Ê û²Jes{¿y4(Çbå\ÞuÈnpeéþ&p˽mv°!pÙÈlÈínÓ³ D,øWÞKÃR;U¹Ò½Z®ã:7Ç~KÙ©ìÞÌd<bÉ\kÇqEE¸+ó¼D1@¯ª_aTb¯¸ÎàÄÇeì£Â¼Øs®Ûf£ÈuÞ+"ù|½HùXd¿mlUýf§Üã3í¼P/¯ò\íÂÐx¾ó~ (|tú NdB4¼GiVL0ÊåÁ¯nàÞãûçoñ¬ö¶jÓêÈàùèp
+
+4Ä>ÃÞïÁâÄùWõ|Ü9yiy1JióÚÒª!¥¢¹À¿_ø±I¬n²uýÄùÐþêêÐæ~þ
+îßnq)ßÊÃÎ]vMsøþêêááAÕÀ´V¤¶Ï*]«öÓUÙ"½:w¹ï»Jo¬S¸XßxÎmZgkì
+§¤IúÆw
+0Ij
<±úÄ6Ç"Ý<ÛÅÛçÅ>h-~!jg)sÏP:hËÕSj÷ã~=¹=ÐBÀ_ÒuQ4ËÙÓ0xa(¦|HÞ> #zaGºº¥ev"á>c>¡³.W¬²ÌÛͤÊ%`vÃéáíØiq)åàjY2"bW üF{M\êÂ¥FóóCÈãú®7§|zXúOòÓ´ªáBÎ8¤ÝKzö5z2ïÀáÀ;pÊ
kvyIª¢üdë,-ø±Çߧ¢*O=ar{/ëOYAVIY:¸lÅ°èiÜvq ìÓÏÙÇ yö$Ê3Ébb¿üt ÝÙɺtÜË&SQ{P±DÅ[{îæ¾ÿDã¶sîû 8F}àýÖj2GÞfÜÉ@`þ x{Ö^$XyÔk@;+
+&ÇC羸j;Ò_ak#@F^;§Î9÷¾BdHõÁ\4h\ô4Fnt8`ô<Öi¾nsñ;|B¸~!o´Úð2[UeUWtïOÈt<Þ«90Ñe¼9Ow¾ü1¦ Ä0Ö§i]ã\ A¾Mÿ xXílcÚÂf¬]d¾äÓëÀ¶$¥zFS î8#ÃÂîºsÜ©$벨3Pݹ/¸X¶}sÆÿQÖ¬(ëR^è"â´vnÝÂAðIâ6;¿ÞÝgÑÁõü¡ùFÁäKÓ´`!¾BçÐU4ÙXþ}Ù²u=gFrIþ(M~È8-'{Ò-îªA¨'MWOÚ¦éÊÍ<zÈ°DÀÑ¡*o¡àùrùýÜ×x8ÙîHÑ31ůãÌ´ª-ùÂT⨯L¯?"P)McioP rÀÓZvlºáQ³«Êv»ãSpÀ ê¨Óg}L ÷J~¥¶òJ&"s tä ÄF«@ÿ#³ÝP`Íw
+¡%Z
nHEöaüàtnÂnv Pð:»O³t$ø¨|X!Ó¿æP®ÔªZA\
º¤ZÁ=/WAèü!CMö ¨¯r®,ë§l2-7%Áå {åsÅ
+OÕÏ%½ùȼ×.î̯WýîÀzPKþ7ÖÔAU
=I¾üÅGKVÙ-Ü
+äÿ
+÷ A4ãEKáá5_Ñ%@ý]ÕÙm~ì_:}D*D¯3\°9H?8e²Éµ{J% PÛÈã^¯ë mMQ ÈlRH"SªyLÊ.ÊÖÿÔk¨¹Þ¼ôÌ˶ê.³®Ó#t¶K2Ø<go)G7ÒÖv#gÇÓRÐ&0L@« ½=%ò[q÷Ö¨Ïg£8GoçÊñÍ°¿5ÌhhÇ$Q:ø²xÊõýnÕ©MÛªöÔ¹ã
@Àß'õM¢¸±ó{k«°.LR6t`å?lq? Ç{F /r¾q|¥Ñ0¿Ð8Rn?¹oüä¤dmF×h¡Ã?Y,PC7^Ü
+~ÛnD©;zL{^}xss~Z¨ÄOºÓ^Í0´çzOÓ):Zo΢Õ(_½
+õðÄq¨¼Ó6XÇÌâÕή°ic¢
1;!`É{õÖûÔ¥}åç'c$(W÷þðÔÃÑ"` Y
Ë ^·¤8v £6B8ÊòÒ>9"Ã`fiÉåpu39¸ÒÀ¬|P§'
+6ñÐWaO:<VêQRf¤ ¤Ç.3^]_ýeØàðßlógêGnF'Fº7
¬¤ËëÞô<nãï¦kñÕS
JY)ÐpܨÄq:dÔµpjOáÐRÁ/J c²@\H²9Å8¿®§HÐé>ëÂÚö?)=AreëJر8ÔHeãç)Éìì++aÞB¡5èîOPJV@¥çt¯h#¢&¼ã.Ý\äã?3´«´[Ôt[ó¡
+¢>9Òõ'È£¯m½®²BÔÙwì¥ß²Î77p¼`h {Ù'³W ¥I4¶þæ]Ì´âëåá¢Ö'ÒÀðsÅ]d¨/Ä©l@K+IC8ÎëG¬>ä]Gìz#è3RpâZ®Î»Ie|!;õ¢^eÛEQ-©MNIT
+KL4çÛD¾L&xî*+W_[ADjfð¹7.Jg°ÓÖÊþâæü³£JzÇ¿aN8Ê 8mÄ¡P{äã{Û¶êÌïbÆò ÐtѲæÿ¯õXHÖ
->gyQòHßÚ5"ýk íJ«5ÄUèK5ÈùjÅÞo2Àäºð*çʺíx[È%óvS¼X §2#àBù\qq¤âS÷sIo!"´·#ò5F¿{°d×ÿE
-iϧ*{
-,üŤåkì¤ùËà¨aÍøåRxxâc z èxU[ÜÃK笯³Dųòe+ÜÅì$¤Ü2XKDDýR 0Ôwò¸â¦7pm(*M
-AdJ-¯S¹åØØVâ\a
-=×ë>"òºo0Û6ßY!ÁÙ.ñ`˽A¸H¤o9>ì1&Þ·µToÀ(2¬}íx-1ßJÝ[)>_TÎÁ$Ï+ñ|kÑ~×Y¦tôy/îÔiL×SUèirÇ ÞT¯È7P)~êý··MAµ.lr6t@í?°Øây ®\u at yQ²Äñ¡îɲ@ÓDùQúä¹!âJ%ÈÚ®£¢
zðdIp¸ñá^ äðÛ»cµæî°ÂYÙÛýôòí÷·çÔHea樽^@iϦSt´Á1D«I¿~ë1Åi¬Ó6¬SFñro7Wphb¢
5;a36Ø
-ÖÔ¥CDçè° ÊÕ?|êáhI°¬Âí ^·¤ 8u£B®pU9¤}sDÆ1;ÂÌÒËáénF¸ÒȬBPD g6ñ8TqÎ&<V"ßs6]f¼¾¹þËjãíM¬?!éÁH¢)os<ÇßñÕSJY)Ò Tâ:#r#S0ôÔð˨§ÒC;íX,P+_elN1.
-×S¤ÒéCáÂ\xºö?)=Qrc
-9tè%uBÙxqJr ;; ï¡ÑM÷gUJQA§X$×DÏ´ ©^õK7ÊÏ r ?3´¯t[âZÂD¦Çò±G!9óÍ{È£ßÙvÓG¨³¯ÙK¿&e_n¼hlPö²Îg¯0PfÉÔ2øN1óW¬\ÔG,µ>FÆï+î"2¨:°â
8õ- `y#i×e[ój[´ÇÒMäÀ®·r>#E' å¦ãåb¸uƲ A2(°î»#UQÔKjSRÆÍù5I¨3É#ÒÝUçë+#º
zÃy0.JgpÓÎÊýâæüg¤JzÏ¿£:Âêh3FÅé"Pµ'~4Û®/3¿+FÓGËXý¿2Ö§B²Vи¸üÅÓ¤T ë&Mø[rþ©ìÃ'¨@ÍQ KB;®L|¶ÁÕ6§côEY
-ê
-
-¹TÈþd³¯.F£dKÿ¿Ró&ï»g¼"ë8;××Ã&>ôí²;±ùþÉûCÎý%t°ÛøB8A_ñãQ¡º4ÃJÎìROÐW0ù'ç@ÜP!WØiÒ²²4DËßSNÆÇ»kUeoILx¿"ÀGw9ª7ô~ïJ°¹'2÷M}Xæá·séC¸·Ã±C7£FIÕvìèâHϽ㣰ÔkEÁkã³á@gÀ>î°Kj Å wd@[àÔͶrv7?~?£I'_ݤpBÈèãLÓøåv".6 S:6úK¤Ô{yóü-ã+r¥ÕPåné2ɬeìtÞ ¢ hɼ$iøöü¥Á¨ÊÆ%9Ééôt¥EÆI
7:Ì!
-ÀñEÆÖÊ
-Sà¤ó
-XÔ6[ôÕRÕ²[oÅïúÝ3ÛGÛNºá?mAЦ¨6Ø|ÿ>a.óæT~6ËÓòö÷eµ×ãrÙDc`md¡üXi7ö%¿ljüÊx(Ä>SLƦhféi|¦Ðêð4î²Má=ÂÎcÚä5Ä ):éx`¡èd$TA³ë¹Æ&<V®Vÿô;iGÆYì¦môJ§xN¦#¥MSûÕÿ ÌÓ®
+n%ñ41aÝÄKRÊ?
}`úè¨8ã±uîP+F_D>¸z_æ4Ìþ!Ësa]`A´.²¿úFEÉä«eLA2
+¥þ_ç<IÛ¦ÄïÂáIdgë*áÒâ0 O ¾}PvÇ%v-ß?y¾O¹¾$@óq¸
+/ÔHÀô~-WÌ
[TRUNCATED]
To get the complete diff run:
svnlook diff /svnroot/rsiena -r 134
More information about the Rsiena-commits
mailing list