ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_database_sources.F90
Go to the documentation of this file.
1  SUBROUTINE database_source(USER, MACHINE, VERSION, SHOT, RUN, INTERPOL, TIME, COREPROF, CORESOURCE_OUT, RHO_INTERPOL)
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  REAL (R8) :: time !Time
18  INTEGER :: shot, run !shot and run numbers
19  INTEGER :: idx !index (internal)
20 
21  TYPE (type_coreprof), POINTER :: coreprof(:)
22  TYPE (type_coresource), POINTER :: coresource_out(:)
23  TYPE (type_coresource), POINTER :: coresource_db(:)
24  TYPE (type_coresource), POINTER :: coresource_tmp(:)
25 
26  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
27  INTEGER :: nrho1, nrho2
28  INTEGER :: nnucl1
29  INTEGER :: nion1
30  INTEGER :: nimp1
31  INTEGER, ALLOCATABLE :: nzimp1(:)
32  INTEGER :: nneut1
33  INTEGER, ALLOCATABLE :: ncomp1(:)
34  INTEGER, ALLOCATABLE :: ntype1(:)
35 
36 
37 
38 
39  INTEGER :: interpol !interpolation index
40  INTEGER :: rho_interpol
41 
42  CHARACTER(len=10) :: cpopath
43  CHARACTER(len=5), PARAMETER :: treename = 'euitm'
44  CHARACTER(*) :: user
45  CHARACTER(*) :: machine
46  CHARACTER(*) :: version
47 
48 
49 
50 ! +++ allocate and define grid of output CPO:
51  nrho1 = SIZE(coreprof(1)%rho_tor, dim=1)
52  CALL get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
53  CALL allocate_coresource_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coresource_out)
54  call deallocate_cpo(coresource_out(1)%COMPOSITIONS)
55  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coresource_out(1)%COMPOSITIONS)
56  coresource_out(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
57 
58 
59 
60 ! +++ Retrieve CPO from the data base:
61  cpopath = 'coresource'
62  ALLOCATE (coresource_db(1))
63 #ifdef UAL
64  CALL euitm_open_env(treename, shot, run, idx, user, machine, version)
65  CALL euitm_get_slice(idx, cpopath, coresource_db(1), time, interpol)
66 #else
67  WRITE (6,*) 'ERROR>>> NO CORESOURCE CPO IN THE DATABASE FOR SELECTED SHOT:', shot, run
68  CALL allocate_coresource_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coresource_db)
69  call deallocate_cpo(coresource_db(1)%COMPOSITIONS)
70  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coresource_db(1)%COMPOSITIONS)
71  coresource_db(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
72 #endif
73 
74 
75 
76 ! +++ OUTPUT SOURCE CPO:
77  nrho2 = SIZE (coresource_db(1)%VALUES(1)%rho_tor, dim=1)
78 
79  IF (rho_interpol.NE.0) &
80  coresource_db(1)%VALUES(1)%rho_tor = coresource_db(1)%VALUES(1)%rho_tor &
81  / coresource_db(1)%VALUES(1)%rho_tor(nrho2) &
82  * coresource_out(1)%VALUES(1)%rho_tor(nrho1)
83 
84 ! +++ Check:
85  IF (SIZE(coresource_db(1)%VALUES).GT.1) THEN
86  ALLOCATE (coresource_tmp(1))
87  ALLOCATE (coresource_tmp(1)%VALUES(1))
88  CALL copy_cpo(coresource_db(1)%VALUES(1), coresource_tmp(1)%VALUES(1))
89  CALL deallocate_cpo(coresource_db(1)%VALUES)
90  ALLOCATE (coresource_db(1)%VALUES(1))
91  CALL copy_cpo(coresource_tmp(1)%VALUES(1), coresource_db(1)%VALUES(1))
92  END IF
93 
94 
95 ! +++ Interpolate CPO:
96  CALL interpolate_source(coresource_db(1), coresource_out(1))
97 
98 
99 
100 ! +++ ADD IDENTIFIER TO OUTPUT CPO VALUES(1):
101  ALLOCATE (coresource_out(1)%VALUES(1)%sourceid%id(1))
102  ALLOCATE (coresource_out(1)%VALUES(1)%sourceid%description(1))
103 
104  coresource_out(1)%VALUES(1)%sourceid%id = 'database'
105  coresource_out(1)%VALUES(1)%sourceid%flag = 27
106  coresource_out(1)%VALUES(1)%sourceid%description = 'Source from database entry'
107 
108 
109 
110 
111  CALL deallocate_cpo(coresource_db)
112  IF (ALLOCATED(nzimp1)) DEALLOCATE (nzimp1)
113  IF (ALLOCATED(ncomp1)) DEALLOCATE (ncomp1)
114  IF (ALLOCATED(ntype1)) DEALLOCATE (ntype1)
115 
116 #ifdef UAL
117  CALL euitm_close(idx, treename, shot, run)
118 #endif
119 
120 
121  RETURN
122 
123 
124  END SUBROUTINE database_source
125 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
126 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
127 
128 
129 
130 
131 
132 
subroutine euitm_open_env(name, shot, run, retIdx, user, tokamak, version)
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine allocate_coresource_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, CORESOURCE)
This routine allocates CORESOURCE CPO.
subroutine database_source(USER, MACHINE, VERSION, SHOT, RUN, INTERPOL, TIME, COREPROF, CORESOURCE_OUT, RHO_INTERPOL)
subroutine interpolate_source(CORESOURCE_IN, CORESOURCE_OUT)
subroutine euitm_close(idx)