Displaying 6 results from an estimated 6 matches for "par0".
Did you mean:
pad0
2004 Jan 23
1
Problem with hasArg() using R-files
...q <- length(par); x <- data
+ if(hasArg(crit))
+ cat("\n Crit present\n")
+ else
+ cat("\n Crit not present\n")
+ }
>
> Gauss.Obj <- SDT.Optim(Par0, Freq, crit, T)
Error in SDT.Optim(Par0, Freq, crit, T) : unused argument(s) ( ...)
The reason is that the function definition says SDT.Optim should only accept
two arguments, but is called with four.
Please also provide the error messages (if any), instead of just saying that
it doesn't `wor...
2008 Sep 18
0
quantile regression / problems calling nlrq from inside other functions
...This worked:
mBW <- function( ... ) ... # matrix-valued function
BaconWatts <- function(formula,
mmf=mBW, # model matrix function(x, bp, g)
data, plot=T, tau=0.5 )
{
...
m.nl <- nlrq(y ~ b0 + mBW(x,bp,g) %*% c(b1,b2), tau=tau, start=par0,
trace=T )$m
...
}
For some reason the following reports a failure to find the function mmf()
mBW <- function( ... ) ...
BaconWatts <- function(formula,
mmf=mBW, # model matrix function(x, bp, g)
data, plot=T, tau=0.5 )
{
...
m.n...
2009 Nov 12
1
trap window pop up when running 'bugs' in R
...""
.f ARRAY 64 OF CHAR "" ...
.g ARRAY 64 OF CHAR "" ...
.hook StdInterpreter.CallHook [01060050H]
.i INTEGER 112
.i0 INTEGER 0
.i1 INTEGER 0
.id StdInterpreter.Ident "Parse" ...
.par0 Dialog.String "" ...
.par1 Views.Title "" ...
.proc ARRAY 240 OF CHAR "BugsCmds.Parse('C:/Documents and" ...
.res INTEGER 0
.s0 Dialog.String "C:/Documents and Settings/BaBaoZ" ...
.s1 Dialog.St...
2011 Dec 29
0
problem of "constrOptim.nl", no hessian and convergence values
...u)-0
h[2]<-var(u)-1
h
}
heq.jac<-function(par){
u<-par[1:m]
a<-par[(m+1):(m+n)]
b<-par[(m+n+1):(m+2*n)]
j <- matrix(NA, 2, length(par))
j[1,]<-c(rep(1,m),rep(0,2*n))
j[2, ] <- c(2/(m-1)*(u-mean(u)),rep(0,2*n))
j
}
# use optim
library(alabama)
myoptim<-constrOptim.nl(par=par0, fn=obj, heq=heq, heq.jac=heq.jac,
control.outer=list(maxit=5000000,method="L-BFGS-B"))
--
View this message in context: http://r.789695.n4.nabble.com/problem-of-constrOptim-nl-no-hessian-and-convergence-values-tp4242031p4242031.html
Sent from the R help mailing list archive at Nabble....
2009 Mar 26
0
Help with GSM or CDMA hardware on CentOS and SMSTools question please
...tty17? tty29? tty40? tty52? tty7
urandom???????? usbdev4.1_ep00? vcsa2
cdwriter????? fb???????????? fd0u360?? hda4??????? loop5??? oldmem
ram10???? ram9???? stdout????? tty18? tty3?? tty41? tty53? tty8
usbdev1.1_ep00? usbdev4.1_ep81? vcsa3
cdwriter-hdb? fb0??????????? fd0u720?? hda5??????? loop6??? par0
ram11???? ramdisk? systty????? tty19? tty30? tty42? tty54? tty9
usbdev1.1_ep81? usbdev5.1_ep00? vcsa4
console?????? fd???????????? fd0u800?? hdb???????? loop7??? parport0
ram12???? random?? tty???????? tty2?? tty31? tty43? tty55? ttyS0
usbdev2.1_ep00? usbdev5.1_ep81? vcsa5
core????????? fd0????????...
2008 Nov 23
0
why this function give error message
...an))]
}
else{
n.dummies.var <-0
delta <- 0
}
h0 <- var(y)
l <- 0
l <-
.C("garchmd",as.double(beta),as.double(gamma),as.double(delta),as.double(h0),as.integer(T),as.double(y),as.double(Z),as.integer(n.dummies.var),loglik=as.double(l))$loglik
-l
}
par0<- c(0.008134136, 0.005701749, 0.084139263, -0.039, 0.210580086,
0.038085728, 0.103540999, 0.8355774957, 0.00, 0.001, 0.001, 0.001,
0.070029653, -0.386212925, -0.073624190, -0.232775269, -0.253785415,
0.117517450)
a<-nlm(garch.gjr.d,par0,y=y,X=X,Z=X,hessian=TRUE, iterlim=200)
se &...