Displaying 20 results from an estimated 600 matches similar to: "reshaping data frame"
2008 Feb 22
1
fitting a lognormal distribution using cumulative probabilities
Dear all,
I'm trying to estimate the parameters of a lognormal distribution fitted
from some data.
The tricky thing is that my data represent the time at which I recorded
certain events. However, in many cases I don't really know when the event
happened. I' only know the time at which I recorded it as already happened.
Therefore I want to fit the lognormal from the cumulative
2006 Nov 30
1
scaling y-axis to relative frequency in multiple histogram (multhist)
Hi,
I'm plotting a multiple histogram using the function multhist {package
plotrix}, something like:
library(plotrix)
mh <- list(rnorm(200, mean=200, sd=50), rnorm(200, mean=250, sd=50))
multhist(mh)
In this graph y-axis represents the frequency of observations.... but I
would like it to be scaled into relative frequencies,
does anybody know how to do this with multhist or similar
2007 Mar 01
1
how to apply the function cut( ) to many columns in a data.frame?
Dear useRs,
In a data.frame (df) I have several columns (x1, x2, x3....xn) containing
data as a continuous numerical response:
df
var x1 x2 x3
1 143 147 137
2 93 93 117
3 164 39 101
4 123 118 97
5 63 125 97
6 129 83 124
7 123 93 136
8 123 80 79
9 89 107 150
10 78 95 121
I want to
2006 Jan 04
1
silly, extracting the value of "C" from the results of somers2
Sorry I have a very simple question:
I used somers2 function from Design package:
> z<- somers2(x,y, weights=w)
results are:
>z
C Dxy n Missing
0.88 0.76 500 0.00
Now I want to call only the value of C to be used in further analyses, but I
fail to do it. I have tried:
> z$C
NULL
> z[,C]
Error in z[,C]: incorrect number of dimensions
and some other silly
2011 Nov 14
1
lme4:glmer with nested data
Dear all,
I have the following dataset with results from an experiment with individual bats that performed two tasks related to prey capture under different conditions:
X variables:
indiv - 5 individual bats used in the experiment; all of which performed both tasks
task - 2 tasks that each individual bat had to perform
dist - 5 repeated measures of individual bats at 5 different distances from
2010 Feb 11
2
Unexpected output in first iteration of for-loop
Dear r-helpers,
why do I get an output in the first iteration of the for-loop
which contains the string values of the input vector,
and how can I avoid that?
Here's the output (only line 1 is wrong)
latentVariable Indiv Group
1 rPlanning rIterat rTDD
2 rPlanning 0.79 0.84
3 rIterat 0.79 0.83
4 rTDD 0.9 0.96
5 rStandup 0.83 0.82
6
2000 Mar 31
1
R: one bananna aov() question
Hello world,
I'm trying to do an
anova on data in data.set, dependent variable is a column
named "dep.var", grouping variable is in a column called "indep.var", and
is.factor(indep.var) is TRUE...
why can't I just do aov(dep.var ~ indep.var, data = data.set)?
What have I done to deserve this?! What gives? Am I missing something
totlly obvious?
R-base-1.0.0-1,
2008 Mar 18
3
UNSOLITED E_MAILS: Integrate R data-analysis projects with Microsoft Office for free
Dear R Admins,
I received an unsolicited e-mail from BlueInference as an R
user. Does it mean that R that our e-mails (and names) is
sharing it's user database with third parties without our
consent? Or perhaps the BlueInference guys are using an
e-mail address miner to get our contact details?
[SNIP]
Dear Gorden Jemwa,
As a fellow R user, I am sure you agree with me that R is a
2006 Jan 12
4
Loading Excel file into Limma
Dear mailing group,
This is my first time here. Glad to have this resource!
I am currently trying to load an Excel file into R (limma package loaded)
using the source(*name of directory*) command, but it cannot open the file.
I renamed the file as .R and .RData, to no avail. The Excel data contains
one gene name per row and about 100 data points per gene (columns).
I am only used to
2010 Aug 11
4
Arbitrary number of covariates in a formula
Hello!
I have something like this:
test1 <- data.frame(intx=c(4,3,1,1,2,2,3),
status=c(1,1,1,0,1,1,0),
x1=c(0,2,1,1,1,0,0),
x2=c(1,1,0,0,2,2,0),
sex=c(0,0,0,0,1,1,1))
and I can easily fit a cox model:
library(survival)
coxph(Surv(intx,status) ~ x1 + x2 + strata(sex),test1)
However, I want to
2010 May 24
2
Table to matrix
Dear R users,
I am trying to make this (3 by 10) matrix A
--A----------------------------------------------------
0 0 0 0 1 0 0 0 0 0
0 0 0 0 0 1 0 0 0 0
0 0.5 0.5 0 0 0 0 0 0 0
-------------------------------------------------------
from "mass.func"
--mass.func-------------------------------------------
> mass.func
$`00`
prop
5
1
$`10`
2007 Aug 07
2
GLMM: MEEM error due to dichotomous variables
I am trying to run a GLMM on some binomial data. My fixed factors include 2
dichotomous variables, day, and distance. When I run the model:
modelA<-glmmPQL(Leaving~Trial*Day*Dist,random=~1|Indiv,family="binomial")
I get the error:
iteration 1
Error in MEEM(object, conLin, control$niterEM) :
Singularity in backsolve at level 0, block 1
>From looking at previous help
2008 Dec 28
1
Random coefficients model with a covariate: coxme function
Dear R users:
I'm new to R and am trying to fit a mixed model
Cox regression model with coxme function.
I have one two-level factor (treat) and one
covariate (covar) and 32 different groups
(centers). I'd like to fit a random coefficients model, with treat and covar
as fixed factors and a random intercept, random
treat effect and random covar slope per center.
I haver a couple of
2006 Feb 20
1
var-covar matrices comparison:
Hi,
Using package gclus in R, I have created some graphs that show the
trends within subgroups of data and correlations among 9 variables (v1-v9).
Being interested for more details on these data I have produced also the
var-covar matrices.
Question: From a pair of two subsets of data (with 9 variables each, I
have two var-covar matrices for each subgroup, that differ for a
treatment on one
2007 Apr 09
3
sem vs. LISREL: sem fails
I am new to R.
I just tried to recreate in R (using sem package and the identical input data) a solution for a simple measurment model I have found before in LISREL. LISREL had no problems and converged in just 3 iterations.
In sem, I got no solution, just the warning message:
"Could not compute QR decomposition of Hessian.
Optimization probably did not converge.
in: sem.default(ram =
2002 Jun 19
1
best selection of covariates (for each individual)
Dear All,
This is not strictly R related (though I would implement the solution in R;
besides, being this list so helpful for these kinds of stats questions...).
I got a "strange" request from a colleage. He has a bunch (approx. 25000)
subjects that belong to one of 12 possible classes. In addition, there are 8
covariates (factors) that can take as values either "absence"
2007 Apr 11
1
creating a path diagram in sem
Hello,
I finally run my measurement model in sem - successfully. Now, I am trying to print out the path diagram that is based on the results - but for some reason it's not working. Below is my script - but the problem is probably in my very last line:
# ANALYSIS OF ANXIETY, DEPRESSION, AND FEAR - LISREL P.31
library(sem)
# Creating the ANXIETY, DEPRESSION, AND FEAR intercorrelation matrix
2013 Mar 11
2
How to 'extend' a data.frame based on given variable combinations ?
Dear expeRts,
I have a data.frame with certain covariate combinations ('group' and 'year')
and corresponding values:
set.seed(1)
x <- data.frame(group = c(rep("A", 4), rep("B", 3)),
year = c(2001, 2003, 2004, 2005,
2003, 2004, 2005),
value = rexp(7))
My goal is essentially to
2010 Jan 07
1
faster GLS code
Dear helpers,
I wrote a code which estimates a multi-equation model with generalized
least squares (GLS). I can use GLS because I know the covariance matrix of
the residuals a priori. However, it is a bit slow and I wonder if anybody
would be able to point out a way to make it faster (it is part of a bigger
code and needs to run several times).
Any suggestion would be greatly appreciated.
Carlo
2007 Feb 28
0
no df to test the effect of an interaccion on a lmer mixed model
Dear useRs,
I am fitting a mixed model using the function lmer from the package lme4,
but I have some problems when I try to test the effect of my factors of
interest.
First let me explain the structure of the model:
I'm measuring animal movements. Explicitly, I am interested in displacement
(straight-line distance from an initial point). Displacements are measured
longitudinally, with one