ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_database_sources2.F90
Go to the documentation of this file.
1  SUBROUTINE database_source2(COREPROF, CORESOURCE_DB, CORESOURCE_OUT)
2 
4  USE deallocate_structures
5 
6  USE itm_constants
7  USE euitm_routines
8  USE euitm_schemas
9  USE interpolate_cpo
10  USE copy_structures
11 
12  IMPLICIT NONE
13 
14 
15 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
16 ! +++ CPOs:
17 
18 
19  TYPE (type_coreprof), POINTER :: coreprof(:)
20  TYPE (type_coresource), POINTER :: coresource_out(:)
21  TYPE (type_coresource), POINTER :: coresource_db(:)
22  TYPE (type_coresource), POINTER :: coresource_tmp(:)
23 
24  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
25  INTEGER :: nrho1, nrho2
26  INTEGER :: nnucl1
27  INTEGER :: nion1
28  INTEGER :: nimp1
29  INTEGER, ALLOCATABLE :: nzimp1(:)
30  INTEGER :: nneut1
31  INTEGER, ALLOCATABLE :: ncomp1(:)
32  INTEGER, ALLOCATABLE :: ntype1(:)
33 
34 
35  integer :: nvalues,ivalues,combvalue
36 
37 
38 
39 
40 ! +++ allocate and define grid of output CPO:
41  nrho1 = SIZE(coreprof(1)%rho_tor, dim=1)
42  CALL get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
43  CALL allocate_coresource_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coresource_out)
44  call deallocate_cpo(coresource_out(1)%COMPOSITIONS)
45  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coresource_out(1)%COMPOSITIONS)
46  coresource_out(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
47 
48 
49 
50  nvalues=size(coresource_db(1)%values)
51  combvalue=-1
52  if (nvalues.ge.0) then
53 ! check if combined sources are present
54  do ivalues=1,nvalues
55  if (coresource_db(1)%values(ivalues)%sourceid%flag.eq.30) combvalue=ivalues
56  enddo
57  else
58  write(*,*) 'no sources are given on input'
59  end if
60 
61  IF (combvalue.GT.0) THEN
62  write(*,*) 'take combined sources'
63  ALLOCATE (coresource_tmp(1))
64  ALLOCATE (coresource_tmp(1)%VALUES(1))
65  CALL copy_cpo(coresource_db(1)%VALUES(combvalue), coresource_tmp(1)%VALUES(1))
66  CALL deallocate_cpo(coresource_db(1)%VALUES)
67  ALLOCATE (coresource_db(1)%VALUES(1))
68  CALL copy_cpo(coresource_tmp(1)%VALUES(1), coresource_db(1)%VALUES(1))
69  else
70  write(*,*) 'take first value'
71  ALLOCATE (coresource_tmp(1))
72  ALLOCATE (coresource_tmp(1)%VALUES(1))
73  CALL copy_cpo(coresource_db(1)%VALUES(1), coresource_tmp(1)%VALUES(1))
74  CALL deallocate_cpo(coresource_db(1)%VALUES)
75  ALLOCATE (coresource_db(1)%VALUES(1))
76  CALL copy_cpo(coresource_tmp(1)%VALUES(1), coresource_db(1)%VALUES(1))
77  END IF
78 
79 
80 ! +++ Interpolate CPO:
81 ! if combined sources are present use them, use 1st value else
82 
83  CALL interpolate_source(coresource_db(1), coresource_out(1))
84 
85 
86 
87 ! +++ ADD IDENTIFIER TO OUTPUT CPO VALUES(1):
88  ALLOCATE (coresource_out(1)%VALUES(1)%sourceid%id(1))
89  ALLOCATE (coresource_out(1)%VALUES(1)%sourceid%description(1))
90 
91  coresource_out(1)%VALUES(1)%sourceid%id = 'database'
92  coresource_out(1)%VALUES(1)%sourceid%flag = 27
93  coresource_out(1)%VALUES(1)%sourceid%description = 'Source from database entry'
94 
95 
96 
97 
98  CALL deallocate_cpo(coresource_db)
99  CALL deallocate_cpo(coresource_tmp)
100  IF (ALLOCATED(nzimp1)) DEALLOCATE (nzimp1)
101  IF (ALLOCATED(ncomp1)) DEALLOCATE (ncomp1)
102  IF (ALLOCATED(ntype1)) DEALLOCATE (ntype1)
103 
104 
105 
106 
107  RETURN
108 
109 
110  END SUBROUTINE database_source2
111 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
112 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
113 
114 
115 
116 
117 
118 
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_source2(COREPROF, CORESOURCE_DB, CORESOURCE_OUT)
subroutine interpolate_source(CORESOURCE_IN, CORESOURCE_OUT)