|
V3FIT
|
Go to the documentation of this file.
12 USE stel_kinds,
ONLY: rprec
43 REAL (rprec) :: b_factor
46 REAL (rprec),
DIMENSION(:,:,:),
POINTER :: jksupsmnsf => null()
48 REAL (rprec),
DIMENSION(:,:,:),
POINTER :: jksupumncf => null()
50 REAL (rprec),
DIMENSION(:,:,:),
POINTER :: jksupvmncf => null()
52 REAL (rprec),
DIMENSION(:,:,:),
POINTER :: jksupsmncf => null()
54 REAL (rprec),
DIMENSION(:,:,:),
POINTER :: jksupumnsf => null()
56 REAL (rprec),
DIMENSION(:,:,:),
POINTER :: jksupvmnsf => null()
79 CHARACTER (len=*),
INTENT(in) :: siesta_file_name
82 REAL (rprec) :: start_time
83 INTEGER :: siesta_ncid
91 CALL cdf_open(siesta_ncid, trim(siesta_file_name),
'r', status)
93 CALL cdf_read(siesta_ncid,
'state_flags',
100 CALL cdf_read(siesta_ncid,
'b_factor',
116 CALL cdf_read(siesta_ncid,
'jksupsmnsf(m,n,r)',
118 CALL cdf_read(siesta_ncid,
'jksupumncf(m,n,r)',
120 CALL cdf_read(siesta_ncid,
'jksupvmncf(m,n,r)',
137 CALL cdf_read(siesta_ncid,
'jksupsmncf(m,n,r)',
139 CALL cdf_read(siesta_ncid,
'jksupumnsf(m,n,r)',
141 CALL cdf_read(siesta_ncid,
'jksupvmnsf(m,n,r)',
145 CALL cdf_close(siesta_ncid)
166 TYPE (siesta_file_class),
POINTER :: this
169 IF (
ASSOCIATED(this%jksupsmncf))
THEN
170 DEALLOCATE(this%jksupsmncf)
171 this%jksupsmncf => null()
174 IF (
ASSOCIATED(this%jksupsmnsf))
THEN
175 DEALLOCATE(this%jksupsmnsf)
176 this%jksupsmnsf => null()
179 IF (
ASSOCIATED(this%jksupumncf))
THEN
180 DEALLOCATE(this%jksupumncf)
181 this%jksupumncf => null()
184 IF (
ASSOCIATED(this%jksupumnsf))
THEN
185 DEALLOCATE(this%jksupumnsf)
186 this%jksupumnsf => null()
189 IF (
ASSOCIATED(this%jksupvmncf))
THEN
190 DEALLOCATE(this%jksupvmncf)
191 this%jksupvmncf => null()
194 IF (
ASSOCIATED(this%jksupvmnsf))
THEN
195 DEALLOCATE(this%jksupvmnsf)
196 this%jksupvmnsf => null()
type(siesta_file_class) function, pointer siesta_file_construct(siesta_file_name)
Construct a siesta_file_class object.
Defines functions for measuring an tabulating performance of function and subroutine calls....
Defines the base class of the type siesta_file_class. This contains the output of a siesta equilibriu...
integer, parameter siesta_lasym_flag
Version number.
Base class representing a siesta output.
real(rprec) function profiler_get_start_time()
Gets the start time of profiled function.
subroutine siesta_file_destruct(this)
Deconstruct a siesta_file_class object.
subroutine profiler_set_stop_time(symbol_name, start_time)
Gets the end time of profiled function.