[r-cran-matchit] 04/45: Import Upstream version 1.0-2

Andreas Tille tille at debian.org
Fri Oct 20 06:17:18 UTC 2017


This is an automated email from the git hooks/post-receive script.

tille pushed a commit to branch master
in repository r-cran-matchit.

commit 3a3db294197a1dfe16dd054ada1901232ecff0bf
Author: Andreas Tille <tille at debian.org>
Date:   Fri Oct 20 07:40:50 2017 +0200

    Import Upstream version 1.0-2
---
 DESCRIPTION            | 6 +++---
 R/distance.R           | 2 +-
 R/matchdef.R           | 5 +++++
 R/subclassify.R        | 2 +-
 R/summary.matchit.R    | 7 +++++--
 demo/00Index           | 6 +++---
 man/diagnose.Rd        | 2 +-
 man/distance.Rd        | 2 +-
 man/exactmatch.Rd      | 2 +-
 man/help.matchit.Rd    | 2 +-
 man/match.data.Rd      | 2 +-
 man/matchdef.Rd        | 2 +-
 man/matchit.Rd         | 2 +-
 man/neyman.Rd          | 2 +-
 man/plot.matchit.Rd    | 2 +-
 man/print.matchit.Rd   | 2 +-
 man/subclassify.Rd     | 2 +-
 man/summary.matchit.Rd | 2 +-
 man/summary.neyman.Rd  | 2 +-
 19 files changed, 31 insertions(+), 23 deletions(-)

diff --git a/DESCRIPTION b/DESCRIPTION
index 325109c..b5f700d 100644
--- a/DESCRIPTION
+++ b/DESCRIPTION
@@ -1,6 +1,6 @@
 Package: MatchIt
-Version: 1.0-1
-Date: 2005-1-3
+Version: 1.0-2
+Date: 2005-8-10
 Title: MatchIt: Nonparametric Preprocessing for Parametric Casual Inference
 Author: Daniel Ho <daniel.ho at yale.edu>,
         Kosuke Imai <kimai at Princeton.Edu>, 
@@ -16,4 +16,4 @@ Description:  MatchIt selects matched samples of the
   a variety of other matching procedures.
 License: GPL version 2 or newer
 URL: http://gking.harvard.edu/matchit
