[Distr-commits] r448 - branches/distr-2.2/pkg/SweaveListingUtils branches/distr-2.2/pkg/distr branches/distr-2.2/pkg/distr/R branches/distr-2.2/pkg/distr/chm branches/distr-2.2/pkg/distrDoc branches/distr-2.2/pkg/distrEx branches/distr-2.2/pkg/distrEx/R branches/distr-2.2/pkg/distrMod branches/distr-2.2/pkg/distrSim branches/distr-2.2/pkg/distrTEst branches/distr-2.2/pkg/distrTeach branches/distr-2.2/pkg/startupmsg pkg/SweaveListingUtils pkg/distr/chm pkg/distrDoc pkg/distrEx pkg/distrMod pkg/distrSim pkg/distrTEst pkg/distrTeach pkg/startupmsg

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Tue Mar 31 18:43:38 CEST 2009


Author: ruckdeschel
Date: 2009-03-31 18:43:38 +0200 (Tue, 31 Mar 2009)
New Revision: 448

Modified:
   branches/distr-2.2/pkg/SweaveListingUtils/DESCRIPTION
   branches/distr-2.2/pkg/distr/DESCRIPTION
   branches/distr-2.2/pkg/distr/R/ContDistribution.R
   branches/distr-2.2/pkg/distr/R/DiscreteDistribution.R
   branches/distr-2.2/pkg/distr/R/UnivarMixingDistribution.R
   branches/distr-2.2/pkg/distr/chm/Distr.chm
   branches/distr-2.2/pkg/distrDoc/DESCRIPTION
   branches/distr-2.2/pkg/distrEx/DESCRIPTION
   branches/distr-2.2/pkg/distrEx/R/Functionals.R
   branches/distr-2.2/pkg/distrEx/R/Kurtosis.R
   branches/distr-2.2/pkg/distrMod/DESCRIPTION
   branches/distr-2.2/pkg/distrSim/DESCRIPTION
   branches/distr-2.2/pkg/distrTEst/DESCRIPTION
   branches/distr-2.2/pkg/distrTeach/DESCRIPTION
   branches/distr-2.2/pkg/startupmsg/DESCRIPTION
   pkg/SweaveListingUtils/DESCRIPTION
   pkg/distr/chm/Distr.chm
   pkg/distrDoc/DESCRIPTION
   pkg/distrEx/DESCRIPTION
   pkg/distrMod/DESCRIPTION
   pkg/distrSim/DESCRIPTION
   pkg/distrTEst/DESCRIPTION
   pkg/distrTeach/DESCRIPTION
   pkg/startupmsg/DESCRIPTION
Log:
svn-revision-tags in all DESCRIPTION files
branches/distr-2.2
distr: UnivarMixingDistribution enhanced Conv2newVersion
       enhanced abs() for ContDistribution / DiscreteDistribution
 

Modified: branches/distr-2.2/pkg/SweaveListingUtils/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/SweaveListingUtils/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/SweaveListingUtils/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -13,3 +13,5 @@
 Maintainer: Peter Ruckdeschel <Peter.Ruckdeschel at itwm.fraunhofer.de>
 License: LGPL-3
 Date: 2009-03-19
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: branches/distr-2.2/pkg/SweaveListingUtils/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distr/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distr/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distr/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -12,3 +12,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: branches/distr-2.2/pkg/distr/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distr/R/ContDistribution.R
===================================================================
--- branches/distr-2.2/pkg/distr/R/ContDistribution.R	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distr/R/ContDistribution.R	2009-03-31 16:43:38 UTC (rev 448)
@@ -256,8 +256,9 @@
        upper <- getUp(object, eps = getdistrOption("TruncQuantile")*2)
        #lower <- 0 ; upper <- 8
        dist <- upper - lower
-       grid <- seq(from = lower - 0.1 * dist, to = upper + 0.1 * dist, 
-                          length = ngrid) 
+       low1 <- max(q(object)(0),lower-0.1*dist)
+       upp1 <- min(q(object)(1),upper+0.1*dist)
+       grid <- seq(from = low1, to = upp1, length = ngrid) 
        dxg <- d(object)(grid)
        
        ix <-  1:ngrid
