ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_database_profiles2.F90
Go to the documentation of this file.
1  SUBROUTINE database_profiles2(COREPROF_DB, COREPROF, COREPROF_OUT, RHO_INTERPOL)
2 
3 
5  USE deallocate_structures
6 
7  USE itm_constants
8  USE euitm_routines
9  USE euitm_schemas
10  USE interpolate_cpo
11  USE copy_structures
12 
13  IMPLICIT NONE
14 
15 
16 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
17 ! +++ CPOs:
18 
19 
20  TYPE (type_coreprof), POINTER :: coreprof(:)
21  TYPE (type_coreprof), POINTER :: coreprof_out(:)
22  TYPE (type_coreprof), POINTER :: coreprof_db(:)
23 
24  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
25  INTEGER :: nrho1, nrho2
26  INTEGER :: nnucl1
27  INTEGER :: nion1, iion1
28  INTEGER :: nimp1
29  INTEGER, ALLOCATABLE :: nzimp1(:)
30  INTEGER :: nneut1
31  INTEGER, ALLOCATABLE :: ncomp1(:)
32  INTEGER, ALLOCATABLE :: ntype1(:)
33 
34 
35 
36 
37  INTEGER :: interpol !interpolation index
38  INTEGER :: rho_interpol
39 
40  CHARACTER(len=10) :: cpopath
41 
42 
43 
44 
45 ! +++ allocate and define grid of output CPO:
46  nrho1 = SIZE(coreprof(1)%rho_tor, dim=1)
47  CALL get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
48  CALL allocate_coreprof_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coreprof_out)
49  CALL copy_cpo(coreprof(1), coreprof_out(1))
50  coreprof_out(1)%rho_tor = coreprof(1)%rho_tor
51 
52 
53 
54 ! +++ Retrieve CPO from the data base:
55  cpopath = 'COREPROF'
56 
57 
58 #ifdef UAL
59  write(6,*) ' profiles are read from the database'
60 #else
61  WRITE (6,*) 'ERROR>>> NO COREPROF CPO IN THE DATABASE FOR SELECTED SHOT:'
62  CALL allocate_coreprof_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coreprof_db)
63  call deallocate_cpo(coreprof_db(1)%COMPOSITIONS)
64  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coreprof_db(1)%COMPOSITIONS)
65  coreprof_db(1)%rho_tor = coreprof(1)%rho_tor
66 #endif
67 
68 
69 
70 ! +++ OUTPUT TRANSPORT CPO:
71  nrho2 = SIZE (coreprof_db(1)%rho_tor, dim=1)
72 
73  IF (rho_interpol.NE.0) &
74  coreprof_db(1)%rho_tor = coreprof_db(1)%rho_tor &
75  / coreprof_db(1)%rho_tor(nrho2) &
76  * coreprof_out(1)%rho_tor(nrho1)
77 
78 
79 
80 ! +++ Interpolate CPO:
81  CALL interpolate_prof(coreprof_db(1), coreprof(1))
82 
83 
84 
85 
86 ! +++ Copy profiles:
87  IF (coreprof_out(1)%psi%flag .EQ. 1) &
88  coreprof_out(1)%psi%value = coreprof(1)%psi%value
89  IF (coreprof_out(1)%ne%flag .EQ. 1) &
90  coreprof_out(1)%ne%value = coreprof(1)%ne%value
91  IF (coreprof_out(1)%te%flag .EQ. 1) &
92  coreprof_out(1)%te%value = coreprof(1)%te%value
93 
94  DO iion1 = 1, nion1
95 
96  IF (coreprof_out(1)%ni%flag(iion1) .EQ. 1) &
97  coreprof_out(1)%ni%value(:,iion1) = coreprof(1)%ni%value(:,iion1)
98  IF (coreprof_out(1)%ti%flag(iion1) .EQ. 1) &
99  coreprof_out(1)%ti%value(:,iion1) = coreprof(1)%ti%value(:,iion1)
100  IF (coreprof_out(1)%vtor%flag(iion1) .EQ. 1) &
101  coreprof_out(1)%vtor%value(:,iion1) = coreprof(1)%vtor%value(:,iion1)
102 
103  END DO
104 
105  IF (coreprof_out(1)%ne%flag .EQ. 3) THEN
106  coreprof_out(1)%ne%boundary%value(1) = coreprof(1)%ne%value(nrho1)
107  coreprof_out(1)%ne%boundary%value(2) = 0.0_r8
108  coreprof_out(1)%ne%boundary%value(3) = 0.0_r8
109  coreprof_out(1)%ne%boundary%type = 1
110  END IF
111  IF (coreprof_out(1)%te%flag .EQ. 3) THEN
112  coreprof_out(1)%te%boundary%value(1) = coreprof(1)%te%value(nrho1)
113  coreprof_out(1)%te%boundary%value(2) = 0.0_r8
114  coreprof_out(1)%te%boundary%value(3) = 0.0_r8
115  coreprof_out(1)%te%boundary%type = 1
116  END IF
117 
118  DO iion1 = 1, nion1
119 
120  IF (coreprof_out(1)%ni%flag(iion1) .EQ. 3) THEN
121  coreprof_out(1)%ni%boundary%value(1,iion1) = coreprof(1)%ni%value(nrho1,iion1)
122  coreprof_out(1)%ni%boundary%value(2,iion1) = 0.0_r8
123  coreprof_out(1)%ni%boundary%value(3,iion1) = 0.0_r8
124  coreprof_out(1)%ni%boundary%type(iion1) = 1
125 
126  END IF
127  IF (coreprof_out(1)%ti%flag(iion1) .EQ. 3) THEN
128  coreprof_out(1)%ti%boundary%value(1,iion1) = coreprof(1)%ti%value(nrho1,iion1)
129  coreprof_out(1)%ti%boundary%value(2,iion1) = 0.0_r8
130  coreprof_out(1)%ti%boundary%value(3,iion1) = 0.0_r8
131  coreprof_out(1)%ti%boundary%type(iion1) = 1
132 
133  END IF
134  IF (coreprof_out(1)%vtor%flag(iion1) .EQ. 3) THEN
135  coreprof_out(1)%vtor%boundary%value(1,iion1) = coreprof(1)%vtor%value(nrho1,iion1)
136  coreprof_out(1)%vtor%boundary%value(2,iion1) = 0.0_r8
137  coreprof_out(1)%vtor%boundary%value(3,iion1) = 0.0_r8
138  coreprof_out(1)%vtor%boundary%type(iion1) = 1
139 
140  END IF
141 
142  END DO
143 
144 
145 
146 
147  CALL deallocate_cpo(coreprof_db)
148  IF (ALLOCATED(nzimp1)) DEALLOCATE (nzimp1)
149  IF (ALLOCATED(ncomp1)) DEALLOCATE (ncomp1)
150  IF (ALLOCATED(ntype1)) DEALLOCATE (ntype1)
151 
152 
153 
154 
155  RETURN
156 
157 
158  END SUBROUTINE database_profiles2
159 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
160 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
161 
162 
163 
164 
165 
166 
subroutine allocate_coreprof_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, COREPROF)
This routine allocates COREPROF CPO.
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine interpolate_prof(COREPROF_IN, COREPROF_OUT)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine database_profiles2(COREPROF_DB, COREPROF, COREPROF_OUT, RHO_INTERPOL)