ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_database_transport2.F90
Go to the documentation of this file.
1  SUBROUTINE database_transport2(COREPROF, CORETRANSP_DB, CORETRANSP_OUT, RHO_INTERPOL,user_out_outputFlag,user_out_diagnosticInfo)
2 
4  USE deallocate_structures
5 
6  USE itm_constants
7  USE euitm_routines
8  USE euitm_schemas
10  USE copy_structures
11 
12  IMPLICIT NONE
13 
14 
15 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
16 ! +++ CPOs:
17 
18 
19 
20  TYPE (type_coreprof), POINTER :: coreprof(:)
21  TYPE (type_coretransp), POINTER :: coretransp_out(:)
22  TYPE (type_coretransp), POINTER :: coretransp_db(:)
23  TYPE (type_coretransp), POINTER :: coretransp_tmp(:)
24 
25  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
26  INTEGER :: nrho1, nrho2
27  INTEGER :: nnucl1
28  INTEGER :: nion1
29  INTEGER :: nimp1
30  INTEGER, ALLOCATABLE :: nzimp1(:)
31  INTEGER :: nneut1
32  INTEGER, ALLOCATABLE :: ncomp1(:)
33  INTEGER, ALLOCATABLE :: ntype1(:)
34 
35 
36 
37 
38 
39  INTEGER :: rho_interpol
40 
41  !---- Diagnostic info ----
42 integer, intent(out) :: user_out_outputflag
43 character(len=:), pointer, intent(out) :: user_out_diagnosticinfo
44 integer nchd
45 character*255 error_mes
46 
47 
48  user_out_outputflag=0
49 
50 nullify(user_out_diagnosticinfo)
51 
52 if (.not.associated(coretransp_db(1)%values)) then
53  user_out_outputflag=-1
54  error_mes='no coretransp present in input,stop'
55  nchd=len_trim(error_mes)
56  allocate(character(nchd) :: user_out_diagnosticinfo)
57  user_out_diagnosticinfo=error_mes(1:nchd)
58 ! the next one is just to be consistent in parameters'
59  allocate(coretransp_out(1))
60  !user_out_diagnosticInfo='no coretransp present in input,stop'
61  return
62 end if
63 
64 
65 
66 
67 ! +++ allocate and define grid of output CPO:
68  nrho1 = SIZE(coreprof(1)%rho_tor, dim=1)
69  CALL get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
70  CALL allocate_coretransp_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coretransp_out)
71  call deallocate_cpo(coretransp_out(1)%COMPOSITIONS)
72  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coretransp_out(1)%COMPOSITIONS)
73  coretransp_out(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
74 
75 
76 
77 
78 
79 #ifdef UAL
80  write(*,*) 'take the transport data from cpo'
81 #else
82  WRITE (6,*) 'ERROR>>> NO CORETRANSP CPO IN THE DATABASE FOR SELECTED SHOT:', shot, run
83  CALL allocate_coretransp_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coretransp_db)
84  call deallocate_cpo(coretransp_db(1)%COMPOSITIONS)
85  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coretransp_db(1)%COMPOSITIONS)
86  coretransp_db(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
87 #endif
88 
89 
90 
91 ! +++ OUTPUT TRANSPORT CPO:
92  nrho2 = SIZE (coretransp_db(1)%VALUES(1)%rho_tor, dim=1)
93 
94  IF (rho_interpol.NE.0) &
95  coretransp_db(1)%VALUES(1)%rho_tor = coretransp_db(1)%VALUES(1)%rho_tor &
96  / coretransp_db(1)%VALUES(1)%rho_tor(nrho2) &
97  * coretransp_out(1)%VALUES(1)%rho_tor(nrho1)
98 
99 
100 !dy should we in the future copy all values from the database?
101 
102 ! +++ Check:
103  IF (SIZE(coretransp_db(1)%VALUES).GT.1) THEN
104  ALLOCATE (coretransp_tmp(1))
105  ALLOCATE (coretransp_tmp(1)%VALUES(1))
106  CALL copy_cpo(coretransp_db(1)%VALUES(1), coretransp_tmp(1)%VALUES(1))
107  CALL deallocate_cpo(coretransp_db(1)%VALUES)
108  ALLOCATE (coretransp_db(1)%VALUES(1))
109  CALL copy_cpo(coretransp_tmp(1)%VALUES(1), coretransp_db(1)%VALUES(1))
110  END IF
111 
112 
113 ! +++ Interpolate CPO:
114  CALL interpolate_transp(coretransp_db(1), coretransp_out(1), 0)
115 
116 
117 
118 ! +++ ADD IDENTIFIER TO OUTPUT CPO VALUES(1):
119  ALLOCATE (coretransp_out(1)%VALUES(1)%transportid%id(1))
120  ALLOCATE (coretransp_out(1)%VALUES(1)%transportid%description(1))
121  coretransp_out(1)%VALUES(1)%transportid%id = 'database'
122  coretransp_out(1)%VALUES(1)%transportid%flag = 10
123  coretransp_out(1)%VALUES(1)%transportid%description = 'Transport specified by a database entry'
124 
125 
126 
127  CALL deallocate_cpo(coretransp_db)
128  if (associated(coretransp_tmp)) call deallocate_cpo(coretransp_tmp)
129  IF (ALLOCATED(nzimp1)) DEALLOCATE (nzimp1)
130  IF (ALLOCATED(ncomp1)) DEALLOCATE (ncomp1)
131  IF (ALLOCATED(ntype1)) DEALLOCATE (ntype1)
132 
133 
134 
135 
136  RETURN
137 
138 
139  END SUBROUTINE database_transport2
140 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
141 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
142 
143 
144 
145 
146 
147 
subroutine database_transport2(COREPROF, CORETRANSP_DB, CORETRANSP_OUT, RHO_INTERPOL, user_out_outputFlag, user_out_diagnosticInfo)
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine interpolate_transp(CORETRANSP_IN, CORETRANSP_OUT, NEGATIVE_DIFF)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine allocate_coretransp_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, CORETRANSP)
This routine allocates CORETRANSP CPO.