@@ -427,11 +428,78 @@
 
 ## exact: abs for absolutly continuous distributions
 setMethod("abs", "AbscontDistribution",
-          function(x){
-            if (.isEqual(p(x)(0),0)) return(x)
-            rnew <- function(n, ...){}
-            body(rnew) <- substitute({ abs(g(n, ...)) },
-                                         list(g = x at r))
+    function(x){
+       if (.isEqual(p(x)(0),0)) return(x)
+       rnew <- function(n, ...){}
+       body(rnew) <- substitute({ abs(g(n, ...)) }, list(g = x at r))
+       
+       isSym0 <- FALSE
+       if(is(Symmetry(x),"SphericalSymmetry"))
+          if(.isEqual(SymmCenter(Symmetry(x)),0))
+             isSym0 <- TRUE  
+       
+       if(isSym0){
+          if (is.null(gaps(x)))
+              gapsnew <- NULL
+          else {gapsnew <- gaps[gaps[,2]>=0,]
+                VZW <- gapsnew[,1] <= 0 
+                gapsnew[VZW,1] <- 0
+                gapsnew <- .consolidategaps(gapsnew)}
+          dOx <- d(x)
+
+          dxlog <- if("log" %in% names(formals(dOx))) 
+                        quote({dOx(x, log = TRUE)})
+                   else quote({log(dOx(x))})
+          pxlog <- if("log.p" %in% names(formals(p(x))) && 
+                       "lower.tail" %in% names(formals(p(x)))) 
+                        quote({p(x)(q, lower.tail = FALSE, log.p = TRUE)})
+                   else
+                        quote({log(1-p(x)(q))})
+
+          qxlog <- if("lower.tail" %in% names(formals(q(x)))) 
+                          quote({qx <- if(lower.tail)
+                                          q(x)((1+p1)/2)
+                                       else
+                                          q(x)(p1/2,lower.tail=FALSE)}) 
+                      else
+                          quote({qx <- q(x)(if(lower.tail) (1+p1)/2 else 1-p1/2)})
+          if("lower.tail" %in% names(formals(q(x)))&& 
+             "log.p" %in% names(formals(q(x))))           
+              qxlog <- quote({qx <- if(lower.tail) q(x)((1+p1)/2)
+                                       else
+                                          q(x)(if(log.p)p-log(2)
+                                               else p1/2,lower.tail=FALSE,log.p=log.p)}) 
+          dnew <- function(x, log = FALSE){}
+          body(dnew) <- substitute({
+                    dx <- (dxlog0 + log(2))*(x>=0)
+                    if (!log) dx <- exp(dx)
+                    dx[x<0] <- if(log) -Inf else 0
+                    return(dx)
+                    }, list(dxlog0 = dxlog))
+            
+          pnew <- function(q, lower.tail = TRUE, log.p = FALSE){}
+          body(pnew) <- substitute({
+                    if (!lower.tail){
+                        px <- (log(2) + pxlog0)*(q>=0)
+                        if(!log.p) px <- exp(px)
+                    }else{
+                        px <- pmax(2 * p(x)(q) - 1,0)
+                        if(log.p) px <- log(px)
+                    }
+                    return(px)            
+            }, list(pxlog0 = pxlog))
+
+          qnew <- function(p, lower.tail = TRUE, log.p = FALSE){}
+          body(qnew) <- substitute({
+                   p1 <- if(log.p) exp(p) else p 
+                   qxlog0
+                   qx[p1<0] <- NaN
+                   if (any((p1 < -.Machine$double.eps)|(p1 > 1+.Machine$double.eps)))
+                   warning(gettextf("q method of %s produced NaN's ", objN))
+                   return(qx)
+            }, list(qxlog0 = qxlog, objN= quote(.getObjName(1))))
+                   
+       }else{
             if (is.null(gaps(x)))
                 gapsnew <- NULL
             else {VZW <- gaps(x)[,1] <= 0 & gaps(x)[,2] >= 0
@@ -458,12 +526,19 @@
                     return(dx)
             }
             
-            pnew <- function(q, lower.tail = TRUE, log.p = FALSE){
-                    px <- (q>=0) * (p(x)(q) - p(x)(-q))                    
-                    if (!lower.tail) px <- 1 - px
+            pxlow <- if("lower.tail" %in% names(formals(p(x))))
+                        substitute({p(x)(q, lower=FALSE)})
+                   else
+                        substitute({1-p(x)(q)})
+
+            pnew <- function(q, lower.tail = TRUE, log.p = FALSE){}
+            body(pnew) <- substitute({
+                    px <- if (lower.tail)
+                            (q>=0) * (p(x)(q) - p(x)(-q))                    
+                          else pxlow0 + p(x)(-q)
                     if (log.p) px <- log(px)
                     return(px)
-            }
+            }, list(pxlow0 = pxlow))
 
             px.l <- pnew(x.g + 0.5*h)
             px.u <- pnew(x.g + 0.5*h, lower.tail = FALSE)
@@ -472,14 +547,18 @@
 
             qnew <- .makeQNew(x.g + 0.5*h, px.l, px.u,
                               notwithLLarg = FALSE,  lower, yR)
+    
+            lowerExact <- FALSE
+ 
+    }
+    object <- AbscontDistribution( r = rnew, p = pnew, q = qnew, d = dnew, 
+                     gaps = gapsnew,  .withSim = x at .withSim, .withArith = TRUE,
+                     .lowerExact = .lowerExact(x), .logExact = FALSE)
+    object
+    })
+aN=abs(N)
+q(aN)(-35,log=T,lower=F)
 
-            object <- AbscontDistribution( r = rnew, p = pnew,
-                           q = qnew, d = dnew, gaps = gapsnew, 
-                           .withSim = x at .withSim, .withArith = TRUE,
-                           .lowerExact = .lowerExact(x), .logExact = FALSE)
-            object
-          })
-
 ## exact: exp for absolutly continuous distributions
 setMethod("exp", "AbscontDistribution",
            function(x) .expm.c(x))

