Displaying 20 results from an estimated 650 matches for "beta1".
Did you mean:
beta
2013 Mar 24
5
Rails 4.0 has_many_through and fields_for
...Trace <http://localhost:3100/controller_actions/1/edit#> | Full Trace<http://localhost:3100/controller_actions/1/edit#>
app/views/controller_actions/_form.html.erb:21:in `block (2 levels) in _app_views_controller_actions__form_html_erb__366592963_95670400''
actionpack (4.0.0.beta1) lib/action_view/helpers/capture_helper.rb:38:in `block in capture''
actionpack (4.0.0.beta1) lib/action_view/helpers/capture_helper.rb:200:in `with_output_buffer''
actionpack (4.0.0.beta1) lib/action_view/helpers/capture_helper.rb:38:in `capture''
actionpack (4.0.0.beta1) l...
2005 Dec 01
2
Minimizing a Function with three Parameters
...ha \sum\limits_{i=1}^{n} ( i / \psihat(i) ) - (\alpha + 1)
\sum\limits_{i=1}^{n} ( i / (x_i + \psihat(i)) ) = 0
where \psihat=\beta_0 + \beta_1 * i. Now i want to get iterated values
for \alpha, \beta_0 and \beta_1, so i used the following implementation
# first equation
l1 <- function(beta0,beta1,alpha,x) {
n<-length(x)
s2<-length(x)
for(i in 1:n) {
s2[i]<-log(beta0+beta1*i)-log(x[i]+beta0+beta1*i)
}
s2<-sum(s2)
return((n/alpha)+s2)
}
# second equation
l2 <- function(beta0,beta1,alpha,x) {
n<-length(x)
s1<-length(x)
s2<-length(x)
for(i...
2004 Apr 21
2
Question on CAR appendix on NLS
...e code does a certain model in 3 ways: Vanilla NLS (using
numerical differentation), Analytical derivatives (where the user
supplies the derivatives) and analytical derivatives (using automatic
differentiation). The three results agree, except for the correlation
of parameter estimates :
beta1 beta2
beta2 -0.1662 Numerical derivatives
beta3 0.9145 -0.5407
beta2 -0.7950 Analytical derivatives
beta3 0.9145 -0.9661
beta2 -0.1662 Automatic differentiation
beta3 0.9145 -0.5407
Is this just a glitch of a small s...
2004 Mar 30
0
koq.q ---- Kent O' Quigley R2
...ype = "kaplan-meier")
Obs Events Model L.R. d.f. P Score Score P
26 12 14.29 1 2e-04 12.26 5e-04
R2
0.454
coef se(coef) z p
age 0.162 0.0497 3.25 0.00116
>koq(fit)
Beta = 0
Beta1 = 0.1616199
Error in ELL(theta = theta0, theta1 = theta1, x = x) :
only 0's may mix with negative subscripts
In addition: Warning message:
Replacement length not a multiple of the elements to replace in matrix(...)
-------------- next part --------------
"koq"<-
function(b...
2013 Apr 03
3
Generating a bivariate joint t distribution in R
Hi,
I conduct a panel data estimation and obtain estimators for two of the
coefficients beta1 and beta2. R tells me the mean and covariance of the
distribution of (beta1, beta2). Now I would like to find the distribution
of the quotient beta1/beta2, and one way to do it is to simulate via the
joint distribution (beta1, beta2), where both beta1 and beta2 follow t
distribution.
How could...
2009 Dec 14
5
v2.0.beta1 released
http://dovecot.org/releases/2.0/beta/dovecot-2.0.beta1.tar.gz
http://dovecot.org/releases/2.0/beta/dovecot-2.0.beta1.tar.gz.sig
Now that v2.0 is in beta stage I don't expect anything big to change
anymore. The configuration and the APIs shouldn't change in
non-backwards compatible ways. There are still bugs left to be fixed and
some small feat...
2009 Dec 14
5
v2.0.beta1 released
http://dovecot.org/releases/2.0/beta/dovecot-2.0.beta1.tar.gz
http://dovecot.org/releases/2.0/beta/dovecot-2.0.beta1.tar.gz.sig
Now that v2.0 is in beta stage I don't expect anything big to change
anymore. The configuration and the APIs shouldn't change in
non-backwards compatible ways. There are still bugs left to be fixed and
some small feat...
2005 Aug 26
2
Asterisk 1.2.0-beta1 Released
The first beta of Asterisk 1.2.0 has been released! It is available from
the ftp.digium.com FTP servers, as well as the Digium CVS servers (under
the 'v1-2-0-beta1' tag).
This version of Asterisk represents a significant improvement in
features, stability and compatibility over the 1.0.x releases. Some of
the major new (or upgraded) features include:
* Asterisk Realtime Architecture
* Asterisk Manager Interface
* Asterisk Extension Langua...
2009 Jan 29
3
bootstrapping in regression
...t statistics
distributions (t-distr for individual coefficients, F-values for
whole-model-comparisons), but instead apply a more robust approach by
bootstrapping.
In the simple linear regression case, one possibility is to randomly
rearrange the X/Y data pairs, estimate the model and take the
beta1-coefficient. Do this many many times, and so derive the null
distribution for beta1. Finally compare beta1 for the observed data
against this null-distribution.
What I now wonder is how the situation looks like in the multiple
regression case. Assume there are two predictors, X1 and X2. Is it t...
2013 Mar 11
2
vertical lines in R plot
...o
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),
xlab=...
2008 Sep 11
0
Loop for the convergence of shape parameter
Hello,
The likelihood includes two parameters to be estimated: lambda
(=beta0+beta1*x) and alpha. The algorithm for the estimation is as
following:
1) with alpha=0, estimate lambda (estimate beta0 and beta1 via GLM)
2) with lambda, estimate alpha via ML estimation
3) with updataed alpha, replicate 1) and 2) until alpha is converged to a
value
I coded 1) and 2) (it works), but fa...
2007 Sep 23
7
v1.1.beta1 released
http://dovecot.org/releases/1.1/beta/dovecot-1.1.beta1.tar.gz
http://dovecot.org/releases/1.1/beta/dovecot-1.1.beta1.tar.gz.sig
Alpha6 seemed to finally work quite well, so I think it's time for a
feature freeze (except for dbox changes).
I started a new wiki page to list incompatibilities between v1.0 and
v1.1: http://wiki.dovecot.org/Upgrading/...
2007 Sep 23
7
v1.1.beta1 released
http://dovecot.org/releases/1.1/beta/dovecot-1.1.beta1.tar.gz
http://dovecot.org/releases/1.1/beta/dovecot-1.1.beta1.tar.gz.sig
Alpha6 seemed to finally work quite well, so I think it's time for a
feature freeze (except for dbox changes).
I started a new wiki page to list incompatibilities between v1.0 and
v1.1: http://wiki.dovecot.org/Upgrading/...
2006 Oct 17
4
if statement error
Hi List,
I was not able to make this work. I know it is a simple one, sorry to bother. Give me some hints pls. Thanks!
Jen
if(length(real.d)>=30 && length(real.b)>=30 && beta1*beta2*theta1*theta2>0 )
{ r <- 1; corr <- 1; }
real.d and real.b are two vectors, beta1,beta2,theta1,and theta2 are constants. The error occurred like this:
Error in if (length(real.d) >= 30 && length(real.b) >= 30 && beta1 * beta2 * :
missing value w...
2008 Dec 03
1
hypergeometric
...n on hypergeometric but not really
sure what it means.
I would like to evaluate the hypergeometric function as follows:
F((2*alpha+1)/2, (2*alpha+2)/2 , alpha+1/2, betasq/etasq).
I'm not sure which function should be used- either phyper or qhyper or
dhyper
Where
alpha <- .75; beta1 <- 7 ; beta2 <- 5.5;
etasq <- ((beta1+beta2)/(2*beta1*beta2*(1-rho))) ^2
betasq <-
((beta1-beta2)^2+4*beta1*beta2*rho)/(4*beta1^2*beta2^2*(1-rho)^2)
Thank you so much for your help.
[[alternative HTML version deleted]]
2011 May 04
1
hurdle, simulated power
...zero_trt
-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 coun...
2010 Mar 25
0
help with breaking loops used to fit covariates in nlme model building procedure
Dear All
I'm attempting to speed up my model building procedure, but need some help with the loops I've created...please bear with me through the explanation!
My basic model call is something like:
m0sulf.nlme<-nlme(conc~beta0*exp(-beta1*day)+beta2*exp(-beta3*day),
data=m0sulf,
fixed=(beta0+beta1+beta2+beta3~1),
random=pdDiag(beta0+beta1+beta2+beta3~1),
start=c(beta0=-300,beta1=15, beta2=300,beta3=0.5),
)
In ord...
2005 Jul 22
1
Generate a function
hi all,
I need to generate a function inside a loop:
tmp is an array
for (i in 1:10)
{
func<- func * function(beta1) dweibull(tmp[i],beta1,eta)
}
because then i need to integrate this function on beta.
I could have written this :
func<-function(beta1) prod(dweibull(tmp,beta1,eta)) (with eta and beta1 set)
but it is unplottable and no integrable... i could make it a bit different but if i do that ( prod(tm...
2012 Oct 17
1
Random Forest for multiple categorical variables
Dear all,
I have the following data set.
V1 V2 V3 V4 V5 V6 V7 V8 V9 V10 alpha beta
1 11 1 11 1 11 1 11 1 11 alpha beta1
2 12 2 12 2 12 2 12 2 12 alpha beta1
3 13 3 13 3 13 3 13 3 13 alpha beta1
4 14 4 14 4 14 4 14 4 14 alpha beta1
5 15 5 15 5 15 5 15 5 15 alpha beta1
6 16 6 16 6 16 6 16...
2006 Jan 24
1
Fwd: Weird problem opening mbox in beta1/2
Hmm, this is peculiar!
This mailbox has been unchanged on my test server since September. I've
been using it to test each new version of Dovecot just after I've
compiled it.
When beta1 was released, I opened this mbox with no problems. However,
when I upgraded to beta2, I got "file size unexpectedly shrinked in mbox
file /export/mail/a/24/vis99003/INBOX (16895967 vs 16899267)".
Reverting to beta1, it also failed with the same error! I've deleted
indexes, restored t...