search for: alpha1

Displaying 20 results from an estimated 176 matches for "alpha1".

Did you mean: alpha
2005 Aug 24
0
verbose imap logging
...: jens.laas at data.slu.se Department of Computer Services, SLU Phone: +46 18 67 35 15 Vindbrov?gen 1 P.O. Box 7079 S-750 07 Uppsala SWEDEN ----------------------------------------------------------------------- -------------- next part -------------- diff -ur dovecot-1.0.alpha1.orig/src/imap/client.c dovecot-1.0.alpha1/src/imap/client.c --- dovecot-1.0.alpha1.orig/src/imap/client.c 2005-07-03 23:32:21.000000000 +0200 +++ dovecot-1.0.alpha1/src/imap/client.c 2005-08-23 10:39:08.000000000 +0200 @@ -56,10 +56,22 @@ return client; } -void client_destroy(struct client *cl...
2001 Jan 04
0
Problems/Modifications compiling SAMBA 2.2-alpha1 on SCO Openserver 5.0.5a
...ne small modification I was able to compile samba. I have not yet tried to use it, but at least swat is working. It would be nice if anyone could modify the current code to resolve the specified problems. Mike The Problems: Only a nuisance: uid_t and gid_t are unsigned: /GNU-Source/samba-2.2.0-alpha1/source/smbd/sec_ctx.c: In function `initialise_groups': /GNU-Source/samba-2.2.0-alpha1/source/smbd/sec_ctx.c:227: warning: comparison is always false due to limited range of data type /GNU-Source/samba-2.2.0-alpha1/source/smbd/sec_ctx.c:227: warning: comparison is always false due to limited ra...
2008 Dec 02
3
date operations
Un texte encapsul? et encod? dans un jeu de caract?res inconnu a ?t? nettoy?... Nom : non disponible URL : <https://stat.ethz.ch/pipermail/r-help/attachments/20081202/10f66fc6/attachment.pl>
2013 Mar 11
2
vertical lines in R plot
...wish to draw vertical lines at d=c(5.0,5.5,6) and they should go till p=c(0.12,0.60,0.20) . I haven't found any way out, though made several attempts. Please run the following commands first if you are interested in! ####################################################### psi1<-function(alpha1,beta1,alpha2,beta2,d){ exp(alpha1+beta1*d)/((1+exp(alpha1+beta1*d))*(1+exp(alpha2+beta2*d))) } alpha1<--3.5 beta1<-1 alpha2<--6 beta2<-0.72 d<-seq(0.5,10,0.01) plot(d,psi1(alpha1,beta1,alpha2,beta2,d),type="l",pch=18, ylim=c(0,1),...
2011 May 04
1
hurdle, simulated power
...-0.200134813 Three of the four look right (ie, converging to population values), but the count_trt is stuck at zero, regardless of sample size (when it should be ~ -0.20). Does anyone see what's wrong? Thanks for any input. cheers, Dave mysim <- function(n, beta0, beta1, alpha0, alpha1, theta){ trt <- c(rep(0,n), rep(1,n)) ### mean function logit model p0 <- exp(alpha0 + alpha1*trt)/(1 + exp(alpha0 + alpha1*trt)) ### 0 / 1 based on p0 y1 <- as.numeric(runif(n)>p0) ### mean function count portion mu <- exp(beta0 + beta1*trt) ### estimate counts using NB dist...
2007 Aug 07
2
Latest 1.1 tree build failure
Suggestions of how to fix this? mkdir -p /build/work/dovecot-1.1-alpha1 cd /build/work/dovecot-1.1-alpha1 export LDFLAGS='-L/common/pkgs/sqlite-3.4.1.1/lib64 -R/common/pkgs/sqlite-3.4.1.1/lib64' export CPPFLAGS='-pipe -O2 -I/common/pkgs/sqlite-3.4.1.1/include' unset CDPATH make distclean ./configure --prefix=/common/pkgs/dovecot-1.1-alpha1 --disable-nls...
2005 Aug 18
3
1.0 alpha1 released
As promised a few days ago, 1.0.alpha1 release is now available from Dovecot web page. Changes since 1.0-test80 include only one mbox assert crashfix and removed fsync() call when writing to transaction log, making it a bit faster. I changed the version number also since 1.0-tests to 1.0.alpha. I know '-' is problematic to bin...
2012 Oct 23
1
Minimizing Computational Time
...way (if there is!) to reduce the computational time of the main programme. For instance, is there any smart way for the following programme that will lessen time? --------------------------------------------------------------------------------------------------------------- dose<-seq(0,10,.5) alpha1<--4 beta1<-0.5 alpha2<--6 beta2<--.7 psi1<-function(alpha1,beta1,alpha2,beta2,d){ z1<-exp(alpha1+beta1*d) z2<-exp(alpha2+beta2*d) z1/((1+z1)*(1+z2)) } psi2<-function(alpha2,beta2,d) { z2<-exp(alpha2+be...
2005 Feb 27
2
Help with constrained optimization
Dear all, I need an advice in the following problem. I have to maximize two functions of the form f1(x)=f(y1,x,alpha1,beta1) and f2(x)=(y2,x,alpha2,beta2), the maximization is with respect to alpha1, alpha2, beta1, beta2. I can maximize each function separately using nlm. The problem is that I have to add the constraint of the form g(alpha1)=g(alpha2). The total number of parameters is approximately 30. What...
2008 Sep 05
4
v1.2.alpha1 released
http://dovecot.org/releases/1.2/alpha/dovecot-1.2.alpha1.tar.gz http://dovecot.org/releases/1.2/alpha/dovecot-1.2.alpha1.tar.gz.sig This is the only v1.2.alpha announcement I'm going to send to dovecot-news list. Next announcement will be for either v1.2.beta1 or v1.2.rc1. I'm hoping that v1.2 stabilizes pretty soon. There are no huge changes l...
2008 Sep 05
4
v1.2.alpha1 released
http://dovecot.org/releases/1.2/alpha/dovecot-1.2.alpha1.tar.gz http://dovecot.org/releases/1.2/alpha/dovecot-1.2.alpha1.tar.gz.sig This is the only v1.2.alpha announcement I'm going to send to dovecot-news list. Next announcement will be for either v1.2.beta1 or v1.2.rc1. I'm hoping that v1.2 stabilizes pretty soon. There are no huge changes l...
2005 Mar 02
1
Warning: number of items to replace is not a multiple of replacement length
...3=0.006688287 b3=0.039047537 t<-tt-20 h.t<-a2+a3*exp(b3*t) S.t<-exp(-a2*t+a3/b3*(1-exp(b3*t))) return(S.t*h.t) } #=========================== trans<-function (age) { indic=c(2,2) lage=log(age) xpars=c(2.1862908,7.5528077,8.5806697,2.3319461,8.8959507,9.1380187,0.3720293) beta<-c(0,0) alpha1<-c(0,0) alpha2<-c(0,0) beta[1]<-xpars[1] alpha1[1]<-xpars[2] alpha2[1]<-xpars[3] beta[2]<-xpars[4] alpha1[2]<-xpars[5] alpha2[2]<-xpars[6] corr<-matrix(rep(0,4),nc=2) corr[1,1]=1 corr[2,2]=1 corr[1,2]=xpars[7] corr[2,1]=corr[1,2] LLK<-0 L<-c(0,0) R<-c(0,0) for(...
2009 Jul 01
2
Difficulty in calculating MLE through NLM
Hi R-friends, Attached is the SAS XPORT file that I have imported into R using following code library(foreign) mydata<-read.xport("C:\\ctf.xpt") print(mydata) I am trying to maximize logL in order to find Maximum Likelihood Estimate (MLE) of 5 parameters (alpha1, beta1, alpha2, beta2, p) using NLM function in R as follows. # Defining Log likelihood - In the function it is noted as logL > library(stats) > loglike1<- function(x) + { + alpha1<-x[1] + beta1<-x[2] + alpha2<-x[3] + beta2<-x[4] + p<-x[5] + n<- mydata[3] + e<-mydata[...
2008 Dec 19
1
obtaining output from an evaluated expression
Hi I am trying to use the deriv and eval functions to obtain the value of a function , say "xi-(alpha0+alpha1*gi)" , differentiated with respect to alpha0 and alpha1, in the following way # for gi = 0 > dU1dtheta <- deriv(~ xi-(alpha0+alpha1*gi), c("alpha0","alpha1")) > eval(dU1dtheta) (Intercept) -0.2547153 attr(,"gradient") alpha0 alpha1 [1,]...
2007 Jul 30
1
dovecot-1.1-alpha1 prefetch appears broken
Config shows... # 1.1.alpha1: /usr/local/conf/dovecot.conf protocols: imaps ssl_listen: 69.94.137.124:10943 login_dir: /common/pkgs/dovecot-1.1-alpha1/var/run/dovecot/login login_executable: /common/pkgs/dovecot-1.1-alpha1/libexec/dovecot/imap-login mail_debug: yes auth default: verbose: yes debug: yes debug_passwords...
2009 Oct 12
3
v2.0.alpha1 released
http://dovecot.org/releases/2.0/alpha/dovecot-2.0.alpha1.tar.gz http://dovecot.org/releases/2.0/alpha/dovecot-2.0.alpha1.tar.gz.sig So here's the first alpha version of Dovecot v2.0. There are still a couple of things left to do, but in general it should work for most people. I started using it for my own mails a few days ago and it seems to work wi...
2009 Oct 12
3
v2.0.alpha1 released
http://dovecot.org/releases/2.0/alpha/dovecot-2.0.alpha1.tar.gz http://dovecot.org/releases/2.0/alpha/dovecot-2.0.alpha1.tar.gz.sig So here's the first alpha version of Dovecot v2.0. There are still a couple of things left to do, but in general it should work for most people. I started using it for my own mails a few days ago and it seems to work wi...
2006 Jul 22
1
Why the contrain does not work for selecting a particular range of data?
...'! I selecting the data whose 'x2'=1 for maximizing likelihood. I used two way to do this but the results are different. 1.Way one I use the data for x2=1 and run the program. It works for me. Tthe program is described as below: function (parameters,y1,x11) { p<-parameters[1] alpha1<-parameters[2] beta1<-parameters[3] delta1<-parameters[4] lamda1<-parameters[5] mu<-alpha1*((x11)^beta1)*exp(-delta1*(x11^lamda1)) ifelse(y1>0|x11>0, L<-lgamma(y1+p)+p*(log(p)-log(mu+p))+y1*(log(mu)-log(mu+p))-lfactorial(y1)-lgamma(p) ,Inf) L } This is working for...
2008 Jan 04
2
R2WinBUGS sending variables as factors
...sity of Tasmania and CSIRO Marine and Atmospheric Research ph +62 3 6232 5182 mb +61 429 32 5182 model { #Centre variables mSeaW <- mean(SeaW[]) s_dSeaW <- sd(SeaW[]) #normalise Variables nSeaWiFS <- mSeaW/s_dSeaW for(i in 1:N) { log(lambda[i]) <- delta0 + alpha1 * Month[i] + alpha2 * Lat[i] + beta1 * (SeaW[i] - nSeaW) logit(p[i]) <- gamma0 mu[i, 1] <- 0 mu[i, 2] <- lambda[i] mu.i[i] <- mu[i, index[i]] index[i] ~ dcat(theta[i, 1:2]) theta[i, 1] <- p[i] theta[i, 2] <- 1 - p[i] # mixture YFTCPUE[i] ~ dpois(mu.i[i...
2005 Aug 29
2
Sig11 and some corrupted indexes after 1.0-stable -> 1.0.alpha1
I just upgraded my production box from 1.0-stable to 1.0.alpha1. I've noted some new errors in my dovecot logs: Aug 28 23:23:56 cliff dovecot: IMAP(rsferra): Corrupted index cache file /mail/mcad.edu/rsferra/Maildir/.Sent Items/dovecot.index.cache: indexid changed Aug 28 23:33:57 cliff dovecot: IMAP(acarr): Corrupted transaction log file /mail/mcad.edu/ac...