My Project
Public Member Functions | List of all members
mod_par::aprint Interface Reference

Public Member Functions

subroutine aprint_arr (IUNIT, VARP, VART, NOW, ILOC, K1, K2, MSG)
 
subroutine aprint_vec (IUNIT, VARP, VART, NOW, ILOC, MSG)
 

Detailed Description

Definition at line 96 of file mod_par.f90.

Member Function/Subroutine Documentation

◆ aprint_arr()

subroutine mod_par::aprint::aprint_arr ( integer, intent(in)  IUNIT,
real(sp), dimension(:,:), intent(in), allocatable, target  VARP,
character(len=*), intent(in)  VART,
type(time), intent(in)  NOW,
integer, intent(in)  ILOC,
integer, intent(in)  K1,
integer, intent(in), optional  K2,
character(len=*), intent(in), optional  MSG 
)

Definition at line 288 of file mod_par.f90.

288  USE mod_time
289  IMPLICIT NONE
290  TYPE(TIME), INTENT(IN) :: NOW
291  INTEGER, INTENT(IN) :: IUNIT,ILOC,K1
292  INTEGER, INTENT(IN),OPTIONAL :: K2
293  REAL(SP), ALLOCATABLE, INTENT(IN),TARGET :: VARP(:,:)
294  CHARACTER(LEN=*), INTENT(IN) :: VART
295  CHARACTER(LEN=*), INTENT(IN),OPTIONAL :: MSG
296  REAL(SP), POINTER:: VARP_O(:,:)
297 
298  varp_o => varp
299 
300  IF (PRESENT(k2)) THEN
301  IF(PRESENT(msg))THEN
302  CALL pprint_arr(iunit,varp_o,vart,now,iloc,k1,k2,msg)
303  ELSE
304  CALL pprint_arr(iunit,varp_o,vart,now,iloc,k1,k2)
305  END IF
306  ELSE
307  IF(PRESENT(msg))THEN
308  CALL pprint_arr(iunit,varp_o,vart,now,iloc,k1,k1,msg)
309  ELSE
310  CALL pprint_arr(iunit,varp_o,vart,now,iloc,k1)
311  END IF
312  END IF

◆ aprint_vec()

subroutine mod_par::aprint::aprint_vec ( integer, intent(in)  IUNIT,
real(sp), dimension(:), intent(in), allocatable, target  VARP,
character(len=*), intent(in)  VART,
type(time), intent(in)  NOW,
integer, intent(in)  ILOC,
character(len=*), intent(in), optional  MSG 
)

Definition at line 145 of file mod_par.f90.

145  USE mod_time
146  IMPLICIT NONE
147  TYPE(TIME), INTENT(IN) :: NOW
148  INTEGER, INTENT(IN) :: IUNIT,ILOC
149  REAL(SP), ALLOCATABLE, INTENT(IN),TARGET :: VARP(:)
150  CHARACTER(LEN=*), INTENT(IN) :: VART
151  CHARACTER(LEN=*), INTENT(IN),OPTIONAL :: MSG
152  REAL(SP), POINTER:: VARP_O(:)
153 
154  varp_o => varp
155 
156  IF(PRESENT(msg))THEN
157  CALL pprint_vec(iunit,varp_o,vart,now,iloc,msg)
158  ELSE
159  CALL pprint_vec(iunit,varp_o,vart,now,iloc)
160  END IF
161 

The documentation for this interface was generated from the following file: