search for: ll1

Displaying 9 results from an estimated 9 matches for "ll1".

Did you mean: l1
2003 Mar 17
2
scoping rules; summary
Hi everyone thanks for the replies. The issue was NOT a font problem; I deliberately chose ll1 and l11 as examples of easily confused variable names (evidently these were too easily confused ;-). The code snippet was written as intended, and increment() contained a deliberate, highlighted, bug. I was asking for guidance on avoiding/finding this sort of coding error. That was why I wrote &...
2003 Mar 17
1
scoping rules
Hi I recently found a bug that was isomorphic to the following: ll1 <- 2 increment <- function(x) { l11 <- 1 return(x+ll1) #bug here } Of course, R is obeying the scoping rules just fine, but I'm evidently not setting the do.what.I.mean.not.what.I.say variable correctly. Now, how do I avoid making this type of error? ... and what is the best to...
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)] Testn<-Testfaellew5[length(Testfaellew5)] X1n<-X1[length(X1)] X2n<-X2[...
2017 Dec 21
0
Fitting Beta Distribution
.... Cheers Lorenzo ######################################################################### library(MASS) library(stats4) dbeta1 <- function(x, shape, ...) dbeta(x, shape, shape, ...) dbeta2 <- function(x, shape){ res <- x^(shape-1)*(1-x)^(shape-1) return(res) } LL1 <- function(shape){ R <- dbeta1(x, shape) res <- -sum(log(R)) return(res) } LL2 <- function(shape){ R <- dbeta2(x, shape) res <- -sum(log(R)) return(res) } set.seed(124) x <-rbeta(1000, 0.2, 0.2) fit_dbeta1 <- fitdistr( x , db...
2017 Dec 21
1
Fitting Beta Distribution
.... Cheers Lorenzo ######################################################################### library(MASS) library(stats4) dbeta1 <- function(x, shape, ...) dbeta(x, shape, shape, ...) dbeta2 <- function(x, shape){ res <- x^(shape-1)*(1-x)^(shape-1) return(res) } LL1 <- function(shape){ R <- dbeta1(x, shape) res <- -sum(log(R)) return(res) } LL2 <- function(shape){ R <- dbeta2(x, shape) res <- -sum(log(R)) return(res) } set.seed(124) x <-rbeta(1000, 0.2, 0.2) fit_dbeta1 <- fitdistr( x , db...
2012 May 13
2
Discrete choice model maximum likelihood estimation
...P3(b3,b,t) L2l <- (P11=1)*(P22=1)*(P33=0) return(L2l) } L1 <- function(b1,b2,b,t) { P11 <- P1(b1,b,t) P22 <- P2(b2,b,t) L1l <- (P11=1)*(P22=0) return(L1l) } # Log-likelihood function llfn <- function(par,a,t) { b1 <- par[1] b2 <- par[2] b3 <- par[3] b <- par[4] lL1 <- log(L1(b1,b2,b,t)) lL2 <- log(L2(b1,b2,b3,b,t)) lL3 <- log(L3(b1,b2,b3,b,t)) llfn <- (a==1)*lL1+(a==2)*lL2+(a==3)*lL3 } est <- optim(par,llfn, method = c("CG"),control=list(trace=2,maxit=2000), hessian=TRUE) And when I run this code I get "cannot coerce type '...
2002 Apr 12
1
Parrot
This is just an idea for comment. Perl6, the upcoming version of Perl has separated out the runtime into a virtual machine called Parrot. There are already several small languages (one is C-like, one is Java-like and one is BASIC-like) that target Parrot and given the popularity of Perl its likely that others may attempt to target it too. If R could interface easily with Parrot then it might be
1997 Jul 24
0
Security hole in mgetty+sendfax
...t;K(MU3 _UB1R\;QI+IG''BEQ25D=/,V2QN/C-XK=L6.QF%8S?F+(. M)E72\*:-.K]"+U!@CO)F^^0''N$Q&EL P/0U[*1]1ZCO19]V#HY^0R :\$M$> MGE,/HA!=<7T/SPX''Q3/<VJ2!"5J)]F>K,V,G1D@G WT=43@(*H.?#=*1)-=T M3UQYM[=A7QAXV!.IF\7"K1/S?=B"Z<^"L^!''5*T6 LL1(]Q>2D*%=Z[W6_$A M0NI?C"+$VT9OM"^W]T,==Q5_W0XP7%W,34-767R+0QN3]&H()XL":LP71!)D M>]9SV1-LP!=SZ+J6E^F:X(!5Y0-%<"I25=.N)DKA=CVO8(V\AF4%C''M4C+C3 MXBV[W*A,T7(/RVD''913I4CG=BH''21FB^MC:.H#JM$&L3KTQN4C"M<\P*I_%3 MJA6@5IB!1))FBU / ^PJ[982...
2008 Jun 30
4
Rebuild of kernel 2.6.9-67.0.20.EL failure
Hello list. I'm trying to rebuild the 2.6.9.67.0.20.EL kernel, but it fails even without modifications. How did I try it? Created a (non-root) build environment (not a mock ) Installed the kernel.scr.rpm and did a rpmbuild -ba --target=`uname -m` kernel-2.6.spec 2> prep-err.log | tee prep-out.log The build failed at the end: Processing files: kernel-xenU-devel-2.6.9-67.0.20.EL Checking