Modified: branches/distr-2.2/pkg/distr/R/DiscreteDistribution.R
===================================================================
--- branches/distr-2.2/pkg/distr/R/DiscreteDistribution.R	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distr/R/DiscreteDistribution.R	2009-03-31 16:43:38 UTC (rev 448)
@@ -360,16 +360,86 @@
                        Dirac(lc)})
 
 ## exact: abs for discrete distributions
-setMethod("abs", "DiscreteDistribution",
-          function(x){
+setMethod("abs", "DiscreteDistribution",function(x){
+       
+       rnew <- function(n, ...){}
+       body(rnew) <- substitute({ abs(g(n, ...)) },
+                                      list(g = x at r))
+       
+       xx <- x
+       supportnew <- support(x)
+       
+       isSym0 <- FALSE
+       if(is(Symmetry(x),"SphericalSymmetry"))
+          if(.isEqual(SymmCenter(Symmetry(x)),0))
+             isSym0 <- TRUE  
+       
+       if(isSym0){
+          supportnew <- supportnew[supportnew>=0]
+       
+          .lowerExact = .lowerExact(x)
+
+          dxlog <- if("log" %in% names(formals(d(x)))) 
+                        quote({dx <- d(xx)(x, log = TRUE)})
+                   else quote({dx <-  log(d(xx)(x))})
+          pxlog <- if("log.p" %in% names(formals(p(x))) && 
+                       "lower.tail" %in% names(formals(p(x)))) 
+                        quote({p(x)(q, lower.tail = FALSE, log.p = TRUE)})
+                   else
+                        quote({log(1-p(x)(q))})
+
+
+          qxlog <- if("lower.tail" %in% names(formals(q(x)))) 
+                          quote({qx <- if(lower.tail)
+                                          q(x)((1+p1)/2)
+                                       else
+                                          q(x)(p1/2,lower.tail=FALSE)}) 
+                      else
+                          quote({qx <- q(x)(if(lower.tail) (1+p1)/2 else 1-p1/2)})
+          if("lower.tail" %in% names(formals(q(x)))&& 
+             "log.p" %in% names(formals(q(x))))           
+              qxlog <- quote({qx <- if(lower.tail) q(x)((1+p1)/2)
+                                       else
+                                          q(x)(if(log.p)p-log(2)
+                                               else p1/2,lower.tail=FALSE,log.p=log.p)}) 
+
+
+          dnew <- function(x, log = FALSE){}
+          body(dnew) <- substitute({
+                    dxlog0
+                    dx[x>0] <- dx+log(2)
+                    if (!log) dx <- exp(dx)
+                    dx[x<0] <- if(log) -Inf else 0
+                    return(dx)
+                    }, list(dxlog0 = dxlog))
+            
+          pnew <- function(q, lower.tail = TRUE, log.p = FALSE){}
+          body(pnew) <- substitute({
+                    if (!lower.tail){
+                        px <- (log(2) + pxlog0)*(q>=0)
+                        if(!log.p) px <- exp(px)
+                    }else{
+                        px <- pmax(2 * p(x)(q) - 1,0)
+                        if(log.p) px <- log(px)
+                    }
+                    return(px)            
+            }, list(pxlog0 = pxlog))
+
+          qnew <- function(p, lower.tail = TRUE, log.p = FALSE){}
+          body(qnew) <- substitute({
+                   p1 <- if(log.p) exp(p) else p
+                   qxlog0
+                   qx[p1<0] <- NaN
+                   if (any((p1 < -.Machine$double.eps)|(p1 > 1+.Machine$double.eps)))
+                   warning(gettextf("q method of %s produced NaN's ", objN))
+                   return(qx)
+            }, list(qxlog0 = qxlog, objN= quote(.getObjName(1))))
+
+       }else{
             if (.isEqual(p.l(x)(0),0)) return(x)
-            rnew <- function(n, ...){}
-            body(rnew) <- substitute({ abs(g(n, ...)) },
-                                         list(g = x at r))
 
-            supportnew <- sort(unique(abs(support(x))))
+            supportnew <- sort(unique(abs(supportnew)))
 
-            xx <- x
             dnew <- function(x, log = FALSE){
                     o.warn <- getOption("warn"); options(warn = -1)
                     on.exit(options(warn=o.warn))
@@ -377,28 +447,36 @@
                     options(warn = o.warn)
                     if (log) dx <- log(dx)
                     return(dx)
-            }
+                 }
             
-            pnew <- function(q, lower.tail = TRUE, log.p = FALSE){
-                    px <- (q>=0) * (p(x)(q) - p.l(x)(-q))                    
-                    if (!lower.tail) px <- 1 - px
+            pxlow <- if("lower.tail" %in% names(formals(p(x)))) 
+                        substitute({p(x)(q, lower=FALSE)})
+                   else
+                        substitute({1-p(x)(q)})
+
+            pnew <- function(q, lower.tail = TRUE, log.p = FALSE){}
+            body(pnew) <- substitute({
+                    px <- if (lower.tail)
+                            (q>=0) * (p(x)(q) - p.l(x)(-q))                    
+                          else pxlow0 + p.l(x)(-q)
                     if (log.p) px <- log(px)
                     return(px)
-            }
+            }, list(pxlow0=pxlow))
 
             prob <- dnew(supportnew)
             
             qnew <- .makeQNew(supportnew, cumsum(prob), 
                             rev(cumsum(rev(prob))), notwithLLarg = x at .withSim, 
                             min(supportnew), max(supportnew), Cont = FALSE)
+            
+         }
+         object <- new("DiscreteDistribution", r = rnew, p = pnew,
+                        q = qnew, d = dnew, support = supportnew, 
+                        .withSim = x at .withSim, .withArith = TRUE,
+                        .lowerExact = .lowerExact(x))
+         object
+})
 
-            object <- new("DiscreteDistribution", r = rnew, p = pnew,
-                           q = qnew, d = dnew, support = supportnew, 
-                           .withSim = x at .withSim, .withArith = TRUE,
-                           .lowerExact = .lowerExact(x))
-            object
-          })
-
 ## exact: abs for discrete distributions
 setMethod("exp", "DiscreteDistribution",
            function(x) .expm.d(x))

