similar to: samba4 and ncacn_http

Displaying 20 results from an estimated 11000 matches similar to: "samba4 and ncacn_http"

2012 Sep 11
1
Strange result from GAMLSS
Hi Folks! Just started using the gamlss package and I tried a simple code example (see below). Why the negative sigma? John > y <- rt(100, df=1)> m1<-fitDist(y, type="realline")Warning messages:1: In MLE(ll3, start = list(eta.mu = eta.mu, eta.sigma = eta.sigma, : possible convergence problem: optim gave code=1 false convergence (8)2: In MLE(ll4, start = list(eta.mu =
2008 Apr 03
1
help with R semantics
Greetings: I'm running R2.6.2 on a WinXP DELL box with 2 gig RAM. I have created a new glm link function to be used with family = binomial. The function works (although any suggested improvements would be welcome), logit.FC <- function(POD.floor = 0, POD.ceiling =1) { if (POD.floor < 0 | POD.floor > 1) stop ("POD.floor must be between zero and one.") if
2002 Feb 27
1
Bug in glm.fit? (PR#1331)
G'day all, I had a look at the GLM code of R (1.4.1) and I believe that there are problems with the function "glm.fit" that may bite in rare circumstances. Note, I have no data set with which I ran into trouble. This report is solely based on having a look at the code. Below I append a listing of the glm.fit function as produced by my system. I have added line numbers so that I
2005 Jul 22
1
multiplicate 2 functions
Thks for your answer, here is an exemple of what i do with the errors in french... > tmp [1] 200 150 245 125 134 345 320 450 678 > beta18 Erreur : Objet "beta18" not found //NORMAL just to show it > eta [1] 500 > func1<-function(beta18) dweibull(tmp[1],beta18,eta) > func1<-func1(beta18) * function(beta18) dweibull(tmp[2],beta18,eta) Erreur dans dweibull(tmp[1],
2009 Jun 03
2
code for double sum
Hi R-users,   I wrote a code to evaluate double sum as follows:   ff2 <- function(bb,eta,z,k) { r <- length(z) for (i in 1:r) { sm1 <- sum((z[i]*bb/2)*(psigamma((0:k)+eta+1,deriv=0)/(factorial(0:k)*gamma((0:k)+eta+1))))  sm2 <- sum((besselI(z[i]*bb,eta)*log(z[i]*bb/2) - sm1)/besselI(z[i]*bb,eta))  sm2 } ff2(bb,eta,z,10)     but it gave me the following message:   >
2008 Jun 13
1
Writing a new link for a GLM.
Hi, I wish to write a new link function for a GLM. R's glm routine does not supply the "loglog" link. I modified the make.link function adding the code: }, loglog = { linkfun <- function(mu) -log(-log(mu)) linkinv <- function(eta) exp(-exp(-eta)) mu.eta <- function(eta) exp(-exp(-eta)-eta) valideta <- function(eta) all(eta != 0)
2010 Aug 03
2
incorrect number of dimensions
Hi, How to solve this problem. The following is the code. betabinexch0=function(theta,data) + { + eta=theta[,1] + K=theta[,2] + y=data[,1]; n=data[,2] + N=length(y) + val=0*K; + for (i in 1:N) + val=val+lbeta(K*eta+y[i],K*(1-eta)+n[i]-y[i]) + val=val-N*lbeta(K*eta,K*(1-eta)) + val=val-2*log(1+K)-log(eta)-log(1-eta) + return(val) + } > data(cancermortality) >
2011 Sep 23
4
'save' saved object names instead of objects
Hello, I created an array to hold the results of a series of simulations I'm running: d.eta <- array(0,dim=c(3,3,200)) <simulation goes here and populates the array but it's not important> Then I tried to save the results using this: save(d.eta,file="D:/Simulation Results/sim 9-23-11 deta") When I later tried to reload them using this: d.eta <-
2011 May 19
3
problem with optim()
Dear R-users, I would like to maximize the function g above which depends on 4 parameters (2 vectors, 1 real number, and 1 matrix) using optim() and BFGS method. Here is my code: # fonction to maximize g=function(x) { x1 = x[1:ncol(X)] x2 = x[(ncol(X)+1)] x3 = matrix(x[(ncol(X)+2):(ncol(X)+1+ncol(X)*ncol(Y))],nrow=ncol(X),ncol=ncol(Y)) x4 = x[(ncol(X)+1+ncol(X)*ncol(Y)+1):length(x)]
2008 Mar 15
1
again with polr
hello everybody solved the problem with summary, now I have another one eg I estimate > try.op <- polr( > as.ordered(sod.sit.ec.fam) ~ > log(y) + > log(1 + nfiglimin) + > log(1 + nfiglimagg) + > log(ncomp - nfiglitot) + > eta + > I(eta^2) + >
2007 Mar 07
1
Failure to run mcsamp() in package arm
Dear r-helpers, I can run the examples on the mcsamp help page. For example: **************************************** > M1 <- lmer (y1 ~ x + (1|group)) > (M1.sim <- mcsamp (M1)) fit using lmer, 3 chains, each with 1000 iterations (first 500 discarded) n.sims = 1500 iterations saved mean sd 2.5% 25% 50% 75% 97.5% Rhat n.eff beta.(Intercept)
2011 Aug 18
3
Error message: object of type 'closure' is not subsettable
Dear R-users I need to calibrate kappa, rho, eta, theta, v0 in the following code, see below. However when I run it, I get: y <- function(kappahat, rhohat, etahat, thetahat, v0hat) {sum(difference(k, t, S0, X, r, implvol, q, kappahat, rhohat, etahat, thetahat, v0hat)^2)} > nlminb(start=list(kappa, rho, eta, theta, v0), objective = y, lower =lb, > upper =ub) Error in dots[[1L]][[1L]] :
2006 Jul 30
1
Parametric links for glm?
At useR 2006 I mentioned that it would be nice to have a way to specify binomial links that involved free parameters and described some experience with a Gosset link involving a free degrees of freedom parameter, and a Tukey-lambda link with two free parameters. My implementation of this involved some rather kludgey modifications of binomial, make.link and glm that (essentially) added a
2006 Mar 08
1
Want to fit random intercept in logistic regression (testing lmer and glmmML)
Greetings. Here is sample code, with some comments. It shows how I can simulate data and estimate glm with binomial family when there is no individual level random error, but when I add random error into the linear predictor, I have a difficult time getting reasonable estimates of the model parameters or the variance component. There are no clusters here, just individual level responses, so
2006 Mar 01
1
a strange problem with integrate()
Dear all, I am stuck on the following problem with integrate(). I have been out of luck using RSiteSearch().. My function is g2<-function(b,theta,xi,yi,sigma2){ xi<-cbind(1,xi) eta<-drop(xi%*%theta) num<-exp((eta + rep(b,length(eta)))*yi) den<- 1 + exp(eta + rep(b,length(eta))) result=(num/den)*exp((-b^2)/sigma2)/sqrt(2*pi*sigma2)
2009 Sep 06
2
question about ... passed to two different functions
I have hit a problem with the design of the mcmc package I can't figure out, possibly because I don't really understand the R function call mechanism. The function metrop in the mcmc package has a ... argument that it passes to one or two user-supplied functions, which are other arguments to metrop. When the two functions don't have the same arguments, this doesn't work.
2005 Feb 03
2
dovecot-auth hangs with IO leak
Hi dovecot, I am using the debian dovecot packages on a system running LDAP. My /etc/pam.d/common-* looks like this, which simply means try /etc/passwd first, and try LDAP using the same password if it is failed. account [success=1 default=ignore] pam_unix.so account required pam_ldap.so use_first_pass account required pam_permit.so auth [success=1 default=ignore] pam_unix.so auth
2004 Aug 18
1
Gee
I am trying to learn the gee function in R. So I try to generate some data and use this function. I have the following lines: ######################################## Gee # Generating lny=10+2*Si-Si^2+eta # eta ~ N(0,1) # Si ~ U(0,11) eta <- vector(mode="numeric",100) eta <- rnorm(100) Si <- vector(mode="numeric",100) Si <- runif(100, min=0, max=11) lny <-
2007 Feb 10
2
error using user-defined link function with mixed models (LMER)
Greetings, everyone. I've been trying to analyze bird nest survival data using generalized linear mixed models (because we documented several consecutive nesting attempts by the same individuals; i.e. repeated measures data) and have been unable to persuade the various GLMM models to work with my user-defined link function. Actually, glmmPQL seems to work, but as I want to evaluate a suite of
2005 Feb 27
1
"not listening" notification
Hi dovecot, My dovecot log shows this: Feb 27 03:08:38 eta imap-login: Login: sltam [X.X.X.X] Feb 27 03:09:38 eta imap-login: Disconnected: Inactivity [X.X.X.X] Feb 27 03:10:32 eta dovecot: login: received another "not listening" notification (if you can't login at all, see src/lib/fdpass.c) Feb 27 03:10:42 eta dovecot-auth: Login process has too old (124s) requests, killing it.