-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathdata.f90
36 lines (24 loc) · 1.06 KB
/
data.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
MODULE data
USE prms
IMPLICIT none
real, allocatable, dimension(:,:) :: X ! control points
real, allocatable, dimension(:) :: Soe ! every point ref coord
real, allocatable, dimension(:) :: dSo ! dso of all ctrl points
real, allocatable, dimension(:) :: rad ! initial radius
real, allocatable, dimension(:) :: Tc,Mc ! elastiticy arrays
integer, allocatable, dimension(:) :: cell ! cell number for any of Np points
real, allocatable, dimension(:,:) :: wX ! wall initial loc
real, allocatable, dimension(:,:) :: wDx ! derivatives of wall
real, allocatable, dimension(:) :: wD ! stretch of wall
real, allocatable, dimension(:) :: len0 ! unstretched length
CONTAINS
SUBROUTINE initdata
allocate(X(2,Np),Soe(Nb),dSo(Np),rad(Nm),Tc(Nm),Mc(Nm))
allocate(wX(2,Nw),wDx(2,Nw),wD(Nw))
allocate(cell(Np),len0(Nm))
END SUBROUTINE initdata
SUBROUTINE finaldata
deallocate(X,Soe,dSo,rad,Tc,Mc)
deallocate(wX,wDx,wD,len0,cell)
END SUBROUTINE finaldata
END MODULE data