Modified: branches/distr-2.2/pkg/distr/R/UnivarMixingDistribution.R
===================================================================
--- branches/distr-2.2/pkg/distr/R/UnivarMixingDistribution.R	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distr/R/UnivarMixingDistribution.R	2009-03-31 16:43:38 UTC (rev 448)
@@ -107,18 +107,36 @@
 setMethod(".lowerExact", "UnivarMixingDistribution", function(object){ 
              er <- is(try(slot(object, ".lowerExact"), silent = TRUE), "try-error")
              if(er){ object0 <- conv2NewVersion(object)
-                    eval.parent(substitute(object<-object0))
-                    return(invisible(NULL))}
+                     objN <- paste(substitute(object))
+                     warning(gettextf("'%s' was generated in an old version of this class.\n",
+                                     objN),
+                            gettextf("'%s' has been converted to the new version",objN),
+                            gettextf(" of this class by a call to 'conv2NewVersion'.\n")
+                            )           
+                    eval.parent(substitute(object<-object0))                    
+                    return(object0 at .lowerExact)}
              object at .lowerExact})
 setMethod(".logExact", "UnivarMixingDistribution", function(object){
              er <- is(try(slot(object, ".logExact"), silent = TRUE), "try-error")
              if(er){ object0 <- conv2NewVersion(object)
+                     objN <- paste(substitute(object))
+                     warning(gettextf("'%s' was generated in an old version of this class.\n",
+                                     objN),
+                            gettextf("'%s' has been converted to the new version",objN),
+                            gettextf(" of this class by a call to 'conv2NewVersion'.\n")
+                            )           
                     eval.parent(substitute(object<-object0))
-                    return(invisible(NULL))}
+                    return(object0 at .logExact)}
              object at .logExact})
 setMethod("Symmetry", "UnivarMixingDistribution", function(object){
              er <- is(try(slot(object, "Symmetry"), silent = TRUE), "try-error")
              if(er){ object0 <- conv2NewVersion(object)
+                     objN <- paste(substitute(object))
+                     warning(gettextf("'%s' was generated in an old version of this class.\n",
+                                     objN),
+                            gettextf("'%s' has been converted to the new version",objN),
+                            gettextf(" of this class by a call to 'conv2NewVersion'.\n")
+                            )           
                     eval.parent(substitute(object<-object0))
-                    return(invisible(NULL))}
+                    return(object0 at Symmetry)}
              object at Symmetry})

