search for: psi

Displaying 20 results from an estimated 538 matches for "psi".

Did you mean: pci
2009 Aug 12
1
psi not functioning in nlrob?
Hi all, I'm trying to fit a nonlinear regression by "nlrob": model3=nlrob(y~a1*x^a2,data=transient,psi=psi.bisquare, start=list(a1=0.02,a2=0.7),maxit=1000) However an error message keeps popping up saying that the function psi.bisquare doesn't exist. I also tried psi.huber, which is supposed to be the default for nlrob: model3=nlrob(y~a1*x^a2,data=transient,psi=psi.huber, start=list(a1=0.02,a...
2007 Apr 09
1
R:Maximum likelihood estimation using BHHH and BFGS
Dear R users, I am new to R. I would like to find *maximum likelihood estimators for psi and alpha* based on the following *log likelihood function*, c is consumption data comprising 148 entries: fn<-function(c,psi,alpha) { s1<-sum(for(i in 1:n){(c[i]-(psi^(-1/alpha)*(lag(c[i],-1))))^2* (lag(c[i],-1)^((-2)*(alpha+1)) )}); s2<- sum(for(m in 1:n){log(lag(c[m],-1)^(((2)*alp...
2016 Aug 19
3
multiple domain and winbind use default domain
Hello I'm preparing a new fileserver, based on jessie + sernet 4.2.10 packages. the server is bound to a forest, "AD" where users account are stored, and subdomains "PSI" for computers and some local accounts The Active directory forest is managed by 2008R2 servers, with rfc2307 attributs filled for accounts. I'm using "winbind use default domain" because users are also used on linux PC labs. So currently an user user1 from domain AD can req...
2012 Jul 03
2
EM algorithm to find MLE of coeff in mixed effects model
I have a general question about coefficients estimation of the mixed model. I simulated a very basic model: Y|b=X*\beta+Z*b +\sigma^2* diag(ni); b follows N(0,\psi) #i.e. bivariate normal where b is the latent variable, Z and X are ni*2 design matrices, sigma is the error variance, Y are longitudinal data, i.e. there are ni measurements for object i. Parameters are \beta, \sigma, \psi; call them \theta. I wrote a regular EM, the M step is to maximize the l...
2010 May 24
2
How to set parameters constraints in a function?
Dear R list, I have a function specifying my log-likelihood, and now I need to set the constraint that *alpha > kappa*, could anyone help me with setting this in my function? the function is defined as follows: mll <- function(param){ n <- length(x) psi <- numeric(n) psi[1] <- 1.0 a0 <- exp(param[1]); a1 <-exp(param[2]); b1 <- exp(param[3]); *alpha *<- exp(param[4]); *kappa *<- exp(param[5]); for (i in 2:n) {psi[i] <- a0 + a1*x[i-1] + b1*psi[i-1]} lam <- gamma(kappa)/gamma(kappa+(1/alpha)) ll <- n*log(alpha...
2011 Apr 10
1
MLE where loglikelihood function is a function of numerical solutions
Hi there, I'm trying to solve a ML problem where the likelihood function is a function of two numerical procedures and I'm having some problems figuring out how to do this. The log-likelihood function is of the form L(c,psi) = 1/T sum [log (f(c, psi)) - log(g(c,psi))], where c is a 2xT matrix of data and psi is the parameter vector. f(c, psi) is the transition density which can be approximated. The problem is that in order to approximate this we need to first numerically solve 3 ODEs. Second, numerically solve 2 non-l...
2011 Jun 23
0
Fwd: Re: Help with winbugs code
...efine real result" but when I delete variable "y" in the initial part it said that there some variable that has to be initialized. what should i do? ...very grateful for your help... model{ for(i in 1:N){ #model persamaan pengukuran for(j in 1:P){ y[i,j]~dnorm(mu[i,j],psi [j]) I(thd [j,z[i,j]],thd[j,z[i,j]+1]) ephat[i,j]<-y[i,j] -mu[i,j] } #faktor Budaya Organisasi mu[i,1]<-xi[i,1] mu[i,2]<-lam[1]*xi[i,1] mu[i,3]<-lam[2]*xi[i,1] #faktor Kemampuan Pengguna mu[i,4]<-xi[i,2] mu[i,5]<-lam[3]*xi[i,2] mu[i,6]<-lam[4]*xi[i,2] #fa...
2013 Apr 24
0
vorbis-psy compilation fix
This patch enables compilation with GCC 4.7.1 and --enable-shared=yes --enable-static=no --enable-vorbis-psy -------------- next part -------------- diff -r -u speex/configure.ac speex/configure.ac --- speex/configure.ac 2013-04-24 19:08:00.710564608 +0400 +++ speex/configure.ac 2013-04-24 20:04:33.589310544 +0400 @@ -204,7 +204,7 @@ AC_DEFINE([TI_C55X], , [Enable support for TI C55X DSP])
2019 Mar 13
2
RFC: Getting ProfileSummaryInfo and BlockFrequencyInfo from various types of passes under the new pass manager
Overall seems fine to me. On 3/11/19 8:12 PM, Hiroshi Yamauchi wrote: > Here's a revised approach based on the discussion: > > - Cache PSI right after the profile summary in the IR is written in > the pass pipeline. This would avoid the need to insert > RequireAnalysisPass for PSI before each non-module pass that needs it. > PSI can be technically invalidated but unlikely as PSI is immutable. > If it does, we can inser...
2005 Mar 09
0
Illegal filenames produced by rename
Greetings. I have a Windows share mounted via Samba. I recently tried to rename some files; the destination filenames had some high-bit characters. The renaming had some completely unexpected consequences; the new filenames now contain the full pathname (including backslashes), plus other illegal characters (colons). The files can no longer be accessed or modified, either from the remote
2019 Feb 27
2
RFC: Getting ProfileSummaryInfo and BlockFrequencyInfo from various types of passes under the new pass manager
Hi all, To implement more profile-guided optimizations, we’d like to use ProfileSummaryInfo (PSI) and BlockFrequencyInfo (BFI) from more passes of various types, under the new pass manager. The following is what we came up with. Would appreciate feedback. Thanks. Issue It’s not obvious (to me) how to best do this, given that we cannot request an outer-scope analysis result from an inner-sco...
2012 Jul 03
0
need help EM algorithm to find MLE of coeff in mixed effects model
Dear All, have a general question about coefficients estimation of the mixed model. I simulated a very basic model: Y|b=X*\beta+Z*b +\sigma^2* diag(ni); b follows N(0,\psi) #i.e. bivariate normal where b is the latent variable, Z and X are ni*2 design matrices, sigma is the error variance, Y are longitudinal data, i.e. there are ni measurements for object i. Parameters are \beta, \sigma, \psi; call them \theta. I wrote a regular EM, the M step is to maximize the lo...
2012 Aug 13
0
rjags error. Error parsing model file:,syntax error on line 5 near ""
...ed the following error Error parsing model file: syntax error on line 5 near "" Line 5 is model { Here is my syntax. Any insight would be greatly appreciated. require(rjags) modelstring = " model { for (i in 1 : nData) { for (j in 1 : nIndicators) { y[i,j] ~ dnorm(mu[i,j],psi[j]) ephat[i,j] <- y[i,j] - mu[i,j] } mu[i,1] <- alpha[1]+xi[i,1] # Factor 1 mu[i,2] <- alpha[2]+lam[2]*xi[i,1] mu[i,3] <- alpha[3]+lam[3]*xi[i,1] mu[i,4] <- alpha[4]+lam[4]*xi[i,1] mu[i,5] <- alpha[5]+lam[5]*xi[i,1] mu[i,6] <- alpha[6]+lam[6]*xi[i,1] mu[i,...
2016 Aug 19
0
multiple domain and winbind use default domain
...Aug 2016 09:22:50 +0200 BLINDAUER Emmanuel via samba <samba at lists.samba.org> wrote: > Hello > I'm preparing a new fileserver, based on jessie + sernet 4.2.10 > packages. the server is bound to a forest, "AD" where users account > are stored, and subdomains "PSI" for computers and some local accounts > The Active directory forest is managed by 2008R2 servers, with > rfc2307 attributs filled for accounts. > > I'm using "winbind use default domain" because users are also used on > linux PC labs. > > So currently an...
2009 Aug 17
2
Newbie that don't understand R code
...} , gumbel = function(t, theta) { exp( - t^(1/theta)) } , frank = function(t, theta) { (-1/theta) * log(1 - (1 - exp( - theta)) * exp( - t)) } , BB9 = function(t, theta) { exp( - (theta[2]^theta[1] + t)^(1/theta[1]) + theta[2]) } , GIG = function(t, theta) { lambda <- theta[1] chi <- theta[2] psi <- theta[3] if (chi==0) out <- (1+2*t/psi)^(-lambda) else if (psi==0) out <- 2^(lambda+1)*exp(besselM3(lambda,sqrt(2*chi*t),log value=TRUE)-lambda*log(2*chi*t)/2)/gamma(-lambda) else out <- exp(besselM3(lambda,sqrt(chi*(psi+2*t)),logvalue=T RUE)+lambda*log(chi*psi)/2-besselM3(lambda,sqr...
2008 Oct 26
0
orthographic projection of ellipsoids
...e outline of the object. This is clearly not very efficient or satisfying. I think I'm on the wrong track from the start. Is there an obvious analytical parametrisation of such projections? Any comments are welcome. Many thanks, baptiste > > rotM3d <- function(theta=0, phi=0, psi=0){ # 3D rotation matrix > a11 <- cos(psi)*cos(phi) - cos(theta)*sin(phi)*sin(psi) > a12 <- cos(psi)*sin(phi) + cos(theta)*cos(phi)*sin(psi) > a13 <- sin(psi)*sin(theta) > a21 <- -sin(psi)*cos(phi) - cos(theta)*sin(phi)*cos(psi) > a22 <- -sin(psi)*sin(phi) + cos(t...
2019 Mar 04
2
RFC: Getting ProfileSummaryInfo and BlockFrequencyInfo from various types of passes under the new pass manager
...lists.llvm.org>> wrote: >> >> On 2/28/19 12:47 AM, Hiroshi Yamauchi via llvm-dev wrote: >>> Hi all, >>> >>> To implement more profile-guided optimizations, we’d >>> like to use ProfileSummaryInfo (PSI) and >>> BlockFrequencyInfo (BFI) from more passes of various >>> types, under the new pass manager. >>> >>> The following is what we came up with. Would appreciate >>> feedback. Thanks. >>> >&g...
2019 Mar 13
1
RFC: Getting ProfileSummaryInfo and BlockFrequencyInfo from various types of passes under the new pass manager
...2019 at 2:37 PM Fedor Sergeev <fedor.sergeev at azul.com > <mailto:fedor.sergeev at azul.com>> wrote: > >> >> - Add a new proxy ModuleAnalysisManagerLoopProxy for a loop pass >> to be able to get to the ModuleAnalysisManager in one step and >> PSI through it. > This is just an optimization of compile-time, saves one > indirection through FunctionAnalysisManager. > I'm not even sure if it is worth the effort. And definitely not > crucial for the overall idea. > > > This should probably be clarified to...
2012 May 08
1
Error with psi value for 'segmented' package for R
Hi everyone, while trying to use 'segmented' (R i386 2.15.0 for Windows 32bit OS) to determine the breakpoint I got stuck with an error message and I can't find solution. It is connected with psi value, and the error says: Error in seg.glm.fit(y, XREG, Z, PSI, weights, offs, opz) : (Some) estimated psi out of its range This is the code I am using: library("segmented") curva<-read.table("lamintr1.txt", header=T) attach(curva) fit.glm<-glm(gpp~temp, weight=...
2007 Oct 13
2
the use of the .C function
Dear All, could someone please shed some light on the use of the .C or .Fortran function: I am trying load and running on R the following function // psi.cpp -- psi function for real arguments. // Algorithms and coefficient values from "Computation of Special // Functions", Zhang and Jin, John Wiley and Sons, 1996. // // (C) 2003, C. Bond. All rights reserved. // // Returns psi function for real argument 'x'. //...