GCC Code Coverage Report


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

Line Branch Exec Source
1 2881 SUBROUTINE convmas (pbaru, pbarv, convm)
2 !
3 !-------------------------------------------------------------------------------
4 ! Authors: P. Le Van , Fr. Hourdin.
5 !-------------------------------------------------------------------------------
6 ! Purpose: Compute mass flux convergence at p levels.
7 IMPLICIT NONE
8 include "dimensions.h"
9 include "paramet.h"
10 include "comgeom.h"
11 !===============================================================================
12 ! Arguments:
13 REAL, INTENT(IN) :: pbaru(ip1jmp1,llm)
14 REAL, INTENT(IN) :: pbarv(ip1jm ,llm)
15 REAL, INTENT(OUT) :: convm(ip1jmp1,llm)
16 !===============================================================================
17 ! Method used: Computation from top to bottom.
18 ! Mass convergence at level llm is equal to zero and is not stored in convm.
19 !===============================================================================
20 ! Local variables:
21 INTEGER :: l
22 !===============================================================================
23
24 !--- Computation of - (d(pbaru)/dx + d(pbarv)/dy )
25 2881 CALL convflu( pbaru, pbarv, llm, convm )
26
27 !--- Filter
28 2881 CALL filtreg( convm, jjp1, llm, 2, 2, .TRUE., 1 )
29
30 !--- Mass convergence is integrated from top to bottom
31
2/2
✓ Branch 0 taken 109478 times.
✓ Branch 1 taken 2881 times.
112359 DO l=llmm1,1,-1
32
2/2
✓ Branch 0 taken 119221542 times.
✓ Branch 1 taken 109478 times.
119333901 convm(:,l) = convm(:,l) + convm(:,l+1)
33 END DO
34
35 2881 END SUBROUTINE convmas
36