Modified: branches/distr-2.2/pkg/distr/chm/Distr.chm
===================================================================
(Binary files differ)

Modified: branches/distr-2.2/pkg/distrDoc/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distrDoc/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrDoc/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -13,3 +13,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: branches/distr-2.2/pkg/distrDoc/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distrEx/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distrEx/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrEx/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -11,3 +11,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: branches/distr-2.2/pkg/distrEx/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distrEx/R/Functionals.R
===================================================================
--- branches/distr-2.2/pkg/distrEx/R/Functionals.R	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrEx/R/Functionals.R	2009-03-31 16:43:38 UTC (rev 448)
@@ -8,9 +8,17 @@
 setMethod("var", signature(x = "UnivariateDistribution"),
     function(x, fun = function(t) {t}, cond, withCond = FALSE, useApply = TRUE, 
              ...){
-        if(missing(cond)&&missing(fun)){
+        dots <- match.call(call = sys.call(sys.parent(1)), 
+                        expand.dots = FALSE)$"..."
+        low <- -Inf; upp <- Inf
+        if(hasArg(low)) low <- dots$low
+        if(hasArg(upp)) upp <- dots$upp
+        LowIsUpp <- if(low == -Inf) 
+                    low == -upp else distr:::.isEqual(low,upp)
+        
+        if(LowIsUpp && missing(cond)&&missing(fun)){
            if(is(Symmetry(x),"SphericalSymmetry"))
-              return(E(x, fun = function(t)t^2, useApply = useApply, ...))
+              return(2 * E(x, fun = function(t)t^2, low =0, useApply = useApply, ...))
         }
         f2 <- function(t) {fun(t)^2}
         

Modified: branches/distr-2.2/pkg/distrEx/R/Kurtosis.R
===================================================================
--- branches/distr-2.2/pkg/distrEx/R/Kurtosis.R	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrEx/R/Kurtosis.R	2009-03-31 16:43:38 UTC (rev 448)
@@ -8,10 +8,18 @@
 ###################################################################################
 setMethod("kurtosis", signature(x = "UnivariateDistribution"),
     function(x, fun = function(t) {t}, cond, withCond = FALSE, useApply = TRUE, ...){
-        if(missing(cond)&&missing(fun)){
+        dots <- match.call(call = sys.call(sys.parent(1)), 
+                        expand.dots = FALSE)$"..."
+        low <- -Inf; upp <- Inf
+        if(hasArg(low)) low <- dots$low
+        if(hasArg(upp)) upp <- dots$upp
+        LowIsUpp <- if(low == -Inf) 
+                    low == -upp else distr:::.isEqual(low,upp)
+
+        if(LowIsUpp && missing(cond)&&missing(fun)){
            if(is(Symmetry(x),"SphericalSymmetry")){
-                m2 <- E(x, fun = function(t)t^2, useApply = useApply, ...)
-                m4 <- E(x, fun = function(t)t^4, useApply = useApply, ...)
+                m2 <- 2*E(x, fun = function(t)t^2, low=0, useApply = useApply, ...)
+                m4 <- 2*E(x, fun = function(t)t^4, low=0, useApply = useApply, ...)
                 return(m4/m2^2 -3)
            }
         }

Modified: branches/distr-2.2/pkg/distrMod/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distrMod/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrMod/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -11,3 +11,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: branches/distr-2.2/pkg/distrMod/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distrSim/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distrSim/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrSim/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -12,3 +12,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: branches/distr-2.2/pkg/distrSim/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distrTEst/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distrTEst/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrTEst/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -15,3 +15,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: branches/distr-2.2/pkg/distrTEst/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/distrTeach/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/distrTeach/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/distrTeach/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -14,3 +14,5 @@
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
 Packaged: Fri Jun 8 00:12:57 2007; Peter
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: branches/distr-2.2/pkg/distrTeach/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: branches/distr-2.2/pkg/startupmsg/DESCRIPTION
===================================================================
--- branches/distr-2.2/pkg/startupmsg/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ branches/distr-2.2/pkg/startupmsg/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -8,3 +8,5 @@
 Depends: R(>= 1.8.0)
 LazyLoad: yes
 License: LGPL-3
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: branches/distr-2.2/pkg/startupmsg/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/SweaveListingUtils/DESCRIPTION
===================================================================
--- pkg/SweaveListingUtils/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/SweaveListingUtils/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -13,3 +13,5 @@
 Maintainer: Peter Ruckdeschel <Peter.Ruckdeschel at itwm.fraunhofer.de>
 License: LGPL-3
 Date: 2009-03-19
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: pkg/SweaveListingUtils/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/distr/chm/Distr.chm
===================================================================
(Binary files differ)

Modified: pkg/distrDoc/DESCRIPTION
===================================================================
--- pkg/distrDoc/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/distrDoc/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -11,3 +11,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: pkg/distrDoc/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/distrEx/DESCRIPTION
===================================================================
--- pkg/distrEx/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/distrEx/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -11,3 +11,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}


Property changes on: pkg/distrEx/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/distrMod/DESCRIPTION
===================================================================
--- pkg/distrMod/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/distrMod/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -9,3 +9,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: pkg/distrMod/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/distrSim/DESCRIPTION
===================================================================
--- pkg/distrSim/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/distrSim/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -10,3 +10,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: pkg/distrSim/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/distrTEst/DESCRIPTION
===================================================================
--- pkg/distrTEst/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/distrTEst/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -11,3 +11,5 @@
 LazyLoad: yes
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: pkg/distrTEst/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/distrTeach/DESCRIPTION
===================================================================
--- pkg/distrTeach/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/distrTeach/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -11,3 +11,5 @@
 License: LGPL-3
 URL: http://distr.r-forge.r-project.org/
 Packaged: Fri Jun 8 00:12:57 2007; Peter
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: pkg/distrTeach/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy

Modified: pkg/startupmsg/DESCRIPTION
===================================================================
--- pkg/startupmsg/DESCRIPTION	2009-03-31 13:31:30 UTC (rev 447)
+++ pkg/startupmsg/DESCRIPTION	2009-03-31 16:43:38 UTC (rev 448)
@@ -8,3 +8,5 @@
 Depends: R(>= 1.8.0)
 LazyLoad: yes
 License: LGPL-3
+LastChangedDate: {$LastChangedDate$}
+LastChangedRevision: {$LastChangedRevision$}
\ No newline at end of file


Property changes on: pkg/startupmsg/DESCRIPTION
___________________________________________________________________
Name: svn:keywords
   - 
   + HeadURL LastChangedDate LastChangedRevision LastChangedBy



More information about the Distr-commits mailing list