Good morning,
I use raster package to process sattelite image maps. Could anyone help me with
exporting data into KML? I have a raster image which I need to transfer into
Google Maps. The colors of this image is described in raster@legend@colortable
slot. Each color corresponds to raster cell v
I have a several questions about R graphic properties.
I use a "barplot2" function for creating plots with error bars. My data include
species' names in first column, and I need make plots for each species. I know
how to select species for each plot:
D<-read.table("FD_R.txt", h=T)
Dens<-D[D[,1
Dear all,
how to calculate values of t-distribution for given values of d.f. using R
functions?
Anton
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-proje
Dear all,
I need to fit a set of empirical data to cumulative normal distribution to
find the mean and sd of theoretical distribution. But I assume that my data
set describes only part of PDF, for example, only half of theoretical
distribution. What function allows it in R? Thank
--
Отправлено из мобильной Яндекс.Почты: http://m.ya.ru/ymail
__
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
--
Отправлено из мобильной Яндекс.Почты: http://m.ya.ru/ymail
__
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
Hi,
How to fit data to cumulative normal distribution?
I tried such way:
library(MASS)
ed<-c(1:10)
cnd<-function(mn,sdd){pnorm(c(1:10),mn,sdd)}
fitdistr(ed,cnd,start=list(mn=mean(ed),sdd=sd(ed)))
.but an error occured:
Error in solve.default(res$hessian) :
function Lapack 'dgesv': system are
Hi,
How to fit data to cumulative normal distribution?
I tried such way:
library(MASS)
ed<-c(1:10)
cnd<-function(mn,sdd){pnorm(c(1:10),mn,sdd)}
fitdistr(ed,cnd,start=list(mn=mean(ed),sdd=sd(ed)))
.but an error occured:
Error in solve.default(res$hessian) :
function Lapack 'dgesv': system are
Hi,
How to fit data to cumulative normal distribution?
I tried such way:
library(MASS)
ed<-c(1:10)
cnd<-function(mn,sdd){pnorm(c(1:10),mn,sdd)}
fitdistr(ed,cnd,start=list(mn=mean(ed),sdd=sd(ed)))
..but an error occured:
Error in solve.default(res$hessian) :
functio
Hi all,
does anybody know a useful function in R to calculate Weighted Spearman
Correlation with p-values, particularly for matrices?
Thanks,
A. Morkovin
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read
Dear all,
is there any functions which allow to calculate Student t-criterion using
means, their SE and sample size? I've seek for, but bulit-in t-criterion works
only with initial sample...
Best regards,
A.Morkovin
__
R-help@r-project.org mailing l
Dear all,
I need to create n*n table with sums of all possible pair combinations of
numbers from n-row column. What function allows it?
Best regards,
A.Morkovin
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEA
Dear all,
is there any functions which allow to calculate Student t-criterion using
means, their SE and sample size? I've seek for, but bulit-in t-criterion works
only with initial sample...
Best regards,
A.Morkovin
__
R-help@r-project.org mailing l
--
Отправлено из мобильной Яндекс.Почты: http://m.ya.ru/ymail
__
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,
Dear all,
what function can be used to calculate weighted SD or/and SE¿
There's no such stuff in 'base' package.
Best regards,
A.A.Morkovin
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting gui
For example, I have a numeric vector named "d" (without any attributes) and
I want to coerce it to character vector "d". Is there any such functions? I
need it to make a function which applies other functions to objects,
something like this:
do<-function(x,fun, ...) {
fun<-mat
Hi all,
I need to test the significnce of difference between slopes of two regression
lines and regression line with theoretical line. Is it correct to use t-test in
this situation? Here is my script:
library(car)
d1<-data.frame(P1=c(1,2,3,5,7,8,9,13,14,15),
P2=c(1,2,5,8,11,13,1
Hi all,
I need to test the significnce of difference between slopes of two regression
lines and regression line with theoretical line. I try to use Slope.test
function from emu package,
but an error occured...
library(emu)
d1<-data.frame(P1=c(1,2,3,5,7,8,9,13,14,15),
P2=c(1,2,5,8,11,13,15,15,1
; estimator. For your regression models m1 and m2 you can enter
>
> vcov(m1)
> vcov(m2)
>
> to get the variance-covariance matrix of m1 and m2. Then, assuming that
> the slope estimator is normal, you compute the p-value for slope_theo
> with respect to this normal distribution.
Hello,
Is there any functions in R to proceed Kruskal-Wallis test with weights for
each observation, without pseudoreplicating the sample?
__
Best Regards
A.A. Morkovin
__
R-help@r-project.org mailing list
https://stat.ethz.ch/mailman/listinfo/r
20 matches
Mail list logo