Skip to content

Commit bb3ac51

Browse files
fix probs Sentinel-1
1 parent e2772cb commit bb3ac51

7 files changed

+9
-12
lines changed

R/api_apply.R

+1-2
Original file line numberDiff line numberDiff line change
@@ -149,8 +149,7 @@
149149
base_tile = feature,
150150
block_files = block_files,
151151
multicores = 1,
152-
update_bbox = FALSE,
153-
normalized = normalized
152+
update_bbox = FALSE
154153
)
155154
# Return a feature tile
156155
band_tile

R/api_source_mpc.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -273,7 +273,7 @@
273273
collection,
274274
stac_query, ...,
275275
tiles = NULL,
276-
orbit = "ascending") {
276+
orbit = "descending") {
277277

278278
# set caller to show in errors
279279
.check_set_caller(".source_items_new.mpc_cube_sentinel-1-grd")
@@ -337,7 +337,7 @@
337337
collection,
338338
stac_query, ...,
339339
tiles = NULL,
340-
orbit = "ascending") {
340+
orbit = "descending") {
341341
`.source_items_new.mpc_cube_sentinel-1-grd`(
342342
source = source,
343343
collection = collection,

R/api_tile.R

+3-5
Original file line numberDiff line numberDiff line change
@@ -528,11 +528,9 @@ NULL
528528
#' @noRd
529529
#' @param tile A tile.
530530
#' @param band Band character vector.
531-
#' @param normalized A logical indicating if band is normalized.
532-
#' @param ... Additional parameters.
533531
#'
534532
#' @return band_conf or band_cloud_conf
535-
.tile_band_conf <- function(tile, band, ...) {
533+
.tile_band_conf <- function(tile, band) {
536534
UseMethod(".tile_band_conf", tile)
537535
}
538536
#' @export
@@ -554,13 +552,13 @@ NULL
554552
return(NULL)
555553
}
556554
#' @export
557-
.tile_band_conf.derived_cube <- function(tile, band, ...) {
555+
.tile_band_conf.derived_cube <- function(tile, band) {
558556
.conf_derived_band(
559557
derived_class = .tile_derived_class(tile), band = band[[1]]
560558
)
561559
}
562560
#' @export
563-
.tile_band_conf.default <- function(tile, band, ...) {
561+
.tile_band_conf.default <- function(tile, band) {
564562
tile <- tibble::as_tibble(tile)
565563
tile <- .cube_find_class(tile)
566564
band_conf <- .tile_band_conf(tile, band)

R/sits_regularize.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -100,7 +100,7 @@ sits_regularize <- function(cube,
100100
multicores = 2L,
101101
progress = TRUE) {
102102
# Pre-conditions
103-
.check_valid(cube)
103+
.check_null(cube)
104104
UseMethod("sits_regularize", cube)
105105
}
106106
#' @rdname sits_regularize

man/sits-package.Rd

-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

tests/testthat/test-cube.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -248,7 +248,7 @@ test_that("Creating cubes from BDC - LANDSAT per tile", {
248248
testthat::skip_if(purrr::is_null(bdc_l8_cube),
249249
message = "BDC cube LANDSAT-OLI-16D is not accessible"
250250
)
251-
expect_equal(bdc_l8_cube$tile, tile)
251+
usexpect_equal(bdc_l8_cube$tile, tile)
252252
expect_true(all(sits_bands(bdc_l8_cube) %in% bands))
253253
# test timeline
254254
timeline <- sits_timeline(bdc_l8_cube)

tests/testthat/test-regularize.R

+1
Original file line numberDiff line numberDiff line change
@@ -283,6 +283,7 @@ test_that("Regularizing SENTINEL-1 data",{
283283
collection = "SENTINEL-1-GRD",
284284
bands = c("VV", "VH"),
285285
roi = roi_sar,
286+
orbit = "descending",
286287
start_date = "2020-06-01",
287288
end_date = "2020-09-28"
288289
)

0 commit comments

Comments
 (0)