libsim Versione 7.2.1

◆ arrayof_ttr_mapper_remove()

subroutine, private arrayof_ttr_mapper_remove ( type(arrayof_ttr_mapper this,
integer, intent(in), optional  nelem,
integer, intent(in), optional  pos 
)
private

Method for removing elements of the array at a desired position.

If necessary, the array is reallocated to reduce space.

Parametri
thisarray object in which an element has to be removed
[in]nelemnumber of elements to remove, if not provided, a single element is removed
[in]posposition of the element to be removed, if it is out of range, it is clipped, if it is not provided, objects are removed at the end

Definizione alla linea 641 del file stat_proc_engine.F90.

646 do_otime2: DO i = 1, SIZE(otime)
647 CALL time_timerange_get_period_pop(otime(i), otimerange(j), step, &
648 time_definition, pstart2, pend2, reftime2)
649 IF (lforecast) THEN
650 IF (reftime1 /= reftime2) cycle do_otime2
651 ENDIF
652
653 IF (climat_behavior .AND. pstart1 == pstart2) cycle do_otime2
654 IF (pstart1 >= pstart2 .AND. pend1 <= pend2) THEN ! useful
655 lmapper%it = k
656 lmapper%itr = l
657 IF (pstart1 == pstart2) THEN
658 lmapper%extra_info = 1 ! start of interval
659 ELSE IF (pend1 == pend2) THEN
660 lmapper%extra_info = 2 ! end of interval
661 ELSE
662 lmapper%extra_info = imiss
663 ENDIF
664 lmapper%time = pstart1 ! = pend1, order by time?
665 n = insert_sorted(map_ttr(i,j), lmapper, .true., .true.)
666! no CYCLE, a single input can contribute to multiple output intervals
667 ENDIF
668 ENDDO do_otime2
669 ENDDO do_otimerange2
670 ENDDO do_itime2
671 ENDDO do_itimerange2
672
673ENDIF
674
675END SUBROUTINE recompute_stat_proc_agg_common
676
677
678SUBROUTINE compute_stat_proc_agg_sw(vertime, pstart, pend, time_mask, &
679 max_step, weights)
680TYPE(datetime),INTENT(in) :: vertime(:)
681TYPE(datetime),INTENT(in) :: pstart
682TYPE(datetime),INTENT(in) :: pend
683LOGICAL,INTENT(in) :: time_mask(:)
684TYPE(timedelta),OPTIONAL,INTENT(out) :: max_step
685DOUBLE PRECISION,OPTIONAL,INTENT(out) :: weights(:)
686
687INTEGER :: i, nt

Generated with Doxygen.