libsim Versione 7.2.1
|
◆ map_distinct_var6d()
map distinct Definizione alla linea 814 del file volgrid6d_var_class.F90. 815ENDDO
816DEALLOCATE(c_func)
817
818END SUBROUTINE volgrid6d_var_hor_comp_index
819
820
825FUNCTION volgrid6d_var_is_hor_comp(this) RESULT(is_hor_comp)
826TYPE(volgrid6d_var),INTENT(in) :: this
827LOGICAL :: is_hor_comp
828
829TYPE(vol7d_var) :: varbufr
830
831varbufr = convert(this)
832is_hor_comp = any(varbufr == vol7d_var_horcomp(:))
833
834END FUNCTION volgrid6d_var_is_hor_comp
835
836! before unstaggering??
837
838!IF (.NOT. ALLOCATED(conv_fwd)) CALL vg6d_v7d_var_conv_setup()
839!
840!call init(varu,btable="B11003")
841!call init(varv,btable="B11004")
842!
843! test about presence of u and v in standard table
844!if ( index(conv_fwd(:)%v7d_var,varu) == 0 .or. index(conv_fwd(:)%v7d_var,varv) == 0 )then
845! call l4f_category_log(this%category,L4F_FATAL, &
846! "variables B11003 and/or B11004 (wind components) not defined by vg6d_v7d_var_conv_setup")
847! CALL raise_error()
848! RETURN
849!end if
850!
851!if (associated(this%var))then
852! nvar=size(this%var)
853! allocate(varbufr(nvar),stat=stallo)
854! if (stallo /=0)then
855! call l4f_log(L4F_FATAL,"allocating memory")
856! call raise_fatal_error("allocating memory")
857! end if
858!
859! CALL vargrib2varbufr(this%var, varbufr)
860!ELSE
861! CALL l4f_category_log(this%category, L4F_ERROR, &
862! "trying to destagger an incomplete volgrid6d object")
863! CALL raise_error()
864! RETURN
865!end if
866!
867!nvaru=COUNT(varbufr==varu)
868!nvarv=COUNT(varbufr==varv)
869!
870!if (nvaru > 1 )then
871! call l4f_category_log(this%category,L4F_WARN, &
872! ">1 variables refer to u wind component, destaggering will not be done ")
873! DEALLOCATE(varbufr)
874! RETURN
875!endif
876!
877!if (nvarv > 1 )then
878! call l4f_category_log(this%category,L4F_WARN, &
879! ">1 variables refer to v wind component, destaggering will not be done ")
880! DEALLOCATE(varbufr)
881! RETURN
882!endif
883!
884!if (nvaru == 0 .and. nvarv == 0) then
885! call l4f_category_log(this%category,L4F_WARN, &
886! "no u or v wind component found in volume, nothing to do")
887! DEALLOCATE(varbufr)
888! RETURN
889!endif
890!
891!if (COUNT(varbufr/=varu .and. varbufr/=varv) > 0) then
892! call l4f_category_log(this%category,L4F_WARN, &
893! "there are variables different from u and v wind component in C grid")
894!endif
895
896
Class for managing physical variables in a grib 1/2 fashion. Definition: volgrid6d_var_class.F90:218 |