Displaying 20 results from an estimated 100000 matches similar to: "p-value or the t-test value"
2010 Aug 22
2
coxme AIC score and p-value mismatch??
Hi,
I am new to R and AIC scores but what I get from coxme seems wrong. The AIC
score increases as p-values decrease.
Since lower AIC scores mean better models and lower p-values mean stronger
effects or differences then shouldn't they change in the same direction? I
found this happens with the data set rats as well as my own data. Below is
the output for two models constructed with the rats
2006 Aug 20
2
how to the p-values or t-values from the lm's results
Dear friends,
After running the lm() model, we can get summary resluts like the
following:
Coefficients:
Estimate Std. Error t value Pr(>|t|)
x1 0.11562 0.10994 1.052 0.2957
x2 -0.13879 0.09674 -1.435 0.1548
x3 0.01051 0.09862 0.107 0.9153
x4 0.14183 0.08471 1.674 0.0975 .
x5 0.18995 0.10482 1.812 0.0732 .
x6 0.24832 0.10059 2.469 0.0154 *
x7
2016 Apr 06
1
Optimization max likelihood problem
hello all,
I am getting wrong estimates from this code. do you know what could be the problem.
thanks
x<- c(1.6, 1.7, 1.7, 1.7, 1.8, 1.8, 1.8, 1.8)
y <- c( 6, 13, 18, 28, 52, 53, 61, 60)
n <- c(59, 60, 62, 56, 63, 59, 62, 60)
DF <- data.frame(x, y, n)
# note: there is no need to have the choose(n, y) term in the likelihood
fn <- function(p, DF) {
z <- p[1]+p[2]*DF$x
2009 Jun 05
2
p-values from VGAM function vglm
Anyone know how to get p-values for the t-values from the coefficients
produced in vglm?
Attached is the code and output ? see comment added to output to show
where I need p-values
+ print(paste("********** Using VGAM function gamma2 **********"))
+ modl2<-
vglm(MidPoint~Count,gamma2,data=modl.subset,trace=TRUE,crit="c")
+ print(coef(modl2,matrix=TRUE))
2008 Sep 12
1
Error in "[<-"(`*tmp*`, i, value = numeric(0)) :
I use "while" loop but it produces an errro. I have no idea about this.
Error in "[<-"(`*tmp*`, i, value = numeric(0)) :
nothing to replace with
The problem description is
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
2004 May 02
1
arima problems when using argument fixed=
As I am reading ?arima, only NA entries in the argument fixed=
imports. The following seems to indicate otherwise:
x <- arima.sim(model=list(ar=0.8), n=100) + (1:100)/50
> t <- 1:100
> mod1 <- lm(x ~ t)
>
> init1 <- c(0, coef(mod1)[2])
> fixed1 <- c(as.numeric(NA), 0)
>
> arima(x, order=c(1,0,0), xreg=t, include.mean=FALSE, init=init1,
fixed=fixed1)
2009 Nov 04
1
vglm(), t values and p values
Hi All,
I'm fitting an proportional odds model using vglm() from VGAM.
My response variable is the severity of diseases, going from 0 to 5 (the
severity is actually an ordered factor).
The independent variables are: 1 genetic marker, time of medical observation,
age, sex. What I *need* is a p-value for the genetic marker. Because I have ~1.5
million markers I'd rather not faffing
2009 Aug 08
1
linear model: Test difference between coefficients and given values (t.test?)
Hi there,
I've got a question which is really trivial for sure but still I have
to ask as I'm not
making any progress solving it by myself (please be patient with an
undergraduate
student):
I've got a linear model (lm and lmer fitted with method="ML").
Now I want to compare the coefficients (slope, intercept, not the
random effects)
of both models with a given value (e.g.
2004 Jan 14
2
Fixed parameters in an AR (or arima) model
Hello
I want to fit an AR model were two of the coefficients are fixed to zero
(the second and third ar-coefficients).
I used the "arima" function with the "fixed" argument but the ar3
coefficient is not set to zero:
==============================================
> arima(Y, order=c(4,0,0), xreg=1:23, fixed=c(NA,0,0,NA,NA,NA))
Call:
arima(x = Y, order = c(4, 0, 0), xreg =
2011 Sep 12
1
Difference in function arima estimation between 2.11.1 and R 2.12.2
Hello , I have estimated the following model, a sarima:
p=9
d=1
q=2
P=0
D=1
Q=1
S=12
In R 2.12.2
Call:
arima(x = xdata, order = c(p, d, q), seasonal = list(order = c(P, D, Q),
period = S),
optim.control = list(reltol = tol))
Coefficients:
ar1 ar2 ar3 ar4 ar5 ar6 ar7 ar8
ar9
0.3152 0.8762 -0.4413 0.0152 0.1500 0.0001 -0.0413 -0.1811
2011 Sep 09
2
Different results with arima in R 2.12.2 and R 2.11.1
Hello , I have estimated the following model, a sarima:
p=9
d=1
q=2
P=0
D=1
Q=1
S=12
In R 2.12.2
Call:
arima(x = xdata, order = c(p, d, q), seasonal = list(order = c(P, D, Q),
period = S),
optim.control = list(reltol = tol))
Coefficients:
ar1 ar2 ar3 ar4 ar5 ar6 ar7 ar8
ar9
0.3152 0.8762 -0.4413 0.0152 0.1500 0.0001 -0.0413 -0.1811
2009 Apr 28
2
Why there is no p-value from likelihood ratio test using anova in GAM model fitting?
Hello, everybody,
There is the first time for me to post a question, because I really cannot
find answer from books, websites or my colleagues. Thank you in advance for
your help!
I am running likelihood ratio test to find if the simpler model is not
significant from more complicated model. However, when I run LRT to compare
them, the test did not return F value and p-value for me. What's the
2004 Jul 16
0
Does AIC() applied to a nls() object use the correctnumber of estimated parameters?
Thanks Adaikalavan, however the problem remains.
Considering AIC() as applied to the linear model in AIC() help
documentation:
> data(swiss)
> lm1 <- lm(Fertility ~ . , data = swiss)
> AIC(lm1)
[1] 326.0716
Clearly this includes the estimation of the residual standard error as
an estimated parameter, as this gives the correct score:
> -2*logLik(lm1) + 2*(length(coef(lm1))+1)
2008 Sep 10
0
MA coefficients
Hi everyone,
I am performing the time series regression analysis on a series of data sets. A few data sets followed an ARMA(1,1) process. However, they all had a same value of moving average MA coefficients = -1, constantly, from output of function “arima" .
Example:
> arima(residuals, order=c(1,0,1))
Call:
arima(residuals, order = c(1, 0, 1))
Coefficients:
ar1 ma1 intercept
2003 Apr 21
2
Anyone Familiar with Using arima function with exogenous variables?
I've posted this before but have not been able to locate what I'm doing
wrong. I cannot determine how the forecast is made using the estimated
coefficients from a simple AR(2) model when there is an exogenous
variable. Does anyone know what the problem is? The help file for arima
doesn't show the model with any exogenous variables. I haven't been able
to locate any documents
2012 Feb 10
0
coxme with frailty
A couple of clarifications for you.
1. I write mixed effects Cox models as exp(X beta + Z b), beta = fixed
effects coefficients and b = random effects coefficients. I'm using
notation that is common in linear mixed effects models (on purpose).
About 2/3 of the papers use exp(X beta)* c, i.e., pull the random
effects out of the exponent. Does it make a difference? Not much: b
will be
2008 Jul 23
1
Time series reliability questions
Hello all,
I have been using R's time series capabilities to perform analysis for quite
some time now and I am having some questions regarding its reliability. In
several cases I have had substantial disagreement between R and other packages
(such as gretl and the commercial EViews package).
I have just encountered another problem and thought I'd post it to the list. In
this case,
2011 Sep 23
1
p values in coxph()
Hi,
I'm interested in building a Cox PH model for survival modeling, using 2
covariates (x1 and x2). x1 represents a 'baseline' covariate, whereas x2
represents a 'new' covariate, and my goal is to figure out where x2 adds
significant predictive information over x1.
Ideally, I could get a p-value for doing this. Originally, I thought of
doing some kind of likelihood ratio
2003 Mar 30
1
simple test of lme, questions on DF corrections
I''m a physicist working on fusion energy and dabble in statistics
only occasionally, so please excuse gaps in my statistical
knowledge. I''d appreciate any help that a real statistics expert
could provide. Most people in my field do only very simple
statistics, and I am trying to extend some work on multivariate
linear regression to account for significant between-group
2009 Jun 05
1
Bug in print.Arima and patch
Dear List,
A posting to R-Help exposed this problem with the print method for
objects of class Arima:
> set.seed(1)
> x <- arima.sim(n = 100, list(ar = 0.8897, ma = -0.2279))
> mod <- arima(x, order = c(1,0,1))
> coefs <- coef(mod)
> mod2 <- arima(x, order = c(1,0,1), fixed = coefs)
> mod2
Call:
arima(x = x, order = c(1, 0, 1), fixed = coefs)
Coefficients:
Error