search for: voodooochild

Displaying 7 results from an estimated 7 matches for "voodooochild".

2006 Jan 14
1
Different length of objects
Hello, i got an warning message in the following code: f<-1:100 t<-1:100 b<-100 ll2 <- function(b,f,t) { t<-cumsum(t) tn<-t[length(t)] i<-seq(along=f) s1<-(tn*exp(-b*tn)*sum(f[i]))/(1-exp(-b*tn)) s2<-sum((f[i]*(t[i]*exp(-b*t[i])-t[i-1]*exp(b*t[i-1])))/(exp(-b*t[i-1])-exp(-b*t[i]))) s1-s2 } ll2(b,f,t) i think, the problem here is, that t[0] doesn't
2005 Dec 01
2
Minimizing a Function with three Parameters
Hi, I'm trying to get maximum likelihood estimates of \alpha, \beta_0 and \beta_1, this can be achieved by solving the following three equations: n / \alpha + \sum\limits_{i=1}^{n} ln(\psihat(i)) - \sum\limits_{i=1}^{n} ( ln(x_i + \psihat(i)) ) = 0 \alpha \sum\limits_{i=1}^{n} 1/(psihat(i)) - (\alpha+1) \sum\limits_{i=1}^{n} ( 1 / (x_i + \psihat(i)) ) = 0 \alpha \sum\limits_{i=1}^{n} (
2006 Feb 08
1
Plotting a count process
hello everybody, i want to plot a count process in the following way, but i don't know how i can do that. i have data for example x<-(0,2,6,2,8,4,.....) and dates y which is a vector of weekly dates for example (01/01/06, 08/01/06, 15/01/06, 22/01/06, ....), now i want to plot the y's an the horizontal axis. On each date the count process jumps upwards 1 unit, so the vertical axis is
2006 Mar 27
1
Missing Argument in optim()
Hello everybody, i already searched the archieves, but i still don't know what is wrong in my implementation, mybe anybody coud give me some advice ll1<-function(rho,theta,beta1,beta2,beta3,beta4,t,Szenariosw5,Testfaellew5,X1,X2) { n<-length(t) t<-cumsum(t) tn<-t[length(t)] Szenn<-Szenariosw5[length(Szenariosw5)]
2006 Apr 19
1
Singularities in glm()
Hello, i have the following model, poi1<-glm(F~S+T+L+C,family=poisson,x=T) where F,S,T,L are metric and C is a factor variable with the levels "0", "1", "2", "3", "4", "5" and "6" if i do summary(poi1), i get the following Call: glm(formula = F ~ S + T + L + C, family = poisson, x = T) Deviance Residuals: Min
2006 Apr 25
3
persp plot increasing 'x' and 'y' values expected
hello, i do the following in order to get an persp-plot x<-c(2,2,2,2,2,2,3,3,3,3) y<-c(41,41,83,83,124,166,208,208,208,208) z<-c(90366,90366,92240,92240,92240,96473,100995,100995,100995,100995) x<-data$x y<-data$y z<-matrix(data$z,length(y),length(x)) persp(x,y,z, col="gray") but i always get the error message increasing 'x' and 'y' values expected,
2006 Jan 25
0
Log-Likelihood 3d-plot and contourplot / optim() starting values
Hello, i have coded the following loglikelihood-function # Log-Likelihood-Funktion loglik_jm<-function(N,phi,t) { n<-length(t) i<-seq(along=t) s1<-sum(log(N-(i-1))) s2<-phi*sum((N-(i-1))*t[i]) n*log(phi)+s1-s2 } # the data t<-c(7,11,8,10,15,22,20,25,28,35) # now i want to do a 3d-plot and a contourplot in order to see at which values of N and phi the loglikelihood