Displaying 20 results from an estimated 300 matches similar to: "Function -return value"
2007 Jun 13
2
Fitted Value Pareto Distribution
I would like to fit a Pareto Distribution and I am using the following codes.
I thought the fitted (fit1) should be the fitted value for the data, is it
correct? As the result of the "fitted" turns out to be a single value for
all.
fit=vglm(ycf1 ~ 1, pareto1(location=alpha), trace=TRUE, crit="c")
fitted(fit)
The result is
fitted(fit)
[,1]
[1,] 0.07752694
2006 May 16
2
PLS
hello,
can u please give me the code written in matlab for partial least square
regression
I tried implimenting it but could not succesful,
will you pls provide me the code written in matlab and also the exlanatiion
to each step
Thnaking you.
Mr Jivan shrikrishna Parab
research scholar
Electronics department
Goa university
[[alternative HTML version deleted]]
2005 Oct 07
1
Troubleshooting with "gpd" (Fit generalized pareto model)
Up to now, I have recognized problems with "gpd(..)", the function from
the package "evir"
I think that all these functions that estimate the parameters xi, beta for
the GPD
by given threshold mu use the function "optim(..)" ( gpd, fitgpd, ...)
"Error" example:
data1 <- rgpd(1000, xi= -1.5, mu=1000, beta=100)
so the created poinnts take place in about
2007 Jun 06
0
A question about riskmeasures() vs. qgpd() in library(evir)
Dear List,
This inquiry probably does not directly pertain to R.
I am using library(evir) to learn EVT. Based on my reading of things,
it is my understanding that if one wants to calculate quantiles of
GPD, one could use either riskmeasures() or qgpd(). However, using
data(danish) as an example, the quantile estimates produced by
riskmeasures() are considerably different from those produced by
2010 Jul 06
3
how to define a function in R
1. how to write a R script?
2.How to write a SAS like macro/generic process to process multiple files by
using the same funstion in R?
Thanks in advance
--
View this message in context: http://r.789695.n4.nabble.com/how-to-define-a-function-in-R-tp2280290p2280290.html
Sent from the R help mailing list archive at Nabble.com.
2012 Jun 01
1
POT Package
Hi,
I have a problem in fitting GPD distribution.
i generate random numbers from gpd distribution from specific parameters
using pot packege then i used fitgpd function to estimete the parameters.The
estimated parameters are not matched with the given parameters i.e.from
which i generate random numbers.I think estimated parameters should be
matched with the given parameters.Also suggest me
2008 Sep 18
0
Joint distributions
Dear R-help!
I need to draw contour lines in a plot of wave heights (Hs) versus peak
periods (Tp) showing the joint probabilities of 1-year wave heights~peak
periods, 10-year wave heights~peak periods and 100-year wave heights~peak
periods.
I've used the contourplot() function in the plot I've added in this mail.
You can use the added dataset "Rhelpdata.txt" to reproduce a
2008 May 14
6
PWGL in wine, problems
Hello,
I'm new on this list. First of all, thank you to all the developers of this
great project!
At the moment there is only an application that keeps me on both macos and
windows, its name is PWGL a free environment for computer assisted
composition in openGL. (http://www2.siba.fi/PWGL/)
I'm running Ubuntu 8.04 and wine 0.9.59.
I have to say that I also installed vcrun2005 and
2000 Dec 28
1
function write
Dear R users,
how can i export data from R to excel (or text file)?
i use write funstion but i ve the following error message :
write(charlotte,"h:/hakim/charlotte/essai3.txt",nc=2)
Error in cat(list(...), file, sep, fill, labels, append) :
argument 1 not yet handled by cat
thx.
AXA Corporate Solutions
Nouveaux Produits
Nour-Eddine HAKIM
52 Rue d'Amsterdame - 75009
1998 Sep 03
2
ppoints
When I look at ppoints I see:
ppoints<-function (x)
{
n <- length(x)
if (n == 1)
n <- x
(1:n - 0.5)/n
}
However Venables & Ripley (2nd ed, p 165) say ppoints() should return
(i-1/2)/n for n>=11; (i-3/8)/(n+1/4) for n<=10.
The version below should work as described:
ppoints<-function (x)
{
n <- length(x)
if (n <= 10)
(1:n - 0.375)/(n + 0.25)
else
(1:n - 0.5)/n
2005 Jan 19
1
ppoints (PR#7538)
Dear r-bugs,
Whilst playing with ppoints I discovered
that when one uses it directly, occasional
NA's in a vector also become data fractions:
ppoints(c(1,2,NA,4))
Would it be a good idea to add a warning message
as in:
ppoints <- function (n, a = ifelse(n <= 10, 3/8, 1/2))
{
if(any(is.na(n))) warning("'n' contains NA's")
if(length(n) > 1) n <-
2000 Dec 11
1
qqline (PR#764)
I think qqline does not do exactly what it is advertised to do ("`qqline'
adds a line to a normal quantile-quantile plot which passes through the
first and third quartiles."). Consider the graph:
tmp <- qnorm(ppoints(10))
qqnorm(tmp)
qqline(tmp)
The line (which I expected go through all the points), has a slightly
shallower slope than does the points plotted by qqnorm. I think
2006 Apr 13
2
Plotting positions in qqnorm?
Do you know of a reference that discusses alternative choices for
plotting positions for a normal probability plot? The documentation for
qqnorm says it calls ppoints, which returns qnorm((1:m-a)/(m+1-2*a))
with "a" = ifelse(n<=10, 3/8, 1/2)? The help pages for qqnorm and
ppoints just refer to Becker, Chambers and Wilks (1988) The New S
Language (Wadsworth & Brooks/Cole),
2004 Feb 12
2
calling R from a shell script and have it display graphics
Hello,
I am running R under Linux/x11.
I would like to call R from a shell script and have it display a series
of graphics.
The graphics should remain visible until the user clicks or presses a key.
I first tried R BATCH, but it does not load the x11 module, making it
impossible to open x11 or png devices.
Then, I tried to call R with a 'here' script:
R --vanilla --quiet --args
2012 May 11
1
identify() doesn't return "true" numbers
Dear R community.
I am using the identify() function to identify outliers in my dataset.
This is the code I am using:
####################################################################
# Function to allow identifying points in the QQ plot (by mouseclicking)
qqInteractive <- function(..., IDENTIFY = TRUE)
{
qqplot(...) -> X
abline(a=0,b=1)
if(IDENTIFY) return(identify(X))
2004 Feb 14
6
Beginner's question about t.test()
Dear All,
I am doing some exercise in statistics textbook on comparison of two
experimental means. Is it possible to use t.test() do t-test when I have
only two means, sample size, two standard deviations ? (no raw data).
Thanks.
Pramote
1999 Aug 31
1
Suggestion for qqplot() improvement
>>>>> On Tue, 31 Aug 1999 14:57, Werner Stahel <stahel@stat.math.ethz.ch> said:
WSt> Here is a suggestion. It seems that qqplots, comparing a sample
WSt> to a distribution other than the normal, are not explicitly
WSt> available in S or R. I found
(in S-plus / Trellis it is, see below)
WSt> qqplot(y, rt(300, df = 5))
WSt> as an
2014 Nov 07
1
php api binding for setting interface link flags (up/down).
Hello. I can't see in php api reference info about setting port status
of interface.
virsh have comands virsh domif-setlink, but php api does not have link
funstions.
Please add this interface, bacause it very useful - then we need to
disable some vps, but not want to shutdown it.
Thanks!
--
Vasiliy Tolstov,
e-mail: v.tolstov@selfip.ru
jabber: vase@selfip.ru
2007 Jun 04
3
test for nested factors
Is there a conventional way to test for nested factors? I.e., if 'a'
and 'b' are lists of same-length factors, does each level specified by
'a' correspond to exactly one level specified by 'b'?
The function below seems to suffice, but I'd be happy to know of a more
succinct solution, if it already exists.
Thanks,
Tim.
---
"%nested.in%" <-
2003 Dec 09
2
PROC MIXED vs. lme()
I'm trying to learn how to do a repeated measures ANOVA in R using lme().
A data set that comes from the book Design and Analysis has the following
structure: Measurements (DV) were taken on 8 subjects (SUB) with two
experimental levels (GROUP) at four times (TRIAL).
In SAS, I use the code:
PROC MIXED DATA=[data set below];
CLASS sub group trial;
MODEL dv = group trial group*trial;