Home
last modified time | relevance | path

Searched refs:crds (Results 1 – 25 of 2079) sorted by relevance

12345678910>>...84

/dports/astro/R-cran-maptools/maptools/R/
H A Dsun-methods.R1 ".balanceCrdsTimes" <- function(crds, dateTime) argument
9 ncrds <- nrow(crds)
12 crds <- crds[rep(1, nTimes), ]
20 list(crds=crds, dateTime=dateTime) nameattr
41 lon <- eq.ll$crds[, 1]
42 lat <- eq.ll$crds[, 2]
61 function(crds, dateTime, argument
86 lon <- eq.ll$crds[, 1]
106 function(crds, dateTime, argument
148 function(crds, dateTime, argument
[all …]
H A DSP2owin.R10 crds <- slot(pl[[1]], "coords") functionVar
11 colnames(crds) <- c("x", "y")
13 if (rD == 1) crds <- crds[nrow(crds):1,]
14 crds <- crds[-nrow(crds),]
15 res <- spatstat.geom::owin(poly=list(x=crds[,1], y=crds[,2]))
22 crds <- slot(pl[[j]], "coords")
23 colnames(crds) <- c("x", "y")
27 if (rD == -1 && hole) crds <- crds[nrow(crds):1,]
28 else if (rD == 1 && !hole) crds <- crds[nrow(crds):1,]
30 crds <- crds[-nrow(crds),]
[all …]
H A Delide.R23 crds <- coordinates(obj) functionVar
26 if (rotate != 0) crds <- rotateCoords(crds, rotate, center)
28 y <- crds[,1] + shift[1]
65 rotateCoords <- function(crds, angle=0, center= c(min(crds[,1]),min(crds[,2]))) { argument
69 crds <- crds-adj
70 cbind(co * crds[,1] - si * crds[,2],
71 si * crds[,1] + co * crds[,2]) + adj
97 crds <- cbind(x, y) functionVar
98 crds
128 if (rotate != 0) crds <- rotateCoords(crds, rotate, center)
[all …]
H A DnowrapRecenter.R92 crds <- rbind(crds, crds[1,])
94 crds[,1] <- crds[,1] - (2*offset)
96 crds[,1] <- crds[,1] + (2*offset)
99 rD <- .ringDirxy(crds)
100 if (rD == 1 & hole) crds <- crds[nrow(crds):1,]
101 if (rD == -1 & !hole) crds <- crds[nrow(crds):1,]
113 pc[[1]] <- list(x=crds[,1], y=crds[,2])
116 pc[[i]] <- list(x=crds[,1], y=crds[,2])
137 crds <- rbind(crds, crds[1,])
139 crds[,1] <- crds[,1] - (2*offset)
[all …]
H A DRgshhs.R52 crds <- rbind(crds[1:(nrow(crds)-2),],
53 c(0, crds[(nrow(crds)-2),2]), c(0, lim[3]),
180 if (!identical(crds[1,], crds[nrow(crds),])) {
181 crds <- rbind(crds, crds[1,,drop=FALSE])
185 if (shift) crds[,1] <- ifelse(crds[,1] > 180,
186 crds[,1] - 360, crds[,1])
292 if (!identical(crds[1,], crds[nrow(crds),])) {
293 crds <- rbind(crds, crds[1,,drop=FALSE])
298 crds[,1] - 360, crds[,1])
314 if (shift) crds[,1] <- ifelse(crds[,1] > 180,
[all …]
H A Dspmaps.R58 crds <- xyList[[belongs[[i]][j]]] functionVar
59 lgs[j] <- LineLength(crds) > 0
60 if (nrow(crds) > 1) srl[[j]] <- Line(coords=crds)
61 else srl[[j]] <- Line(coords=rbind(crds, crds))
119 if (nrow(crds) == 2) crds <- rbind(crds, crds[1,])
120 if (nrow(crds) == 3) crds <- rbind(crds, crds[1,])
122 crds <- crds[nrow(crds):1,]
123 srl[[j]] <- Polygon(coords=crds, hole=FALSE)
166 crds <- slot(Pls[[j]], "coords") functionVar
167 x <- c(x, crds[,1])
[all …]
H A DreadSplus.R81 crds <- lpolys[[belongs[[i]][j]]] functionVar
82 nc <- nrow(crds)
83 if (crds[1,1] != crds[nc,1] || crds[1,2] != crds[nc,2])
84 crds <- rbind(crds, crds[1,,drop=FALSE])
85 srl[[j]] <- Polygon(coords = crds)
H A DcheckHoles.R55 crds <- cbind(gpc_res@pts[[j]]$x, gpc_res@pts[[j]]$y) functionVar
56 crds <- rbind(crds, crds[1,])
58 rD <- .ringDirxy_gpc(crds)
59 if (rD == 1 & hole) crds <- crds[nrow(crds):1,]
60 if (rD == -1 & !hole) crds <- crds[nrow(crds):1,]
61 Srl[[j]] <- Polygon(coords=crds, hole=hole)
H A Dsp2Mondrian.R24 crds <- slot(pl[[j]], "coords") functionVar
25 nc <- nrow(crds)
30 write.table(crds, file = con,
59 crds <- slot(pl[[j]], "coords")
60 nc <- nrow(crds)
64 write.table(crds, file = con,
H A Dsp2tmap.R15 crds <- slot(pl[[j]], "coords") functionVar
25 cID <- c(cID, rep(i, nrow(crds)))
26 cX <- c(cX, crds[,1])
27 cY <- c(cY, crds[,2])
H A Dunion.R62 crds <- cbind(resi@pts[[j]]$x, resi@pts[[j]]$y) functionVar
63 crds <- rbind(crds, crds[1,])
65 Srli[[j]] <- Polygon(coords=crds, hole=hole)
/dports/games/flightgear-data/fgdata/Nasal/canvas/map/
H A DRWY-profile.symbol30 var crds = [];
37 append(crds,"N"~coord.lat());
38 append(crds,"E"~coord.lon());
40 append(crds,"N"~coord.lat());
41 append(crds,"E"~coord.lon());
44 .setDataGeo([2,4],crds)
48 var crds = [];
50 append(crds,"N"~coord.lat());
60 .setDataGeo([2,4,4],crds)
62 var crds = [];
[all …]
H A Drunway-nd.draw16 var crds = [];
21 append(crds,"N"~coord.lat());
22 append(crds,"E"~coord.lon());
24 append(crds,"N"~coord.lat());
25 append(crds,"E"~coord.lon());
28 .setDataGeo([2,4],crds)
31 var crds = [];
34 append(crds,"N"~coord.lat());
41 .setDataGeo([2,4],crds)
43 var crds = [];
[all …]
/dports/math/R-cran-sp/sp/R/
H A Drecenter.R28 crds <- slot(obj, "coords") functionVar
30 inout <- (crds[,1] < 0)
32 crds[,1] <- crds[,1]+360
35 crds[,1] <- ifelse(inout, crds[,1]+360, crds[,1])
38 res <- Polygon(crds, hole)
68 crds <- coordinates(obj) functionVar
69 inout <- (crds[,1] < 0)
71 crds[,1] <- crds[,1]+360
74 crds[,1] <- ifelse(inout, crds[,1]+360, crds[,1])
77 res <- Line(crds)
/dports/graphics/R-cran-rgdal/rgdal/R/
H A Dproject.R422 n <- nrow(crds)
429 as.double(crds[,1]), as.double(crds[,2]), NULL, aoi,
473 as.double(crds[,1]), as.double(crds[,2]),
497 as.double(crds[,1]), as.double(crds[,2]),
502 as.double(crds[,1]), as.double(crds[,2]), as.double(crds[,3]),
565 n <- nrow(crds)
571 as.double(crds[,1]), as.double(crds[,2]), NULL, aoi,
602 as.double(crds[,1]), as.double(crds[,2]), NULL,
786 n <- nrow(crds)
792 as.double(crds[,1]), as.double(crds[,2]), NULL, aoi,
[all …]
/dports/games/frogatto/frogatto-1.3.1/modules/cube_trains/data/object_prototypes/gui/
H A Dbase_input.cfg10 if(mode in [1,4,7], crds[0], if(mode in [2,5,8], crds[0], if(mode in [3,6,9], crds[0]))),
11 if(mode in [7,8,9], crds[1], if(mode in [4,5,6], crds[1], if(mode in [1,2,3], crds[1])))
12 ] where crds = anchor(mode, crds_in)",
14 …ode in [1,4,7], set(self.x, crds[0]), if(mode in [2,5,8], set(self.midpoint_x, crds[0]), if(mode i…
15 …ode in [7,8,9], set(self.y, crds[1]), if(mode in [4,5,6], set(self.midpoint_y, crds[1]), if(mode i…
16 ] where crds = anchor(mode, crds_in)",
/dports/math/R-cran-terra/terra/man/
H A Dcoords.Rd1 \name{crds}
5 \alias{crds}
6 \alias{crds,SpatVector-method}
7 \alias{crds,SpatRaster-method}
16 \S4method{crds}{SpatVector}(x, df=FALSE)
18 \S4method{crds}{SpatRaster}(x, df=FALSE, na.rm=TRUE)
49 crds(p)
53 g <- crds(v)
/dports/sysutils/istio/istio-1.6.7/vendor/sigs.k8s.io/controller-runtime/pkg/envtest/
H A Dcrd.go114 func WaitForCRDs(config *rest.Config, crds []runtime.Object, options CRDInstallOptions) error {
117 for _, crd := range runtimeCRDListToUnstructured(crds) {
247 func CreateCRDs(config *rest.Config, crds []runtime.Object) error {
254 for _, crd := range runtimeCRDListToUnstructured(crds) {
281 crds []*unstructured.Unstructured
311 if existsUnstructured(crds, crdList) {
314 crds = append(crds, crdList...)
317 return unstructuredCRDListToRuntime(crds), nil
322 var crds []*unstructured.Unstructured
358 crds = append(crds, crd)
[all …]
/dports/graphics/R-cran-rgdal/rgdal/src/
H A DOGR_write.cpp382 SEXP crds, dim; local
383 crds = GET_SLOT(obj, install("coords"));
384 dim = getAttrib(crds, install("dim"));
414 pt.setX( NUMERIC_POINTER(crds)[i] );
415 pt.setY( NUMERIC_POINTER(crds)[i+nobs] );
488 SEXP crds, dim; local
491 dim = getAttrib(crds, install("dim"));
587 SEXP crds, dim; local
590 dim = getAttrib(crds, install("dim"));
693 SEXP crds, dim; local
[all …]
/dports/math/R-cran-sp/sp/man/
H A Drecenter-methods.Rd32 crds <- matrix(c(179, -179, -179, 179, 50, 50, 52, 52), ncol=2)
33 SL <- SpatialLines(list(Lines(list(Line(crds)), "1")),
38 rcrds <- rbind(crds, crds[1,])
48 crds <- matrix(c(-1, 1, 1, -1, 50, 50, 52, 52), ncol=2)
49 SL <- SpatialLines(list(Lines(list(Line(crds)), "1")),
54 rcrds <- rbind(crds, crds[1,])
/dports/sysutils/istio/istio-1.6.7/vendor/sigs.k8s.io/service-apis/vendor/sigs.k8s.io/controller-runtime/pkg/envtest/
H A Dcrd.go109 func WaitForCRDs(config *rest.Config, crds []*apiextensionsv1beta1.CustomResourceDefinition, option…
112 for _, crd := range crds {
184 func CreateCRDs(config *rest.Config, crds []*apiextensionsv1beta1.CustomResourceDefinition) error {
191 for _, crd := range crds {
213 var crds []*apiextensionsv1beta1.CustomResourceDefinition
236 crds = append(crds, crd)
241 return crds, nil
/dports/sysutils/istio/istio-1.6.7/vendor/helm.sh/helm/v3/pkg/chart/
H A Dchart.go151 crds := []CRD{}
156 crds = append(crds, mycrd)
161 crds = append(crds, dep.CRDObjects()...)
163 return crds
/dports/sysutils/helm/helm-3.5.2/pkg/chart/
H A Dchart.go155 crds := []CRD{}
160 crds = append(crds, mycrd)
165 crds = append(crds, dep.CRDObjects()...)
167 return crds
H A Dchart_test.go52 crds := chrt.CRDs()
53 is.Equal(2, len(crds))
54 is.Equal("crds/foo.yaml", crds[0].Name)
55 is.Equal("crds/foo/bar/baz.yaml", crds[1].Name)
209 crds := chrt.CRDObjects()
210 is.Equal(expected, crds)
/dports/sysutils/ansible/ansible-4.7.0/ansible_collections/community/kubernetes/molecule/default/roles/helm/tasks/
H A Dtest_crds.yml4 test_chart: "test-crds"
20 name: test-crds
27 - install.status.name == "test-crds"
50 name: test-crds
57 name: test-crds

12345678910>>...84