libsim Versione 7.2.0

◆ arrayof_georef_coord_array_insert_array()

subroutine arrayof_georef_coord_array_insert_array ( type(arrayof_georef_coord_array this,
type(georef_coord_array), dimension(:), intent(in), optional  content,
integer, intent(in), optional  nelem,
integer, intent(in), optional  pos 
)

Method for inserting a number of elements of the array at a desired position.

If necessary, the array is reallocated to accomodate the new elements.

Parametri
thisarray object to extend
[in]contentobject of TYPE TYPE(georef_coord_array) to insert, if not provided, space is reserved but not initialized
[in]nelemnumber of elements to add, mutually exclusive with the previous parameter, if both are not provided, a single element is added without initialization
[in]posposition where to insert, if it is out of range, it is clipped, if it is not provided, the object is appended

Definizione alla linea 462 del file georef_coord_class.F90.

463
464res = ALLOCATED(this%coord)
465
466END FUNCTION georef_coord_array_c_e
467
468
473SUBROUTINE georef_coord_array_getval(this, x, y, topo, proj)
474TYPE(georef_coord_array),INTENT(in) :: this
475DOUBLE PRECISION,OPTIONAL,ALLOCATABLE,INTENT(out) :: x(:)
476DOUBLE PRECISION,OPTIONAL,ALLOCATABLE,INTENT(out) :: y(:)
477! allocatable per vedere di nascosto l'effetto che fa
478INTEGER,OPTIONAL,INTENT(out) :: topo
479TYPE(geo_proj),OPTIONAL,INTENT(out) :: proj
480
481
482IF (PRESENT(x)) THEN
483 IF (ALLOCATED(this%coord)) THEN
484 x = this%coord%x
485 ENDIF
486ENDIF
487IF (PRESENT(y)) THEN
488 IF (ALLOCATED(this%coord)) THEN
489 y = this%coord%y
490 ENDIF
491ENDIF
492IF (PRESENT(topo)) topo = this%topo
493IF (PRESENT(proj)) proj = this%proj ! warning proj has no missing value yet
494
495END SUBROUTINE georef_coord_array_getval
496

Generated with Doxygen.