search for: traj

Displaying 20 results from an estimated 24 matches for "traj".

Did you mean: trac
2012 Jun 09
2
Help with permutation function from Turner et al. 2010 (Ecology)
...is simply a matrix of repeating rows (i.e., it appears as if the function is selecting the same "random" sample every time). The function is as follows (please keep in mind that many of the internal functions were written by Turner et al. as well and may not be familiar): line.1<-c(0,traj.result(traj.size,traj.dir,traj.shape)) permute<-function(y,x2,g,o,p) { p.table<-line.1 yhat<-predict(x2) res<-resid(x2) line<-nrow(y) for(i in 1:p){ line.rand<-sample(line,replace=FALSE) res.temp<-cbind(line.rand,res) z<-(order(line.rand)) res...
2008 Feb 23
1
Set without argument
...d that change the slot of an object without using <- ? My object contain a numeric and a matrix. At some point, I would like to impute the missing value in the matrix. So I would like to use something like : ----------------- setClass("MyObj",representation(time="numeric",traj="matrix")) a <- new("MyObj",time=3,traj=matrix(c(1:6,NA,8:12),ncol=3)) imputeMyObj(a) ----------------- I find 'setTime<-' to change le slot time, but it can not work in the case of imputeMyObs since this mehod does not need a value... Any solution ? Thanks Ch...
2009 Sep 09
1
Package that does not work until I re write the exactly the same code
...me verifications: --- 8< ---- class(dn) # [1] "ClusterizLongData" # attr(,"package") # [1] "kml" getMethod("kml","ClusterizLongData") # Method Definition: # # function (Object, nbClusters = 2:6, nbRedrawing = 20, saveFreq = 100, # maxIt = 200, trajMinSize = 2, print.cal = FALSE, print.traj = FALSE, # imputationMethod = "copyMean", distance, power = 2, centerMethod = meanNA, # startingCond = "allMethods", distanceStartingCond = "euclidean", # ...) #{ # nbIdFull <- nrow(Object["traj"]) # .....
2002 Nov 25
2
Pspline smoothing
Dear all, I'm trying to use the Pspline add-on package to fit a quintic spline (norder =3), but I keep running into a Singularity error. > traj.spl <- smooth.Pspline(time, x, norder=3 ) Error in smooth.Pspline(time, x, norder = 3) : Singularity error in solving equations > Playing around with the other parameters produces an "unused arguments" error: > traj.spl <- smooth.Pspline(time, x, norder=3 , cv=FALSE, metho...
2014 Mar 19
1
Memcheck: Invalid read of size 4
...C5DF28: kml1 (kml.c:183) ... ==27283== by 0x10C5DE4F: kml1 (kml.c:151) ... ==27283== at 0x10C5DF90: kml1 (kml.c:198) --- 8< ---------------- Here is the function kml1 from the file kml.c (I add some comments to tag the lines 151, 183 and 198) --- 8< ---------------- void kml1(double *traj, int *nbInd, int *nbTime, int *nbClusters, int *maxIt, int *clusterAffectation1, int *convergenceTime){ int i=0,iter=0; int *clusterAffectation2=malloc(*nbInd * sizeof(int)); // lines 151 double *trajMean=malloc(*nbClusters * *nbTime * sizeof(double)); for...
2015 May 26
0
Compatibility issue between lme4 and kml (operateur "[")
...then it does no longer work (2). Moreover, it has some kind of strange behavior (3). Do you know what is wrong? Any idea of how I can correct that? Thanks for your help Christophe --- 8< ----------------- Code for reproductible example ------------------- library(kml) dn <- gald(1) dn["traj"] library(lme4) dn["traj"] setMethod( ### Simplified version ### "[", signature=signature(x="ClusterLongData", i="character", j="ANY",drop="ANY"), definition=function (x, i, j="missing", ..., drop = TRUE){ x &l...
2008 Feb 08
2
learning S4
Hi the list. I try to learn the S4 programming. I find the wiki and several doc. But I still have few questions... 1. To define 'representation', we can use two syntax : - representation=list(temps = 'numeric',traj = 'matrix') - representation(temps = 'numeric',traj = 'matrix') Is there any difference ? 2. 'validityMethod' check the intialisation of a new object, but not the latter modifications. Is it possible to set up a validation that check every modifications...
2009 Jun 09
3
"R CMD check" does not find a mistake
...Is that normal ? Here is what Kurt gets (which is right, I did this mistake): --- 8< ---------------- * checking for code/documentation mismatches ... WARNING S4 class codoc mismatches from documentation object 'LongData-class': Slots for class 'LongData' Code: id other time traj varName Docs: id time traj varName --- 8< ---------------- But here is what I get : --- 8< ---------------- R CMD check longitudinalData * checking for working pdflatex ... OK * using log directory 'C:/Documents and Settings/Christophe/Mes documents/Recher che/Trajectoires/kmeal/long...
2006 Feb 23
0
adehabitat version 1.4
...nalysis of selection ratios (Calenge and Dufour, 2006, Ecology) can now be performed using the function eisera(). It can be used for the analysis of habitat selection when habitat can be considered to consist of several habitat types (e.g. vegetation types). - A new class, the class "ltraj", is now available for the analysis of trajectories of animals (e.g. for the analysis of data collected using GPS collars). This class automatically computes the turning angles between successive moves, the absolute angles for each move, the speeds and the net squared displacement for...
2006 Feb 23
0
adehabitat version 1.4
...nalysis of selection ratios (Calenge and Dufour, 2006, Ecology) can now be performed using the function eisera(). It can be used for the analysis of habitat selection when habitat can be considered to consist of several habitat types (e.g. vegetation types). - A new class, the class "ltraj", is now available for the analysis of trajectories of animals (e.g. for the analysis of data collected using GPS collars). This class automatically computes the turning angles between successive moves, the absolute angles for each move, the speeds and the net squared displacement for...
2014 Sep 04
1
R CMD check --as-cran does not show all error messages.
...that the CRAN people responsible for checking packages are replying me with some mistakes that I just do NOT get when I do the check in my computer. With the most recent R version, i.e. 3.1.1 and the command R CMD check --as-cran on my package I get: * using log directory ?/home/thalles/Music/opentraj.Rcheck? * using R version 3.1.1 (2014-07-10) * using platform: x86_64-pc-linux-gnu (64-bit) * using session charset: UTF-8 * checking for file ?opentraj/DESCRIPTION? ... OK * checking extension type ... Package * this is package ?opentraj? version ?1.0? * checking CRAN incoming feasibility ... NOTE...
2005 May 12
0
Package adehabitat version 1.3
...sion 1.3 of the package 'adehabitat'. Significant changes are listed below: - Several functions allowing the conversion from and to classes of the package sp have been added. Maps of class "asc", "kasc", "area", as well as radio-monitoring of class "traj" can now be converted to the spatial classes available in sp. - The function buffer.line() allows to compute buffer around a line - The function distfacmap() converts one factor map into a set of maps giving the distance to the patches belonging to the different levels. - The kernel...
2005 May 12
0
Package adehabitat version 1.3
...sion 1.3 of the package 'adehabitat'. Significant changes are listed below: - Several functions allowing the conversion from and to classes of the package sp have been added. Maps of class "asc", "kasc", "area", as well as radio-monitoring of class "traj" can now be converted to the spatial classes available in sp. - The function buffer.line() allows to compute buffer around a line - The function distfacmap() converts one factor map into a set of maps giving the distance to the patches belonging to the different levels. - The kernel...
2010 Mar 15
1
problem in reading trajectory file
Hi, I'm trying to read some trajectory files (text files) which have the form: # trial n # t X Y 0 1 2 0.2 1 3 0.4 1.2 4 ... # trial n+1 # t X Y 0 1 2 0.2 1.3 3.3 0.4 1.5 5 ... ... where the symbol # means that the line is not a numeric value, but I...
2009 Jun 09
0
"R CMD check" does not find a mistake
.... Is that normal ? Here is what Kurt gets (which is right, I did this mistake): --- 8< ---------------- * checking for code/documentation mismatches ... WARNING S4 class codoc mismatches from documentation object 'LongData-class': Slots for class 'LongData' Code: id other time traj varName Docs: id time traj varName --- 8< ---------------- But here is what I get on my computer: --- 8< ---------------- C:\Documents and Settings\Christophe\Mes documents\Recherche\Trajectoires\kmeal> R CMD check longitudinalData * checking for working pdflatex ... OK * using log dir...
2014 Sep 12
0
Compatibility issues between Matrix and kml
...setClass(Class="CLD", contains=c("LongData","ListPartition")) myCld <- new("CLD", idAll=as.character(c(100,102,103,109,115,123)), idFewNA=as.character(c(100,102,103,109,115,123)), time=c(1,2,4,8,15), varNames="P", traj=matrix(c(1,2,3,1,4, 3,6,1,8,10, 1,2,1,3,2, 4,2,5,6,3, 4,3,4,4,4, 7,6,5,5,4),6), dimTraj=c(6,5), maxNA=3, reverse=matrix(c(0,1),2,1) ) setMethod("[", signature=signature(x="CLD", i="character", j="ANY",drop="ANY"), definition=func...
2002 Oct 02
6
help to make a map on R
Hi all, I need a little help for construct an state's map on R. The first problem is to get the data. I have a datafile of longitude and latitude in the follow format: trajectory latitude longtude T -22.045618 -51.287056 T -22.067078 -51.265888 T -22.067039 -51.207249 T -22.059690 -48.089695 T -22.075529 -48.074608 T -22.072460 -48.044472 T -22.062767 -48.298473 T -22.077349 -48.322140 T -22.047001 -48.347443 T -22.054266 -48.369331 T -22.042810 -48.39261...
2010 Jan 11
1
K-means recluster data with given cluster centers
...SE) 2: R code to recluster new data #---RECLUSTER NEW DATA WITH GIVEN CLUSTER CENTERS # LOAD LIB, SET PARAMETER library(cluster) loopStart="0" loopEnd="10" # LOAD CLUSTER CENTER load("clusterCenters.RData") # load cluster centers # LOOP OVER TRAJ AND RECLUSTER THEM for(ii in loopStart:loopEnd){ # DEFINE FILENAME #print(paste("test",ii,sep="")) filenameInput=paste("dataset",ii,"dat",sep="") filenameOutput=paste("dataset",ii,"datClusters",...
2006 Dec 01
1
R News, volume 6, issue 5 is now available
Hi The December 2006 issue of R News is now available on CRAN under the Documentation/Newsletter link. Paul (on behalf of the R News Editorial Board) -- Dr Paul Murrell Department of Statistics The University of Auckland Private Bag 92019 Auckland New Zealand 64 9 3737599 x85392 paul at stat.auckland.ac.nz http://www.stat.auckland.ac.nz/~paul/ _______________________________________________
2006 Dec 01
1
R News, volume 6, issue 5 is now available
Hi The December 2006 issue of R News is now available on CRAN under the Documentation/Newsletter link. Paul (on behalf of the R News Editorial Board) -- Dr Paul Murrell Department of Statistics The University of Auckland Private Bag 92019 Auckland New Zealand 64 9 3737599 x85392 paul at stat.auckland.ac.nz http://www.stat.auckland.ac.nz/~paul/ _______________________________________________