My Project
swanpre2.f90
Go to the documentation of this file.
1 
2 
3 
4 
5 
6 
7 
8 
9 
10 
11 
12 !************************************************************************
13 ! *
14  SUBROUTINE swboun ( )
15  END SUBROUTINE swboun
16 
17 !*********************************************************************
18 ! *
19  SUBROUTINE bcfile (FBCNAM, BCTYPE)
20 
21 ! (This subroutine has not been used and tested yet)
22 ! *
23 !*********************************************************************
24 !
25 ! Reads file data for boundary condition
26 !
27 !*********************************************************************
28 !
29  USE ocpcomm1
30  USE ocpcomm2
31  USE ocpcomm4
32  USE swcomm2
33  USE swcomm3
34  USE swcomm4
35  USE m_bndspec
36 !
37  IMPLICIT NONE
38 
39  CHARACTER FBCNAM *(*), BCTYPE *(*)
40 
41  INTEGER :: ISTATF, NDSL, NDSD, IOSTAT, IERR, NBOUNC, NANG, NFRE
42  INTEGER :: IBOUNC, DORDER
43  INTEGER :: IENT,IOPTT
44  INTEGER :: NHEDF, NHEDT, NHEDS, IFRE , IANG
45  INTEGER :: NQUANT, IQUANT, IBC, II, NBGRPT_PREV,IIPT2
46  REAL :: XP, YP, XP2, YP2
47  REAL :: FREQHZ, DIRDEG, DIRRD1,DIRRAD, EXCV
48  CHARACTER BTYPE *4, HEDLIN *80
49  LOGICAL CCOORD
50 
51 !
52  ndsl = 0
53  iipt2 = 0
54 ! open data file
55  ndsd = 0
56  iostat = 0
57  CALL for (ndsd, filenm, 'OF', iostat)
58 !
59 ! --- initialize array BFILED of BSPFIL
60 ! BSPFIL%BFILED = 0
61 !
62 ! start reading from the data file
63  READ (ndsd, '(A)') hedlin
64 ! IF (EQCSTR(HEDLIN,'TPAR')) THEN
65 ! BTYPE = 'TPAR'
66 ! ISTATF = 1
67 ! IOPTT = 1
68 ! NBOUNC = 1
69 ! NANG = 0
70 ! NFRE = 0
71 ! NHEDF = 0
72 ! NHEDT = 0
73 ! NHEDS = 0
74 ! DORDER = 0
75 ! ALLOCATE(BSPFIL%BSPFRQ(NFRE))
76 ! ALLOCATE(BSPFIL%BSPDIR(NANG))
77 ! IF (NSTATM.EQ.0) CALL MSGERR (3,'time information not allowed in stationary mode')
78 ! NSTATM = 1
79 ! ELSE IF (EQCSTR(HEDLIN,'SWAN')) THEN
80 ! ELSE
81 ! CALL MSGERR (3, 'unsupported boundary data file')
82 ! ENDIF
83 !
84 ! ALLOCATE(BSPFIL%BSPLOC(NBOUNC))
85 ! DO IBC = 1, NBOUNC
86 ! BSPFIL%BSPLOC(IBC) = NBSPEC + IBC
87 ! ENDDO
88  nbspec = nbspec + nbounc
89 !
90 ! store file reading parameters in array BFILED
91 !
92 ! IF (ITEST.GE.80) WRITE(PRINTF,81) NBFILS, NBSPEC,(BSPFIL%BFILED(II), II=1,16)
93  81 FORMAT (' array BFILED: ', 2i4, 2(/,8i10))
94 !
95  RETURN
96  END SUBROUTINE bcfile
character(len=lenfnm) filenm
Definition: swmod1.f90:280
subroutine swboun()
Definition: swanpre2.f90:15
subroutine bcfile(FBCNAM, BCTYPE)
Definition: swanpre2.f90:20
subroutine for(IUNIT, DDNAME, SF, IOSTAT)
Definition: ocpmix.f90:835
integer nbspec
Definition: swmod1.f90:1357