source: LMDZ6/trunk/libf/misc/fdump.f90 @ 5300

Last change on this file since 5300 was 5246, checked in by abarral, 11 days ago

Convert fixed-form to free-form sources .F -> .{f,F}90
(WIP: some .F remain, will be handled in subsequent commits)

  • Property copyright set to
    Name of program: LMDZ
    Creation date: 1984
    Version: LMDZ5
    License: CeCILL version 2
    Holder: Laboratoire de m\'et\'eorologie dynamique, CNRS, UMR 8539
    See the license file in the root directory
File size: 1.1 KB
Line 
1!DECK FDUMP
2SUBROUTINE FDUMP
3  !***BEGIN PROLOGUE  FDUMP
4  !***PURPOSE  Symbolic dump (should be locally written).
5  !***LIBRARY   SLATEC (XERROR)
6  !***CATEGORY  R3
7  !***TYPE      ALL (FDUMP-A)
8  !***KEYWORDS  ERROR, XERMSG
9  !***AUTHOR  Jones, R. E., (SNLA)
10  !***DESCRIPTION
11  !
12  !    ***Note*** Machine Dependent Routine
13  !    FDUMP is intended to be replaced by a locally written
14  !    version which produces a symbolic dump.  Failing this,
15  !    it should be replaced by a version which prints the
16  !    subprogram nesting list.  Note that this dump must be
17  !    printed on each of up to five files, as indicated by the
18  !    XGETUA routine.  See XSETUA and XGETUA for details.
19  !
20  ! Written by Ron Jones, with SLATEC Common Math Library Subcommittee
21  !
22  !***REFERENCES  (NONE)
23  !***ROUTINES CALLED  (NONE)
24  !***REVISION HISTORY  (YYMMDD)
25  !   790801  DATE WRITTEN
26  !   861211  REVISION DATE from Version 3.2
27  !   891214  Prologue converted to Version 4.0 format.  (BAB)
28  !***END PROLOGUE  FDUMP
29  !***FIRST EXECUTABLE STATEMENT  FDUMP
30  RETURN
31END SUBROUTINE FDUMP
Note: See TracBrowser for help on using the repository browser.