libsim  Versione 7.1.6

◆ 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 669 del file volgrid6d_var_class.F90.

671 
672 END SUBROUTINE vg6d_v7d_var_conv_setup
673 
674 
675 ELEMENTAL FUNCTION conv_func_eq(this, that) RESULT(res)
676 TYPE(conv_func),INTENT(IN) :: this, that
677 LOGICAL :: res
678 
679 res = this%a == that%a .AND. this%b == that%b
680 
681 END FUNCTION conv_func_eq
682 
683 
684 ELEMENTAL FUNCTION conv_func_ne(this, that) RESULT(res)
685 TYPE(conv_func),INTENT(IN) :: this, that
686 LOGICAL :: res
687 
688 res = .NOT.(this == that)
689 
690 END FUNCTION conv_func_ne
691 
692 
693 FUNCTION conv_func_mult(this, that) RESULT(mult)
694 TYPE(conv_func),INTENT(in) :: this
695 TYPE(conv_func),INTENT(in) :: that
696 
697 TYPE(conv_func) :: mult
698 
699 IF (this == conv_func_miss .OR. that == conv_func_miss) THEN
700  mult = conv_func_miss
701 ELSE
702  mult%a = this%a*that%a
703  mult%b = this%a*that%b+this%b
704 ENDIF
705 
706 END FUNCTION conv_func_mult
707 
715 ELEMENTAL SUBROUTINE conv_func_compute(this, values)
716 TYPE(conv_func),INTENT(in) :: this
717 REAL,INTENT(inout) :: values
718 
719 IF (this /= conv_func_miss) THEN
720  IF (c_e(values)) values = values*this%a + this%b
721 ELSE
722  values=rmiss
723 ENDIF
724 
725 END SUBROUTINE conv_func_compute
726 
727 
735 ELEMENTAL FUNCTION conv_func_convert(this, values) RESULT(convert)
736 TYPE(conv_func),intent(in) :: this
737 REAL,INTENT(in) :: values
738 REAL :: convert
739 
740 convert = values

Generated with Doxygen.