GCC Code Coverage Report


Directory: ./
File: dyn3d_common/vitvert.f90
Date: 2022-01-11 19:19:34
Exec Total Coverage
Lines: 4 4 100.0%
Branches: 6 6 100.0%

Line Branch Exec Source
1 3361 SUBROUTINE vitvert (convm, w)
2 !
3 !-------------------------------------------------------------------------------
4 ! Authors: P. Le Van , Fr. Hourdin.
5 !-------------------------------------------------------------------------------
6 ! Purpose: Compute vertical speed at sigma levels.
7 USE comvert_mod, ONLY: bp
8 IMPLICIT NONE
9 include "dimensions.h"
10 include "paramet.h"
11 !===============================================================================
12 ! Arguments:
13 REAL, INTENT(IN) :: convm(ip1jmp1,llm)
14 REAL, INTENT(OUT) :: w (ip1jmp1,llm)
15 !===============================================================================
16 ! Notes: Vertical speed is oriented from bottom to top.
17 ! * At ground - level sigma(1): w(i,j,1) = 0.
18 ! * At top - level sigma(llm+1): w(i,j,l) = 0. (not stored in w)
19 !===============================================================================
20 ! Local variables:
21 INTEGER :: l
22 !===============================================================================
23
4/4
✓ Branch 0 taken 3361 times.
✓ Branch 1 taken 127718 times.
✓ Branch 2 taken 127718 times.
✓ Branch 3 taken 139084902 times.
139215981 DO l=1,llmm1; w(:,l+1)=convm(:,l+1)-bp(l+1)*convm(:,1); END DO
24
2/2
✓ Branch 0 taken 3660129 times.
✓ Branch 1 taken 3361 times.
3663490 w(:,1)=0.
25
26 3361 END SUBROUTINE vitvert
27
28