[Distr-commits] r250 - in branches/distr-2.0/pkg/distrMod: R man
noreply at r-forge.r-project.org
noreply at r-forge.r-project.org
Fri Aug 8 06:08:01 CEST 2008
Author: stamats
Date: 2008-08-08 06:08:01 +0200 (Fri, 08 Aug 2008)
New Revision: 250
Modified:
branches/distr-2.0/pkg/distrMod/R/L2GroupFamilies.R
branches/distr-2.0/pkg/distrMod/R/SimpleL2ParamFamilies.R
branches/distr-2.0/pkg/distrMod/man/L2LocationFamily.Rd
branches/distr-2.0/pkg/distrMod/man/L2LocationScaleFamily.Rd
branches/distr-2.0/pkg/distrMod/man/L2LocationUnknownScaleFamily.Rd
branches/distr-2.0/pkg/distrMod/man/L2ScaleFamily.Rd
branches/distr-2.0/pkg/distrMod/man/L2ScaleUnknownLocationFamily.Rd
Log:
we don't need "..." as we don't call "E" with further arguments to fun ...
Modified: branches/distr-2.0/pkg/distrMod/R/L2GroupFamilies.R
===================================================================
--- branches/distr-2.0/pkg/distrMod/R/L2GroupFamilies.R 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/R/L2GroupFamilies.R 2008-08-08 04:08:01 UTC (rev 250)
@@ -6,7 +6,7 @@
LogDeriv, L2derivDistr.0,
FisherInfo.0,
distrSymm, L2derivSymm, L2derivDistrSymm,
- trafo, ..., .returnClsName = NULL){
+ trafo, .returnClsName = NULL){
if(missing(name))
name <- "L2 location family"
@@ -66,38 +66,38 @@
FI0 <- if(missing(FisherInfo.0))
E(centraldistribution, fun = function(x) LogDeriv(x)^2,
- useApply = FALSE, ...) else FisherInfo.0
+ useApply = FALSE) else FisherInfo.0
FI0 <- matrix(FI0,1,1,dimnames=list("loc","loc"))
FisherInfo.fct <- function(param) PosDefSymmMatrix(FI0)
f.call <- substitute(L2LocationFamily(loc = l,
- name = N,
- centraldistribution = D0,
- locname = lN,
- modParam = mP,
- LogDeriv = lD,
- L2derivDistr.0 = L2D0,
- FisherInfo.0 = F.0,
- distrSymm = DSymm,
- L2derivSymm = L2Symm,
- L2derivDistrSymm = L2DSymm,
- trafo = matrix(Tr, dimnames = list("loc","loc")),
+ name = N,
+ centraldistribution = D0,
+ locname = lN,
+ modParam = mP,
+ LogDeriv = lD,
+ L2derivDistr.0 = L2D0,
+ FisherInfo.0 = F.0,
+ distrSymm = DSymm,
+ L2derivSymm = L2Symm,
+ L2derivDistrSymm = L2DSymm,
+ trafo = matrix(Tr, dimnames = list("loc","loc")),
.returnClsName = rtn),
- list(l = loc,
- N = name,
- D0 = centraldistribution,
- lN = locname,
- mP = modParam,
- lD = LogDeriv,
- L2D0 = L2derivDistr[[1]],
- F.0 = FI0,
- DSymm = distrSymm,
- L2Symm = L2derivSymm,
- L2DSymm = L2derivDistrSymm,
- Tr = trafo,
- rtn = .returnClsName))
-
+ list(l = loc,
+ N = name,
+ D0 = centraldistribution,
+ lN = locname,
+ mP = modParam,
+ lD = LogDeriv,
+ L2D0 = L2derivDistr[[1]],
+ F.0 = FI0,
+ DSymm = distrSymm,
+ L2Symm = L2derivSymm,
+ L2DSymm = L2derivDistrSymm,
+ Tr = trafo,
+ rtn = .returnClsName))
+
if(is.null(.returnClsName))
.returnClsName <- "L2LocationFamily"
L2Fam <- new(.returnClsName)
@@ -132,7 +132,7 @@
LogDeriv, L2derivDistr.0,
FisherInfo.0,
distrSymm, L2derivSymm, L2derivDistrSymm,
- trafo, ..., .returnClsName = NULL){
+ trafo, .returnClsName = NULL){
if(length(scale) != 1 || !is.numeric(scale))
stop("scale has to be a numeric of length 1")
if(scale < 0)
@@ -147,7 +147,7 @@
}else{
if(!all(names(locscalename)%in% c("loc","scale")))
names(locscalename) <- c("loc", "scale")
- }
+ }
distribution <- scale*centraldistribution + loc
if(missing(distrSymm)){
@@ -205,7 +205,7 @@
FI0 <- if(missing(FisherInfo.0))
E(centraldistribution, fun = function(x) (x*LogDeriv(x)-1)^2,
- useApply = FALSE, ...) else FisherInfo.0
+ useApply = FALSE) else FisherInfo.0
FI0 <- matrix(FI0,1,1,dimnames=list("scale","scale"))
@@ -277,7 +277,7 @@
LogDeriv, L2derivDistr.0,
FisherInfo.0,
distrSymm, L2derivSymm, L2derivDistrSymm,
- trafo, ..., .returnClsName = NULL){
+ trafo, .returnClsName = NULL){
if(length(scale) != 1 || !is.numeric(scale))
stop("scale has to be a numeric of length 1")
if(scale < 0)
@@ -317,7 +317,7 @@
makeOKPar <- function(param) {
st <- c(param[1],abs(param[2])+.Machine$double.eps)
names(st) <- c("loc", "scale")
- return(st)}
+ return(st)}
if(missing(modParam))
modParam <- function(theta){theta[2]*centraldistribution+theta[1] }
props <- c(paste("The", name, "is invariant under"),
@@ -359,14 +359,14 @@
if(missing(FisherInfo.0)){
FI11 <- E(centraldistribution, fun = function(x) LogDeriv(x)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
FI22 <- E(centraldistribution, fun = function(x) (x*LogDeriv(x)-1)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
if( is(distrSymm, "SphericalSymmetry") ){
FI12 <- 0
}else{
FI12 <- E(centraldistribution, fun = function(x) x*LogDeriv(x)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
}
FI0 <- matrix(c(FI11,FI12,FI12,FI22),2,2)
}else{
@@ -443,7 +443,7 @@
LogDeriv, L2derivDistr.0,
FisherInfo.0,
distrSymm, L2derivSymm, L2derivDistrSymm,
- trafo, ..., .returnClsName = NULL){
+ trafo, .returnClsName = NULL){
if(length(scale) != 1 || !is.numeric(scale))
stop("scale has to be a numeric of length 1")
if(scale < 0)
@@ -478,7 +478,7 @@
makeOKPar <- function(param) {
st <- c(param[1],abs(param[2])+.Machine$double.eps)
names(st) <- c("loc", "scale")
- return(st)}
+ return(st)}
if(missing(trafo)) {trafo <- matrix(1)
dimnames(trafo) <- list("loc","loc")}
param <- ParamFamParameter(name = "location and scale", main = param0[1],
@@ -525,14 +525,14 @@
if(missing(FisherInfo.0)){
FI11 <- E(centraldistribution, fun = function(x) LogDeriv(x)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
FI22 <- E(centraldistribution, fun = function(x) (x*LogDeriv(x)-1)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
if( is(distrSymm, "SphericalSymmetry") ){
FI12 <- 0
}else{
FI12 <- E(centraldistribution, fun = function(x) x*LogDeriv(x)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
}
FI0 <- matrix(c(FI11,FI12,FI12,FI22),2,2)
}else{
@@ -544,33 +544,33 @@
scale <- nuisance(param)
PosDefSymmMatrix(FI0/scale^2)}
-f.call <- substitute(L2LocationUnknownScaleFamily(loc = l,
- scale = s,
- name = N,
- centraldistribution = D0,
- locscalename = lN,
- modParam = mP,
- LogDeriv = lD,
- L2derivDistr.0 = L2D0,
- FisherInfo.0 = F.0,
- distrSymm = DSymm,
- L2derivSymm = L2Symm,
- L2derivDistrSymm = L2DSymm,
- trafo = matrix(Tr, dimnames = list("loc","loc")),
+ f.call <- substitute(L2LocationUnknownScaleFamily(loc = l,
+ scale = s,
+ name = N,
+ centraldistribution = D0,
+ locscalename = lN,
+ modParam = mP,
+ LogDeriv = lD,
+ L2derivDistr.0 = L2D0,
+ FisherInfo.0 = F.0,
+ distrSymm = DSymm,
+ L2derivSymm = L2Symm,
+ L2derivDistrSymm = L2DSymm,
+ trafo = matrix(Tr, dimnames = list("loc","loc")),
.returnClsName = rtn),
- list(s = scale,
- l = loc,
- N = name,
- D0 = centraldistribution,
- lN = locscalename,
- mP = modParam,
- lD = LogDeriv,
- L2D0 = as(L2derivDistr, "list"),
- F.0 = FI0,
- DSymm = distrSymm,
- L2Symm = L2derivSymm,
- L2DSymm = L2derivDistrSymm,
- Tr = trafo,
+ list(s = scale,
+ l = loc,
+ N = name,
+ D0 = centraldistribution,
+ lN = locscalename,
+ mP = modParam,
+ lD = LogDeriv,
+ L2D0 = as(L2derivDistr, "list"),
+ F.0 = FI0,
+ DSymm = distrSymm,
+ L2Symm = L2derivSymm,
+ L2DSymm = L2derivDistrSymm,
+ Tr = trafo,
rtn = .returnClsName))
if(is.null(.returnClsName))
@@ -607,7 +607,7 @@
LogDeriv, L2derivDistr.0,
FisherInfo.0,
distrSymm, L2derivSymm, L2derivDistrSymm,
- trafo, ..., .returnClsName = NULL){
+ trafo, .returnClsName = NULL){
if(length(scale) != 1 || !is.numeric(scale))
stop("scale has to be a numeric of length 1")
if(scale < 0)
@@ -618,7 +618,7 @@
if(!length(locscalename)==2)
stop("argument 'locscalename' must be of length 2.")
if(!all(names(locscalename)%in% c("loc","scale")))
- names(locscalename) <- c("loc", "scale")
+ names(locscalename) <- c("loc", "scale")
distribution <- scale*centraldistribution+loc
@@ -642,7 +642,7 @@
makeOKPar <- function(param) {
st <- c(param[1],abs(param[2])+.Machine$double.eps)
names(st) <- c("loc", "scale")
- return(st)}
+ return(st)}
if(missing(trafo)) {trafo <- matrix(1)
dimnames(trafo) <- list("scale","scale")}
param <- ParamFamParameter(name = "scale and location", main = param0[1],
@@ -689,14 +689,14 @@
if(missing(FisherInfo.0)){
FI11 <- E(centraldistribution, fun = function(x) LogDeriv(x)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
FI22 <- E(centraldistribution, fun = function(x) (x*LogDeriv(x)-1)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
if( is(distrSymm, "SphericalSymmetry") ){
FI12 <- 0
}else{
FI12 <- E(centraldistribution, fun = function(x) x*LogDeriv(x)^2,
- useApply = FALSE, ...)
+ useApply = FALSE)
}
FI0 <- matrix(c(FI11,FI12,FI12,FI22),2,2)
}else{
@@ -736,7 +736,6 @@
L2DSymm = L2derivDistrSymm,
Tr = trafo,
rtn = .returnClsName))
-
if(is.null(.returnClsName))
.returnClsName <- "L2LocationScaleFamily"
L2Fam <- new(.returnClsName)
Modified: branches/distr-2.0/pkg/distrMod/R/SimpleL2ParamFamilies.R
===================================================================
--- branches/distr-2.0/pkg/distrMod/R/SimpleL2ParamFamilies.R 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/R/SimpleL2ParamFamilies.R 2008-08-08 04:08:01 UTC (rev 250)
@@ -599,7 +599,7 @@
modParam <- function(theta){}
body(modParam) <- substitute({ Gumbel(loc = theta, scale = sd) },
list(sd = scale))
- res <- L2LocationFamily(loc = loc, scale = scale,
+ res <- L2LocationFamily(loc = loc,
name = "Gumbel location family",
centraldistribution = Gumbel(loc = 0, scale = scale),
modParam = modParam,
Modified: branches/distr-2.0/pkg/distrMod/man/L2LocationFamily.Rd
===================================================================
--- branches/distr-2.0/pkg/distrMod/man/L2LocationFamily.Rd 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/man/L2LocationFamily.Rd 2008-08-08 04:08:01 UTC (rev 250)
@@ -9,8 +9,7 @@
L2LocationFamily(loc = 0, name, centraldistribution = Norm(),
locname = "loc", modParam, LogDeriv,
L2derivDistr.0, FisherInfo.0, distrSymm, L2derivSymm,
- L2derivDistrSymm, trafo, ...,
- .returnClsName = NULL)
+ L2derivDistrSymm, trafo, .returnClsName = NULL)
}
\arguments{
\item{loc}{numeric: location parameter of the model. }
@@ -37,12 +36,11 @@
\item{L2derivDistrSymm}{ object of class \code{"DistrSymmList"}:
symmetry of the distributions contained in \code{L2derivDistr} }
\item{trafo}{ matrix or function in \code{param}: transformation of the parameter }
- \item{...}{further arguments to be passed to \code{E}}
- \item{.returnClsName}{ the class name of the return value; by default this
- argument is \code{NULL} whereupon the return class will be
- \code{L2LocationScaleFamily}; but, internally, this generating function is also
- used to produce objects of class Classes \code{NormLocationFamily} and
- \code{GumbelLocationFamily}.}
+ \item{.returnClsName}{ the class name of the return value; by default this
+ argument is \code{NULL} whereupon the return class will be
+ \code{L2LocationScaleFamily}; but, internally, this generating function is also
+ used to produce objects of class Classes \code{NormLocationFamily} and
+ \code{GumbelLocationFamily}.}
}
\details{
If \code{name} is missing, the default
Modified: branches/distr-2.0/pkg/distrMod/man/L2LocationScaleFamily.Rd
===================================================================
--- branches/distr-2.0/pkg/distrMod/man/L2LocationScaleFamily.Rd 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/man/L2LocationScaleFamily.Rd 2008-08-08 04:08:01 UTC (rev 250)
@@ -9,8 +9,7 @@
L2LocationScaleFamily(loc = 0, scale = 1, name, centraldistribution = Norm(),
locscalename = c("loc", "scale"), modParam, LogDeriv,
L2derivDistr.0, FisherInfo.0, distrSymm, L2derivSymm,
- L2derivDistrSymm, trafo, ...,
- .returnClsName = NULL)
+ L2derivDistrSymm, trafo, .returnClsName = NULL)
}
\arguments{
@@ -42,12 +41,11 @@
\item{L2derivDistrSymm}{ object of class \code{"DistrSymmList"}:
symmetry of the distributions contained in \code{L2derivDistr} }
\item{trafo}{ matrix or function in \code{param}: transformation of the parameter }
- \item{...}{further arguments to be passed to \code{E}}
- \item{.returnClsName}{ the class name of the return value; by default this
- argument is \code{NULL} whereupon the return class will be
- \code{L2LocationScaleFamily}; but, internally, this generating function is also
- used to produce objects of class \code{NormalLocationScaleFamily},
- \code{CauchyLocationScaleFamily}.}
+ \item{.returnClsName}{ the class name of the return value; by default this
+ argument is \code{NULL} whereupon the return class will be
+ \code{L2LocationScaleFamily}; but, internally, this generating function is also
+ used to produce objects of class \code{NormalLocationScaleFamily},
+ \code{CauchyLocationScaleFamily}.}
}
\details{
If \code{name} is missing, the default
Modified: branches/distr-2.0/pkg/distrMod/man/L2LocationUnknownScaleFamily.Rd
===================================================================
--- branches/distr-2.0/pkg/distrMod/man/L2LocationUnknownScaleFamily.Rd 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/man/L2LocationUnknownScaleFamily.Rd 2008-08-08 04:08:01 UTC (rev 250)
@@ -10,8 +10,7 @@
L2LocationUnknownScaleFamily(loc = 0, scale = 1, name, centraldistribution = Norm(),
locscalename = c("loc", "scale"), modParam, LogDeriv,
L2derivDistr.0, FisherInfo.0, distrSymm, L2derivSymm,
- L2derivDistrSymm, trafo, ...,
- .returnClsName = NULL)
+ L2derivDistrSymm, trafo, .returnClsName = NULL)
}
\arguments{
@@ -43,11 +42,10 @@
\item{L2derivDistrSymm}{ object of class \code{"DistrSymmList"}:
symmetry of the distributions contained in \code{L2derivDistr} }
\item{trafo}{ matrix or function in \code{param}: transformation of the parameter }
- \item{...}{further arguments to be passed to \code{E}}
- \item{.returnClsName}{ the class name of the return value; by default this
- argument is \code{NULL} whereupon the return class will be
- \code{L2LocationScaleFamily}; but, internally, this generating function is also
- used to produce objects of class \code{NormalLocationScaleFamily}.}
+ \item{.returnClsName}{ the class name of the return value; by default this
+ argument is \code{NULL} whereupon the return class will be
+ \code{L2LocationScaleFamily}; but, internally, this generating function is also
+ used to produce objects of class \code{NormalLocationScaleFamily}.}
}
\details{
If \code{name} is missing, the default
Modified: branches/distr-2.0/pkg/distrMod/man/L2ScaleFamily.Rd
===================================================================
--- branches/distr-2.0/pkg/distrMod/man/L2ScaleFamily.Rd 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/man/L2ScaleFamily.Rd 2008-08-08 04:08:01 UTC (rev 250)
@@ -9,7 +9,7 @@
L2ScaleFamily(scale = 1, loc = 0, name, centraldistribution = Norm(),
locscalename = c("loc", "scale"), modParam, LogDeriv,
L2derivDistr.0, FisherInfo.0, distrSymm, L2derivSymm,
- L2derivDistrSymm, trafo, ..., .returnClsName = NULL)
+ L2derivDistrSymm, trafo, .returnClsName = NULL)
}
\arguments{
@@ -41,12 +41,11 @@
\item{L2derivDistrSymm}{ object of class \code{"DistrSymmList"}:
symmetry of the distributions contained in \code{L2derivDistr} }
\item{trafo}{ matrix or function in \code{param}: transformation of the parameter }
- \item{...}{further arguments to be passed to \code{E}}
- \item{.returnClsName}{ the class name of the return value; by default this
- argument is \code{NULL} whereupon the return class will be
- \code{L2ScaleFamily}; but, internally, this generating function is also
- used to produce objects of class \code{NormScaleFamily}, \code{ExpScaleFamily},
- and \code{LnormScaleFamily}.}
+ \item{.returnClsName}{ the class name of the return value; by default this
+ argument is \code{NULL} whereupon the return class will be
+ \code{L2ScaleFamily}; but, internally, this generating function is also
+ used to produce objects of class \code{NormScaleFamily}, \code{ExpScaleFamily},
+ and \code{LnormScaleFamily}.}
}
\details{
If \code{name} is missing, the default
Modified: branches/distr-2.0/pkg/distrMod/man/L2ScaleUnknownLocationFamily.Rd
===================================================================
--- branches/distr-2.0/pkg/distrMod/man/L2ScaleUnknownLocationFamily.Rd 2008-08-08 04:03:33 UTC (rev 249)
+++ branches/distr-2.0/pkg/distrMod/man/L2ScaleUnknownLocationFamily.Rd 2008-08-08 04:08:01 UTC (rev 250)
@@ -10,8 +10,7 @@
L2ScaleUnknownLocationFamily(loc = 0, scale = 1, name, centraldistribution = Norm(),
locscalename = c("loc", "scale"), modParam, LogDeriv,
L2derivDistr.0, FisherInfo.0, distrSymm, L2derivSymm,
- L2derivDistrSymm, trafo, ...,
- .returnClsName = NULL)
+ L2derivDistrSymm, trafo, .returnClsName = NULL)
}
\arguments{
@@ -43,12 +42,11 @@
\item{L2derivDistrSymm}{ object of class \code{"DistrSymmList"}:
symmetry of the distributions contained in \code{L2derivDistr} }
\item{trafo}{ matrix or function in \code{param}: transformation of the parameter }
- \item{...}{further arguments to be passed to \code{E}}
- \item{.returnClsName}{ the class name of the return value; by default this
- argument is \code{NULL} whereupon the return class will be
- \code{L2LocationScaleFamily}; but, internally, this generating function is also
- used to produce objects of class \code{NormalLocationScaleFamily},
- \code{CauchyLocationScaleFamily}.}
+ \item{.returnClsName}{ the class name of the return value; by default this
+ argument is \code{NULL} whereupon the return class will be
+ \code{L2LocationScaleFamily}; but, internally, this generating function is also
+ used to produce objects of class \code{NormalLocationScaleFamily},
+ \code{CauchyLocationScaleFamily}.}
}
\details{
If \code{name} is missing, the default
More information about the Distr-commits
mailing list