-Packaged: Thu Jan  6 13:44:52 2005; estuart
+Packaged: Wed Aug 10 14:48:40 2005; kimai
diff --git a/R/distance.R b/R/distance.R
index bac2983..adde38a 100644
--- a/R/distance.R
+++ b/R/distance.R
@@ -41,7 +41,7 @@ distance <- function(formula, model="logit", data,
     else if(model=="nnet"){
       require(nnet)
       mf[[1]] <- as.name("nnet.formula")
-      mf$size <- 3  #is this the right default setting?
+      if(is.null(mf$size)){mf$size <- 3}  # default setting?
       res <- eval(as.call(mf),sys.frame(sys.parent()))
       if(a==0){
         pscore <- as.vector(fitted(res))
diff --git a/R/matchdef.R b/R/matchdef.R
index 8af675a..a0cc5aa 100644
--- a/R/matchdef.R
+++ b/R/matchdef.R
@@ -33,6 +33,11 @@ matchdef <-  function(formula, in.sample, pscore, nearest = TRUE,
   
   ## optimal ratio matching
   if (m.order==1) {
+    check <- library()
+    if(any(check$results[,"Package"] == "optmatch"))
+      require(optmatch)
+    else
+      stop("Please install optmatch using \n     install.packages(\"optmatch\", contriburl= \"http://www.stat.lsa.umich.edu/~bbh/optmatch\")")
     cat("Optimal Matching Treated: ")
     distance <- matrix(0, ncol=n0, nrow=n1)
     rownames(distance) <- row.names(treata)[treat==1]
diff --git a/R/subclassify.R b/R/subclassify.R
index 550fb08..061fd99 100644
--- a/R/subclassify.R
+++ b/R/subclassify.R
@@ -54,7 +54,7 @@ subclassify <- function(formula,data,in.sample,pscore,nearest=TRUE,
     q <- NULL
     if(counter){cat("Done\n")}
   }
-  else if(subclass) {
+  else if(any(subclass>0)){
     if(counter){cat("Subclassifying...")}  
     n <- length(treat)
     if(nearest){
diff --git a/R/summary.matchit.R b/R/summary.matchit.R
index 4dbd586..473aa67 100644
--- a/R/summary.matchit.R
+++ b/R/summary.matchit.R
@@ -38,8 +38,11 @@ summary.matchit <- function(object, verbose=F, sig=2, ...) {
       if(sum(tt==1)<2|(sum(tt==0)<2)){
         xsum[c(1,2),c(3,4,5)] <- NA
       } else {
-        xsum[1,3] <- sd(xx,na.rm=T) 
-        xsum[1,4] <- -1*t.test(xx~tt)$sta
+        xsum[1,3] <- sd(xx,na.rm=T)
+        if (sd(xx)>0)
+          xsum[1,4] <- -1*t.test(xx~tt)$sta
+        else
+          xsum[1,4] <- NaN
         xsum[1,5] <- (mean(x1,na.rm=T)-mean(x0,na.rm=T))/sd(x1,na.rm=T)
         xsum[2,3] <- sqrt(weighted.var(xx[ww>0],ww[ww>0]))
         xsum[2,4] <- t.test.wtd(xx[ww>0],tt[ww>0],ww[ww>0])
diff --git a/demo/00Index b/demo/00Index
index 8a58bec..2c474f2 100644
--- a/demo/00Index
+++ b/demo/00Index
@@ -1,3 +1,3 @@
-lalonde		General examples of MatchIt methods, using Lalonde dataset
-analysis	Demo of analysis procedures to estimate treatment effects
-diagnose	Demo of how to diagnose a propensity score model
+analysis	Methods for analysis of outcome using matched samples
+diagnose	Propensity score specification procedure
+lalonde		Examples of matching methods, using National Supported Work demonstration data
diff --git a/man/diagnose.Rd b/man/diagnose.Rd
index 8121ac1..009bc9a 100644
--- a/man/diagnose.Rd
+++ b/man/diagnose.Rd
@@ -70,7 +70,7 @@ process.  Each weight is proportional to the number of times that unit was match
 }
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/distance.Rd b/man/distance.Rd
index 4364841..04df0e3 100644
--- a/man/distance.Rd
+++ b/man/distance.Rd
@@ -62,7 +62,7 @@ common support restrictions with \code{discard}.}
 
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/exactmatch.Rd b/man/exactmatch.Rd
index c09d4ea..60b978f 100644
--- a/man/exactmatch.Rd
+++ b/man/exactmatch.Rd
@@ -44,7 +44,7 @@ categories of the variables in \code{formula}.} }
 }
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/help.matchit.Rd b/man/help.matchit.Rd
index 957fdcf..fc9a481 100644
--- a/man/help.matchit.Rd
+++ b/man/help.matchit.Rd
@@ -27,7 +27,7 @@ help.matchit(object)
 
                                                                                                                                                              
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/match.data.Rd b/man/match.data.Rd
index c7eda3b..a7281c7 100644
--- a/man/match.data.Rd
+++ b/man/match.data.Rd
@@ -30,7 +30,7 @@ See the \code{matchit} documentation for more details.}
   \url{http://gking.harvard.edu/matchit}.}
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/matchdef.Rd b/man/matchdef.Rd
index f5c78e2..821fa4e 100644
--- a/man/matchdef.Rd
+++ b/man/matchdef.Rd
@@ -70,7 +70,7 @@ common support restrictions with \code{discard}.} }
 }
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/matchit.Rd b/man/matchit.Rd
index 7df07a6..69f81fd 100644
--- a/man/matchit.Rd
+++ b/man/matchit.Rd
@@ -131,7 +131,7 @@ Unmatched units have subclass=0.}
 }
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/neyman.Rd b/man/neyman.Rd
index d6f5c04..6846ff5 100644
--- a/man/neyman.Rd
+++ b/man/neyman.Rd
@@ -40,7 +40,7 @@ of that estimate.} }
   \url{http://gking.harvard.edu/matchit}.}
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/plot.matchit.Rd b/man/plot.matchit.Rd
index 0cf8529..27ff439 100644
--- a/man/plot.matchit.Rd
+++ b/man/plot.matchit.Rd
@@ -32,7 +32,7 @@ estimate graphs of any covariates, and density estimate graphs of any covariates
 }
   
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/print.matchit.Rd b/man/print.matchit.Rd
index 591c692..506afc8 100644
--- a/man/print.matchit.Rd
+++ b/man/print.matchit.Rd
@@ -29,7 +29,7 @@ subclass).} }
   \url{http://gking.harvard.edu/matchit}.}
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/subclassify.Rd b/man/subclassify.Rd
index 264d86d..99c2e21 100644
--- a/man/subclassify.Rd
+++ b/man/subclassify.Rd
@@ -70,7 +70,7 @@ Unmatched units have subclass=0.}
 }
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/summary.matchit.Rd b/man/summary.matchit.Rd
index 08c7098..adae6df 100644
--- a/man/summary.matchit.Rd
+++ b/man/summary.matchit.Rd
@@ -58,7 +58,7 @@ for each subclass.}
   \url{http://gking.harvard.edu/matchit}.}
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 
diff --git a/man/summary.neyman.Rd b/man/summary.neyman.Rd
index 18134f9..9a9fa62 100644
--- a/man/summary.neyman.Rd
+++ b/man/summary.neyman.Rd
@@ -37,7 +37,7 @@ treatment effect.} }
   \url{http://gking.harvard.edu/matchit}.}
 
 \author{
-  Daniel Ho <\email{deho at fas.harvard.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
+  Daniel Ho <\email{daniel.ho at yale.edu}>;  Kosuke Imai <\email{kimai at princeton.edu}>; Gary King
   <\email{king at harvard.edu}>; Elizabeth Stuart<\email{stuart at stat.harvard.edu}>
 }
 

-- 
Alioth's /usr/local/bin/git-commit-notice on /srv/git.debian.org/git/debian-science/packages/r-cran-matchit.git



More information about the debian-science-commits mailing list