search for: sigma_s

Displaying 20 results from an estimated 26 matches for "sigma_s".

Did you mean: sigma_j
2008 Aug 29
3
extract variance components
HI, I would like to extract the variance components estimation in lme function like a.fit<-lme(distance~age, data=aaa, random=~day/subject) There should be three variances \sigma_day, \sigma_{day %in% subject } and \sigma_e. I can extract the \sigma_e using something like a.fit$var. However, I cannot manage to extract the first two variance components. I can only see the results in
2010 Jun 08
0
GMM: "The covariance matrix of the coefficients is singular"
...ction g, where E[g]=0: g <- function(theta,x){ N <- length(x) #Transform parameters in order to make them x>0, x<0 or 0<x<1 a <- exp(theta[1]) b <- -exp(theta[2]) mu_s <- exp(theta[3]) prob <- exp(theta[4])/(1+exp(theta[4])) sigma <- exp(theta[5]) sigma_s <- exp(theta[6]) nt1 <- diff(x) - a - b*x[-N] m1 <- nt1 m2 <- nt1^2 - (sigma^2-2*prob*(mu_s^2+sigma_s^2))/(1-2*prob) m3 <- nt1^3 m4 <- nt1^4 - (-2*prob*mu_s^4-12*mu_s^2*sigma_s^2*prob+3*sigma^4-6*prob*sigma_s^4)/(1-2*prob) m5 <- nt1^5 m6 <- nt1^6 - (-...
2011 Jan 03
1
Greetings. I have a question with mixed beta regression model in nlme.
*Dear R-help: My name is Rodrigo and I have a question with nlme package in R to fit a mixed beta regression model. The details of the model are: Suppose that:* *j in {1, ..., J}* *(level 1)* *i in {1, ..., n_j}* *(level 2)* *y_{ij} ~ Beta(mu_{ij} * phi_{ij}; (1 - mu_{ij}) * phi_{ij}) y_{ij} = mu_{ij} + w_{ij} * *with* *logit(mu_{ij}) = Beta_{0i} + Beta_{1i} * x1_{ij} + b2 * x2_{ij}
2011 Jan 03
0
Greetings. I have a question with mixed beta regression model in nlme (corrected version).
*Dear R-help: My name is Rodrigo and I have a question with nlme package in R to fit a mixed beta regression model. I'm so sorry. In the last email, I forgot to say that W is also a unknown parameter in the mixed beta regression model. In any case, here I send you the correct formulation. ** Suppose that:* *j in {1, ..., J}* *(level 1)* *i in {1, ..., n_j}* *(level 2)* *y_{ij} ~
2010 May 18
1
Maximization of quadratic forms
Dear R Help, I am trying to fit a nonlinear model for a mean function $\mu(Data_i, \beta)$ for a fixed covariance matrix where $\beta$ and $\mu$ are low- dimensional. More specifically, for fixed variance-covariance matrices $\Sigma_{z=0}$ and $\Sigma_{z=1}$ (according to a binary covariate $Z $), I am trying to minimize: $\sum_{i=1^n} (Y_i-\mu_(Data_i,\beta))' \Sigma_{z=z_i}^{-1} (Y_i-
2004 Jul 29
2
expression + paste + arguments + ...
dear R wizards: I would like to write a function that roughly places the equivalent of the following latex text into the current plot: \newcommand{ \placesigma }[4]{ \put(\#1,\#2){ \sigma_{A , #3} = #4 } I cannot figure out how to do this. I know I have to use a function that uses expressions in a text() invoke. But passing arguments and nesting strings and expressions has so far not
2011 Sep 13
2
Mathematical expressions in the group labels in lattice
Hi, I am working with the lattice package and I want to label to groups in the xyplots with mathematical expressions. I short example for this library(lattice) Case<-factor(rep(1:2,each=300)) xx<-rnorm(600,0,1) yy<-rnorm(600,0,1) xyplot(yy~xx|Case) This results in two scatter plots with label "1" and "2". I would like to substitute this labels by math expression. I
2009 Jun 19
1
using garchFit() to fit ARMA+GARCH model with exogeneous variables
Hello - Here's what I'm trying to do. I want to fit a time series y with ARMA(1,1) + GARCH(1,1), there are also an exogeneous variable x which I wish to include, so the whole equation looks like: y_t - \phi y_{t-1} = \sigma_t \epsilon_t + \theta \sigma_{t-1} \epsilon_{t-1} + c x_t where \epsilon_t are i.i.d. random variables \sigma_t^2 = omega + \alpha \sigma_{t-1}^2 + \beta
2005 Jun 04
1
can R do Fixed-effects (within) regression (panel data)?
i want to ask 2 questions. 1) can R do Random-effects GLS regression which i can get from Stata? the following result is frome Stata.can I get the alike result from R? xtreg lwage educ black hisp exper expersq married union, re Random-effects GLS regression Number of obs = 4360 Group variable (i) : nr Number of groups = 545 R-sq:
2011 Dec 17
0
time-varying parameters kalman filter estimation problem using FKF package
Dear R users, I am trying to carry out MLE of the time-varying CAPM using the FKF package. My approach so far has been to try and adapt the example given in the help file found using ?fkf which demonstrates the MLE of an ARMA(2,1) model. When I attempt to run my R code (given below) I get the following error: Error in fkf(a0 = sp$a0, P0 = sp$P0, dt = sp$dt, ct = sp$ct, Tt = sp$Tt, : Some of
2004 Apr 05
3
2 lme questions
Greetings, 1) Is there a nice way of extracting the variance estimates from an lme fit? They don't seem to be part of the lme object. 2) In a series of simulations, I am finding that with ML fitting one of my random effect variances is sometimes being estimated as essentially zero with massive CI instead of the finite value it should have, whilst using REML I get the expected value. I guess
2004 Oct 06
0
quadratically constrained quadratic programming
Hi, Does anybody have experience to solve an quadratic programming problem with quadratic constraints in R? It seems that the package "quadprog" only handles the quadratic programming with linear constraint. My probelm is to maximze x^T\Sigma_{xy} y, subject to x^Tx=1, y^T\Sigma_{yy} y=1, and sum(y)<t, or sum(y)=t, where x and y are the variable, and the Sigma's and t are
2005 Dec 29
0
calculating recursive sequences
Hi, I was trying to repeat the estimation of threshold GARCH models from the book "Analysis of Financial Time Series" by Ruey S. Tsay, and I was succesfull, but I had to use "for" loop, which is quite slow. The loop is necessary, since you need to calculate recursive sequence. Is there a faster way to do this in R, without using loops? The model is such: r_t = \mu + \alpha_2
2007 Apr 22
1
labels
Hello, I would like to add to axis labels special caracters. Instead of writing :plot(simul, xlab="beta", ylab="sigma11") It would be great if I could write something as in LaTeX :plot(simul, xlab="\beta", ylab="\sigma_{11}") Is there a way to do that ? Thank you _________________________________________________________________ ues clics pour retrouver tout
2002 Feb 20
2
How to get the penalized log likelihood from smooth.spline()?
I use smooth.spline(x, y) in package modreg and I would like to get value of penalized log likelihood and preferable also its two parts. To make clear what I am asking for (and make sure that I am asking for the right thing) I clarify my problem trying to use the same notation as in help(smooth.spline): I want to find the natural cubic spline f(x) such that L(f) = \sum_{k=1}{n} w[k](y[k] -
2008 Nov 14
1
aov help
Please pardon an extremely naive question. I see related earlier posts, but no responses which answer my particular question. In general, I'm very confused about how to do variance decomposition with random and mixed effects. Pointers to good tutorials or texts would be greatly appreciated. To give a specific example, page 193 of V&R, 3d Edition, illustrates using raov assuming pure
2006 Oct 24
1
Variance Component/ICC Confidence Intervals via Bootstrap or Jackknife
I'm using the lme function in nmle to estimate the variance components of a fully nested two-level model: Y_ijk = mu + a_i + b_j(i) + e_k(j(i)) lme computes estimates of the variances for a, b, and e, call them v_a, v_b, and v_e, and I can use the intervals function to get confidence intervals. My understanding is that these intervals are probably not that robust plus I need intervals on the
2011 Oct 04
1
F-values in nested designs
Hello all I'm trying to learn how to fit a nested model in R. I found a toy example on internet where a dataset that have?3 areas and 4 sites within these areas. When I use Minitab to fit a nested model to this data, this is the ANOVA table that I got: Nested ANOVA: y versus areas, sites Analysis of Variance for y Source DF SS MS F P areas 2 4.5000 2.2500
2010 Jun 09
1
equivalent of stata command in R
Dear all, I need to use R for one estimation, and i have readily available stata command, but i need also the R version of the same command. the estimation in stata is as following: 1. Compute mean values of relevant variables . sum inno lnE lnM Variable | Obs Mean Std. Dev. Min Max -------------+--------------------------------------------------------
2010 Jun 09
1
equivalent of stata command in R‏
From: saint-filth@hotmail.com To: saint-filth@hotmail.com Subject: RE: Date: Wed, 9 Jun 2010 09:53:20 +0000 OK! sorry thats my fault, here the translations of the stata commands 1st step is to get the mean values of the variables, well that doesnt need explanation i guess, 2nd step is to estimate the model on panel data estimation method which is: