libsim  Versione6.3.0

◆ pack_distinct_var6d()

type(volgrid6d_var) function, dimension(dim) volgrid6d_var_class::pack_distinct_var6d ( type(volgrid6d_var), dimension(:), intent(in)  vect,
integer, intent(in)  dim,
logical, dimension(:), intent(in), optional  mask,
logical, intent(in), optional  back 
)
private

compatta gli elementi distinti di vect in un array

Definizione alla linea 679 del file volgrid6d_var_class.F90.

679  mult%a = this%a*that%a
680  mult%b = this%a*that%b+this%b
681 ENDIF
682 
683 END FUNCTION conv_func_mult
684 
692 ELEMENTAL SUBROUTINE conv_func_compute(this, values)
693 TYPE(conv_func),INTENT(in) :: this
694 REAL,INTENT(inout) :: values
695 
696 IF (this /= conv_func_miss) THEN
697  IF (c_e(values)) values = values*this%a + this%b
698 ELSE
699  values=rmiss
700 ENDIF
701 
702 END SUBROUTINE conv_func_compute
703 
704 
712 ELEMENTAL FUNCTION conv_func_convert(this, values) RESULT(convert)
713 TYPE(conv_func),intent(in) :: this
714 REAL,INTENT(in) :: values
715 REAL :: convert
716 
717 convert = values
718 CALL compute(this, convert)
719 
720 END FUNCTION conv_func_convert
721 
722 
736 SUBROUTINE volgrid6d_var_hor_comp_index(this, xind, yind)
737 TYPE(volgrid6d_var),INTENT(in) :: this(:)
738 INTEGER,POINTER :: xind(:), yind(:)
739 
740 TYPE(vol7d_var) :: varbufr(SIZE(this))
741 TYPE(conv_func),POINTER :: c_func(:)
742 INTEGER :: i, nv, counts(SIZE(vol7d_var_horcomp))
743 
744 NULLIFY(xind, yind)
745 counts(:) = 0
746 
747 CALL vargrib2varbufr(this, varbufr, c_func)
748 

Generated with Doxygen.