1
2! KGEN-generated Fortran source file
3!
4! Filename    : mo_exception_stub.f90
5! Generated at: 2015-02-19 15:30:31
6! KGEN version: 0.4.4
7
8
9
10    MODULE mo_exception
11        IMPLICIT NONE
12        PRIVATE
13        PUBLIC finish
14        ! normal message
15        ! informational message
16        ! warning message: number of warnings counted
17        ! error message: number of errors counted
18        ! report parameter value
19        ! debugging message
20        !++mgs
21        CONTAINS
22
23        ! read subroutines
24
25        SUBROUTINE finish(name, text, exit_no)
26            CHARACTER(LEN=*), intent(in) :: name
27            CHARACTER(LEN=*), intent(in), optional :: text
28            INTEGER, intent(in), optional :: exit_no
29            INTEGER :: ifile
30            IF (present(exit_no)) THEN
31                ifile = exit_no
32                ELSE
33                ifile = 6
34            END IF
35            WRITE (ifile, '(/,80("*"),/)')
36            IF (present(text)) THEN
37                WRITE (ifile, '(1x,a,a,a)') trim(name), ': ', trim(text)
38                ELSE
39                WRITE (ifile, '(1x,a,a)') trim(name), ': '
40            END IF
41            WRITE (ifile, '(/,80("-"),/,/)')
42            STOP
43        END SUBROUTINE finish
44
45    END MODULE mo_exception
46