[EMAIL PROTECTED] wrote:
> I have done a cluster analysis doing:
>
> 1-clusNorth <-hclust(dist(Artorious)^2, method="ward")
> 2-clusNorth$labels <-Artorious$Name ## to show the case names and not
> numbers
> 3-dend1 <- as.dendrogram(clusNorth)
> 4-plot(dend1)
>
> My Dendrogram is now showing th
> dim(data.sub)
[1] 1 140
#extracting all differentially express genes##
library(multtest)
two_side<- (1-pt(abs(data.sub),50))*2
diff<- mt.rawp2adjp(two_side)
all_differ<-diff[[1]][37211:1,]
all_differ
#list of differentially expressed genes##
> probe.names<-
+
Why not use the interactive histogram in iplots? ihist(x) Then you
can vary the binwidth interactively and get a very quick idea of the
structure of your data by looking at a range of plots with different
binwidths. Relying on a single plot to reveal everything about a
variable's distrib
On Sat, Mar 01, 2008 at 12:54:56AM +0100, Louise Hoffman wrote:
> > If you still want to then read ?write.table, that can export your data
> > into a spreadsheet-like ascii format which can be used from GNUplot
> > easily.
>
> Very interesting.
>
> So if I e.g. write:
> ts.sim <- arima.sim(lis
On Fri, 2008-02-29 at 14:40 -0800, Alex Reynolds wrote:
> I have the following code:
>
> subsetTimeDataPlot <- boxplot(subsetTimeData$time ~
> subsetTimeData$build, horizontal=True, col="lightblue", ...)
>
> The 'names' component consists of strings that can be up to 20-30
> characters long.
>
Dear Rglers,
With rgl, I would like to set marker when a button is pressed, but leave the
standard trackball handling otherwise. Thanks to Duncan and Oleg for helping
me handling key down.
How do I say in a custom mouse handler "after having done your work, forward
to standard trackball once only
Dear R helpers,
I am quite new working with R, and that might be a very easy question for
some of you. So I hope you can help me!! I used a hirarchical cluster
analysis to create dendrograms, like that:
hc <- hclust(dist(USArrests), "ave")
plot(hc)
plot(hc, hang = -1)
Here I want to compare th
Charilaos Skiadas wrote:
> On Feb 29, 2008, at 5:39 PM, Michael wrote:
>
>> On 29 Feb 2008, Charilaos Skiadas wrote:
>>
>>> On Feb 29, 2008, at 12:38 PM, Michael wrote:
On 29 Feb 2008, Frank E. Harrell, Jr. wrote:
> Several people have given great advice on how to successfully use
>>
Trying to set up multiple spawns of R
---
Hi. I'm new to the list but I have a small problem with R. I'm trying to
set up multiple spawns of R active at the same time on an AMD with a dual
core in Vista so that I can cut down my permutation processing time
Hi Christophe --
I don't know whether there's a particularly elegant way. This works
setClass("A", representation(x="numeric"))
setClass("B", representation(y="numeric"))
setClass("C", contains=c("A", "B"))
setMethod("show", "A", function(object) cat("A\n"))
setMethod("show", "B", function(obje
Hi all,
Suppose I have to letters 'u' and 'd'. Now I want to find all combinations
like that :
uu
ud
du
.
dd
This type of combination generally required for Option Pricing in
financial/derivative market. Here generally 'u' means: up-move and 'd' means
down mo
Hi,
I have 30 arrays (geographical) of 1000 rows (individuals) by 20 columns
(time-series data), and need to group arrays that are most similar.
What packages and functions will be useful for this task ?
Thanks
Stanley
[[alternative HTML version deleted]]
__
Sorry: resending this; didn't have a title on it.
Trying to set up multiple spawns of R
---
Hi. I'm new to the list but I have a small problem with R. I'm trying to
set up multiple spawns of R active at the same time on an AMD with a dual
core in Vista so
On Fri, Feb 29, 2008 at 4:40 PM, Alex Reynolds <[EMAIL PROTECTED]> wrote:
> I have the following code:
>
> subsetTimeDataPlot <- boxplot(subsetTimeData$time ~
> subsetTimeData$build, horizontal=True, col="lightblue", ...)
>
> The 'names' component consists of strings that can be up to 20-30
> c
Hi,
I have data in 3 vectors a,b and c looking like
eg a: 1.2 3.4 1.4 ..
I like to have the data from each vector as a boxplot, but the 3
boxplots within one graph.
One example is the first graph at
http://www.statmethods.net/graphs/boxplot.html
Unfor
target = c("u", "d")
apply(expand.grid(rep(list(target), 6)), 1, paste, sep="", collapse="")
b
On Mar 1, 2008, at 9:13 AM, Megh Dal wrote:
Hi all,
Suppose I have to letters 'u' and 'd'. Now I want to find all
combinations like that :
uu
ud
du
.
dd
This t
Hi Marek,
use a list instead of a data.frame; e.g.
boxplot(list(x = rnorm(10), y = rnorm(20)))
hth,
Matthias
Marek Bartkuhn wrote:
> Hi,
>
> I have data in 3 vectors a,b and c looking like
>
> eg a:1.2 3.4 1.4 ..
>
>
> I like to have the data from ea
"Henrique Dallazuanna" <[EMAIL PROTECTED]> wrote in
news:[EMAIL PROTECTED]:
library(lattice)
levelplot(r, colorkey=list(col=gray((0:32)/32)),
col.regions=(col=gray((0:32)/32)))
When I try that example, I get an error, even after updating lattice.
> levelplot(r, colorkey=list(col=gray((0:3
On 01/03/2008 5:41 AM, Dieter Menne wrote:
> Dear Rglers,
>
> With rgl, I would like to set marker when a button is pressed, but leave the
> standard trackball handling otherwise. Thanks to Duncan and Oleg for helping
> me handling key down.
I don't think there's currently an easy way to do that.
Hi guys,
I use R 2.6.2 and Windows XP.
Ive got the following question: I wrote a lot of text into the margin of a
plot. When I use the jpeg-function, only a little part of the margin text
is displayed in the final jpeg? Any ideas to change it?
Source-Code:
datenbankda
On 1 March 2008 at 09:19, Guy Perry wrote:
| Sorry: resending this; didn't have a title on it.
|
| Trying to set up multiple spawns of R
| ---
|
| Hi. I'm new to the list but I have a small problem with R. I'm trying to
| set up multiple spawns of R acti
You may want to look at the nws package (there are others that also help with
parallel versions, but on windows, nws seems to work the best (at least in my
experiance so far)).
From: [EMAIL PROTECTED] on behalf of Guy Perry
Sent: Sat 3/1/2008 7:19 AM
To: r-help@
There is a very basic interface between R and gnuplot in the TeachingDemos
package. Look at the help for gp.plot.
gp.open will run gnuplot and link it to R, gp.plot will send data to gnuplot
and create a scatterplot. (gp.send will send extra commands to gnuplot and
gp.close will clean up).
It would be helpful if you provided commented, minimal,
self-contained, reproducible code.
What does str(all_differ) say? That will tell you the structure of
the object that you are trying to work with.
On Sat, Mar 1, 2008 at 3:35 AM, Keizer_71 <[EMAIL PROTECTED]> wrote:
>
> > dim(data.sub)
> [1
library("R.utils")
intToBin(0:63)
Best wishes
Wolfgang
--
Wolfgang Huber EBI/EMBL Cambridge UK http://www.ebi.ac.uk/huber
Benilton Carvalho scripsit:
> target = c("u", "d")
> apply(expand.grid(rep(list(target), 6)), 1, paste,
Dear ALL:
I have two quick questions about how to perform some steps in R. Could you
please see the attached MS file if the data not clean enough in this email.
Thank you so much for all your helps.
Abou
Here it is:
=
Consider the following matrix:
data<-matrix(c(2
Try this:
data <- as.data.frame(data)
names(data) <- c('Data', 'Indicator')
a)
sort(unique(subset(data, Indicator == 1))[,1])
b) with(subset(data, Indicator == 1),
tapply(Indicator, Data, sum))
On 01/03/2008, AbouEl-Makarim Aboueissa <[EMAIL PROTECTED]> wrote:
> Dear ALL:
>
> I
This works for me:
x <- y <- seq(-4*pi, 4*pi, len=27)
r <- sqrt(outer(x^2, y^2, "+"))
library(lattice)
levelplot(r, colorkey=list(col=gray((0:32)/32)),
col.regions=(col=gray((0:32)/32)))
'r' is a matrix for you?
On 01/03/2008, David Winsemius <[EMAIL PROTECTED]> wrote:
> "Henrique Dallazuann
At 23:07 01.03.2008, AbouEl-Makarim Aboueissa wrote:
>Dear ALL:
>
>I have two quick questions about how to perform some steps in R.
>Could you please see the attached MS file if the data not clean
>enough in this email.
>
>Thank you so much for all your helps.
>
>
>Abou
>
>
>
>Here it is:
>==
Just started using 'R'. Nice system. Once quick question: Is it possible to
put plot more than one series against a common 'x variable on the same plot?
In otherwords, I may want a stacked bar chart of line chart containing more
than one series. Could not figure out how to do this.
Thanks for your
Hello,
I am running the program COMPAR.GEE within the package APE. My dependent
variable is binomial, while my independent variable is a multi-state
categorical variable. The output reports an estimate for each state of the
independent variable except the first one. For example, for the variable X
x <- rnorm(10)
y <- runif(10)
z <- 1:10
plot(x~z, ylim=range(x, y), type='l')
lines(y, col='red')
On 01/03/2008, Marc Diamond <[EMAIL PROTECTED]> wrote:
> Just started using 'R'. Nice system. Once quick question: Is it possible to
> put plot more than one series against a common 'x variable on
"Henrique Dallazuanna" <[EMAIL PROTECTED]> wrote in
news:[EMAIL PROTECTED]:
> This works for me:
>
> x <- y <- seq(-4*pi, 4*pi, len=27)
> r <- sqrt(outer(x^2, y^2, "+"))
> library(lattice)
> levelplot(r, colorkey=list(col=gray((0:32)/32)),
> col.regions=(col=gray((0:32)/32)))
Works for me a
On Fri, Feb 29, 2008 at 2:12 PM, Louise Hoffman
<[EMAIL PROTECTED]> wrote:
> [snip]
>
> > Seriously. Be specific if you have a problem. (read the posting guide). R
> > can
> > also plot. If you don't like R's plots (which I could not understand) you
> can
> > export data and import them to g
y<-ts(x, frequency=1/15)
spec.pgram(y, log="no")
There is high power in the very low frequency range for the data set
of continuous dissolved oxygen on which I am preforming this analysis.
This is the seasonal trend due to temperature (and all things that
are associated- photosynthesis, respirati
If you want color, then a slight addition to Henrique's solution will do it:
x <- y <- seq(-4*pi, 4*pi, len=27)
r <- sqrt(outer(x^2, y^2, "+"))
library(lattice)
colkey <- colorRampPalette(c('red','yellow','green'))(32)
levelplot(r, colorkey=list(col=colkey),
col.regions=(col=colkey))
On Sat, M
Hi,
I am new to model selection by coefficient shrinkage
method such as lasso. And I became particularly
interested in variable selection in Cox regression by
lasso. I became aware of the coxpath() in R package
glmpath does lasso on Cox model. I have tried the
sample script on the help page of cox
Another option to get graphs in LaTeX using the same fonts as the rest of the
document is to export from R as an eps file, then use eps2pgf
(http://sourceforge.net/projects/eps2pgf) to convert to a pgf file. Then in
the LaTeX file just use \input with the created .pgf file. This creates the
g
http://www.nabble.com/file/p15782617/logo-300-pix-72-dpi-no-sub.jpg
Predictive Analytics for Business, Marketing and Web is a concentrated
training program that includes interactive breakout sessions.
Dates: April 3-4, May 8-9, and June 5-6, 2008
Locations: Toronto (April), San Francisco (May),
I am running lrm() with a single factor. I then run anova() on the fitted
model to obtain a p-value associated with having that factor in the model.
I am noticing that the "Model L.R." in the lrm results is almost the same
as the "Chi-Square" in the anova results, but not quite; the latter value
i
I don't know if this is the correct forum to ask the following question;
however, when I search the aroma.affymetrix discussion group, it suggested
that I should posted the question to r-help. Here it goes.
I followed the instructions on aroma.affymetrix trying to install the
packages; followi
[EMAIL PROTECTED] wrote:
> I am running lrm() with a single factor. I then run anova() on the fitted
> model to obtain a p-value associated with having that factor in the model.
>
> I am noticing that the "Model L.R." in the lrm results is almost the same
> as the "Chi-Square" in the anova results
Hi,
Not sure about what you want your plot to look like, but you should also
look at 'matplot'.
Best,
Elizabeth
Marc Diamond wrote:
> Just started using 'R'. Nice system. Once quick question: Is it possible to
> put plot more than one series against a common 'x variable on the same plot?
> In oth
?lines
-Original Message-
From: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On
Behalf Of Elizabeth Purdom
Sent: Sunday, March 02, 2008 10:30 AM
To: Marc Diamond
Cc: R-help@r-project.org
Subject: Re: [R] One quick question concerning R
Hi,
Not sure about what you want your plot to look lik
I have these questions:
(1) Use Poisson regression to estimate the main effects of car, age, and
dist (each treated as categorical and modelled using indicator variables)
and interaction terms.
(2) It was determined by one study that all the interactions were
unimportant and decided that age and
45 matches
Mail list logo