search for: dlogi

Displaying 20 results from an estimated 35 matches for "dlogi".

Did you mean: logi
2004 Oct 06
1
dlogis for large negative numbers
Hi to all, > dlogis(-2000) [1] NaN Warning message: NaNs produced in: dlogis(x, location, scale, log) > dnorm(-2000) [1] 0 Is this an expected behaviour of `dlogis()'? Thanks in advance for any comments, Dimitris platform i386-pc-mingw32 arch i386 os mingw32 system i386, mi...
2008 Aug 21
1
pnmath compilation failure; dylib issue?
...miclib -Wl,- headerpad_max_install_names -mmacosx-version-min=10.4 -undefined dynamic_lookup -single_module -multiply_defined suppress -L/usr/local/ lib -o pnmath.so bd0.o beta.o chebyshev.o choose.o d1mach.o dbeta.o dbinom.o dcauchy.o dchisq.o dexp.o df.o dgamma.o dgeom.o dhyper.o dlnorm.o dlogis.o dnbeta.o dnbinom.o dnchisq.o dnf.o dnorm.o dnt.o dpois.o dt.o dunif.o dweibull.o fmax2.o fmin2.o ftrunc.o gamma.o gamma_cody.o i1mach.o imax2.o imin2.o lbeta.o lgamma.o lgammacor.o mlutils.o pbeta.o pbinom.o pcauchy.o pchisq.o pexp.o pf.o pgamma.o pgeom.o phyper.o plnorm.o plogis.o pnbet...
2005 Nov 12
0
Error message in polr
...habitat variables. > ro6 <- polr(formula = abun ~ InOmbrot + Oliva.OC + ToCultAr + DivCulArb + AltitMax + COORXY) > summary(ro6) Re-fitting to get Hessian Error in La.svd(x, nu, nv, method) : error code 8 from Lapack routine dgesdd In addition: Warning messages: 1: NaNs produced in: dlogis(x, location, scale, log) 2: NaNs produced in: dlogis(x, location, scale, log) But if I call for the "ro6" object I get the coefficients but without standard errors: > ro6 Call: polr(formula = abun ~ InOmbrot + Oliva.OC + ToCultAr + DivCulArb + AltitMax + COORXY) Coefficient...
2008 Apr 03
1
help with R semantics
...sep="")) linkfun <- function(mu) { mu <- qlogis( (mu - POD.floor)/(POD.ceiling - POD.floor) ) } linkinv <- function(eta) { eta <- POD.floor + (POD.ceiling - POD.floor)*plogis(eta) } mu.eta <- function(eta) { (POD.ceiling - POD.floor)*dlogis(eta)# derivitaive of mu with respect to eta } valideta <- function(eta) TRUE link <- paste("logit.FC(", POD.floor, ",", POD.ceiling, ")", sep = "") structure(list(linkfun = linkfun, linkinv = linkinv, mu.eta = mu.eta, valideta...
2008 Sep 28
0
constrained logistic regression: Error in optim() with method = "L-BFGS-B"
...---------------------------# # A function to return the gradient for the "BFGS", "L-BFGS-B" methods # #----------------------------------------------------------------------# gmin <- function(beta, X, y, w) { eta <- X %*% beta; p <- plogis(eta) -2*matrix(w*dlogis(eta)*ifelse(y, 1/p, -1/(1-p)), 1) %*% X # Gradient #print(-2*matrix(w*dlogis(eta)*ifelse(y, 1/p, -1/(1-p)), 1) %*% X) } if(is.null(dim(x))) dim(x) <- c(length(x), 1) dn <- dimnames(x)[[2]] if(!length(dn)) dn <- paste("Slope", 1:ncol(x), sep="")...
2008 Sep 29
0
Logistic Regression using optim() give "L-BFGS-B" error, please help
...ction to return the gradient for the "BFGS", "L-BFGS-B" methods # #----------------------------------------------------------------------# gmin <- function(beta, X, y, w) { eta <- X %*% beta; p <- plogis(eta) #p <- ifelse(1-p < 1e-6, 1-1e-6, p) -2*matrix(w*dlogis(eta)*ifelse(y, 1/p, -1/(1-p)), 1) %*% X # Gradient print(-2*matrix(w*dlogis(eta)*ifelse(y, 1/p, -1/(1-p)), 1) %*% X) } if(is.null(dim(x))) dim(x) <- c(length(x), 1) dn <- dimnames(x)[[2]] if(!length(dn)) dn <- paste("Slope", 1:ncol(x), sep="") p <- ncol(x...
2005 Feb 20
1
logistic regression and 3PL model
...ngth(y)), intercept = T, start=rep(0,p), ...) { fmin <- function (beta, X, y, w){ p <- plogis(X %*% beta) -sum(2 * w * ifelse(y, log(p), log(1-p))) } gmin <- function (beta, X, y, w) { eta <- X %*% beta; p <- plogis(eta) -2 * (w *dlogis(eta) * ifelse(y, 1/p, -1/(1-p))) %*% X } if(is.null(dim(x))) dim(x) <- c(length(x), 1) dn <- dimnames(x)[[2]] if(!length(dn)) dn <- paste("Var", 1:ncol(x), sep="") p <- ncol(x) + intercept if(intercept) {x <- cbind(1,...
2008 Aug 14
3
extending the derivs table/fools rushing in
I added "plogis" to the derivative table in the development version of R; the patch against yesterday's R-devel src/deriv/main.c is available at http://www.zoology.ufl.edu/bolker/deriv_patch.txt . I pretty much followed the framework of the other symbols; here was my incantation - } else if (CAR(expr) == PlogisSymbol) { - ans = simplify(TimesSymbol, -
2009 Mar 17
3
R does not compile any more on FreeBSD 8.0-CURRENT
...inom.o pbinom.o qbinom.o rbinom.o rmultinom.o dcauchy.o pcauchy.o qcauchy.o rcauchy.o dexp.o pexp.o qexp.o rexp.o dgeom.o pgeom.o qgeom.o rgeom.o dhyper.o phyper.o qhyper.o rhyper.o dnbinom.o pnbinom.o qnbinom.o rnbinom.o dpois.o ppois.o qpois.o rpois.o dweibull.o pweibull.o qweibull.o rweibull.o dlogis.o plogis.o qlogis.o rlogis.o dnchisq.o pnchisq.o qnchisq.o dnbeta.o pnbeta.o qnbeta.o pnf.o pnt.o qnf.o qnt.o ptukey.o qtukey.o toms708.o wilcox.o signrank.o ranlib libnmath.a config.status: creating src/unix/Makefile make: /usr/local/R-devel/srcunix: No such file or directory *** Error code 2...
2002 Feb 22
1
Logit / ms
Hello, I am looking for a routine to do a logistic regression. In the book "Modern Applied Statistics with S-PLUS" a function is described which uses the 'ms' command. Is there an analogue for R, or an alternative approach that can accomplish the same thing? Thanks, John. -- ========================================== John Janmaat Department of Economics Acadia
1997 Dec 13
1
R-beta: Compile error; R-0.60.1, Solaris 2.6, gcc 2.7.2.1
...cc -g -I../include -c qhyper.c -o qhyper.o gcc -g -I../include -c rhyper.c -o rhyper.o gcc -g -I../include -c dlnorm.c -o dlnorm.o gcc -g -I../include -c plnorm.c -o plnorm.o gcc -g -I../include -c qlnorm.c -o qlnorm.o gcc -g -I../include -c rlnorm.c -o rlnorm.o gcc -g -I../include -c dlogis.c -o dlogis.o gcc -g -I../include -c plogis.c -o plogis.o gcc -g -I../include -c qlogis.c -o qlogis.o gcc -g -I../include -c rlogis.c -o rlogis.o gcc -g -I../include -c dnbinom.c -o dnbinom.o gcc -g -I../include -c pnbinom.c -o pnbinom.o gcc -g -I../include -c qnbinom.c -o qnbinom.o gc...
1999 May 03
1
problems compiling R-0.63.3 on alpha
.../include -I../../src/include -c pweibull.c -o pweibull.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c qweibull.c -o qweibull.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c rweibull.c -o rweibull.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c dlogis.c -o dlogis.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c plogis.c -o plogis.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c qlogis.c -o qlogis.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c rlogis.c -o rlogis.o gcc -ieee_with_inexact -g -I...
1998 Nov 06
1
DEC alpha INSTALLATION R-0.62.4
...-c rpois.c cc -ieee_with_inexact -g -I../../src/include -c dweibull.c cc -ieee_with_inexact -g -I../../src/include -c pweibull.c cc -ieee_with_inexact -g -I../../src/include -c qweibull.c cc -ieee_with_inexact -g -I../../src/include -c rweibull.c cc -ieee_with_inexact -g -I../../src/include -c dlogis.c cc -ieee_with_inexact -g -I../../src/include -c plogis.c cc -ieee_with_inexact -g -I../../src/include -c qlogis.c cc -ieee_with_inexact -g -I../../src/include -c rlogis.c cc -ieee_with_inexact -g -I../../src/include -c dnchisq.c cc -ieee_with_inexact -g -I../../src/include -c pnchisq.c cc -...
1999 May 03
0
compilation of R-0.63.3 on alpha (PR#183)
..../../src/include -c pweibull.c= -o = pweibull.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c qweibull.c= -o = qweibull.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c rweibull.c= -o = rweibull.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c dlogis.c -= o = dlogis.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c plogis.c -= o = plogis.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c qlogis.c -= o = qlogis.o gcc -ieee_with_inexact -g -I../include -I../../src/include -c rlogis.c -= o = rlogis.o gcc -ieee_wi...
2004 Nov 15
1
R-2.0.1 is released
...mented in R.) o write.table() was not respecting the 'dec' argument for complex numbers. o write.table() printed a mixture of numeric and complex numbers as all complex. (PR#7260) o R CMD INSTALL failed with versioned installs on packages which save images (only). o dlogis() gave NaN not 0 for large negative arguments. o Importing from another namespace was broken for versioned installs, incorrectly reporting something like "package 'imported_from' does not have a name space". o The GNOME interface under Linux/Unix was broken. (PR#7276)...
2004 Nov 15
1
R-2.0.1 is released
...mented in R.) o write.table() was not respecting the 'dec' argument for complex numbers. o write.table() printed a mixture of numeric and complex numbers as all complex. (PR#7260) o R CMD INSTALL failed with versioned installs on packages which save images (only). o dlogis() gave NaN not 0 for large negative arguments. o Importing from another namespace was broken for versioned installs, incorrectly reporting something like "package 'imported_from' does not have a name space". o The GNOME interface under Linux/Unix was broken. (PR#7276)...
2012 Jan 17
2
pscl package and hurdle model marginal effects
This request is related to the following post from last year: https://stat.ethz.ch/pipermail/r-help/2011-June/279752.html After reading the thread, the idea is still not clear. I have fitted a model using HURDLE from the PSCL package. I am trying to get marginal effects / slopes by multiplying the coefficients by the mean of the marginal effects (I think this is right). To my understanding, this
1998 Dec 08
0
R compile problems with AIX
...ude -c dweibull.c -o dweibull.o gcc -g -O2 -I../include -I../../src/include -c pweibull.c -o pweibull.o gcc -g -O2 -I../include -I../../src/include -c qweibull.c -o qweibull.o gcc -g -O2 -I../include -I../../src/include -c rweibull.c -o rweibull.o gcc -g -O2 -I../include -I../../src/include -c dlogis.c -o dlogis.o gcc -g -O2 -I../include -I../../src/include -c plogis.c -o plogis.o gcc -g -O2 -I../include -I../../src/include -c qlogis.c -o qlogis.o gcc -g -O2 -I../include -I../../src/include -c rlogis.c -o rlogis.o gcc -g -O2 -I../include -I../../src/include -c dnchisq.c -o dnchisq.o gcc -g...
1998 Dec 08
0
R compile problems with AIX
...ude -c dweibull.c -o dweibull.o gcc -g -O2 -I../include -I../../src/include -c pweibull.c -o pweibull.o gcc -g -O2 -I../include -I../../src/include -c qweibull.c -o qweibull.o gcc -g -O2 -I../include -I../../src/include -c rweibull.c -o rweibull.o gcc -g -O2 -I../include -I../../src/include -c dlogis.c -o dlogis.o gcc -g -O2 -I../include -I../../src/include -c plogis.c -o plogis.o gcc -g -O2 -I../include -I../../src/include -c qlogis.c -o qlogis.o gcc -g -O2 -I../include -I../../src/include -c rlogis.c -o rlogis.o gcc -g -O2 -I../include -I../../src/include -c dnchisq.c -o dnchisq.o gcc -g...
2006 Apr 16
3
second try; writing user-defined GLM link function
I apologize for my earlier posting that, unbeknownst to me before, apparently was not in the correct format for this list. Hopefully this attempt will go through, and no-one will hold the newbie mistake against me. I could really use some help in writing a new glm link function in order to run an analysis of daily nest survival rates. I've struggled with this for weeks now, and can at least