Displaying 20 results from an estimated 277 matches for "alp".
Did you mean:
all
2010 Apr 09
0
rjags syntax error
...1
Below is my JAGS model. Please cc me as I'm a digest subscriber if you
reply.
Thanks!
Chris
JAGS model ...
model {
for(i in 1:N){
##########################
# measurement equation model
##########################
for(j in 1:P){
y[i,j]~dnorm(mu[i,j],psi[j])
}
##########################
# alp[i] corresponds to the intercepts
##########################
mu[i,1]<-xi[i,1]+alp[1] ## Ext1
mu[i,2]<-lam[1]*xi[i,1]+alp[2]
mu[i,3]<-lam[2]*xi[i,1]+alp[3]
mu[i,4]<-xi[i,2]+alp[4] ## Soc1
mu[i,5]<-lam[3]*xi[i,2]+alp[5]
mu[i,6]<-lam[4]*xi[i,2]+alp[6]
mu[i,7]<-xi[i,3]+alp[7] ## Aca...
2010 Jun 17
3
how to use sapply code
Hi,
I have this code here and try to use sapply code. But I got error message that I don't really understand to correct.
bt <- c(24.96874, 19.67861, 23.51001, 19.86868); round(bt,2)
alp <- c(2.724234, 3.914649, 3.229146, 3.120719); round(alp,2)
bt_alp <- data.frame(bt,alp)
sapply(bt_alp, function(bt,alp) ((bt_m/bt)^alp), bt_m = min(bt))
> sapply(bt_alp, function(bt,alp) ((bt_m/bt)^alp), bt_m = min(bt))
Error in FUN(X[[1L]], ...) : unused argument(s) (bt_m = 19.67861)...
2010 Jun 17
1
sapply or apply
Hi r-users,
I have this code here :
dt <- winter_pos_sum
bt <- c(24.96874, 19.67861, 23.51001, 19.86868); round(bt,2)
alp <- c(2.724234, 3.914649, 3.229146, 3.120719); round(alp,2)
bt_min <- min(bt) ; bt_min
p <- alp_sum ; p
t <- 50
t1 <- t+1
#first get the sum over the eigenvalues for a particular power i
gam_sum <- function(alp,bt,bt_min,i) {alp*(1-bt_min/bt)^i}
gam_sum(a...
2011 Mar 15
1
Problem with nls.lm function of minpack.lm package.
...l = j.Th,
h = h, Th = Th, control = nls.lm.control(maxfev = integer(),
maxiter = 10000, nprint=100))
The parameter estimates keep changing even after 1000 iterations. This is
not good.
In the second fit, I change the starting values slightly, to
##starting values (alp = 0.04, n = 1.6, L = 0.5)
guess.k <- c(alp = 0.08, n = 1.61, L = 0.51)
## to use an analytical expression for the gradient found in fcn.jac
## uncomment jac = fcn.jac
out.k <- nls.lm(par = guess.k, fn = fcn.k, jac = fcn.jac.k,
fcall = f.k, jcall = j.k,
h = h, k...
2010 Jan 26
1
newton method for single nonlinear equation
...es. Thank you so much for any help given.
newton.inputsingle <- function(pars,n)
{ runi <- runif(974, min=0, max=1)
lendt <- length(runi)
## Parameter to estimate
z <- vector(length=lendt, mode= "numeric")
z <- pars[1]
## Constant value
alp <- 2.0165 ; rho <- 0.868;
c <- sqrt(pi)/(gamma(alp)*(1-rho)^alp)
for (i in 1:n)
{ t1 <- exp(-pars[1]/(1-rho))
t2 <- (pars[1]*(1-rho)/(2*sqrt(rho)))^(alp-0.5)
bes1 <- besselI(pars[1]*sqrt(rho)/(1-rho),alp-0.5)
bes...
2014 Jun 06
2
[LLVMdev] buildbot failure in LLVM on sanitizer-x86_64-linux (-Wframe-larger-than)
On 06/06/2014 02:33, Alexey Samsonov wrote:
> Hi Alp,
>
> This warning should be fixed by r210301. However, consider
> investigating why the frame size appears to be that large. I believe
> we build this code with GCC as well and have seen no complaints
> from its implementation of -Wframe-larger-than.
CC'ing in llvmdev. Like Ch...
2010 Feb 10
1
looping problem
Hi R-users,
I have this code here:
library(numDeriv)
fprime <- function(z)
{ alp <- 2.0165;
rho <- 0.868;
# simplified expressions
a <- alp-0.5
c1 <- sqrt(pi)/(gamma(alp)*(1-rho)^alp)
c2 <- sqrt(rho)/(1-rho)
t1 <- exp(-z/(1-rho))
t2 <- (z/(2*c2))^a
bes1 <- besselI(z*c2,a)
t1bes1 <- t1*bes1
c1*t1bes1*t2
}
...
2013 Dec 11
3
[LLVMdev] [cfe-dev] Phabricator email
On 11 December 2013 17:35, Alp Toker <alp at nuanti.com> wrote:
> I noticed a few contributors have been landing patches without responding to
> my review comments.
Oh, that happened to me too, but it turns out you have to press the
"clowncopterize" after making comments inlilne, or Phabricator won't
p...
2014 Jun 25
2
[LLVMdev] Phabricator and private reviews
On 25/06/2014 21:03, Eli Bendersky wrote:
> On Wed, Jun 25, 2014 at 10:44 AM, Alp Toker <alp at nuanti.com
> <mailto:alp at nuanti.com>> wrote:
>
> For whatever reason, patches posted to the Phabricator website
> still aren't being sent to the mailing list, making it difficult
> for us to review them.
>
> I've raised this...
2014 Jan 31
7
[LLVMdev] [cfe-dev] Status of SEH?
On 30/01/2014 22:57, Daniel Berlin wrote:
> On Thu, Jan 30, 2014 at 2:34 PM, Alp Toker <alp at nuanti.com> wrote:
>> On 30/01/2014 22:06, Daniel Berlin wrote:
>>> Actually, the policy actually says the right thing, you removed a
>>> sentence, which says:
>>> "Please contact the oversight group for more details."
>>
>>...
2014 Jun 25
5
[LLVMdev] Phabricator and private reviews
On 25/06/2014 21:18, Eli Bendersky wrote:
>
>
>
> On Wed, Jun 25, 2014 at 11:10 AM, Alp Toker <alp at nuanti.com
> <mailto:alp at nuanti.com>> wrote:
>
>
> On 25/06/2014 21:03, Eli Bendersky wrote:
>
> On Wed, Jun 25, 2014 at 10:44 AM, Alp Toker <alp at nuanti.com
> <mailto:alp at nuanti.com> <mailto:alp at nuanti.com
&...
2014 Jul 01
4
[LLVMdev] Usability of phabricator review threads for non-phab-users
On 01/07/2014 21:28, Alp Toker wrote:
> Specifically the problem I've been seeing is that people using the
> website are unable to CC mailing list-based developers. As a result I
> don't get copied in on responses to my review comments, and rarely get
> any kind of direct mail with threading. You end...
2013 Dec 11
0
[LLVMdev] [cfe-dev] Phabricator email
On 11/12/2013 17:48, Renato Golin wrote:
> On 11 December 2013 17:35, Alp Toker <alp at nuanti.com> wrote:
>> I noticed a few contributors have been landing patches without responding to
>> my review comments.
> Oh, that happened to me too, but it turns out you have to press the
> "clowncopterize" after making comments inlilne, or Phabri...
2010 Mar 16
0
recursive term
Hi r-users;
I have this values:
eign_val <- c(137.810447,3.538721,2.995161,1.685670)
alp <- 1.6549 ; lamda <- eign_val
lamda_m <- min(lamda)
First I calculated manually:
delta0 <- 1
delta1 <- alp*delta0*(4-lamda_m*(1/lamda[1]+1/lamda[2]+1/lamda[3]+1/lamda[4]))
delta1
delta2 <- (alp/2)*(delta1*(delta1/alp) + delta0*((1-lamda_m/lamda[1])^2+ (1-lamda_m/lamda[2])^...
2014 Jun 25
12
[LLVMdev] Phabricator and private reviews
...d
be send to the mailing lists *until* the technical issue is confirmed
resolved.
It's really uncool that code is entering ToT through this back-channel
-- I appreciate that it might not be intentional, but every single patch
that gets committed this way is a real problem for the project.
Alp.
--
http://www.nuanti.com
the browser experts
2014 Jun 25
4
[LLVMdev] Phabricator and private reviews
I have to agree with Alp here. I’ve seen a number of review threads that either seem to be missing emails or in which the emails arrive days in unintelligible orders. I don’t know that we need to cut off use of it, but we need to prioritize resolving this issue.
—Owen
On Jun 25, 2014, at 10:59 AM, Eric Christopher <...
2013 Nov 11
3
[LLVMdev] [cfe-dev] Goal for 3.5: Library-friendly headers
On 11/11/2013 19:08, Chris Lattner wrote:
> On Nov 11, 2013, at 9:56 AM, Alp Toker <alp at nuanti.com
> <mailto:alp at nuanti.com>> wrote:
>> Done :-)
>>
>> The patchset is 532K so I've put it online:
>>
>> http://www.nuanti.com/tmp/llvm-api-stability/
>>
>> The bulk edits are split out and noted. They were refa...
2014 Feb 27
3
[LLVMdev] Future of the LLVM OpenMP runtime
On 26/02/2014 09:03, David Chisnall wrote:
> On 25 Feb 2014, at 23:13, Alp Toker <alp at nuanti.com> wrote:
>
>> Now that we've kick-started the LLVM OpenMP runtime discussion, I want to make a concrete proposal to get a test suite up and running for the LLVM OpenMP runtime. I don't think the current setup as an LLVM subproject is sustainable going...
2010 Jan 26
1
Newton method
...es. Thank you so much for any help given.
newton.inputsingle <- function(pars,n)
{ runi <- runif(974, min=0, max=1)
lendt <- length(runi)
## Parameter to estimate
z <- vector(length=lendt, mode= "numeric")
z <- pars[1]
## Constant value
alp <- 2.0165 ; rho <- 0.868;
c <- sqrt(pi)/(gamma(alp)*(1-rho)^alp)
for (i in 1:n)
{ t1 <- exp(-pars[1]/(1-rho))
t2 <- (pars[1]*(1-rho)/(2*sqrt(rho)))^(alp-0.5)
bes1 <- besselI(pars[1]*sqrt(rho)/(1-rho),alp-0.5)
bes...
2010 Feb 09
1
how to adjust the output
Hi R-users,
I have this code below and I understand the error message but do not know how to correct it. My question is how do I get rid of “with absolute error < 7.5e-06” attach to value of cdf so that I can carry out the calculation.
integrand <- function(z)
{ alp <- 2.0165
rho <- 0.868
# simplified expressions
a <- alp-0.5
c1 <- sqrt(pi)/(gamma(alp)*(1-rho)^alp)
c2 <- sqrt(rho)/(1-rho)
t1 <- exp(-z/(1-rho))
t2 <- (z/(2*c2))^a
bes1 <- besselI(z*c2,a)
t1bes1 <- t1*bes1
c1*t1bes1*t2
}...