-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathsetdbg.f90
117 lines (116 loc) · 3.93 KB
/
setdbg.f90
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
!***********************************************************************
! *
SUBROUTINE SETDBG
!-----------------------------------------------
! *
! This subroutine sets the arrays that control debug printout from *
! the radial and angular modules of the GRASP92 suite. *
! *
! Call(s) to: [LIB92]: GETYN, LENGTH, OPENFL. *
! *
! Written by Farid A Parpia Last update: 24 Dec 1992 *
! *
!***********************************************************************
!...Translated by Pacific-Sierra Research 77to90 4.3E 14:06:03 1/ 3/07
!...Modified by Charlotte Froese Fischer
! Gediminas Gaigalas 11/01/17
!-----------------------------------------------
! M o d u l e s
!-----------------------------------------------
USE debug_C
USE default_C
!-----------------------------------------------
! I n t e r f a c e B l o c k s
!-----------------------------------------------
USE getyn_I
USE openfl_I
IMPLICIT NONE
!-----------------------------------------------
! L o c a l V a r i a b l e s
!-----------------------------------------------
INTEGER :: I, IERR
LOGICAL :: YES
CHARACTER :: FILNAM*256, DEFNAM*11, FORM*11, STATUS*3
!-----------------------------------------------
!
! Initialise the arrays that control the debug printout
!
LDBPA = .FALSE.
!
LDBPG = .FALSE.
!
LDBPR = .FALSE.
!
IF (NDEF == 0) RETURN
WRITE (6, *) 'Generate debug printout?'
YES = GETYN()
IF (YES) THEN
!
! The .dbg file is formatted; open it on unit 99
!
DEFNAM = 'CF_Halimtonian.dbg'
FORM = 'FORMATTED'
STATUS = 'NEW'
!
WRITE (6, *) 'File CF_Halimtonian.dbg will be created as the'
WRITE (6, *) ' CF_Halimtonian DeBuG Printout File; enter another'
WRITE (6, *) ' file name if this is not acceptable;'
WRITE (6, *) ' null otherwise:'
READ (*, '(A)') FILNAM
!
IF (LEN_TRIM(FILNAM) == 0) FILNAM = DEFNAM
!
4 CONTINUE
CALL OPENFL (99, FILNAM, FORM, STATUS, IERR)
IF (IERR /= 0) THEN
5 CONTINUE
WRITE (6, *) 'Enter a name for the CF_Halimtonian DeBuG Printout'
WRITE (6, *) ' file that is to be created:'
READ (*, '(A)') FILNAM
IF (LEN_TRIM(FILNAM) == 0) GO TO 5
GO TO 4
ENDIF
!
! Set options for general printout
!
WRITE (6, *) ' Print out the machine constants used?'
YES = GETYN()
IF (YES) LDBPG(1) = .TRUE.
WRITE (6, *) ' Print out the physical constants used?'
YES = GETYN()
IF (YES) LDBPG(2) = .TRUE.
!
! Set options for radial modules
!
WRITE (6, *) ' Printout from radial modules?'
YES = GETYN()
IF (YES) THEN
WRITE (6, *) ' Printout from RADGRD?'
YES = GETYN()
IF (YES) LDBPR(1) = .TRUE.
WRITE (6, *) ' Printout from NUCPOT?'
YES = GETYN()
IF (YES) LDBPR(2) = .TRUE.
WRITE (6, *) ' Printout from LODRWF?'
YES = GETYN()
IF (YES) LDBPR(3) = .TRUE.
!
ENDIF
!
! Set options for angular modules
!
WRITE (6, *) ' Printout from angular modules?'
YES = GETYN()
IF (YES) THEN
WRITE (6, *) ' Printout from LODCSL?'
YES = GETYN()
IF (YES) LDBPA(1) = .TRUE.
WRITE (6, *) ' Print out T coefficients?'
YES = GETYN()
IF (YES) LDBPA(2) = .TRUE.
ENDIF
!
ENDIF
!
RETURN
END SUBROUTINE SETDBG