Skip to content

Commit

Permalink
add new test summary entry
Browse files Browse the repository at this point in the history
Signed-off-by: Akash Kumar <[email protected]>
  • Loading branch information
AkashKumar7902 committed Sep 8, 2023
1 parent 76147f3 commit c56f5f5
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 0 deletions.
Original file line number Diff line number Diff line change
Expand Up @@ -6,6 +6,8 @@
DISPLAY ==UT==TEST-CASE-NUMBER ' PASSED'
MOVE ==UT==NUMBER-FAILED TO ==UT==TEST-CASE-NUMBER
DISPLAY ==UT==TEST-CASE-NUMBER ' FAILED'
MOVE ==UT==NUMBER-UNMOCK-CALL TO ==UT==TEST-CASE-NUMBER
DISPLAY ==UT==TEST-CASE-NUMBER ' CALLS NOT MOCKED'
DISPLAY "================================================="
MOVE ==UT==RETCODE TO RETURN-CODE
GOBACK.
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -66,6 +66,7 @@
05 ==UT==TEST-CASE-COUNT PIC 9(4) VALUE ZERO COMP.
05 ==UT==NUMBER-PASSED PIC 9(4) VALUE ZERO COMP.
05 ==UT==NUMBER-FAILED PIC 9(4) VALUE ZERO COMP.
05 ==UT==NUMBER-UNMOCK-CALL PIC 9(4) VALUE ZERO COMP.
05 ==UT==EXPECTED-TRIM PIC S9(5) COMP-3 VALUE ZERO.
05 ==UT==ACTUAL-TRIM PIC S9(5) COMP-3 VALUE ZERO.
01 ==UT==MOCKS.
Expand Down

0 comments on commit c56f5f5

Please sign in to comment.