!
Thanks,
Jie
On Mon, Nov 7, 2016 at 2:28 AM, Jeff Newmiller
wrote:
> Please read the Posting Guide mentioned at the bottom of this and every
> post, which warns you that homework is off topic on this mailing list. Use
> the support provided by your institution of learning (Courser
Dear Achim,
Sorry to have disturbed you. I have encountered a problem when computing
Hausman test statistics (i.e. p values) in R to compare OLS and 2SLS models.
The problem is a discrepancy between the two p-value outputs from the "manual
approach (by hand)" and the " diagnostics argument" i
files into the folder, however, I still can't get the
library work.
Please help me and let me know what can I do to fix it.
Thanks!
Jie DAI
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/m
I use
windlog=log10(windspec)
plot(windlog)
it seems good but stupid
is there any better method ?
2014/1/7 Jie Tang
> Futher more
>
> When I write as below :,the result is still not satisfied .
> asp=spectrum(ww_spec)
> windspec=data.frame(asp)
> plot(windspec,log=&q
Futher more
When I write as below :,the result is still not satisfied .
asp=spectrum(ww_spec)
windspec=data.frame(asp)
plot(windspec,log="dB")
2014/1/7 Jie Tang
> hi
> I have a wind dataset and I want to analze its spectrum with
> the x-axis and y-axis in log .But I foun
quot;Wind Spectrum(db) ")
YY=c(-40,40)
spectrum(ww_spec,log = "dB",ylim=YY,main=maininfo,ylab=yylab)
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/
ll print 4 but not 2 as what I repect
Could anyone tell me what is the matter with R and how to modify it?
thank you .
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-h
hi R users
I have a large 1D dataset and some of them is NA value .
I found I cound get the spectrum by such a command.
ua=c£¨10£¬30 £¬40£¬50£¬NA£©
spectrum(ua)
and I could not use na.rm just like mean or sd function
How could I get the spectrum of ua ?
thank you .
--
TANG Jie
Sorry, this sample code seems to be OK.
I will look into my original problem and update it soon.
Best wishes,
On Fri, Oct 4, 2013 at 12:06 PM, Jie wrote:
> Dear All,
>
> I have a question, suppose X is a dataframe, with column names as
> "x1", "x2", "x3&quo
Dear All,
I have a question, suppose X is a dataframe, with column names as
"x1", "x2", "x3", . And I would like to use the i-th column by X[,'xi'].
But it seems the single quote and double quote are different.
So if I run X[, names(X)[i]], it has some error.
Please use the below example code
Hi Jean,
I would like to give a histogram for a categorical variable, with
x-axis be different levels, and a number of percentage showed on top
of each bar.
Thanks.
Best wishes,
Jie
On Mon, Aug 26, 2013 at 12:43 PM, Adams, Jean wrote:
> Jie,
>
> I'm not exactly sure what you'
is not 3
categories in this case.
Thank you for any suggestion.
Best wishes,
Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide
in
another vertical line, finally link the same element by a arrow.
Thank you for any advice.
Best wishes
Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org
.
Best wishes,
Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
multiplicity.
Attached is hist of p-values (does this list allow attachment?). The ks test:
One-sample Kolmogorov-Smirnov test
D = 0.0493, p-value = 1.388e-06
alternative hypothesis: two-sided
Thank you for your attention.
Best wishes,
Jie
<>__
R-
se Linux Client release 5.3 (Tikanga)"
How could I install R?
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-hel
e other packages
but which has a similar way to implement it? Thank you.
Best wishes,
Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
a
.6 5.1 1.7 6.5 6.2 " NAN" 4.8 2.3 5.6
"8" 5.1 3.9 6.5 5.4 9.8 6.2 7.3 5.6 1.9 1.7 5.9 6.2 " NAN" 7.1 2.3 6.5
"9" 5.1 3.8 7 5.9 9.8 6.2 6.3 6.5 1.9 1.9 5.9 5.8 " NAN" 7.1 -0.4 6.5
"10" 5.3 3.8 7 5.9 9.4 6.1 6.3 6.5 7 1.9 6.4 5.8 &quo
forecast', dependencies = TRUE)
> library(forecast)
>
> ?ma
>
>
> Hope this helps,
>
> Rui Barradas
>
>
> Em 12-06-2013 08:21, Jie Tang escreveu:
>
> Hi R users:
>>I have a big data and want to calculate the running mean of this data .
>>
Hi R users:
I have a big data and want to calculate the running mean of this data .
How can I get this kind of result ? I have check the command "mean"
it seems "mean" could not get the running mean?
--
TANG Jie
[[alternative
4,34.4,8.6,30,14
I want to read them into a array by such command
wnd_data<-scan("obs.dat",sep=",",what=list(TIME="",rec=0,U=0,V=0,T=0,WS=0,WD=0,ST=0,TA=0,RH=0),na.strings
= "NAN")
but R could not excute sucefully and says that :
error in sca
Dear All,
I would like to store quote as part of an vector.
For instance, I would like to get an character object as
x = " 12"ab"34 "
or
y = c("1", "2", """, "a", "b", """, "3&quo
hi R users:
I have a dataset including u wind in x-axis and v wind in y-axis.
How can I plot the u,v wind data in vector or barb figure?
which command ?
thank you .
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r
Thank you for your advice.
Yes, I was wrong about the size. It seems that gc() does not return
the memory to the system, so my R process looks like taking more space
than yours.
R 3.0.0 solves the issue. Thanks.
Best wishes,
Jie
On Mon, Mar 11, 2013 at 1:05 PM, Prof Brian Ripley
wrote:
> On
do, not how you want to do it".
>
> On Mon, Mar 11, 2013 at 11:20 AM, Jie wrote:
>>
>> Dear All,
>>
>> I have a long sequence and want to find the quantile, or sort it first.
>> It seems sort() or quantile() reaches the memory limit.
>> Is there a wa
Dear All,
I have a long sequence and want to find the quantile, or sort it first.
It seems sort() or quantile() reaches the memory limit.
Is there a way to allocate more memoy on SSD for R when startup, so
that R can use both RAM and hard drive space?
Thank you.
Best wishes,
Jie
which and loop over the vector to do it since for
a long vector it is not fast enough.
Thank you for your suggestion.
Best wishes,
Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guid
ify the plot command ?
thank you
--
TANG Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
t ?
thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read t
Actually, I find a method. The function reshape" OR array
data_5m<-array(data,c(5,length(data)/5))
and
data_5m[1,] is what I wanted ,but I donot think it is a good method.
2013/1/14 Jeff Newmiller
> ab <- AA[(1:10)*10]
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-21548
hi R users
I have a data set with the name AA
AA<-1:100
Now I want to get a child array from AA every 10 numbers
e.g.
ab =c(10,20,30,40,50,60,70,80,100)
How could I subtract aa from AA?
thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,Ch
,
Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained
r (j in 1:5)
{
resu[i,j]=a[i]+b[j] # will be more complicated
}
}
# Do I have to create a list like this i order to use sapply?
data=list()
for (i in 1:5)
{
for (j in 1:5)
{
data[[(i-1)*5+j]]=list(a=a[i],b=b[j])
}
}
Thank you for your attention.
Best wi
try
require(MASS)
require(lme4)
n <- 20
beta <- c( -0.5, 1)
psi <- matrix(c(1,0.2,0.2,1),2,2)
b <- mvrnorm(n=1, mu=c(0,0), Sigma=psi )
X <- cbind(rep(1,n),1:n)
Z <- X
Y <- X%*%beta+ Z%*%b+rnorm(n,0,1)
?lmer
Thank you.
Best wishes,
Jie
[[alternative
nly for continuous case?
Thank you for your time.
Best wishes,
Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.
bit R and exp
Is there a way to improve the result?
R example:
powd <- sample(-2000:0, 100, replace=T) # the power of x [i, j]
x <- matrix(exp(powd),10)# the value of x
sum(log(rowSums(x))) # sum
Thank you for your help.
Best wishe
ed as these aspects: how do these generators
work with/without seed, what is the relation between these packages, what
is the best option of seed if needed.
Thank you very much for your help.
Best wishes,
Jie
[[alternative HTML version deleted]]
__
Please find some reference online or textbook. This must be contained in
the model assessment part.
AIC, BIC, rolling prediction/forecasting error might be what you want.
Best wishes,
Jie
On Fri, Aug 3, 2012 at 4:07 AM, Soham wrote:
> Hi I am trying to fit a time series data.It gives a A
After searching online, I found that clusterCall or foreach might be the
solution.
Best wishes,
Jie
On Sun, Aug 5, 2012 at 10:23 PM, Jie wrote:
> Dear All,
>
> Suppose I have a program as below: Outside is a loop for simulation (with
> random generated data), inside there are se
do some
calculation.Definitely will be very slow)
I am not sure. Just try to help.
Best wishes,
Jie
On Sun, Aug 5, 2012 at 6:52 PM, wrote:
> Dear all
>
> I have a Windows Server 2008 R2 Enterprise machine, with 64bit R installed
> running on 2 x Quad-core Intel Xeon 5500 process
Dear All,
Suppose I have a program as below: Outside is a loop for simulation (with
random generated data), inside there are several sapply()'s (10~100) over
the data and something else, but these sapply's have to be sequential. And
each sapply do not involve very intensive calculation (a few seco
Dear All,
I am learning parallel in R and start with the package "snow". I did a test
about running time and the parallel version is much slower than the regulat
code. My laptop is X200s with dual core intel L9400 cpu.
Should I make more clusters than 2? Or how to improve the performance?
# insta
.But I find that when I use the aa[[1]][1:10] and it seems be mistake.
aa[[1]][1:10]
[1] 11 1 NA NA NA NA NA NA NA NA
But when I just indice one element of the dataframe .e.g.aa[[1]][2]
It will be ok. How could I subset the data.frame data by lines?
Thank you ?
--
TANG Jie
Email: totang...@gma
e Gauss hermite Version improve much?
If I post to a wrong place, please let me know. Thank you.
Best wishes,
Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read th
))
But when I try it in R, the answer is not as expected.
code as below:
A <- matrix(1:9,3,3)
A <- A + t(A)
diag(A) <- 50
print(A)
L <- chol(A)
B <- t(solve(chol(solve(A
print(L)
print(B)
Thank you in advance,
Best wishes,
Jie
[[alternative HTML version deleted]]
wishes,
Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self
Sorry to miss the OS information. I run it on Window 7 32 bit, 64 bit and
Unix (version unclear, it is a grid machine.)
Best wishes,
Jie
On Mon, Jul 30, 2012 at 11:39 AM, Prof Brian Ripley
wrote:
> On 30/07/2012 16:08, Jie wrote:
>
>> Dear All,
>>
>> I am curious if t
Dear All,
I am curious if there is any why to use R to know the specification of the
machine that runs on,
i.e. read the cpu model, memory size, those hardware info, maybe even with
thesoftware information.
Thank you for your attention.
Best wishes,
Jie
[[alternative HTML version
. And also, Bayesian
methods and packages I think exist in R to impute the data.
Best wishes,
Jie
On Mon, Jul 23, 2012 at 11:39 AM, David L Carlson wrote:
> This is chopped off. What happens next is important. EM can be used to
> compute covariance matrices and conducts the statistical analysis wi
hi R-users:
I want to draw three plot into one figure by layout and the script has
been shown below.
But I find R does not show the xlab and ylab information completely as
shown the figure attached.
How can I midify the script.? thank you .
xxlab<-paste(cpmd," (",ro,"%)",sep=" ")
yylab<-pas
hi R-users
Now I have a figure in emf or png or tiff format that have been drawn
by other tool and I want to insert this figure into
my new figure by R script. I wonder if is possible ?
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
Seems that I found the problem.
The degree of freedom was missing as a denominator...
Thank you for your help.
Best wishes,
Jie
On Thu, Jul 5, 2012 at 9:28 AM, John Kane wrote:
> I don't believe that R-help permits pdf files. A useful workaround is to
> post it to a file hostin
Dear Paul,
Thank you for your suggestion. I was moved by the fact that people are so
nice to help learners and ask for nothing.
With your help, I made some changes to my code and add more comments, try
to make things more clear.
If this R email list allow me to upload a pdf file to illustrate the
Dear All,
have a general question about coefficients estimation of the mixed model.
I simulated a very basic model: Y|b=X*\beta+Z*b +\sigma^2* diag(ni);
b follows
N(0,\psi) #i.e. bivariate normal
where b is the latent variable, Z and
hi R-users:
I have some data related with geographical information.
I wonder how to plot some data (in contour,shaded or scatter) on a map.
Could anyone tell me which package or reference or examples I can learn
?
thank you .
--
TANG Jie
Email: totang...@gmail.com
hi,R-users:
Now I plot some data with the name(aveobsdata) in column , How can I add
the
some number(e,g. the sample number) in each of the column?
plot(aveobsdata,type='h',lwd=line_width,col=line_col,main=titleinfo,xlab=xxlab,ylab=yylab,xaxt
= "n")
axis(1, at = 1:nums, label = name)
--
_
hi ,
I am reading a series of files by the command shown as below.
cop_x_data<-read.table(flnm(i)
,skip=2,allowEscapes=TRUE,blank.lines.skip=TRUE)
the first two line of the files are headfile and I skip them by skip=2.
and sometimes the data file is null and there is no any data
in the file except
his situation,my command would be in the error and tell me that
there is not data in the file and can not go on.
How can I go on read the files even if the file is null?
thank you
--
TANG Jie
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listi
;)
> axis(1, at = 1:10, label = paste(1:10, "h", sep = "")) # Happy axis!
> par(ask = op$ask)
>
> The (good) advice to use dput() was to help us help you. Reread what was
> said.
>
> Michael
>
> On Sat, Mar 17, 2012 at 10:22 AM, Jie Tang wrote:
>
someone has told me that use dput but it seems useless.
Can anyone tell me how to use axis or at ?thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typ
t;>
>> op <- par()
>> par(ask = TRUE)
>> plot(1:10) # Unhappy axis
>>
>> plot(1:10, xaxt = "n")
>> axis(1, at = 1:10, label = paste(1:10, "h", sep = "")) # Happy axis!
>> par(ask = op$ask)
>>
>> The (good) a
someone has told me that use dput but it seems useless.
Can anyone tell me how to use axis or at ?thank you .
--
> TANG Jie
> Email: totang...@gmail.com
> Tel: 0086-2154896104
> Shanghai Typhoon Institute,China
>
>
>
> --
> TANG Jie
> Email: totang...@gmail.com
> Te
hi everyone .
I am trying to use some packages but there are some functions have the same
name in different package.
for example
dwt function
both in packages wavelets and waveslim
dwt(X, filter="la8", n.levels, boundary="periodic")
How can I avoid mixing them up ?
tell me what is the meaning of the information of x-axis and
y-axis .
Which one is the space scale ?
thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
<>__
R-help@r-project.org
hi everyone .
Now I want to draw several lines in one frame.And it seems needs more
colors except for blue red,black .Where can i found these color name or
define some new color ?thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
hi
I plot a series of observation data every minutes in a day as the
attachment below
plot(wnd,type='l',lty=1,col='red',lwd=1,xlab=xxlab,ylab=yylab,ylim=YY)
In the figure, the x-axis tickment is the number of data How can I change
it
fore example 1h 2h 3h 4h and so on ?
thank you all. it seems what='' can works while what = " " does not .:)
thank you all.
2012/3/7 kees duineveld
> Hi Jie,
>
> Are you looking for this construction?
>
> mydata <- apply(c("H20100902.TXT", "H20100903.TXT" ,"H2010
here is my file.txt that generated by other command "ls "
2012/3/7 Jie Tang
> there is something wrong :
>
> scan(file, what, nmax, sep, dec, quote, skip, nlines, na.strings, :
> scan() needs 'a real', but not 'H20100903.TXT'
>
> 2012/3/7 j
;
> >
> > files <- scan('file.txt', what = '') # read names from the file
> Read 7 items
> > files # display the names
> [1] "H20100902.TXT" "H20100903.TXT" "H20100904.TXT" "H20100905.TXT"
> "H20100906.TX
ld I read these filenames into one array
and so that .I can read the data by such a command ?
ddata<-scan(pp[2],what=datalist,na.strings = 999)
thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
[[alternative HTML version deleted]]
line are different.
Can anyone help me ?
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo
-- Forwarded message --
From: Jie TANG
Date: 2011/10/25
Subject: how can I install the latest version of r in linux?
To: r-help@r-project.org
HI R-users
I downloaded the latest version of R with the name R-latest.tar.gz from
the website
But when I tar the package and
HI R-users
I downloaded the latest version of R with the name R-latest.tar.gz from
the website
But when I tar the package and configure the package,
some error message showed that
configure: error: --with-readline=yes (default) and headers/libs are not
available
and I run make command:
error
les just like the command
read(unit,err=linenum) in fortran ?
thank you .
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide h
to one figure?
plot(data[1:5])
boxplot(newdata[,1:5])
?
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/po
) can only plot one group of data ?
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guid
nice. thank you all.
R is a great tool and R users are also so kind .
2011/9/1 David Winsemius
>
> On Sep 1, 2011, at 3:45 AM, Jie TANG wrote:
>
> thank you. it works.
>> but further question is that if we can let the " flnm" to be a
>> 2-dimension
>>
uot;)
flnm would be a 1-dimension with 15 elements?
thankyou
2011/9/1 Jorge I Velez
> Hi Jie,
>
> Try
>
> c(outer(mtdno, tyno, FUN = paste, "_err.dat", sep = ""))
>
> HTH,
> Jorge
>
>
> On Thu, Sep 1, 2011 at 3:11 AM, Jie TANG <> wrote:
>
ata1obs4_err.dat" "data2obs5_err.dat"
but actually what i want is data from 1 to 3 and obs from 1 to 5. thus ,I
can read 15 files but not 5 files
how could I do?
thanks.
--
TANG Jie
[[alternative HTML version deleted]]
='')
>
> plot(test[[newnam[1]]])
>
>
> On Mon, Aug 29, 2011 at 12:29 PM, Jie TANG wrote:
>
>> hi, R-users
>> I have a data.frame for example test$newdataday24 and test$newdataday48
>> I can plot them by
>> plot(test$newdataday24)
>> but
t(newnam[1])
but i failed,the error message said that something wrong with plot.window
what can i do to fix my script ? thanks
-
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman
for example : I have files with the name
"ma01.dat","ma02.dat","ma03.dat","ma04.dat",I want to read the data in
these files into one data.frame
flnm<-paste("obs",101:114,"_err.dat",sep="")
newdata<-read.table(flnm,skip=2)
data<-(flnm,skip=2)
but the data only contains data from the flnm[1]
I als
) .OO#. .OO#. rocks...1k
> ---
>
> Sent from my phone. Please excuse my brevity.
>
> Jie TANG wrote:
>
>> hi ,
>> Now I have two dataset and want to compare them with same sample.
>> Dataset A:
>> year mon day obs
>> 2010 03 1212
&g
hi ,
Now I have two dataset and want to compare them with same sample.
Dataset A:
year mon day obs
2010 03 1212
2010 03 1822
2010 04 1262
2010 07 24 29
Dataset B:
year mon day obs
2010 03 1215
2010 04 1257
2010 07 2432
2010 08
my qustion is if my miss value in my dataset is -
for example :
1 3 21 33 - 23 33 -
how can I plot or analysis this dataset ignoring the missing value ? thanks
.
--
TANG Jie
[[alternative HTML version deleted]]
__
R-help@r
for example:
a data.frame
data
V1 V2 V3
1 2 3
4 5 6
If I want to calculate the V2
I can get data$V2
But now I want to calculate the dimension name and then analysis the data.
for example
No=3*x ;x=1,2,3,...n
anadata=data$VNo
How could I do?
--
TANG Jie
Hi guys,
I got a problem when I was trying to use lattice to do some plot. Below is
one working example which can generate one curve for A and one curve for B
in each subplot. However, I would like to just show the points for B, not
connecting the dots. As for A, I still want a curve (dots are con
hi,R users,
Now I have some scatter figures, is there some method can plot equalprobable
error ellipse ?
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
[[alternative HTML version deleted]]
__
R
hi ,R USERS:
I am a new R user. I have study some basic R syntax and get some
interesting results.
Now I want to know how much R can do .where can i get some examples or demo
resource to study advanced function of R ?
--
thank your
TANG Jie
Email: totang...@gmail.com
Shanghai Typhoon
Hi guys,
I used the following R code to generate one plot
library(lattice)
xyplot(Y~X1|as.factor(X2)*as.factor(X3), groups = as.factor(X4),
data=mydata)
Both X2 and X3 have three values. X4 has two values. I got 3x3 grids and in
each grid there are two curves about y~x1 for the two X4 values. I
to look in
> # If your variables are just in your usual workspace
> # it should be .GlobalEnv
> alldata <- mget(x = datasetname, envir = .GlobalEnv)
>
> HTH,
>
> Josh
>
>
> On Mon, Sep 13, 2010 at 11:40 AM, Jie Li wrote:
> > All,
> >
> > For example, I have
All,
For example, I have a dataset named "ABC" loaded into R
> ABC
[,1] [,2] [,3]
[1,]147
[2,]258
[3,]369
and I also have a variable datasetname
> datasetname
[1] "ABC"
and I want to add this "ABC" dataset to an existing list "alldata"
> alldata <-NULL
hi ,R user folks .
Nowadays I read a paper which draw a probability ellipse circle figure
shown in the appendix.
I wonder how to draw this figure by R ?
the x-axis and y-axis both express the error but in different direction .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
list ;-). Try searching the help archiwe (www.rseek.org) and you will
> find solutions. I would guess that you need to use something like:
>
> axis(4)
>
> as the sides of the plot are always numbered from bottom,left,top,right
>
> HTH
> Jannis
> Jie TANG schrieb:
>
>> he
=1,col='black',lwd=4,xlab=xxlab,ylab=yylab)
par(new=T)
plot(sdgrp,type='l',lty=3,col='red1',xlab=xxlab,ylab=yylab,lwd=4)
#axis(2, col = "gold", lty = 2, lwd = 0.5)
legend("topright", legend, lty=llty, lwd=llwd,col =lgcol)
axis(1,at=1:6,labels=grad
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide
clustering analysis ?Thank you .
--
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the postin
s2,Class3 instead of "X5,X12,V3,V4,V5,V6"
What can I do to achieve my goal?thanks
TANG Jie
Email: totang...@gmail.com
Tel: 0086-2154896104
Shanghai Typhoon Institute,China
<>__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailma
Hi, R experts:
I am asking for helps with manipulating this data: we have different groups:
A,B, C, and so on. In each group, we have different students, for example,
we have 6 students in A and 5 students in B. Each student gives a rating,
which ranges from 1 to 3.
We want to manipulate this dat
Dear R experts:
I have following data structure: student id, exam time and score. I want to
create three new columes: 1 st before, 2nd before and 3rd before.
For example, for student 1's 4th exam score is assumed to be influenced by
his previous three cloest scores, which are 6, 9, and 10 in that
1 - 100 of 111 matches
Mail list logo