Octopus
spectrum.F90
Go to the documentation of this file.
1!! Copyright (C) 2002-2006 M. Marques, A. Castro, A. Rubio, G. Bertsch
2!!
3!! This program is free software; you can redistribute it and/or modify
4!! it under the terms of the GNU General Public License as published by
5!! the Free Software Foundation; either version 2, or (at your option)
6!! any later version.
7!!
8!! This program is distributed in the hope that it will be useful,
9!! but WITHOUT ANY WARRANTY; without even the implied warranty of
10!! MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
11!! GNU General Public License for more details.
12!!
13!! You should have received a copy of the GNU General Public License
14!! along with this program; if not, write to the Free Software
15!! Foundation, Inc., 51 Franklin Street, Fifth Floor, Boston, MA
16!! 02110-1301, USA.
17!!
18
19#include "global.h"
20
21module spectrum_oct_m
22 use batch_oct_m
23 use iso_c_binding
25 use debug_oct_m
26 use fft_oct_m
27 use global_oct_m
28 use io_oct_m
29 use kick_oct_m
30 use, intrinsic :: iso_fortran_env
32 use math_oct_m
36 use parser_oct_m
37 use pcm_oct_m
39 use string_oct_m
40 use types_oct_m
41 use unit_oct_m
44
45 implicit none
46
47 private
48 public :: &
49 spectrum_t, &
70
71 integer, public, parameter :: &
72 SPECTRUM_DAMP_NONE = 0, &
77
78 integer, public, parameter :: &
79 SPECTRUM_TRANSFORM_LAPLACE = 1, &
82
83 integer, public, parameter :: &
84 SPECTRUM_ABSORPTION = 1, &
86 spectrum_p_power = 3, &
88
89 integer, public, parameter :: &
90 SPECTRUM_FOURIER = 1, &
92
93 type spectrum_t
94 real(real64) :: start_time
95 real(real64) :: end_time
96 real(real64) :: energy_step
97 real(real64) :: min_energy
98 real(real64) :: max_energy
99 integer :: damp
100 integer :: transform
101 real(real64) :: damp_factor
102 integer :: spectype
103 integer :: method
104 real(real64) :: noise
105 logical, private :: sigma_diag
106 end type spectrum_t
107
110 integer :: niter_
111 real(real64) :: time_step_, energy_step_
112 complex(real64), allocatable :: func_(:),func_ar_(:,:),pos_(:,:),tret_(:), funcw_(:)
113 type(fft_t), save :: fft_handler
114 integer :: is_, ie_, default
115
116contains
117
118 ! ---------------------------------------------------------
119 subroutine spectrum_init(spectrum, namespace, default_energy_step, default_max_energy)
120 type(spectrum_t), intent(inout) :: spectrum
121 type(namespace_t), intent(in) :: namespace
122 real(real64), optional, intent(in) :: default_energy_step
123 real(real64), optional, intent(in) :: default_max_energy
124
125 real(real64) :: fdefault
126
127 push_sub(spectrum_init)
128
129 call messages_print_with_emphasis(msg="Spectrum Options", namespace=namespace)
130
131 !%Variable PropagationSpectrumType
132 !%Type integer
133 !%Default AbsorptionSpectrum
134 !%Section Utilities::oct-propagation_spectrum
135 !%Description
136 !% Type of spectrum to calculate.
137 !%Option AbsorptionSpectrum 1
138 !% Photoabsorption spectrum.
139 !%Option EnergyLossSpectrum 2
140 !% Dynamic structure factor (also known as energy-loss function or spectrum).
141 !%Option DipolePower 3
142 !% Power spectrum of the dipole moment.
143 !%Option RotatoryStrength 4
144 !% Rotatory strength spectrum.
145 !%End
146
147 call parse_variable(namespace, 'PropagationSpectrumType', spectrum_absorption, spectrum%spectype)
148
149 if (.not. varinfo_valid_option('PropagationSpectrumType', spectrum%spectype)) then
150 call messages_input_error(namespace, 'PropagationSpectrumType')
151 end if
152 call messages_print_var_option('PropagationSpectrumType', spectrum%spectype, namespace=namespace)
153
154 !%Variable SpectrumMethod
155 !%Type integer
156 !%Default fourier
157 !%Section Utilities::oct-propagation_spectrum
158 !%Description
159 !% Decides which method is used to obtain the spectrum.
160 !%Option fourier 1
161 !% The standard Fourier transform. Further specified by <tt>PropagationSpectrumTransform</tt>.
162 !%Option compressed_sensing 2
163 !% (Experimental) Uses the compressed sensing technique.
164 !%End
165 call parse_variable(namespace, 'SpectrumMethod', spectrum_fourier, spectrum%method)
166 if (.not. varinfo_valid_option('SpectrumMethod', spectrum%method)) then
167 call messages_input_error(namespace, 'SpectrumMethod')
168 end if
169 call messages_print_var_option('SpectrumMethod', spectrum%method, namespace=namespace)
170
171 if (spectrum%method == spectrum_compressed_sensing) then
172 call messages_experimental('compressed sensing', namespace=namespace)
173
174 !%Variable SpectrumSignalNoise
175 !%Type float
176 !%Default 0.0
177 !%Section Utilities::oct-propagation_spectrum
178 !%Description
179 !% For compressed sensing, the signal to process, the
180 !% time-dependent dipole in this case, is assumed to have some
181 !% noise that is given by this dimensionless quantity.
182 !%End
183 call parse_variable(namespace, 'SpectrumSignalNoise', 0.0_real64, spectrum%noise)
184 call messages_print_var_value('SpectrumSignalNoise', spectrum%noise, namespace=namespace)
185 end if
188 !%Variable PropagationSpectrumDampMode
189 !%Type integer
190 !%Section Utilities::oct-propagation_spectrum
191 !%Description
192 !% Decides which damping/filtering is to be applied in order to
193 !% calculate spectra by calculating a Fourier transform. The
194 !% default is polynomial damping, except when <tt>SpectrumMethod = compressed_sensing</tt>.
195 !% In that case the default is none.
196 !%Option none 0
197 !% No filtering at all.
198 !%Option exponential 1
199 !% Exponential filtering, corresponding to a Lorentzian-shaped spectrum.
200 !%Option polynomial 2
201 !% Third-order polynomial damping.
202 !%Option gaussian 3
203 !% Gaussian damping.
204 !%End
206 if (spectrum%method == spectrum_compressed_sensing) default = spectrum_damp_none
208 call parse_variable(namespace, 'PropagationSpectrumDampMode', default, spectrum%damp)
209
210 if (.not. varinfo_valid_option('PropagationSpectrumDampMode', spectrum%damp)) then
211 call messages_input_error(namespace, 'PropagationSpectrumDampMode')
212 end if
213 call messages_print_var_option('PropagationSpectrumDampMode', spectrum%damp, namespace=namespace)
214
215 if (spectrum%method == spectrum_compressed_sensing .and. spectrum%damp /= spectrum_damp_none) then
216 message(1) = 'Using damping with compressed sensing, this is not required'
217 message(2) = 'and can introduce noise in the spectra.'
218 call messages_warning(2, namespace=namespace)
219 end if
220
221 !%Variable PropagationSpectrumTransform
222 !%Type integer
223 !%Default sine
224 !%Section Utilities::oct-propagation_spectrum
225 !%Description
226 !% Decides which transform to perform, if <tt>SpectrumMethod = fourier</tt>.
227 !%Option sine 2
228 !% Sine transform: <math>\int dt \sin(wt) f(t)</math>. Produces the imaginary part of the polarizability.
229 !%Option cosine 3
230 !% Cosine transform: <math>\int dt \cos(wt) f(t)</math>. Produces the real part of the polarizability.
231 !%Option laplace 1
232 !% Real exponential transform: <math>\int dt e^{-wt} f(t)</math>. Produces the real part of the polarizability at imaginary
233 !% frequencies, <i>e.g.</i> for Van der Waals <math>C_6</math> coefficients.
234 !% This is the only allowed choice for complex scaling.
235 !%End
236 call parse_variable(namespace, 'PropagationSpectrumTransform', spectrum_transform_sin, spectrum%transform)
237 if (.not. varinfo_valid_option('PropagationSpectrumTransform', spectrum%transform)) then
238 call messages_input_error(namespace, 'PropagationSpectrumTransform')
239 end if
240 call messages_print_var_option('PropagationSpectrumTransform', spectrum%transform, namespace=namespace)
241
242 !%Variable PropagationSpectrumStartTime
243 !%Type float
244 !%Default 0.0
245 !%Section Utilities::oct-propagation_spectrum
246 !%Description
247 !% Processing is done for the given function in a time-window that starts at the
248 !% value of this variable.
249 !%End
250 call parse_variable(namespace, 'PropagationSpectrumStartTime', m_zero, spectrum%start_time, units_inp%time)
251 call messages_print_var_value('PropagationSpectrumStartTime', spectrum%start_time, unit = units_out%time, namespace=namespace)
252
253 !%Variable PropagationSpectrumEndTime
254 !%Type float
255 !%Default -1.0 au
256 !%Section Utilities::oct-propagation_spectrum
257 !%Description
258 !% Processing is done for the given function in a time-window that ends at the
259 !% value of this variable. If set to a negative value, the maximum value from
260 !% the corresponding multipole file will used.
261 !%End
262 call parse_variable(namespace, 'PropagationSpectrumEndTime', -m_one, spectrum%end_time, units_inp%time)
263 call messages_print_var_value('PropagationSpectrumEndTime', spectrum%end_time, unit = units_out%time, namespace=namespace)
264
265 !%Variable PropagationSpectrumEnergyStep
266 !%Type float
267 !%Default 0.01 eV
268 !%Section Utilities::oct-propagation_spectrum
269 !%Description
270 !% Sampling rate for the spectrum. If you supply a number equal or smaller than zero, then
271 !% the sampling rate will be <math>2 \pi / T</math>, where <math>T</math> is the total propagation time.
272 !%End
273 fdefault = 0.01_real64/(m_two*p_ry)
274 if (present(default_energy_step)) fdefault = default_energy_step
275 call parse_variable(namespace, 'PropagationSpectrumEnergyStep', fdefault, spectrum%energy_step, units_inp%energy)
276 call messages_print_var_value('PropagationSpectrumEnergyStep', spectrum%energy_step, unit = units_out%energy, &
277 namespace=namespace)
278
279 !%Variable PropagationSpectrumMinEnergy
280 !%Type float
281 !%Default 0
282 !%Section Utilities::oct-propagation_spectrum
283 !%Description
284 !% The Fourier transform is calculated for energies larger than this value.
285 !%End
286 call parse_variable(namespace, 'PropagationSpectrumMinEnergy', m_zero, spectrum%min_energy, units_inp%energy)
287 call messages_print_var_value('PropagationSpectrumMinEnergy', spectrum%min_energy, unit = units_out%energy, &
288 namespace=namespace)
289
290
291 !%Variable PropagationSpectrumMaxEnergy
292 !%Type float
293 !%Default 20 eV
294 !%Section Utilities::oct-propagation_spectrum
295 !%Description
296 !% The Fourier transform is calculated for energies smaller than this value.
297 !%End
298 fdefault = 20.0_real64/(m_two*p_ry)
299 if (present(default_max_energy)) fdefault = default_max_energy
300 call parse_variable(namespace, 'PropagationSpectrumMaxEnergy', fdefault, spectrum%max_energy, units_inp%energy)
301 call messages_print_var_value('PropagationSpectrumMaxEnergy', spectrum%max_energy, unit = units_out%energy, &
302 namespace=namespace)
303
304 !%Variable PropagationSpectrumDampFactor
305 !%Type float
306 !%Default -1.0
307 !%Section Utilities::oct-propagation_spectrum
308 !%Description
309 !% If <tt>PropagationSpectrumDampMode = exponential, gaussian</tt>, the damping parameter of the exponential
310 !% is fixed through this variable.
311 !% Default value ensure that the damping function adquires a 0.0001 value at the end of the propagation time.
312 !%End
313 call parse_variable(namespace, 'PropagationSpectrumDampFactor', -m_one, spectrum%damp_factor, units_inp%time**(-1))
314
315 call messages_print_var_value('PropagationSpectrumDampFactor', spectrum%damp_factor, unit = units_out%time**(-1), &
316 namespace=namespace)
317
318 !%Variable PropagationSpectrumSigmaDiagonalization
319 !%Type logical
320 !%Default .false.
321 !%Section Utilities::oct-propagation_spectrum
322 !%Description
323 !% If <tt>PropagationSpectrumSigmaDiagonalization = yes</tt>, the polarizability tensor is diagonalizied.
324 !% This variable is only used if the cross_section_tensor is computed.
325 !%End
326 call parse_variable(namespace, 'PropagationSpectrumSigmaDiagonalization', .false., spectrum%sigma_diag)
327 call messages_print_var_value('PropagationSpectrumSigmaDiagonalization', spectrum%sigma_diag, namespace=namespace)
328
329 call messages_print_with_emphasis(namespace=namespace)
330
331 pop_sub(spectrum_init)
332 end subroutine spectrum_init
333
334
335 ! ---------------------------------------------------------
336 subroutine spectrum_cross_section_tensor(spectrum, namespace, out_file, in_file)
337 type(spectrum_t), intent(inout) :: spectrum
338 type(namespace_t), intent(in) :: namespace
339 integer, intent(in) :: out_file
340 integer, intent(in) :: in_file(:)
341
342 integer :: nspin, energy_steps, ie, is, equiv_axes, n_files, trash
343 real(real64), allocatable :: sigma(:, :, :, :), sigmap(:, :, :, :), sigmau(:, :, :), &
344 sigmav(:, :, :), sigmaw(:, :, :), ip(:, :)
345 real(real64) :: dw, dump
346 type(kick_t) :: kick
347
349
350 n_files = size(in_file)
351 equiv_axes = 3 - n_files + 1
352
353 call spectrum_cross_section_info(namespace, in_file(1), nspin, kick, energy_steps, dw)
354 ! on subsequent calls, do not overwrite energy_steps and dw
355 call io_skip_header(in_file(1))
356
357 safe_allocate(sigma(1:3, 1:3, 1:energy_steps, 1:nspin))
358 safe_allocate(sigmap(1:3, 1:3, 1:energy_steps, 1:nspin))
359 safe_allocate(sigmau(1:3, 1:energy_steps, 1:nspin))
360 safe_allocate(sigmav(1:3, 1:energy_steps, 1:nspin))
361 safe_allocate(sigmaw(1:3, 1:energy_steps, 1:nspin))
362 safe_allocate( ip(1:3, 1:3))
363
364 select case (equiv_axes)
365
366 case (3)
367
368 do ie = 1, energy_steps
369 read(in_file(1), *) dump, (sigmau(1:3, ie, is), is = 1, nspin)
370 end do
371
372 ! The first row of sigma is the vector that we have just read, but properly projected...
373 do is = 1, nspin
374 do ie = 1, energy_steps
375 sigmap(1, 1, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 1))
376 sigmap(1, 2, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 2))
377 sigmap(1, 3, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 3))
378 end do
379 end do
380
381 ! The diagonal parts are also equal:
382 sigmap(2, 2, :, :) = sigmap(1, 1, :, :)
383 sigmap(3, 3, :, :) = sigmap(1, 1, :, :)
384
385 ! The (2,1) term and (3,1) term are equal by symmetry:
386 sigmap(2, 1, :, :) = sigmap(1, 2, :, :)
387 sigmap(3, 1, :, :) = sigmap(1, 3, :, :)
388
389 ! But for the (2,3) term we need the wprime vector....
390 do is = 1, nspin
391 do ie = 1, energy_steps
392 sigmap(2, 3, ie, is) = sum(sigmau(1:3, ie, is) * kick%wprime(1:3))
393 sigmap(3, 2, ie, is) = sigmap(2, 3, ie, is)
394 end do
395 end do
396
397 case (2)
398
399 call spectrum_cross_section_info(namespace, in_file(2), ie, kick, trash, dump)
400 call io_skip_header(in_file(2))
401
402 do ie = 1, energy_steps
403 read(in_file(1), *) dump, (sigmau(1:3, ie, is), is = 1, nspin)
404 read(in_file(2), *) dump, (sigmaw(1:3, ie, is), is = 1, nspin)
405 end do
406
407 ! The first row of sigma is the vector that we have just read, but properly projected...
408 do is = 1, nspin
409 do ie = 1, energy_steps
410 sigmap(1, 1, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 1))
411 sigmap(1, 2, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 2))
412 sigmap(1, 3, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 3))
413 end do
414 end do
415
416 ! The third row of sigma is also the vector that we have just read, but properly projected...
417 do is = 1, nspin
418 do ie = 1, energy_steps
419 sigmap(3, 1, ie, is) = sum(sigmaw(1:3, ie, is) * kick%pol(1:3, 1))
420 sigmap(3, 2, ie, is) = sum(sigmaw(1:3, ie, is) * kick%pol(1:3, 2))
421 sigmap(3, 3, ie, is) = sum(sigmaw(1:3, ie, is) * kick%pol(1:3, 3))
422 end do
423 end do
424
425 ! The diagonal (2,2) is equal by symmetry to (1,1)
426 sigmap(2, 2, :, :) = sigmap(1, 1, :, :)
427
428 ! The (2,1) term and (1,2) term are equal; (2,3) and (3,2), also.
429 sigmap(2, 1, :, :) = sigmap(1, 2, :, :)
430 sigmap(2, 3, :, :) = sigmap(3, 2, :, :)
431
432 case default
433
434 call spectrum_cross_section_info(namespace, in_file(2), ie, kick, trash, dump)
435 call spectrum_cross_section_info(namespace, in_file(3), ie, kick, trash, dump)
436 call io_skip_header(in_file(2))
437 call io_skip_header(in_file(3))
438
439 do ie = 1, energy_steps
440 read(in_file(1), *) dump, (sigmau(1:3, ie, is), is = 1, nspin)
441 read(in_file(2), *) dump, (sigmav(1:3, ie, is), is = 1, nspin)
442 read(in_file(3), *) dump, (sigmaw(1:3, ie, is), is = 1, nspin)
443 end do
444
445 do is = 1, nspin
446 do ie = 1, energy_steps
447 sigmap(1, 1, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 1))
448 sigmap(1, 2, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 2))
449 sigmap(1, 3, ie, is) = sum(sigmau(1:3, ie, is) * kick%pol(1:3, 3))
450 end do
451 end do
452 do is = 1, nspin
453 do ie = 1, energy_steps
454 sigmap(2, 1, ie, is) = sum(sigmav(1:3, ie, is) * kick%pol(1:3, 1))
455 sigmap(2, 2, ie, is) = sum(sigmav(1:3, ie, is) * kick%pol(1:3, 2))
456 sigmap(2, 3, ie, is) = sum(sigmav(1:3, ie, is) * kick%pol(1:3, 3))
457 end do
458 end do
459 do is = 1, nspin
460 do ie = 1, energy_steps
461 sigmap(3, 1, ie, is) = sum(sigmaw(1:3, ie, is) * kick%pol(1:3, 1))
462 sigmap(3, 2, ie, is) = sum(sigmaw(1:3, ie, is) * kick%pol(1:3, 2))
463 sigmap(3, 3, ie, is) = sum(sigmaw(1:3, ie, is) * kick%pol(1:3, 3))
464 end do
465 end do
466
467 end select
468
469 ! And now, perform the necessary transformation.
470 ip(1:3, 1:3) = kick%pol(1:3, 1:3)
471 call lalg_inverse(3, ip, 'dir')
472 do is = 1, nspin
473 do ie = 1, energy_steps
474 sigma(:, :, ie, is) = matmul(transpose(ip), matmul(sigmap(:, :, ie, is), ip))
475 end do
476 end do
477
478 ! Finally, write down the result
479 call spectrum_cross_section_tensor_write(out_file, sigma, nspin, spectrum%energy_step, &
480 spectrum%min_energy, energy_steps, kick)
481
482 ! Diagonalize sigma tensor
483 if (spectrum%sigma_diag) then
484 call spectrum_sigma_diagonalize(namespace, sigma, nspin, spectrum%energy_step, spectrum%min_energy, energy_steps, kick)
485 end if
486
487 safe_deallocate_a(sigma)
488 safe_deallocate_a(sigmap)
489 safe_deallocate_a(sigmau)
490 safe_deallocate_a(sigmav)
491 safe_deallocate_a(sigmaw)
492 safe_deallocate_a(ip)
493
495 end subroutine spectrum_cross_section_tensor
496
497
498 ! ---------------------------------------------------------
499 subroutine spectrum_cross_section_tensor_write(out_file, sigma, nspin, energy_step, min_energy, energy_steps, kick)
500 integer, intent(in) :: out_file
501 real(real64), intent(in) :: sigma(:, :, :, :)
502 integer, intent(in) :: nspin
503 real(real64), intent(in) :: energy_step, min_energy
504 integer, intent(in) :: energy_steps
505 type(kick_t), optional, intent(in) :: kick
506
507 integer :: is, idir, jdir, ie, ii
508 real(real64) :: average, anisotropy
509 real(real64), allocatable :: pp(:,:), pp2(:,:), ip(:,:)
510 logical :: spins_singlet, spins_triplet
511 character(len=20) :: header_string
512
514
515 spins_singlet = .true.
516 spins_triplet = .false.
517 if (present(kick)) then
518 write(out_file, '(a15,i2)') '# nspin ', nspin
519 call kick_write(kick, out_file)
520 select case (kick_get_type(kick))
521 case (kick_spin_mode)
522 spins_triplet = .true.
523 spins_singlet = .false.
525 spins_triplet = .true.
526 end select
527 end if
528
529 write(out_file, '(a1, a20)', advance = 'no') '#', str_center("Energy", 20)
530 write(out_file, '(a20)', advance = 'no') str_center("(1/3)*Tr[sigma]", 20)
531 write(out_file, '(a20)', advance = 'no') str_center("Anisotropy[sigma]", 20)
532 if (spins_triplet .and. spins_singlet) then
533 write(out_file, '(a20)', advance = 'no') str_center("(1/3)*Tr[sigma-]", 20)
534 end if
535 do is = 1, nspin
536 do idir = 1, 3
537 do jdir = 1, 3
538 write(header_string,'(a6,i1,a1,i1,a1,i1,a1)') 'sigma(', idir, ',', jdir, ',', is, ')'
539 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
540 end do
541 end do
542 end do
543 write(out_file, '(1x)')
544 write(out_file, '(a1,a20)', advance = 'no') '#', str_center('[' // trim(units_abbrev(units_out%energy)) // ']', 20)
545 if (spins_triplet .and. spins_singlet) then
546 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
547 end if
548 do ii = 1, 2 + nspin * 9
549 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
550 end do
551 write(out_file, '(1x)')
552
553 ! The anisotropy (Delta alpha) of a second-rank symmetric tensor alpha (such
554 ! as the cross section) is defined as:
555 !
556 ! (Delta alpha)^2 = (1/3) * (3 * Tr(alpha^2) - (Tr(a))^2)
557 !
558 ! The reason for this definition is that it is identically equal to:
559 !
560 ! (Delta alpha)^2 = (1/3) * ( (alpha_1-alpha_2)^2 + (alpha_1-alpha_3)^2 + (alpha_2-alpha_3)^2)
561 !
562 ! where {alpha_1, alpha_2, alpha_3} are the eigenvalues of alpha. An "isotropic" tensor
563 ! is characterized by having three equal eigenvalues, which leads to zero anisotropy. The
564 ! more different that the eigenvalues are, the larger the anisotropy is.
565
566 safe_allocate(pp(1:3, 1:3))
567 if (spins_triplet .and. spins_singlet) then
568 safe_allocate(pp2(1:3, 1:3))
569 end if
570 safe_allocate(ip(1:3, 1:3))
571
572 do ie = 1, energy_steps
573
574 pp(:, :) = sigma(:, :, ie, 1)
575 if (nspin >= 2) then
576 if (spins_singlet .and. spins_triplet) then
577 pp2(:, :) = pp(:, :) - sigma(:, :, ie, 2)
578 pp(:, :) = pp(:, :) + sigma(:, :, ie, 2)
579 elseif (spins_triplet .and. .not. spins_singlet) then
580 pp(:, :) = pp(:, :) - sigma(:, :, ie, 2)
581 elseif (spins_singlet .and. .not. spins_triplet) then
582 pp(:, :) = pp(:, :) + sigma(:, :, ie, 2)
583 end if
584 end if
585
586 average = m_third * (pp(1, 1) + pp(2, 2) + pp(3, 3))
587 ip = matmul(pp, pp)
588 anisotropy = m_third * (m_three * ( ip(1, 1) + ip(2, 2) + ip(3, 3)) - (m_three * average)**2)
589
590 ! Note that the cross-section elements do not have to be transformed to the proper units, since
591 ! they have been read from the "cross_section_vector.x", where they are already in the proper units.
592 write(out_file,'(3e20.8)', advance = 'no') units_from_atomic(units_out%energy, ((ie - 1) * energy_step + min_energy)), &
593 average, sqrt(max(anisotropy, m_zero))
594
595 if (spins_singlet .and. spins_triplet) then
596 average = m_third * (pp2(1, 1) + pp2(2, 2) + pp2(3, 3))
597 write(out_file,'(1e20.8)', advance = 'no') average
598 end if
599
600 do is = 1, nspin
601 write(out_file,'(9e20.8)', advance = 'no') sigma(1:3, 1:3, ie, is)
602 end do
603 write(out_file, '(1x)')
604 end do
605
606 safe_deallocate_a(pp)
607 if (spins_triplet .and. spins_singlet) then
608 safe_deallocate_a(pp2)
609 end if
610 safe_deallocate_a(ip)
613
614
615 ! ---------------------------------------------------------
616 subroutine spectrum_cross_section(spectrum, namespace, in_file, out_file, ref_file)
617 type(spectrum_t), intent(inout) :: spectrum
618 type(namespace_t), intent(in) :: namespace
619 integer, intent(in) :: in_file
620 integer, intent(in) :: out_file
621 integer, optional, intent(in) :: ref_file
622
623 character(len=20) :: header_string
624 integer :: nspin, ref_nspin, lmax, ref_lmax, time_steps, &
625 ref_time_steps, istart, iend, ntiter, it, ii, isp, no_e, ie, idir
626 real(real64) :: dt, ref_dt, energy, ewsum, polsum
627 type(kick_t) :: kick, ref_kick
628 real(real64), allocatable :: dipole(:, :, :), ref_dipole(:, :, :), sigma(:, :, :), sf(:, :)
629 type(unit_system_t) :: file_units, ref_file_units
630 type(batch_t) :: dipoleb, sigmab
631
632 type(pcm_min_t) :: pcm
633
634 push_sub(spectrum_cross_section)
635
636 ! This function gives us back the unit connected to the "multipoles" file, the header information,
637 ! the number of time steps, and the time step.
638 call spectrum_mult_info(namespace, in_file, nspin, kick, time_steps, dt, file_units, lmax=lmax)
639
640 if (present(ref_file)) then
641 call spectrum_mult_info(namespace, ref_file, ref_nspin, ref_kick, &
642 ref_time_steps, ref_dt, ref_file_units, lmax = ref_lmax)
643 if ((nspin /= ref_nspin) .or. &
644 (time_steps /= ref_time_steps) .or. &
645 (.not.(abs(dt-ref_dt)< 1e-10_real64)) .or. &
646 (lmax /= ref_lmax)) then
647 write(message(1),'(a)') 'The multipoles and reference multipoles files do not match.'
648 call messages_fatal(1, namespace=namespace)
649 end if
650 end if
651
652 ! Now we cannot process files that do not contain the dipole, or that contain more than the dipole.
653 if (lmax /= 1) then
654 message(1) = 'Multipoles file should contain the dipole -- and only the dipole.'
655 call messages_fatal(1, namespace=namespace)
656 end if
657
658 if (kick%function_mode /= kick_function_dipole) then
659 message(1) = "Kick function must have been dipole to run this utility."
660 call messages_fatal(1, namespace=namespace)
661 end if
662
663 if (kick%pol_dir < 1) then
664 message(1) = "Kick polarization direction is not set. Probably no kick was used."
665 call messages_fatal(1, namespace=namespace)
666 end if
667
668 ! Find out the iteration numbers corresponding to the time limits.
669 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
670
671 safe_allocate(dipole(0:time_steps, 1:3, 1:nspin))
672 call spectrum_read_dipole(namespace, in_file, dipole)
673
674 if (present(ref_file)) then
675 safe_allocate(ref_dipole(0:time_steps, 1:3, 1:nspin))
676 call spectrum_read_dipole(namespace, ref_file, ref_dipole)
677 end if
678
679 ! parsing and re-printing to output useful PCM data
680 call pcm_min_input_parsing_for_spectrum(pcm, namespace)
681
682 ! adding the dipole generated by the PCM polarization charges due solute
683 if (pcm%localf) then
684 call spectrum_add_pcm_dipole(namespace, dipole, time_steps, nspin)
685 end if
686
687 ! Now subtract the initial dipole.
688 if (present(ref_file)) then
689 dipole = dipole - ref_dipole
690 else
691 do it = 1, time_steps
692 dipole(it, :, :) = dipole(it, :, :) - dipole(0, :, :)
693 end do
694 dipole(0, :, :) = m_zero
695 end if
696
697 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
698
699 ! Get the number of energy steps.
700 no_e = spectrum_nenergy_steps(spectrum)
701 safe_allocate(sigma(1:no_e, 1:3, 1:nspin))
702
703 if (pcm%localf) then
704
705 ! for numerical reasons, we cannot add the difference (d(t)-d(t0)) of PCM dipoles here -- although it would look cleaner
706
707 ! in the PCM local field case \sigma(\omega) \propto \Im{\alpha(\omega)\epsilon(\omega)} not just \propto \Im{\alpha(\omega)}
708 ! since the dielectric function is complex as well, we need to compute both the real and imaginary part of the polarizability
709 call spectrum_times_pcm_epsilon(spectrum, pcm, dipole, sigma, nspin, istart, iend, kick%time, dt, no_e)
710
711 write(out_file,'(a57)') "Cross-section spectrum contains full local field effects."
712
713 else
714
715 call batch_init(dipoleb, 3, 1, nspin, dipole)
716 call batch_init(sigmab, 3, 1, nspin, sigma)
717
718 call spectrum_signal_damp(spectrum%damp, spectrum%damp_factor, istart + 1, iend + 1, kick%time, dt, dipoleb)
719 call spectrum_fourier_transform(spectrum%method, spectrum%transform, spectrum%noise, &
720 istart + 1, iend + 1, kick%time, dt, dipoleb, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sigmab)
721
722 call dipoleb%end()
723 call sigmab%end()
724
725 end if
726
727 if (pcm%run_pcm) then
728 call spectrum_over_pcm_refraction_index(spectrum, pcm, sigma, nspin, no_e)
729 end if
730
731
732 safe_deallocate_a(dipole)
733 if (present(ref_file)) then
734 safe_deallocate_a(ref_dipole)
735 end if
736
737 safe_allocate(sf(1:no_e, nspin))
738
739 if (abs(kick%delta_strength) < 1e-12_real64) kick%delta_strength = m_one
740 do ie = 1, no_e
741 energy = (ie-1) * spectrum%energy_step + spectrum%min_energy
742 do isp = 1, nspin
743 sf(ie, isp) = sum(sigma(ie, 1:3, isp)*kick%pol(1:3, kick%pol_dir))
744 end do
745 sf(ie, 1:nspin) = -sf(ie, 1:nspin) * (energy * m_two) / (m_pi * kick%delta_strength)
746 sigma(ie, 1:3, 1:nspin) = -sigma(ie, 1:3, 1:nspin)*(m_four*m_pi*energy/p_c)/kick%delta_strength
747 end do
748
749 ! The formulae below are only correct in this particular case.
750 if (kick_get_type(kick) == kick_density_mode .and. spectrum%transform == spectrum_transform_sin) then
751 ewsum = sum(sf(1, 1:nspin))
752 polsum = m_zero
753
754 do ie = 2, no_e
755 energy = (ie-1) * spectrum%energy_step + spectrum%min_energy
756 ewsum = ewsum + sum(sf(ie, 1:nspin))
757 polsum = polsum + sum(sf(ie, 1:nspin)) / energy**2
758 end do
759
760 ewsum = ewsum * spectrum%energy_step
761 polsum = polsum * spectrum%energy_step
762 end if
763
764 write(out_file, '(a15,i2)') '# nspin ', nspin
765 call kick_write(kick, out_file)
766 write(out_file, '(a)') '#%'
767 write(out_file, '(a,i8)') '# Number of time steps = ', time_steps
768 call spectrum_write_info(spectrum, out_file)
769 write(out_file, '(a)') '#%'
770 if (kick_get_type(kick) == kick_density_mode .and. spectrum%transform == spectrum_transform_sin) then
771 write(out_file, '(a,f16.6)') '# Electronic sum rule = ', ewsum
772 write(out_file, '(a,f16.6,1x,a)') '# Static polarizability (from sum rule) = ', &
773 units_from_atomic(units_out%length**3, polsum), trim(units_abbrev(units_out%length))
774 write(out_file, '(a)') '#%'
775 end if
776
777 write(out_file, '(a1,a20)', advance = 'no') '#', str_center("Energy", 20)
778 do isp = 1, nspin
779 do idir = 1, 3
780 write(header_string,'(a6,i1,a8,i1,a1)') 'sigma(', idir, ', nspin=', isp, ')'
781 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
782 end do
783 end do
784 do isp = 1, nspin
785 write(header_string,'(a18,i1,a1)') 'StrengthFunction(', isp, ')'
786 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
787 end do
788 write(out_file, '(1x)')
789 write(out_file, '(a1,a20)', advance = 'no') '#', str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20)
790 do ii = 1, nspin * 3
791 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
792 end do
793 do isp = 1, nspin
794 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(unit_one/units_out%energy)) // ']', 20)
795 end do
796 write(out_file, '(1x)')
797
798 do ie = 1, no_e
799 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, &
800 (ie-1) * spectrum%energy_step + spectrum%min_energy)
801 do isp = 1, nspin
802 write(out_file,'(3e20.8)', advance = 'no') (units_from_atomic(units_out%length**2, sigma(ie, idir, isp)), &
803 idir = 1, 3)
804 end do
805 do isp = 1, nspin
806 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(unit_one/units_out%energy, sf(ie, isp))
807 end do
808 write(out_file, '(1x)')
809 end do
810
811 safe_deallocate_a(sigma)
813 end subroutine spectrum_cross_section
814
815 ! ---------------------------------------------------------
816
817 subroutine spectrum_read_dipole(namespace, in_file, dipole)
818 type(namespace_t), intent(in) :: namespace
819 integer, intent(in) :: in_file
820 real(real64), intent(out) :: dipole(0:, :, :)
821
822 integer :: nspin, lmax, time_steps, trash, it, idir, ispin
823 real(real64) :: dt, dump
824 type(kick_t) :: kick
825 type(unit_system_t) :: file_units
826
827 push_sub(spectrum_read_dipole)
828
829 ! This function gives us back the unit connected to the "multipoles" file, the header information,
830 ! the number of time steps, and the time step.
831 call spectrum_mult_info(namespace, in_file, nspin, kick, time_steps, dt, file_units, lmax = lmax)
832
833 ! Read the dipole.
834 call io_skip_header(in_file)
835
836 do it = 0, time_steps
837 dipole(it, :, :) = m_zero
838 read(in_file, *) trash, dump, (dump, (dipole(it, idir, ispin), idir = 1, kick%dim), ispin = 1, nspin)
839 end do
840 dipole(:,:,:) = units_to_atomic(file_units%length, dipole(:,:,:))
841
842 pop_sub(spectrum_read_dipole)
843
844 end subroutine spectrum_read_dipole
845
846 ! ---------------------------------------------------------
847
848 subroutine spectrum_add_pcm_dipole(namespace, dipole, time_steps, nspin)
849 type(namespace_t), intent(in) :: namespace
850 real(real64), intent(inout) :: dipole(0:, :, :)
851 integer, intent(in) :: time_steps
852 integer, intent(in) :: nspin
853
854 type(pcm_t) :: pcm
855 real(real64) :: dipole_pcm(1:3)
856 integer :: ia, it
857
858 ! unit io variables
859 integer :: asc_unit_test
860 integer :: cavity_unit
861 integer :: asc_vs_t_unit, asc_vs_t_unit_check
862 integer :: dipole_vs_t_unit_check, dipole_vs_t_unit_check1
863 integer :: iocheck
864 integer :: aux_int
865 real(real64) :: aux_float, aux_float1, aux_vec(1:3)
866 character(len=23) :: asc_vs_t_unit_format
867 character(len=16) :: asc_vs_t_unit_format_tail
868
870
871 ! reading PCM cavity from standard output file in two steps
872
873 ! first step - counting tesserae
874 asc_unit_test = io_open(pcm_dir//'ASC_e.dat', namespace, action='read')
875 pcm%n_tesserae = 0
876 iocheck = 1
877 do while(iocheck >= 0)
878 read(asc_unit_test,*,iostat=iocheck) aux_vec(1:3), aux_float, aux_int
879 if (iocheck >= 0) pcm%n_tesserae = pcm%n_tesserae + 1
880 end do
881 call io_close(asc_unit_test)
882
883 ! intermezzo - allocating PCM tessellation and polarization charges arrays
884 safe_allocate(pcm%tess(1:pcm%n_tesserae))
885 safe_allocate(pcm%q_e(1:pcm%n_tesserae))
886 safe_allocate(pcm%q_e_in(1:pcm%n_tesserae)) ! with auxiliary role
887
888 ! second step - reading of PCM tessellation arrays from standard output file
889 ! writing the cavity to debug-purpose file
890 asc_unit_test = io_open(pcm_dir//'ASC_e.dat', namespace, action='read')
891 cavity_unit = io_open(pcm_dir//'cavity_check.xyz', namespace, action='write')
892 write(cavity_unit,'(I3)') pcm%n_tesserae
893 write(cavity_unit,*)
894 do ia = 1, pcm%n_tesserae
895 read(asc_unit_test,*) pcm%tess(ia)%point(1:3), aux_float, aux_int
896 write(cavity_unit,'(A1,3(1X,F14.8))') 'H', pcm%tess(ia)%point(1:3)
897 end do
898 call io_close(asc_unit_test)
899 call io_close(cavity_unit)
900
901 write (asc_vs_t_unit_format_tail,'(I5,A11)') pcm%n_tesserae,'(1X,F14.8))'
902 write (asc_vs_t_unit_format,'(A)') '(F14.8,'//trim(adjustl(asc_vs_t_unit_format_tail))
903
904 ! Now, summary: * read the time-dependent PCM polarization charges due to solute electrons, pcm%q_e
905 ! * compute the real-time dipole generated by pcm%q_e, dipole_pcm
906 ! * add it to the real-time molecular dipole
907 ! * write the total dipole and its PCM contribution to debug-purpose files
908 ! N.B. we assume nuclei fixed in time
909
910 ! opening time-dependent PCM charges standard and debug-purpose file
911 asc_vs_t_unit = io_open(pcm_dir//'ASC_e_vs_t.dat', namespace, action='read', form='formatted')
912 asc_vs_t_unit_check = io_open(pcm_dir//'ASC_e_vs_t_check.dat', namespace, action='write', form='formatted')
913
914 ! opening time-dependent PCM and total dipole debug-purpose files
915 dipole_vs_t_unit_check = io_open(pcm_dir//'dipole_e_vs_t_check.dat', namespace, action='write', form='formatted')
916 dipole_vs_t_unit_check1 = io_open(pcm_dir//'dipole_e_vs_t_check1.dat', namespace, action='write', form='formatted')
917
918 ! reading PCM charges for the zeroth-iteration - not used - pcm%q_e_in is only auxiliary here
919 read(asc_vs_t_unit,trim(adjustl(asc_vs_t_unit_format))) aux_float1, ( pcm%q_e_in(ia) , ia=1,pcm%n_tesserae)
920
921 do it = 1, time_steps
922
923 ! reading real-time PCM charges due to electrons per timestep
924 read(asc_vs_t_unit,trim(adjustl(asc_vs_t_unit_format))) aux_float, ( pcm%q_e(ia) , ia=1,pcm%n_tesserae)
925
926 ! computing real-time PCM dipole per timestep
927 call pcm_dipole(dipole_pcm(1:3), -pcm%q_e(1:pcm%n_tesserae), pcm%tess, pcm%n_tesserae)
928
929 ! adding PCM dipole to the molecular dipole per timestep
930 dipole(it, 1, 1:nspin) = dipole(it, 1, 1:nspin) + dipole_pcm(1)
931 dipole(it, 2, 1:nspin) = dipole(it, 2, 1:nspin) + dipole_pcm(2)
932 dipole(it, 3, 1:nspin) = dipole(it, 3, 1:nspin) + dipole_pcm(3)
933
934 ! since we always have a kick for the optical spectrum in Octopus
935 ! the first-iteration dipole should be equal to the zeroth-iteration one
936 ! in any case, made them equal by hand
937 if (it == 1) then
938 dipole(0, 1, 1:nspin) = dipole(1, 1, 1:nspin)
939 dipole(0, 2, 1:nspin) = dipole(1, 2, 1:nspin)
940 dipole(0, 3, 1:nspin) = dipole(1, 3, 1:nspin)
941 end if
942
943 ! writing real-time PCM charges and dipole, and the total dipole for debug purposes
944 write(asc_vs_t_unit_check,trim(adjustl(asc_vs_t_unit_format))) aux_float, (pcm%q_e(ia), ia=1,pcm%n_tesserae)
945 write(dipole_vs_t_unit_check,'(F14.8,3(1X,F14.8))') aux_float, dipole_pcm
946 write(dipole_vs_t_unit_check1,'(F14.8,3(1X,F14.8))') aux_float, dipole(it,:,1)
947
948 end do
949
950 ! closing PCM and debug files
951 call io_close(asc_vs_t_unit)
952 call io_close(asc_vs_t_unit_check)
953 call io_close(dipole_vs_t_unit_check)
954 call io_close(dipole_vs_t_unit_check1)
955
956 ! deallocating PCM arrays
957 safe_deallocate_a(pcm%tess)
958 safe_deallocate_a(pcm%q_e)
959 safe_deallocate_a(pcm%q_e_in)
960
962
963 end subroutine spectrum_add_pcm_dipole
964
965 ! ---------------------------------------------------------
966
967 subroutine spectrum_times_pcm_epsilon(spectrum, pcm, dipole, sigma, nspin, istart, iend, kick_time, dt, no_e)
968 type(spectrum_t), intent(in) :: spectrum
969 type(pcm_min_t) , intent(in) :: pcm
970 real(real64), allocatable, intent(inout) :: sigma(:, :, :)
971 real(real64), allocatable, intent(in) :: dipole(:, :, :)
972 integer, intent(in) :: nspin
973 real(real64), intent(in) :: kick_time
974 integer, intent(in) :: istart, iend
975 real(real64), intent(in) :: dt
976 integer, intent(in) :: no_e
977
978 real(real64), allocatable :: sigmap(:, :, :)
979 type(batch_t) :: dipoleb, sigmab
980
981 integer :: ie
982
983 complex(real64), allocatable :: eps(:)
984
986
987 ! imaginary part of the polarizability
988
989 call batch_init(dipoleb, 3, 1, nspin, dipole)
990 call batch_init(sigmab, 3, 1, nspin, sigma)
991
992 call spectrum_signal_damp(spectrum%damp, spectrum%damp_factor, istart + 1, iend + 1, kick_time, dt, dipoleb)
993 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
994 istart + 1, iend + 1, kick_time, dt, dipoleb, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sigmab)
995
996 call dipoleb%end()
997 call sigmab%end()
998
999 ! real part of the polarizability
1000
1001 safe_allocate(sigmap(1:no_e, 1:3, 1:nspin))
1002
1003 call batch_init(dipoleb, 3, 1, nspin, dipole)
1004 call batch_init(sigmab, 3, 1, nspin, sigmap)
1005
1006 call spectrum_signal_damp(spectrum%damp, spectrum%damp_factor, istart + 1, iend + 1, kick_time, dt, dipoleb)
1007 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
1008 istart + 1, iend + 1, kick_time, dt, dipoleb, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sigmab)
1009
1010 call dipoleb%end()
1011 call sigmab%end()
1012
1013 safe_allocate(eps(1:no_e))
1014
1015 ! multiplying by the dielectric function and taking the imaginary part of the product
1016
1017 do ie = 1, no_e
1018 call pcm_eps(pcm, eps(ie), (ie-1)*spectrum%energy_step + spectrum%min_energy)
1019 sigma(ie, 1:3, 1:nspin) = sigma(ie, 1:3, 1:nspin) * real(eps(ie), real64) + sigmap(ie, 1:3, 1:nspin) *aimag(eps(ie))
1020 end do
1021
1022 safe_deallocate_a(sigmap)
1023 safe_deallocate_a(eps)
1024
1026
1027 end subroutine spectrum_times_pcm_epsilon
1028
1029 ! ---------------------------------------------------------
1030
1031 subroutine spectrum_over_pcm_refraction_index(spectrum, pcm, sigma, nspin, no_e)
1032 type(spectrum_t), intent(in) :: spectrum
1033 type(pcm_min_t) , intent(in) :: pcm
1034 real(real64), allocatable, intent(inout) :: sigma(:, :, :)
1035 integer, intent(in) :: nspin
1036 integer, intent(in) :: no_e
1037
1038 integer :: ie
1039
1040 complex(real64), allocatable :: eps(:)
1041
1043
1044 safe_allocate(eps(1:no_e))
1045
1046 ! dividing by the refraction index - n(\omega)=\sqrt{\frac{|\epsilon(\omega)|+\Re[\epsilon(\omega)]}{2}}
1047
1048 do ie = 1, no_e
1049 call pcm_eps(pcm, eps(ie), (ie-1)*spectrum%energy_step + spectrum%min_energy)
1050 sigma(ie, 1:3, 1:nspin) = sigma(ie, 1:3, 1:nspin) / sqrt(0.5_real64 * (abs(eps(ie)) + real(eps(ie), real64)))
1051 end do
1052
1053 safe_deallocate_a(eps)
1054
1056
1058
1059 ! ---------------------------------------------------------
1060 subroutine spectrum_dipole_power(spectrum, namespace, in_file, out_file)
1061 type(spectrum_t), intent(inout) :: spectrum
1062 type(namespace_t), intent(in) :: namespace
1063 integer, intent(in) :: in_file
1064 integer, intent(in) :: out_file
1065
1066 character(len=20) :: header_string
1067 integer :: nspin, lmax, time_steps, istart, iend, ntiter, it, ii, isp, no_e, ie, idir
1068 real(real64) :: dt
1069 real(real64), allocatable :: dipole(:, :, :), transform_cos(:, :, :), transform_sin(:, :, :), power(:, :, :)
1070 type(unit_system_t) :: file_units
1071 type(batch_t) :: dipoleb, transformb_cos, transformb_sin
1072 type(kick_t) :: kick
1073
1074 push_sub(spectrum_dipole_power)
1075
1076 ! This function gives us back the unit connected to the "multipoles" file, the header information,
1077 ! the number of time steps, and the time step.
1078 call spectrum_mult_info(namespace, in_file, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1079
1080 ! Now we cannot process files that do not contain the dipole, or that contain more than the dipole.
1081 if (lmax /= 1) then
1082 message(1) = 'Multipoles file should contain the dipole -- and only the dipole.'
1083 call messages_fatal(1, namespace=namespace)
1084 end if
1085
1086 ! Find out the iteration numbers corresponding to the time limits.
1087 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1088
1089 safe_allocate(dipole(0:time_steps, 1:3, 1:nspin))
1090 call spectrum_read_dipole(namespace, in_file, dipole)
1091
1092 ! Now subtract the initial dipole.
1093 do it = 1, time_steps
1094 dipole(it, :, :) = dipole(it, :, :) - dipole(0, :, :)
1095 end do
1096 dipole(0, :, :) = m_zero
1097
1098 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1099
1100 ! Get the number of energy steps.
1101 no_e = spectrum_nenergy_steps(spectrum)
1102 safe_allocate(transform_cos(1:no_e, 1:3, 1:nspin))
1103 safe_allocate(transform_sin(1:no_e, 1:3, 1:nspin))
1104 safe_allocate(power(1:no_e, 1:3, 1:nspin))
1105
1106
1107 call batch_init(dipoleb, 3, 1, nspin, dipole)
1108 call batch_init(transformb_cos, 3, 1, nspin, transform_cos)
1109 call batch_init(transformb_sin, 3, 1, nspin, transform_sin)
1110
1111 call spectrum_signal_damp(spectrum%damp, spectrum%damp_factor, istart + 1, iend + 1, spectrum%start_time, dt, dipoleb)
1112
1113 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
1114 istart + 1, iend + 1, spectrum%start_time, dt, dipoleb, spectrum%min_energy, &
1115 spectrum%max_energy, spectrum%energy_step, transformb_cos)
1116 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
1117 istart + 1, iend + 1, spectrum%start_time, dt, dipoleb, spectrum%min_energy, &
1118 spectrum%max_energy, spectrum%energy_step, transformb_sin)
1119
1120 do ie = 1, no_e
1121 power(ie, :, :) = (transform_sin(ie, :, :)**2 + transform_cos(ie, :, :)**2)
1122 end do
1123
1124 call dipoleb%end()
1125 call transformb_cos%end()
1126 call transformb_sin%end()
1127
1128 safe_deallocate_a(dipole)
1129 safe_deallocate_a(transform_sin)
1130 safe_deallocate_a(transform_cos)
1131
1132 write(out_file, '(a15,i2)') '# nspin ', nspin
1133 write(out_file, '(a)') '#%'
1134 write(out_file, '(a,i8)') '# Number of time steps = ', time_steps
1135 call spectrum_write_info(spectrum, out_file)
1136 write(out_file, '(a)') '#%'
1137
1138 write(out_file, '(a1,a20,1x)', advance = 'no') '#', str_center("Energy", 20)
1139 do isp = 1, nspin
1140 do idir = 1, 3
1141 write(header_string,'(a6,i1,a8,i1,a1)') 'power(', idir, ', nspin=', isp, ')'
1142 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
1143 end do
1144 end do
1145 write(out_file, '(1x)')
1146 write(out_file, '(a1,a20)', advance = 'no') '#', str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20)
1147 do ii = 1, nspin * 3
1148 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
1149 end do
1150 write(out_file, '(1x)')
1151
1152 do ie = 1, no_e
1153 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, &
1154 (ie-1) * spectrum%energy_step + spectrum%min_energy)
1155 do isp = 1, nspin
1156 write(out_file,'(3e20.8)', advance = 'no') (units_from_atomic(units_out%length**2, power(ie, idir, isp)), &
1157 idir = 1, 3)
1158 end do
1159 write(out_file, '(1x)')
1160 end do
1161
1162 safe_deallocate_a(power)
1163
1164 pop_sub(spectrum_dipole_power)
1165 end subroutine spectrum_dipole_power
1166
1167 ! ---------------------------------------------------------
1168 subroutine spectrum_dyn_structure_factor(spectrum, namespace, in_file_sin, in_file_cos, out_file)
1169 type(spectrum_t), intent(inout) :: spectrum
1170 type(namespace_t), intent(in) :: namespace
1171 integer, intent(in) :: in_file_sin, in_file_cos
1172 integer, intent(in) :: out_file
1173
1174 character(len=20) :: header_string
1175 integer :: time_steps, time_steps_sin, time_steps_cos
1176 integer :: istart, iend, ntiter, it, jj, ii, no_e, ie, trash
1177 real(real64) :: dt, dt_sin, dt_cos
1178 real(real64) :: dump, dummy1, dummy2, dummy3, dummy4, energy, fsum
1179 type(kick_t) :: kick
1180 complex(real64) :: xx
1181 complex(real64), allocatable :: ftchd(:), chi(:), damp(:)
1182 type(unit_system_t) :: file_units
1183 character(len=100) :: line
1184
1186
1187 ! Read information from ftchds.sin file
1188
1189 rewind(in_file_sin)
1190
1191 ! skip two lines
1192 read(in_file_sin, *)
1193 read(in_file_sin, *)
1194 read(in_file_sin, '(15x,i2)') kick%qkick_mode
1195 read(in_file_sin, '(10x,3f9.5)') kick%qvector
1196 read(in_file_sin, '(15x,f18.12)') kick%delta_strength
1197
1198 ! skip two lines
1199 read(in_file_sin, *)
1200 read(in_file_sin, '(a)') line
1201 call io_skip_header(in_file_sin)
1202 call io_skip_header(in_file_cos)
1203
1204 ! Figure out the units of the file
1205 ii = index(line, 'eV')
1206 if (ii /= 0) then
1207 call unit_system_get(file_units, units_eva)
1208 else
1209 call unit_system_get(file_units, units_atomic)
1210 end if
1211
1212 ! get time_steps and dt, and make sure that dt is the same in the two files
1213 call spectrum_count_time_steps(namespace, in_file_sin, time_steps_sin, dt_sin)
1214 call spectrum_count_time_steps(namespace, in_file_cos, time_steps_cos, dt_cos)
1215
1216 if (.not. is_close(dt_sin, dt_cos)) then
1217 message(1) = "dt is different in ftchds.cos and ftchds.sin!"
1218 call messages_fatal(1, namespace=namespace)
1219 end if
1220
1221 time_steps = min(time_steps_sin, time_steps_cos)
1222 dt = units_to_atomic(file_units%time, dt_cos) ! units_out is OK
1223
1224 ! Find out the iteration numbers corresponding to the time limits.
1225 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1226
1227 ! Read the f-transformed charge density.
1228 call io_skip_header(in_file_sin)
1229 call io_skip_header(in_file_cos)
1230
1231 safe_allocate(ftchd(0:time_steps))
1232 do it = 0, time_steps
1233 read(in_file_sin, *) trash, dump, dummy1, dummy2
1234 read(in_file_cos, *) trash, dump, dummy3, dummy4
1235 ftchd(it) = cmplx(dummy3-dummy2, dummy4+dummy1, real64)
1236 end do
1237
1238 ! Now subtract the initial value.
1239 do it = 1, time_steps
1240 ftchd(it) = ftchd(it) - ftchd(0)
1241 end do
1242 ftchd(0) = m_zero
1243
1244 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1245
1246 ! Get the number of energy steps.
1247 no_e = spectrum_nenergy_steps(spectrum)
1248
1249 safe_allocate(chi(1:no_e))
1250 chi = m_zero
1251
1252 ! Gets the damp function
1253 safe_allocate(damp(istart:iend))
1254 do it = istart, iend
1255 jj = it - istart
1256 select case (spectrum%damp)
1257 case (spectrum_damp_none)
1258 damp(it) = m_one
1260 damp(it)= exp(-jj * dt * spectrum%damp_factor)
1262 damp(it) = m_one - m_three * (real(jj, real64) / ntiter)**2 &
1263 + m_two * (real(jj, real64) / ntiter)**3
1265 damp(it)= exp(-(jj * dt)**2 * spectrum%damp_factor**2)
1266 end select
1267 end do
1268
1269 ! Fourier transformation from time to frequency
1270 if (abs(kick%delta_strength) < 1.d-12) kick%delta_strength = m_one
1271 do ie = 1, no_e
1272 energy = (ie-1) * spectrum%energy_step + spectrum%min_energy
1273 do it = istart, iend
1274 jj = it - istart
1275
1276 xx = exp(m_zi * energy * jj * dt)
1277 chi(ie) = chi(ie) + xx * damp(it) * ftchd(it)
1278
1279 end do
1280 chi(ie) = chi(ie) * dt / kick%delta_strength / m_pi
1281 end do
1282
1283 ! Test f-sum rule
1284 fsum = m_zero
1285 do ie = 1, no_e
1286 energy = (ie-1) * spectrum%energy_step + spectrum%min_energy
1287 fsum = fsum + energy * aimag(chi(ie))
1288 end do
1289 fsum = spectrum%energy_step * fsum * 2/sum(kick%qvector(:,1)**2)
1290
1291 write(out_file, '(a)') '#%'
1292 write(out_file, '(a,i8)') '# Number of time steps = ', time_steps
1293 call spectrum_write_info(spectrum, out_file)
1294 write(out_file, '(a,3f9.5)') '# qvector : ', kick%qvector
1295 write(out_file, '(a,f10.4)') '# F-sum rule : ', fsum
1296 write(out_file, '(a)') '#%'
1297
1298 write(out_file, '(a1,a20)', advance = 'no') '#', str_center("Energy", 20)
1299 write(header_string,'(a3)') 'chi'
1300 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
1301 write(out_file, '(1x)')
1302 write(out_file, '(a1,a20)', advance = 'no') '#', str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20)
1303 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%energy)) // '**(-1)]', 20)
1304 write(out_file, '(1x)')
1305
1306 do ie = 1, no_e
1307 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, &
1308 (ie-1) * spectrum%energy_step + spectrum%min_energy)
1309 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy**(-1), aimag(chi(ie)))
1310 write(out_file, '(1x)')
1311 end do
1312
1313 safe_deallocate_a(ftchd)
1314 safe_deallocate_a(chi)
1316
1317 end subroutine spectrum_dyn_structure_factor
1318
1319
1320 ! ---------------------------------------------------------
1321 subroutine spectrum_rotatory_strength(spectrum, namespace, in_file, out_file)
1322 type(spectrum_t), intent(inout) :: spectrum
1323 type(namespace_t), intent(in) :: namespace
1324 integer, intent(in) :: in_file
1325 integer, intent(in) :: out_file
1326
1327 integer :: istart, iend, ntiter, ie, idir, time_steps, no_e, nspin, trash, it
1328 real(real64) :: dump, dt, energy
1329 type(kick_t) :: kick
1330 complex(real64) :: sum1, sum2, sp
1331 real(real64), allocatable :: angular(:, :), resp(:), imsp(:)
1332 type(batch_t) :: angularb, respb, imspb
1333 type(unit_system_t) :: file_units
1334
1336
1337 call spectrum_mult_info(namespace, in_file, nspin, kick, time_steps, dt, file_units)
1338 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1339
1340 if (kick%dim /= 3) then
1341 message(1) = "Rotatory strength can only be computed for 3D systems."
1342 call messages_fatal(1, namespace=namespace)
1343 end if
1344
1345 ! load angular momentum from file
1346 safe_allocate(angular(0:time_steps, 1:3))
1347 call io_skip_header(in_file)
1348 do ie = 0, time_steps
1349 read(in_file, *) trash, dump, (angular(ie, idir), idir = 1, 3)
1350 end do
1351
1352 ! subtract static dipole
1353 do idir = 1, 3
1354 angular(:, idir) = angular(:, idir) - angular(0, idir)
1355 end do
1356
1357 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1358
1359 no_e = spectrum_nenergy_steps(spectrum)
1360
1361 do it = istart, iend
1362 angular(it, 1) = sum(angular(it, 1:3)*kick%pol(1:3, kick%pol_dir))
1363 end do
1364
1365 safe_allocate(resp(1:no_e))
1366 safe_allocate(imsp(1:no_e))
1367
1368 call batch_init(angularb, angular(:, 1))
1369 call batch_init(respb, resp)
1370 call batch_init(imspb, imsp)
1371
1372 call spectrum_signal_damp(spectrum%damp, spectrum%damp_factor, istart + 1, iend + 1, kick%time, dt, angularb)
1373
1374 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
1375 istart + 1, iend + 1, kick%time, dt, angularb, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, respb)
1376 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
1377 istart + 1, iend + 1, kick%time, dt, angularb, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, imspb)
1378
1379 call angularb%end()
1380 call respb%end()
1381 call imspb%end()
1382
1383 sum1 = m_z0
1384 sum2 = m_z0
1385 if (abs(kick%delta_strength) < 1.d-12) kick%delta_strength = m_one
1386 do ie = 1, no_e
1387 energy = (ie-1) * spectrum%energy_step + spectrum%min_energy
1388
1389 sp = cmplx(resp(ie), imsp(ie), real64)
1390
1391 sp = sp*m_zi/(m_two*p_c*kick%delta_strength)
1392
1393 sum1 = sum1 + spectrum%energy_step*sp
1394 sum2 = sum2 + spectrum%energy_step*sp*energy**2
1395
1396 resp(ie) = real(sp, real64)
1397 imsp(ie) = aimag(sp)
1398 end do
1399
1400 safe_deallocate_a(angular)
1401
1402 ! print some info
1403 write(message(1), '(a,i8)') 'Number of time steps = ', ntiter
1404 write(message(2), '(a,i4)') 'PropagationSpectrumDampMode = ', spectrum%damp
1405 write(message(3), '(a,f10.4)') 'PropagationSpectrumDampFactor = ', units_from_atomic(units_out%time**(-1), spectrum%damp_factor)
1406 write(message(4), '(a,f10.4)') 'PropagationSpectrumStartTime = ', units_from_atomic(units_out%time, spectrum%start_time)
1407 write(message(5), '(a,f10.4)') 'PropagationSpectrumEndTime = ', units_from_atomic(units_out%time, spectrum%end_time)
1408 write(message(6), '(a,f10.4)') 'PropagationSpectrumMaxEnergy = ', units_from_atomic(units_inp%energy, spectrum%max_energy)
1409 write(message(7),'(a,f10.4)') 'PropagationSpectrumEnergyStep = ', units_from_atomic(units_inp%energy, spectrum%energy_step)
1410 message(8) = ""
1411 write(message(9), '(a,5e15.6,5e15.6)') 'R(0) sum rule = ', sum1
1412 write(message(10),'(a,5e15.6,5e15.6)') 'R(2) sum rule = ', sum2
1413 call messages_info(10, namespace=namespace)
1415
1416 ! Output to file
1417 write(out_file, '(a15,i2)') '# nspin ', nspin
1418 call kick_write(kick, out_file)
1419 write(out_file, '(a1,a20,a20,a20)') '#', str_center("Energy", 20), str_center("R", 20), str_center("Re[beta]", 20)
1420 write(out_file, '(a1,a20,a20,a20)') '#', str_center('[' // trim(units_abbrev(units_out%energy)) // ']', 20), &
1421 str_center('[' // trim(units_abbrev(units_out%length**3)) // ']', 20), &
1422 str_center('[' // trim(units_abbrev(units_out%length**4)) // ']', 20)
1423 write(out_file, '(a,5e15.6,5e15.6)') '# R(0) sum rule = ', sum1
1424 write(out_file, '(a,5e15.6,5e15.6)') '# R(2) sum rule = ', sum2
1425 do ie = 1, no_e
1426 write(out_file,'(e20.8,e20.8,e20.8)') units_from_atomic(units_out%energy, (ie-1)*spectrum%energy_step+spectrum%min_energy), &
1427 units_from_atomic(units_out%length**3, imsp(ie)/m_pi), &
1428 units_from_atomic(units_out%length**4, resp(ie)*p_c/(m_three*max((ie-1),1)*spectrum%energy_step))
1429 end do
1430
1431 safe_deallocate_a(resp)
1432 safe_deallocate_a(imsp)
1433
1435 end subroutine spectrum_rotatory_strength
1436 ! ---------------------------------------------------------
1437
1438
1439 ! ---------------------------------------------------------
1440 subroutine spectrum_hsfunction_init(dt, is, ie, niter, acc)
1441 real(real64), intent(in) :: dt
1442 integer, intent(in) :: is, ie, niter
1443 complex(real64), intent(in) :: acc(:)
1444
1445 integer :: nn(3), j, optimize_parity(3)
1446 logical :: optimize(3)
1447
1448 push_sub(spectrum_hsfunction_init)
1449
1450 is_ = is
1451 ie_ = ie
1452 time_step_ = dt
1453 niter_ = niter
1454 energy_step_ = (m_two * m_pi) / (niter * time_step_)
1455 safe_allocate(func_(0:niter))
1456 safe_allocate(funcw_(0:niter))
1457 func_ = m_z0
1458 func_ = acc
1459 nn(1:3) = (/ niter, 1, 1 /)
1460 optimize(1:3) = .false.
1461 optimize_parity(1:3) = -1
1462
1463 call fft_init(fft_handler, nn(1:3), 1, fft_complex, fftlib_fftw, optimize, optimize_parity)
1464 call zfft_forward(fft_handler, func_(0:niter-1), funcw_(0:niter-1))
1465 do j = 0, niter - 1
1466 funcw_(j) = -abs(funcw_(j))**2 * dt**2
1467 end do
1468
1470 end subroutine spectrum_hsfunction_init
1471 ! ---------------------------------------------------------
1472
1473
1474 ! ---------------------------------------------------------
1475 subroutine spectrum_hsfunction_end
1476
1477 push_sub(spectrum_hsfunction_end)
1478
1479 call fft_end(fft_handler)
1480
1481 safe_deallocate_a(func_)
1482 safe_deallocate_a(funcw_)
1484 end subroutine spectrum_hsfunction_end
1485 ! ---------------------------------------------------------
1486
1487
1488 ! ---------------------------------------------------------
1489 subroutine spectrum_hsfunction_min(namespace, aa, bb, omega_min, func_min)
1490 type(namespace_t), intent(in) :: namespace
1491 real(real64), intent(in) :: aa, bb
1492 real(real64), intent(out) :: omega_min, func_min
1493
1494 integer :: ierr, ie
1495 real(real64) :: xx, hsval, minhsval, ww, xa, xb, hxa, hxb
1496
1497 push_sub(spectrum_hsfunction_min)
1498
1499 ! xx should be an initial guess for the minimum. So we do a quick search
1500 ! that we refine later calling 1dminimize.
1501 !xx = omega
1502 !call hsfunction(xx, minhsval)
1503
1504 ierr = 0
1505
1506 ie = int(aa/energy_step_)
1507 ww = ie * energy_step_
1508 if (ww < aa) then
1509 ie = ie + 1
1510 ww = ie * energy_step_
1511 end if
1512 xx = ie * energy_step_
1513 minhsval = real(funcw_(ie), real64)
1514 do while(ww <= bb)
1515 hsval = real(funcw_(ie), real64)
1516 if (hsval < minhsval) then
1517 minhsval = hsval
1518 xx = ww
1519 end if
1520 ie = ie + 1
1521 ww = ie * energy_step_
1522 end do
1523
1524 ! Around xx, we call some GSL sophisticated search algorithm to find the minimum.
1525 ! First, we get the value of the function at the extremes of the interval
1526 xa = max(xx-energy_step_, aa)
1527 xb = min(xx+energy_step_, bb)
1528 call hsfunction(xa, hxa)
1529 call hsfunction(xb, hxb)
1530
1531 if (hxa <= minhsval) then
1532 xx = xa
1533 minhsval = hxa
1534 elseif (hxb <= minhsval) then
1535 xx = xb
1536 minhsval = hxb
1537 else
1538 call loct_1dminimize(xa, xb, xx, hsfunction, ierr)
1539 end if
1540
1541 if (ierr /= 0) then
1542 write(message(1),'(a,f14.6,a)') 'spectrum_hsfunction_min: The maximum at', xx,' was not properly converged.'
1543 write(message(2),'(a,i12)') 'Error code: ', ierr
1544 call messages_warning(2, namespace=namespace)
1545 end if
1546 call hsfunction(xx, hsval)
1547 omega_min = xx
1548 func_min = hsval
1549
1551 end subroutine spectrum_hsfunction_min
1552 ! ---------------------------------------------------------
1553
1554
1555 ! ---------------------------------------------------------
1556 subroutine hsfunction(omega, power)
1557 real(real64), intent(in) :: omega
1558 real(real64), intent(out) :: power
1559
1560 complex(real64) :: cc, ez1, ez, zz
1561 integer :: jj,dir
1562
1563 push_sub(hsfunction)
1564
1565 cc = m_z0
1566 zz = m_zi * omega * time_step_
1567 ez1 = exp((is_ - 1) * zz)
1568 ez = exp(zz)
1569 do jj = is_, ie_
1570 ez1 = ez1 * ez
1571 cc = cc + ez1 * func_(jj)
1572 end do
1573 power = -abs(cc)**2 * time_step_**2
1574
1575 if (allocated(func_ar_)) then
1576 power = m_zero
1577 do dir = 1, 3
1578 ez1 = exp((is_ - 1) * zz)
1579 cc = m_z0
1580 do jj = is_, ie_
1581 ! This would be easier, but slower.
1582 !cc = cc + exp(M_zI * omega * jj * time_step_) * func_(jj)
1583 ez1 = ez1 * ez
1584 cc = cc + ez1 * func_ar_(dir,jj) &
1585 *exp(-m_zi * omega * tret_(jj)) !integrate over the retarded time
1586 end do
1587 power = power - abs(cc)**2 * time_step_**2
1588! pp(dir) = cc * time_step_
1589 end do
1590! power = - sum(abs(zcross_product(vv_, pp))**2)
1591
1592 end if
1593
1594
1595 pop_sub(hsfunction)
1596 end subroutine hsfunction
1597 ! ---------------------------------------------------------
1598
1599 ! ---------------------------------------------------------
1600 subroutine spectrum_hsfunction_ar_init(dt, is, ie, niter, acc, pos,tret)
1601 real(real64), intent(in) :: dt
1602 integer, intent(in) :: is, ie, niter
1603 complex(real64), intent(in) :: acc(:,:),pos(:,:),tret(:)
1604
1606
1607 is_ = is
1608 ie_ = ie
1609 time_step_ = dt
1610 safe_allocate(func_ar_(1:3, 0:niter))
1611 safe_allocate(pos_(1:3, 0:niter))
1612 safe_allocate(tret_(0:niter))
1613 func_ar_ = acc
1614 pos_= pos
1615 tret_=tret
1616
1617
1619 end subroutine spectrum_hsfunction_ar_init
1620 ! ---------------------------------------------------------
1621
1622
1623 ! ---------------------------------------------------------
1624 ! FIXME: why is this never called?
1626
1628
1629 safe_deallocate_a(func_ar_)
1630 safe_deallocate_a(pos_)
1631 safe_deallocate_a(tret_)
1632
1634 end subroutine spectrum_hsfunction_ar_end
1635 ! ---------------------------------------------------------
1636
1637 ! ---------------------------------------------------------
1638 subroutine spectrum_hs_ar_from_acc(spectrum, namespace, out_file, vec, w0)
1639 type(spectrum_t), intent(inout) :: spectrum
1640 type(namespace_t), intent(in) :: namespace
1641 character(len=*), intent(in) :: out_file
1642 real(real64), intent(in) :: vec(:)
1643 real(real64), optional, intent(in) :: w0
1644
1645 integer :: istep, trash, iunit, nspin, time_steps, istart, iend, ntiter, lmax, ierr, jj
1646 real(real64) :: dt, dump, aa(3)
1647 complex(real64) :: nn(3)
1648 type(kick_t) :: kick
1649 real(real64), allocatable :: dd(:,:)
1650 complex(real64), allocatable :: acc(:,:),PP(:,:),pos(:,:),tret(:)
1651 real(real64) :: vv(3)
1652 type(unit_system_t) :: file_units
1653
1654 push_sub(spectrum_hs_ar_from_acc)
1655
1656 call spectrum_tdfile_info(namespace, 'acceleration', iunit, time_steps, dt)
1657 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1658
1659 ! load dipole from file
1660 safe_allocate(acc(1:3, 0:time_steps))
1661 safe_allocate(pp(1:3, 0:time_steps))
1662 safe_allocate(pos(1:3, 0:time_steps))
1663 safe_allocate(tret(0:time_steps))
1664
1665 acc = m_zero
1666 pos = m_zero
1667 pp = m_zero
1668 nn = m_zero
1669 tret = m_zero
1670
1671 call io_skip_header(iunit)
1672 do istep = 0, time_steps-1
1673 aa = m_zero
1674 read(iunit, '(28x,e20.12)', advance = 'no', iostat = ierr) aa(1)
1675 jj = 2
1676 do while((ierr == 0) .and. (jj <= 3))
1677 read(iunit, '(e20.12)', advance = 'no', iostat = ierr) aa(jj)
1678 jj = jj+1
1679 end do
1680
1681! read(iunit, *) trash, dump, aa
1682
1683 acc(:,istep) = units_to_atomic(units_out%acceleration, aa(:))
1684! write (*,*) istep, Real(acc(:,istep))
1685 end do
1686 close(iunit)
1687
1688
1689 ! Try to get the trajectory from multipole file
1690
1691 iunit = io_open('multipoles', namespace, action='read', status='old', die=.false.)
1692 if (iunit < 0) then
1693 iunit = io_open('td.general/multipoles', namespace, action='read', status='old')
1694 end if
1695 if (.not.(iunit < 0)) then
1696 call spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1697 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1698
1699 call io_skip_header(iunit)
1700! write (*,*)
1701
1702 safe_allocate(dd(1:3, 1:nspin))
1703 do istep = 0, time_steps-1
1704 read(iunit, *) trash, dump, dump, dd
1705 pos(1:3, istep) = -sum(dd(1:3, :),2)
1706 pos(:,istep) = units_to_atomic(units_out%length, pos(:,istep))
1707! write (*,*) istep, Real(pos(:,istep))
1708 end do
1709 safe_deallocate_a(dd)
1710 pos(:,0) = pos(:,1)
1711 call io_close(iunit)
1712
1713 end if
1714
1715! write (*,*)
1716
1717 ! normalize vector and set to global var
1718! vv = vec / sqrt(sum(vec(:)**2))
1719 vv(1:3) = vec(1:3)
1720
1721 pp(:,0) = m_zero
1722 do istep = 0, time_steps - 1
1723 nn(:) = vv(:)-pos(:,istep)
1724 nn(:) = nn(:)/norm2(abs(nn(:)))
1725 tret(istep) = dot_product(vv(:), real(pos(:,istep), real64))/p_c
1726 pp(:,istep) = zcross_product(nn, zcross_product(nn, acc(:,istep)))
1727! write (*,*) istep, Real(PP(:,istep)),"acc", Real(acc(:,istep))
1728 end do
1729
1730 call spectrum_hsfunction_ar_init(dt, istart, iend, time_steps, pp, pos, tret)
1731 call spectrum_hs(spectrum, namespace, out_file, 'a', w0)
1733
1734 safe_deallocate_a(acc)
1735 safe_deallocate_a(pp)
1736 safe_deallocate_a(pos)
1737 safe_deallocate_a(tret)
1738
1740 end subroutine spectrum_hs_ar_from_acc
1741 ! ---------------------------------------------------------
1742
1743
1744 ! ---------------------------------------------------------
1745 subroutine spectrum_hs_ar_from_mult(spectrum, namespace, out_file, vec, w0)
1746 type(spectrum_t), intent(inout) :: spectrum
1747 type(namespace_t), intent(in) :: namespace
1748 character(len=*), intent(in) :: out_file
1749 real(real64), intent(in) :: vec(:)
1750 real(real64), optional, intent(in) :: w0
1751
1752 integer :: istep, trash, iunit, nspin, time_steps, istart, iend, ntiter, lmax
1753 real(real64) :: dt, dump
1754 type(kick_t) :: kick
1755 real(real64), allocatable :: dd(:,:)
1756 complex(real64), allocatable :: dipole(:,:), ddipole(:,:), pp(:,:), tret(:)
1757 complex(real64) :: vv(3)
1758 type(unit_system_t) :: file_units
1759
1760 push_sub(spectrum_hs_ar_from_mult)
1761
1762
1763 iunit = io_open('multipoles', namespace, action='read', status='old', die=.false.)
1764 if (iunit < 0) then
1765 iunit = io_open('td.general/multipoles', namespace, action='read', status='old')
1766 end if
1767 call spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1768 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1769
1770 call io_skip_header(iunit)
1771
1772 ! load dipole from file
1773 safe_allocate(dipole(1:3, 0:time_steps))
1774 safe_allocate(ddipole(1:3, 0:time_steps))
1775 safe_allocate(pp(1:3, 0:time_steps))
1776 safe_allocate(tret(0:time_steps))
1777 safe_allocate(dd(1:3, 1:nspin))
1778
1779 tret= m_zero
1780
1781 do istep = 1, time_steps
1782 read(iunit, *) trash, dump, dump, dd
1783 dipole(1:3, istep) = -sum(dd(1:3, :),2)
1784 dipole(:,istep) = units_to_atomic(units_out%length, dipole(:,istep))
1785 end do
1786 safe_deallocate_a(dd)
1787 dipole(:,0) = dipole(:,1)
1788 call io_close(iunit)
1789
1790 ! we now calculate the acceleration.
1791 ddipole(:,0) = m_zero
1792 do istep = 1, time_steps - 1
1793 ddipole(:,istep) = (dipole(:,istep - 1) + dipole(:,istep + 1) - m_two * dipole(:,istep)) / dt**2
1794 end do
1795 call interpolate(dt*(/ -3, -2, -1 /), &
1796 ddipole(1,time_steps - 3:time_steps - 1), &
1797 m_zero, &
1798 ddipole(1,time_steps))
1799 call interpolate(dt*(/ -3, -2, -1 /), &
1800 ddipole(2,time_steps - 3:time_steps - 1), &
1801 m_zero, &
1802 ddipole(2,time_steps))
1803 call interpolate(dt*(/ -3, -2, -1 /), &
1804 ddipole(3,time_steps - 3:time_steps - 1), &
1805 m_zero, &
1806 ddipole(3,time_steps))
1807
1808 ! normalize vector and set to global var
1809 vv(1:3) = vec(1:3) / norm2(vec(1:3))
1810
1811 pp(:,0) = m_zero
1812 do istep = 1, time_steps - 1
1813! write (*,*) istep, istep*dt, Real(ddipole(1,istep)), Real(ddipole(2,istep))
1814 tret(istep) = dot_product(vv(:), dipole(:,istep))/p_c
1815 pp(:,istep) = zcross_product(vv, zcross_product(vv, ddipole(:,istep - 1)))
1816! PP(istep) = sum(abs(dipole(:,istep))**2)
1817! write(*,*) istep, PP(istep)
1818
1819 end do
1820
1821
1822 call spectrum_hsfunction_ar_init(dt, istart, iend, time_steps, pp, dipole,tret)
1823 call spectrum_hs(spectrum, namespace, out_file, 'a', w0)
1825
1826 safe_deallocate_a(dipole)
1827 safe_deallocate_a(ddipole)
1828 safe_deallocate_a(pp)
1829 safe_deallocate_a(tret)
1830
1831
1833 end subroutine spectrum_hs_ar_from_mult
1834 ! ---------------------------------------------------------
1835
1836
1837 ! ---------------------------------------------------------
1838 subroutine spectrum_hs_from_mult(spectrum, namespace, out_file, pol, vec, w0)
1839 type(spectrum_t), intent(inout) :: spectrum
1840 type(namespace_t), intent(in) :: namespace
1841 character(len=*), intent(in) :: out_file
1842 character, intent(in) :: pol
1843 real(real64), intent(in) :: vec(:)
1844 real(real64), optional, intent(in) :: w0
1845
1846 integer :: istep, trash, iunit, nspin, time_steps, istart, iend, ntiter, lmax, no_e, ie, idir, ispin
1847 real(real64) :: dt, dump, vv(3)
1848 type(kick_t) :: kick
1849 real(real64), allocatable :: dd(:,:)
1850 real(real64), allocatable :: sps(:), spc(:), racc(:)
1851 complex(real64), allocatable :: dipole(:), ddipole(:)
1852 type(batch_t) :: acc_batch, sps_batch, spc_batch
1853 type(unit_system_t) :: file_units
1854
1855 push_sub(spectrum_hs_from_mult)
1856
1857 iunit = io_open('multipoles', namespace, action='read', status='old', die=.false.)
1858 if (iunit < 0) then
1859 iunit = io_open('td.general/multipoles', namespace, action='read', status='old')
1860 end if
1861 call spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1862 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1863
1864 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1865
1866 call io_skip_header(iunit)
1867
1868 ! load dipole from file
1869 safe_allocate(dipole(0:time_steps))
1870 safe_allocate(ddipole(0:time_steps))
1871 safe_allocate(dd(1:3, 1:nspin))
1872
1873 vv(1:3) = vec(1:3) / norm2(vec(1:3))
1874
1875 do istep = 1, time_steps
1876 dd = m_zero
1877 read(iunit, *) trash, dump, (dump, (dd(idir, ispin), idir = 1, kick%dim), ispin = 1, nspin)
1878 select case (pol)
1879 case ('x')
1880 dipole(istep) = -sum(dd(1, :))
1881 case ('y')
1882 dipole(istep) = -sum(dd(2, :))
1883 case ('z')
1884 dipole(istep) = sum(dd(3, :))
1885 case ('+')
1886 dipole(istep) = -sum(dd(1, :) + m_zi * dd(2, :)) / sqrt(m_two)
1887 case ('-')
1888 dipole(istep) = -sum(dd(1, :) - m_zi * dd(2, :)) / sqrt(m_two)
1889 case ('v')
1890 dipole(istep) = -sum(vv(1)*dd(1, :) + vv(2)*dd(2, :) + vv(3)*dd(3, :))
1891 end select
1892 dipole(istep) = units_to_atomic(units_out%length, dipole(istep))
1893 end do
1894 safe_deallocate_a(dd)
1895 dipole(0) = dipole(1)
1896 call io_close(iunit)
1897
1898 ! we now calculate the acceleration.
1899 ddipole(0) = m_zero
1900 do istep = 1, time_steps - 1
1901 ddipole(istep) = (dipole(istep - 1) + dipole(istep + 1) - m_two * dipole(istep)) / dt**2
1902 end do
1903 call interpolate( dt*(/ -3, -2, -1 /), &
1904 ddipole(time_steps - 3:time_steps - 1), &
1905 m_zero, &
1906 ddipole(time_steps))
1907
1908 if (present(w0)) then
1909
1910 call spectrum_hsfunction_init(dt, istart, iend, time_steps, ddipole)
1911 call spectrum_hs(spectrum, namespace, out_file, pol, w0)
1913
1914 else
1915
1916 safe_allocate(racc(0:time_steps))
1917 racc = real(ddipole, real64)
1918
1919 no_e = spectrum_nenergy_steps(spectrum)
1920 safe_allocate(sps(1:no_e))
1921 safe_allocate(spc(1:no_e))
1922 sps = m_zero
1923 spc = m_zero
1924
1925 call batch_init(acc_batch, racc)
1926 call batch_init(sps_batch, sps)
1927 call batch_init(spc_batch, spc)
1928
1929 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
1930 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, spc_batch)
1931 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
1932 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sps_batch)
1933
1934 do ie = 1, no_e
1935 sps(ie) = (sps(ie)**2 + spc(ie)**2)
1936 end do
1937
1938 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sps)
1939
1940 call acc_batch%end()
1941 call sps_batch%end()
1942 call spc_batch%end()
1943
1944 safe_deallocate_a(racc)
1945
1946 end if
1947
1948 safe_deallocate_a(dipole)
1949 safe_deallocate_a(ddipole)
1950
1951 pop_sub(spectrum_hs_from_mult)
1952 end subroutine spectrum_hs_from_mult
1953 ! ---------------------------------------------------------
1954
1955
1956 ! ---------------------------------------------------------
1957 subroutine spectrum_hs_from_acc(spectrum, namespace, out_file, pol, vec, w0)
1958 type(spectrum_t), intent(inout) :: spectrum
1959 type(namespace_t), intent(in) :: namespace
1960 character(len=*), intent(in) :: out_file
1961 character, intent(in) :: pol
1962 real(real64), intent(in) :: vec(:)
1963 real(real64), optional, intent(in) :: w0
1964
1965 integer :: istep, jj, iunit, time_steps, istart, iend, ntiter, ierr, no_e, ie
1966 real(real64) :: dt, aa(3), vv(3)
1967 complex(real64), allocatable :: acc(:)
1968 real(real64), allocatable :: racc(:), sps(:), spc(:)
1969 type(batch_t) :: acc_batch, sps_batch, spc_batch
1970
1971 push_sub(spectrum_hs_from_acc)
1972
1973 call spectrum_tdfile_info(namespace, 'acceleration', iunit, time_steps, dt)
1974 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1975
1976 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1977
1978 ! load dipole from file
1979 safe_allocate(acc(0:time_steps))
1980 acc = m_zero
1981 vv = vec / norm2(vec(:))
1982 call io_skip_header(iunit)
1983
1984 do istep = 1, time_steps
1985 aa = m_zero
1986 read(iunit, '(28x,e20.12)', advance = 'no', iostat = ierr) aa(1)
1987 jj = 2
1988 do while((ierr == 0) .and. (jj <= 3))
1989 read(iunit, '(e20.12)', advance = 'no', iostat = ierr) aa(jj)
1990 jj = jj + 1
1991 end do
1992 select case (pol)
1993 case ('x')
1994 acc(istep) = aa(1)
1995 case ('y')
1996 acc(istep) = aa(2)
1997 case ('z')
1998 acc(istep) = aa(3)
1999 case ('+')
2000 acc(istep) = (aa(1) + m_zi * aa(2)) / sqrt(m_two)
2001 case ('-')
2002 acc(istep) = (aa(1) - m_zi * aa(2)) / sqrt(m_two)
2003 case ('v')
2004 acc(istep) = vv(1)*aa(1) + vv(2)*aa(2) + vv(3)*aa(3)
2005 end select
2006 acc(istep) = units_to_atomic(units_out%acceleration, acc(istep))
2007 end do
2008 close(iunit)
2009
2010 if (present(w0)) then
2011
2012 call spectrum_hsfunction_init(dt, istart, iend, time_steps, acc)
2013 call spectrum_hs(spectrum, namespace, out_file, pol, w0)
2015
2016 else
2017
2018 safe_allocate(racc(0:time_steps))
2019 racc = real(acc, real64)
2020
2021 no_e = spectrum_nenergy_steps(spectrum)
2022 safe_allocate(sps(1:no_e))
2023 safe_allocate(spc(1:no_e))
2024 sps = m_zero
2025 spc = m_zero
2026
2027 call batch_init(acc_batch, racc)
2028 call batch_init(sps_batch, sps)
2029 call batch_init(spc_batch, spc)
2030
2031 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
2032 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, &
2033 spectrum%max_energy, spectrum%energy_step, spc_batch)
2034 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
2035 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, &
2036 spectrum%max_energy, spectrum%energy_step, sps_batch)
2037
2038 do ie = 1, no_e
2039 sps(ie) = (sps(ie)**2 + spc(ie)**2)
2040 end do
2041
2042 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sps)
2043
2044 call acc_batch%end()
2045 call sps_batch%end()
2046 call spc_batch%end()
2047
2048 safe_deallocate_a(racc)
2049
2050 end if
2051
2052 safe_deallocate_a(acc)
2053 pop_sub(spectrum_hs_from_acc)
2054 end subroutine spectrum_hs_from_acc
2055 ! ---------------------------------------------------------
2056
2057 ! ---------------------------------------------------------
2058 subroutine spectrum_hs_from_current(spectrum, namespace, out_file, pol, vec, w0)
2059 type(spectrum_t), intent(inout) :: spectrum
2060 type(namespace_t), intent(in) :: namespace
2061 character(len=*), intent(in) :: out_file
2062 character, intent(in) :: pol
2063 real(real64), intent(in) :: vec(:)
2064 real(real64), optional, intent(in) :: w0
2065
2066 integer :: istep, jj, iunit, time_steps, istart, iend, ntiter, ierr, no_e, ie
2067 real(real64) :: dt, cc(3), vv(3)
2068 complex(real64), allocatable :: cur(:)
2069 real(real64), allocatable :: rcur(:), sps(:), spc(:)
2070 type(batch_t) :: cur_batch, sps_batch, spc_batch
2071
2072 push_sub(spectrum_hs_from_current)
2073
2074 call spectrum_tdfile_info(namespace, 'total_current', iunit, time_steps, dt)
2075 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
2076
2077 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt * time_steps)
2078
2079 ! load dipole from file
2080 safe_allocate(cur(0:time_steps))
2081 cur = m_zero
2082 vv = vec / norm2(vec(:))
2083 call io_skip_header(iunit)
2084
2085 do istep = 1, time_steps
2086 cc = m_zero
2087 read(iunit, '(28x,e20.12)', advance = 'no', iostat = ierr) cc(1)
2088 jj = 2
2089 do while((ierr == 0) .and. (jj <= 3))
2090 read(iunit, '(e20.12)', advance = 'no', iostat = ierr) cc(jj)
2091 jj = jj + 1
2092 end do
2093 select case (pol)
2094 case ('x')
2095 cur(istep) = cc(1)
2096 case ('y')
2097 cur(istep) = cc(2)
2098 case ('z')
2099 cur(istep) = cc(3)
2100 case ('+')
2101 cur(istep) = (cc(1) + m_zi * cc(2)) / sqrt(m_two)
2102 case ('-')
2103 cur(istep) = (cc(1) - m_zi * cc(2)) / sqrt(m_two)
2104 case ('v')
2105 cur(istep) = vv(1)*cc(1) + vv(2)*cc(2) + vv(3)*cc(3)
2106 end select
2107 cur(istep) = units_to_atomic(units_out%velocity, cur(istep))
2108 end do
2109 close(iunit)
2110
2111 if (present(w0)) then
2112
2113 call spectrum_hsfunction_init(dt, istart, iend, time_steps, cur)
2114 call spectrum_hs(spectrum, namespace, out_file, pol, w0)
2116
2117 else
2118
2119 safe_allocate(rcur(0:time_steps))
2120 rcur = real(cur, real64)
2121
2122 no_e = spectrum_nenergy_steps(spectrum)
2123 safe_allocate(sps(1:no_e))
2124 safe_allocate(spc(1:no_e))
2125 sps = m_zero
2126 spc = m_zero
2127
2128 call batch_init(cur_batch, rcur)
2129 call batch_init(sps_batch, sps)
2130 call batch_init(spc_batch, spc)
2131
2132 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
2133 istart + 1, iend + 1, m_zero, dt, cur_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, spc_batch)
2134 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
2135 istart + 1, iend + 1, m_zero, dt, cur_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sps_batch)
2136
2137 do ie = 1, no_e
2138 sps(ie) = (sps(ie)**2 + spc(ie)**2) * ((ie-1) * spectrum%energy_step + spectrum%min_energy)**2
2139 end do
2140
2141 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sps)
2142
2143 call cur_batch%end()
2144 call sps_batch%end()
2145 call spc_batch%end()
2146
2147 safe_deallocate_a(rcur)
2148
2149 end if
2150
2151 safe_deallocate_a(cur)
2153 end subroutine spectrum_hs_from_current
2154
2155
2156 ! ---------------------------------------------------------
2157 subroutine spectrum_hs(spectrum, namespace, out_file, pol, w0)
2158 type(spectrum_t), intent(inout) :: spectrum
2159 type(namespace_t), intent(in) :: namespace
2160 character(len=*), intent(in) :: out_file
2161 character, intent(in) :: pol
2162 real(real64), optional, intent(in) :: w0
2163
2164 integer :: iunit, no_e, ie
2165 real(real64) :: omega, hsval, xx
2166 real(real64), allocatable :: sp(:)
2167
2168 push_sub(spectrum_hs)
2169
2170 if (present(w0)) then
2171
2172 iunit = io_open(trim(out_file) // "." // trim(pol), namespace, action='write')
2173 write(iunit, '(a1,a20,a20)') '#', str_center("w", 20), str_center("H(w)", 20)
2174 write(iunit, '(a1,a20,a20)') '#', &
2175 str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20), &
2176 str_center('[('//trim(units_abbrev(units_out%length))//'/' &
2177 //trim(units_abbrev(units_out%time**2)), 20)
2178
2179 ! output
2180 omega = w0
2181 do while(omega <= spectrum%max_energy)
2182 call spectrum_hsfunction_min(namespace, omega - w0, omega + w0, xx, hsval)
2183
2184 write(iunit, '(1x,2e20.8)') units_from_atomic(units_out%energy, xx), &
2185 units_from_atomic((units_out%length / units_out%time)**2, -hsval)
2186
2187 ! 2 * w0 because we assume that there are only odd peaks.
2188 omega = omega + 2 * w0
2189 end do
2190 call io_close(iunit)
2191
2192 else
2193 no_e = spectrum_nenergy_steps(spectrum)
2194 safe_allocate(sp(1:no_e))
2195 sp = m_zero
2196
2197 do ie = 1, no_e
2198 call hsfunction((ie-1) * spectrum%energy_step + spectrum%min_energy, sp(ie))
2199 sp(ie) = -sp(ie)
2200 end do
2201
2202 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sp)
2203
2204 safe_deallocate_a(sp)
2205
2206 end if
2207
2208 pop_sub(spectrum_hs)
2209 end subroutine spectrum_hs
2210 ! ---------------------------------------------------------
2211
2212
2213 subroutine spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sp)
2214 type(spectrum_t), intent(inout) :: spectrum
2215 type(namespace_t), intent(in) :: namespace
2216 character(len=*), intent(in) :: out_file
2217 character, intent(in) :: pol
2218 integer, intent(in) :: no_e
2219 real(real64), intent(in) :: sp(:)
2220
2221 integer :: iunit, ie
2222
2223 push_sub(spectrum_hs_output)
2224
2225 ! output
2226 if (trim(out_file) /= '-') then
2227 iunit = io_open(trim(out_file) // "." // trim(pol), namespace, action='write')
2228 write(iunit, '(a1,a20,a20)') '#', str_center("w", 20), str_center("H(w)", 20)
2229
2230 write(iunit, '(a1,a20,a20)') &
2231 '#', str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20), &
2232 str_center('[('//trim(units_abbrev(units_out%length))//'/' &
2233 //trim(units_abbrev(units_out%time**2)), 20)
2234
2235 do ie = 1, no_e
2236 write(iunit, '(2e15.6)') units_from_atomic(units_out%energy, (ie-1) * spectrum%energy_step + spectrum%min_energy), &
2237 units_from_atomic((units_out%length / units_out%time)**2, sp(ie))
2238 end do
2239
2240 call io_close(iunit)
2241 end if
2242
2243 pop_sub(spectrum_hs_output)
2244 end subroutine spectrum_hs_output
2245
2246
2247 ! ---------------------------------------------------------
2248 subroutine spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax)
2249 type(namespace_t), intent(in) :: namespace
2250 integer, intent(in) :: iunit
2251 integer, intent(out) :: nspin
2252 type(kick_t), intent(out) :: kick
2253 integer, intent(out) :: time_steps
2254 real(real64), intent(out) :: dt
2255 type(unit_system_t), intent(out) :: file_units
2256 integer, optional, intent(out) :: lmax
2257
2258 integer :: ii
2259 character(len=100) :: line
2260
2261 push_sub(spectrum_mult_info)
2262
2263 rewind(iunit)
2264 read(iunit,*)
2265 read(iunit,*)
2266 read(iunit, '(15x,i2)') nspin
2267 if (present(lmax)) then
2268 read(iunit, '(15x,i2)') lmax
2269 end if
2270 call kick_read(kick, iunit, namespace)
2271 read(iunit, '(a)') line
2272 read(iunit, '(a)') line
2273 call io_skip_header(iunit)
2274
2275 ! Figure out the units of the file
2276 ii = index(line,'eV')
2277 if (ii /= 0) then
2278 call unit_system_get(file_units, units_eva)
2279 else
2280 call unit_system_get(file_units, units_atomic)
2281 end if
2282
2283 call spectrum_count_time_steps(namespace, iunit, time_steps, dt)
2284 dt = units_to_atomic(file_units%time, dt) ! units_out is OK
2285
2286 pop_sub(spectrum_mult_info)
2287 end subroutine spectrum_mult_info
2288 ! ---------------------------------------------------------
2289
2290
2291 ! ---------------------------------------------------------
2292 subroutine spectrum_count_time_steps(namespace, iunit, time_steps, dt)
2293 type(namespace_t), intent(in) :: namespace
2294 integer, intent(in) :: iunit
2295 integer, intent(out) :: time_steps
2296 real(real64), intent(out) :: dt
2297
2298 real(real64) :: t1, t2, dummy
2299 integer :: trash
2300
2301 push_sub(count_time_steps)
2302
2303 ! count number of time_steps
2304 time_steps = 0
2305 t1 = m_zero
2307 do
2308 read(iunit, *, end=100) trash, dummy
2309 time_steps = time_steps + 1
2310 if (time_steps == 1) t1 = dummy
2311 if (time_steps == 2) t2 = dummy
2312 end do
2313100 continue
2314 dt = (t2 - t1)
2315 time_steps = time_steps - 1
2316
2317 if (time_steps < 3) then
2318 message(1) = "Empty file?"
2319 call messages_fatal(1, namespace=namespace)
2320 end if
2321
2322 pop_sub(count_time_steps)
2323 end subroutine spectrum_count_time_steps
2324 ! ---------------------------------------------------------
2325
2326
2327 ! ---------------------------------------------------------
2328 subroutine spectrum_cross_section_info(namespace, iunit, nspin, kick, energy_steps, dw)
2329 type(namespace_t), intent(in) :: namespace
2330 integer, intent(in) :: iunit
2331 integer, intent(out) :: nspin
2332 type(kick_t), intent(out) :: kick
2333 integer, intent(out) :: energy_steps
2334 real(real64), intent(out) :: dw
2335
2336 real(real64) :: dummy, e1, e2
2337
2339
2340 ! read in number of spin components
2341 read(iunit, '(15x,i2)') nspin
2342 call kick_read(kick, iunit, namespace)
2343 call io_skip_header(iunit)
2344
2345 ! count number of time_steps
2346 energy_steps = 0
2347 do
2348 read(iunit, *, end=100) dummy
2349 energy_steps = energy_steps + 1
2350 if (energy_steps == 1) e1 = dummy
2351 if (energy_steps == 2) e2 = dummy
2352 end do
2353100 continue
2354 dw = units_to_atomic(units_out%energy, e2 - e1)
2355
2356 if (energy_steps < 3) then
2357 message(1) = "Empty multipole file?"
2358 call messages_fatal(1, namespace=namespace)
2359 end if
2360
2362 end subroutine spectrum_cross_section_info
2363
2364
2365 ! ---------------------------------------------------------
2366 subroutine spectrum_tdfile_info(namespace, fname, iunit, time_steps, dt)
2367 type(namespace_t), intent(in) :: namespace
2368 character(len=*), intent(in) :: fname
2369 integer, intent(out) :: iunit, time_steps
2370 real(real64), intent(out) :: dt
2371
2372 integer :: trash
2373 real(real64) :: t1, t2, dummy
2374 character(len=256) :: filename
2375
2376 push_sub(spectrum_tdfile_info)
2377
2378 ! open files
2379 filename = trim('td.general/')//trim(fname)
2380 iunit = io_open(filename, namespace, action='read', status='old', die=.false.)
2381
2382 if (iunit < 0) then
2383 filename = trim('./')//trim(fname)
2384 iunit = io_open(filename, namespace, action='read', status='old')
2385 end if
2386
2387
2388 ! read in dipole
2389 call io_skip_header(iunit)
2390
2391 ! count number of time_steps
2392 time_steps = 0
2393 do
2394 read(iunit, *, end=100) trash, dummy
2395 time_steps = time_steps + 1
2396 if (time_steps == 1) t1 = dummy
2397 if (time_steps == 2) t2 = dummy
2398 end do
2399100 continue
2400 dt = units_to_atomic(units_out%time, t2 - t1) ! units_out is OK
2401 time_steps = time_steps - 1
2402
2403 if (time_steps < 3) then
2404 message(1) = "Empty file?"
2405 call messages_fatal(1, namespace=namespace)
2406 end if
2407
2408 rewind(iunit)
2409 pop_sub(spectrum_tdfile_info)
2410 end subroutine spectrum_tdfile_info
2411
2412
2413 ! ---------------------------------------------------------
2414 subroutine spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
2415 type(spectrum_t), intent(inout) :: spectrum
2416 integer, intent(in) :: time_steps
2417 real(real64), intent(in) :: dt
2418 integer, intent(out) :: istart, iend, ntiter
2419
2420 real(real64) :: ts, te, dummy
2422 push_sub(spectrum_fix_time_limits)
2423
2424 ts = m_zero
2425 te = time_steps * dt
2426
2427 if (spectrum%start_time < ts) spectrum%start_time = ts
2428 if (spectrum%start_time > te) spectrum%start_time = te
2429 if (spectrum%end_time > te .or. spectrum%end_time <= m_zero) spectrum%end_time = te
2430 if (spectrum%end_time < ts) spectrum%end_time = ts
2431
2432 if (spectrum%end_time < spectrum%start_time) then
2433 dummy = spectrum%end_time ! swap
2434 spectrum%end_time = spectrum%start_time
2435 spectrum%start_time = dummy
2436 end if
2437 istart = nint(spectrum%start_time / dt)
2438 iend = nint(spectrum%end_time / dt)
2439 ntiter = iend - istart + 1
2440
2441 ! Get default damp factor
2442 if (spectrum%damp /= spectrum_damp_none .and. spectrum%damp /= spectrum_damp_polynomial &
2443 .and. is_close(spectrum%damp_factor, -m_one)) then
2444 select case (spectrum%damp)
2446 spectrum%damp_factor = -log(0.0001_real64)/(spectrum%end_time-spectrum%start_time)
2448 spectrum%damp_factor = sqrt(-log(0.0001_real64)/(spectrum%end_time-spectrum%start_time)**2)
2449 end select
2450 end if
2451
2452
2454 end subroutine spectrum_fix_time_limits
2455
2456 ! -------------------------------------------------------
2457
2458 subroutine spectrum_signal_damp(damp_type, damp_factor, time_start, time_end, t0, time_step, time_function)
2459 integer, intent(in) :: damp_type
2460 real(real64), intent(in) :: damp_factor
2461 integer, intent(in) :: time_start
2462 integer, intent(in) :: time_end
2463 real(real64), intent(in) :: t0
2464 real(real64), intent(in) :: time_step
2465 type(batch_t), intent(inout) :: time_function
2466
2467 integer :: itime, ii
2468 real(real64) :: time
2469 real(real64), allocatable :: weight(:)
2470
2471 push_sub(signal_damp)
2472
2473 assert(time_function%status() == batch_not_packed)
2474
2475 safe_allocate(weight(time_start:time_end))
2476
2477 do itime = time_start, time_end
2478 time = time_step*(itime-1)
2479
2480 ! Gets the damp function
2481 select case (damp_type)
2482 case (spectrum_damp_none)
2483 weight(itime) = m_one
2485 if (time < t0) then
2486 weight(itime) = m_one
2487 else
2488 weight(itime) = exp(-(time - t0)*damp_factor)
2489 end if
2491 if (time < t0) then
2492 weight(itime) = m_one
2493 else
2494 weight(itime) = m_one - m_three*((time - t0) / (time_step * (time_end - 1) - t0))**2 + &
2495 m_two * ((time - t0) / (time_step * (time_end - 1) - t0))**3
2496 end if
2498 if (time < t0) then
2499 weight(itime) = m_one
2500 else
2501 weight(itime) = exp(-(time - t0)**2*damp_factor**2)
2502 end if
2503 case (spectrum_damp_sin)
2504 if (time < t0) then
2505 weight(itime) = m_one
2506 else
2507 weight(itime) = sin(-(time - t0)*m_pi/(time_end+t0))
2508 end if
2509 end select
2510 end do
2511
2512 if (time_function%type() == type_cmplx) then
2513 do ii = 1, time_function%nst_linear
2514 do itime = time_start, time_end
2515 time_function%zff_linear(itime, ii) = weight(itime)*time_function%zff_linear(itime, ii)
2516 end do
2517 end do
2518 else
2519 do ii = 1, time_function%nst_linear
2520 do itime = time_start, time_end
2521 time_function%dff_linear(itime, ii) = weight(itime)*time_function%dff_linear(itime, ii)
2522 end do
2523 end do
2524 end if
2525
2526 safe_deallocate_a(weight)
2527
2528 pop_sub(signal_damp)
2529
2530 end subroutine spectrum_signal_damp
2531 ! -------------------------------------------------------
2532
2533 ! -------------------------------------------------------
2543 subroutine spectrum_fourier_transform(method, transform, noise, time_start, time_end, t0, time_step, time_function, &
2544 energy_start, energy_end, energy_step, energy_function)
2545 integer, intent(in) :: method
2546 integer, intent(in) :: transform
2547 real(real64), intent(in) :: noise
2548 integer, intent(in) :: time_start
2549 integer, intent(in) :: time_end
2550 real(real64), intent(in) :: t0
2551 real(real64), intent(in) :: time_step
2552 type(batch_t), intent(in) :: time_function
2553 real(real64), intent(in) :: energy_start
2554 real(real64), intent(in) :: energy_end
2555 real(real64), intent(in) :: energy_step
2556 type(batch_t), intent(inout) :: energy_function
2557
2558 integer :: itime, ienergy, ii, energy_steps
2559 real(real64) :: energy, sinz, cosz
2560 complex(real64) :: ez, eidt
2561 type(compressed_sensing_t) :: cs
2562
2563 push_sub(fourier_transform)
2564
2565 assert(time_function%nst_linear == energy_function%nst_linear)
2566 assert(time_function%status() == energy_function%status())
2567 assert(time_function%status() == batch_not_packed)
2568 assert(time_function%type() == type_float)
2569 assert(energy_function%type() == type_float)
2570
2571 energy_steps = nint((energy_end-energy_start) / energy_step) + 1
2572
2573 select case (method)
2574
2575 case (spectrum_fourier)
2576
2577 do ienergy = 1, energy_steps
2578
2579 energy = energy_step*(ienergy - 1) + energy_start
2580
2581 do ii = 1, energy_function%nst_linear
2582 energy_function%dff_linear(ienergy, ii) = m_zero
2583 end do
2584
2585 select case (transform)
2586
2587 ! The sine and cosine transforms are computed as the real and imaginary part of the exponential.
2588 ! One can compute the exponential by successive multiplications, instead of calling the sine or
2589 ! cosine function at each time step.
2591
2592 eidt = exp(m_zi * energy * time_step)
2593 ez = exp(m_zi * energy * ((time_start-1)*time_step - t0))
2594 sinz = aimag(ez)
2595 do itime = time_start, time_end
2596 do ii = 1, time_function%nst_linear
2597 energy_function%dff_linear(ienergy, ii) = &
2598 energy_function%dff_linear(ienergy, ii) + &
2599 time_function%dff_linear(itime, ii) * sinz
2600 end do
2601 ez = ez * eidt
2602 sinz = aimag(ez)
2603 end do
2604
2606
2607 eidt = exp(m_zi * energy * time_step)
2608 ez = exp(m_zi * energy * ( (time_start-1)*time_step - t0))
2609 cosz = real(ez, real64)
2610 do itime = time_start, time_end
2611 do ii = 1, time_function%nst_linear
2612 energy_function%dff_linear(ienergy, ii) = &
2613 energy_function%dff_linear(ienergy, ii) + &
2614 time_function%dff_linear(itime, ii) * cosz
2615 end do
2616 ez = ez * eidt
2617 cosz = real(ez, real64)
2618 end do
2619
2621
2622 eidt = exp(-energy * time_step)
2623 ez = exp(-energy * ((time_start - 1) * time_step - t0))
2624 do itime = time_start, time_end
2625 do ii = 1, time_function%nst_linear
2626 energy_function%dff_linear(ienergy, ii) = &
2627 energy_function%dff_linear(ienergy, ii) + &
2628 real( time_function%dff_linear(itime, ii) * ez, real64)
2629 end do
2630 ez = ez * eidt
2631 end do
2632 end select
2633
2634 ! The total sum must be multiplied by time_step in order to get the integral.
2635 do ii = 1, time_function%nst_linear
2636 energy_function%dff_linear(ienergy, ii) = &
2637 energy_function%dff_linear(ienergy, ii) * time_step
2638 end do
2639
2640
2641 end do
2642
2644
2645 call compressed_sensing_init(cs, transform, &
2646 time_end - time_start + 1, time_step, time_step*(time_start - 1) - t0, &
2647 energy_steps, energy_step, energy_start, noise)
2648
2649 do ii = 1, time_function%nst_linear
2650 call compressed_sensing_spectral_analysis(cs, time_function%dff_linear(:, ii), &
2651 energy_function%dff_linear(:, ii))
2652 end do
2653
2654 call compressed_sensing_end(cs)
2655
2656 end select
2657
2658 pop_sub(fourier_transform)
2659
2660 end subroutine spectrum_fourier_transform
2661
2662 ! ---------------------------------------------------------
2663 subroutine spectrum_sigma_diagonalize(namespace, sigma, nspin, energy_step, min_energy, energy_steps, kick)
2664 type(namespace_t), intent(in) :: namespace
2665 real(real64), intent(in) :: sigma(:, :, :, :)
2666 integer, intent(in) :: nspin
2667 real(real64), intent(in) :: energy_step, min_energy
2668 integer, intent(in) :: energy_steps
2669 type(kick_t), optional, intent(in) :: kick
2670
2671 integer :: is, idir, jdir, ie, info, out_file, out_file_t
2672 real(real64), allocatable :: work(:,:)
2673 complex(real64), allocatable :: w(:)
2674 character(len=20) :: header_string
2675 logical :: spins_singlet, spins_triplet, symmetrize
2676 real(real64), allocatable :: pp(:,:), pp2(:,:)
2677
2679
2680
2681 !%Variable PropagationSpectrumSymmetrizeSigma
2682 !%Type logical
2683 !%Default .false.
2684 !%Section Utilities::oct-propagation_spectrum
2685 !%Description
2686 !% The polarizablity tensor has to be real and symmetric. Due to numerical accuracy,
2687 !% that is not extricly conserved when computing it from different time-propations.
2688 !% If <tt>PropagationSpectrumSymmetrizeSigma = yes</tt>, the polarizability tensor is
2689 !% symmetrized before its diagonalizied.
2690 !% This variable is only used if the cross_section_tensor is computed.
2691 !%End
2692 call parse_variable(namespace, 'PropagationSpectrumSymmetrizeSigma', .false., symmetrize)
2693 call messages_print_var_value('PropagationSpectrumSymmetrizeSigma', symmetrize, namespace=namespace)
2694
2695 spins_singlet = .true.
2696 spins_triplet = .false.
2697 if (present(kick)) then
2698 select case (kick_get_type(kick))
2699 case (kick_spin_mode)
2700 spins_triplet = .true.
2701 spins_singlet = .false.
2702 case (kick_spin_density_mode)
2703 spins_triplet = .true.
2704 end select
2705 end if
2706
2707 if (spins_singlet .and. spins_triplet) then
2708 out_file = io_open('cross_section_diagonal-sigma_s', namespace, action='write')
2709 out_file_t = io_open('cross_section_diagonal-sigma_t', namespace, action='write')
2710 else
2711 out_file = io_open('cross_section_diagonal-sigma', namespace, action='write')
2712 end if
2713
2714 write(out_file, '(a1, a20)', advance = 'no') '#', str_center("Energy", 20)
2715 do idir = 1, 3
2716 write(out_file, '(a20)', advance = 'no') str_center("Real part", 20)
2717 if (.not. symmetrize) write(out_file, '(a20)', advance = 'no') str_center("Imaginary part", 20)
2718 do jdir = 1, 3
2719 write(header_string,'(a7,i1,a1,i1,a1,i1,a1)') 'vector(', idir, ',', jdir, ',', is, ')'
2720 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
2721 end do
2722 end do
2723 write(out_file, '(1x)')
2724 write(out_file, '(a1,a20)', advance = 'no') '#', str_center('[' // trim(units_abbrev(units_out%energy)) // ']', 20)
2725
2726 do idir = 1, 3
2727 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2728 if (.not. symmetrize) then
2729 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2730 end if
2731 do jdir = 1, 3
2732 write(out_file, '(a20)', advance = 'no') str_center('[ - ]', 20)
2733 end do
2734 end do
2735 write(out_file, '(1x)')
2736
2737 if (spins_singlet .and. spins_triplet) then
2738 write(out_file_t, '(a1, a20)', advance = 'no') '#', str_center("Energy", 20)
2739 do idir = 1, 3
2740 write(out_file_t, '(a20)', advance = 'no') str_center("Real part", 20)
2741 if (.not. symmetrize) write(out_file_t, '(a20)', advance = 'no') str_center("Imaginary part", 20)
2742 do jdir = 1, 3
2743 write(header_string,'(a7,i1,a1,i1,a1,i1,a1)') 'vector(', idir, ',', jdir, ',', is, ')'
2744 write(out_file_t, '(a20)', advance = 'no') str_center(trim(header_string), 20)
2745 end do
2746 end do
2747 write(out_file_t, '(1x)')
2748 write(out_file_t, '(a1,a20)', advance = 'no') '#', str_center('[' // trim(units_abbrev(units_out%energy)) // ']', 20)
2749
2750 do idir = 1, 3
2751 write(out_file_t, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2752 if (.not. symmetrize) then
2753 write(out_file_t, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2754 end if
2755 do jdir = 1, 3
2756 write(out_file_t, '(a20)', advance = 'no') str_center('[ - ]', 20)
2757 end do
2758 end do
2759 write(out_file_t, '(1x)')
2760 end if
2761
2762 safe_allocate(pp(1:3, 1:3))
2763 if (spins_triplet .and. spins_singlet) then
2764 safe_allocate(pp2(1:3, 1:3))
2765 end if
2766 safe_allocate(w(1:3))
2767 safe_allocate(work(1:3, 1:3))
2768 do ie = 1, energy_steps
2769
2770 pp(:, :) = sigma(:, :, ie, 1)
2771 if (nspin >= 2) then
2772 if (spins_singlet .and. spins_triplet) then
2773 pp2(:, :) = pp(:, :) - sigma(:, :, ie, 2)
2774 pp(:, :) = pp(:, :) + sigma(:, :, ie, 2)
2775 elseif (spins_triplet .and. .not. spins_singlet) then
2776 pp(:, :) = pp(:, :) - sigma(:, :, ie, 2)
2777 elseif (spins_singlet .and. .not. spins_triplet) then
2778 pp(:, :) = pp(:, :) + sigma(:, :, ie, 2)
2779 end if
2780 end if
2781
2782 if (symmetrize) then
2783 do idir = 1, 3
2784 do jdir = idir + 1, 3
2785 pp(idir, jdir) = (pp(idir, jdir) + pp(jdir, idir)) / m_two
2786 pp(jdir, idir) = pp(idir, jdir)
2787 end do
2788 end do
2789 end if
2790
2791 work(1:3, 1:3) = pp(1:3, 1:3)
2792 call lalg_eigensolve_nonh(3, work, w, err_code = info, sort_eigenvectors = .true.)
2793 ! Note that the cross-section elements do not have to be transformed to the proper units, since
2794 ! they have been read from the "cross_section_vector.x", where they are already in the proper units.
2795
2796 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, ((ie-1) * energy_step + min_energy))
2797 do idir = 3, 1, -1
2798 if (symmetrize) then
2799 write(out_file,'(2e20.8)', advance = 'no') real(w(idir), real64)
2800 else
2801 write(out_file,'(2e20.8)', advance = 'no') w(idir)
2802 end if
2803
2804 do jdir = 1, 3
2805 write(out_file,'(e20.8)', advance = 'no') work(jdir, idir)
2806 end do
2807 end do
2808 write(out_file, '(1x)')
2809
2810 if (spins_singlet .and. spins_triplet) then
2811 if (symmetrize) then
2812 do idir = 1, 3
2813 do jdir = idir + 1, 3
2814 pp2(idir, jdir) = (pp2(idir, jdir) + pp2(jdir, idir)) / m_two
2815 pp2(jdir, idir) = pp2(idir, jdir)
2816 end do
2817 end do
2818 end if
2819 work(1:3, 1:3) = -pp2(1:3, 1:3)
2820 call lalg_eigensolve_nonh(3, work, w, err_code = info, sort_eigenvectors = .true.)
2821 ! Note that the cross-section elements do not have to be transformed to the proper units, since
2822 ! they have been read from the "cross_section_vector.x", where they are already in the proper units.
2823
2824 write(out_file_t,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, (ie * energy_step + min_energy))
2825 do idir = 3, 1, -1
2826 if (symmetrize) then
2827 write(out_file_t,'(2e20.8)', advance = 'no') real(w(idir), real64)
2828 else
2829 write(out_file_t,'(2e20.8)', advance = 'no') w(idir)
2830 end if
2831
2832 do jdir = 1, 3
2833 write(out_file_t,'(e20.8)', advance = 'no') work(jdir, idir)
2834 end do
2835 end do
2836 write(out_file_t, '(1x)')
2837 end if
2838 end do
2839
2840 call io_close(out_file)
2841
2842 safe_deallocate_a(pp)
2843 if (spins_triplet .and. spins_singlet) then
2844 safe_deallocate_a(pp2)
2845 call io_close(out_file_t)
2846 end if
2847 safe_deallocate_a(w)
2848 safe_deallocate_a(work)
2849
2851 end subroutine spectrum_sigma_diagonalize
2852
2853 pure integer function spectrum_nenergy_steps(spectrum) result(no_e)
2854 type(spectrum_t), intent(in) :: spectrum
2855
2856 no_e = nint((spectrum%max_energy-spectrum%min_energy) / spectrum%energy_step) + 1
2857 end function spectrum_nenergy_steps
2858
2859 subroutine spectrum_write_info(spectrum, out_file)
2860 type(spectrum_t), intent(in) :: spectrum
2861 integer, intent(in) :: out_file
2862
2863 push_sub(spectrum_write_info)
2864
2865 write(out_file, '(a,i4)') '# PropagationSpectrumDampMode = ', spectrum%damp
2866 write(out_file, '(a,f10.4)') '# PropagationSpectrumDampFactor = ', units_from_atomic(units_out%time**(-1), &
2867 spectrum%damp_factor)
2868 write(out_file, '(a,f10.4)') '# PropagationSpectrumStartTime = ', units_from_atomic(units_out%time, spectrum%start_time)
2869 write(out_file, '(a,f10.4)') '# PropagationSpectrumEndTime = ', units_from_atomic(units_out%time, spectrum%end_time)
2870 write(out_file, '(a,f10.4)') '# PropagationSpectrumMinEnergy = ', units_from_atomic(units_out%energy, spectrum%min_energy)
2871 write(out_file, '(a,f10.4)') '# PropagationSpectrumMaxEnergy = ', units_from_atomic(units_out%energy, spectrum%max_energy)
2872 write(out_file, '(a,f10.4)') '# PropagationSpectrumEnergyStep = ', units_from_atomic(units_out%energy, spectrum%energy_step)
2873
2874 pop_sub(spectrum_write_info)
2875 end subroutine spectrum_write_info
2876
2877end module spectrum_oct_m
2878
2879!! Local Variables:
2880!! mode: f90
2881!! coding: utf-8
2882!! End:
subroutine optimize()
subroutine info()
Definition: em_resp.F90:1096
initialize a batch with existing memory
Definition: batch.F90:267
This is the common interface to a simple-minded polynomical interpolation procedure (simple use of th...
Definition: math.F90:186
Prints out to iunit a message in the form: ["InputVariable" = value] where "InputVariable" is given b...
Definition: messages.F90:180
double log(double __x) __attribute__((__nothrow__
double exp(double __x) __attribute__((__nothrow__
double sin(double __x) __attribute__((__nothrow__
double sqrt(double __x) __attribute__((__nothrow__
This module implements batches of mesh functions.
Definition: batch.F90:133
integer, parameter spectrum_transform_cos
integer, parameter spectrum_transform_sin
Fast Fourier Transform module. This module provides a single interface that works with different FFT ...
Definition: fft.F90:118
subroutine, public fft_init(this, nn, dim, type, library, optimize, optimize_parity, comm, mpi_grp, use_aligned)
Definition: fft.F90:417
subroutine, public fft_end(this)
Definition: fft.F90:995
integer, parameter, public fft_complex
Definition: fft.F90:177
integer, parameter, public fftlib_fftw
Definition: fft.F90:182
real(real64), parameter, public m_two
Definition: global.F90:189
real(real64), parameter, public m_zero
Definition: global.F90:187
real(real64), parameter, public m_four
Definition: global.F90:191
real(real64), parameter, public p_ry
Definition: global.F90:220
real(real64), parameter, public m_third
Definition: global.F90:194
real(real64), parameter, public m_pi
some mathematical constants
Definition: global.F90:185
character(len= *), parameter, public pcm_dir
Definition: global.F90:259
complex(real64), parameter, public m_z0
Definition: global.F90:197
complex(real64), parameter, public m_zi
Definition: global.F90:201
real(real64), parameter, public p_c
Electron gyromagnetic ratio, see Phys. Rev. Lett. 130, 071801 (2023)
Definition: global.F90:223
real(real64), parameter, public m_one
Definition: global.F90:188
real(real64), parameter, public m_three
Definition: global.F90:190
Definition: io.F90:114
subroutine, public io_close(iunit, grp)
Definition: io.F90:468
subroutine, public io_skip_header(iunit)
Definition: io.F90:679
integer function, public io_open(file, namespace, action, status, form, position, die, recl, grp)
Definition: io.F90:395
subroutine, public kick_read(kick, iunit, namespace)
Definition: kick.F90:819
integer, parameter, public kick_spin_mode
Definition: kick.F90:163
pure integer function, public kick_get_type(kick)
Definition: kick.F90:1362
subroutine, public kick_write(kick, iunit, out)
Definition: kick.F90:891
integer, parameter, public kick_density_mode
Definition: kick.F90:163
integer, parameter, public kick_function_dipole
Definition: kick.F90:158
integer, parameter, public kick_spin_density_mode
Definition: kick.F90:163
This module is intended to contain "only mathematical" functions and procedures.
Definition: math.F90:115
pure complex(real64) function, dimension(1:3), public zcross_product(a, b)
Definition: math.F90:1642
subroutine, public messages_print_with_emphasis(msg, iunit, namespace)
Definition: messages.F90:930
character(len=512), private msg
Definition: messages.F90:165
subroutine, public messages_warning(no_lines, all_nodes, namespace)
Definition: messages.F90:543
character(len=256), dimension(max_lines), public message
to be output by fatal, warning
Definition: messages.F90:160
subroutine, public messages_fatal(no_lines, only_root_writes, namespace)
Definition: messages.F90:420
subroutine, public messages_input_error(namespace, var, details, row, column)
Definition: messages.F90:723
subroutine, public messages_experimental(name, namespace)
Definition: messages.F90:1097
subroutine, public messages_info(no_lines, iunit, debug_only, stress, all_nodes, namespace)
Definition: messages.F90:624
real(real64), dimension(:,:), allocatable sigma
S_E matrix.
Definition: pcm.F90:267
subroutine, public pcm_dipole(mu_pcm, q_pcm, tess, n_tess)
Computes the dipole moment mu_pcm due to a distribution of charges q_pcm.
Definition: pcm.F90:3240
subroutine, public pcm_eps(pcm, eps, omega)
Definition: pcm.F90:3286
subroutine, public pcm_min_input_parsing_for_spectrum(pcm, namespace)
Definition: pcm.F90:3310
subroutine, public spectrum_hsfunction_min(namespace, aa, bb, omega_min, func_min)
Definition: spectrum.F90:1583
subroutine spectrum_tdfile_info(namespace, fname, iunit, time_steps, dt)
Definition: spectrum.F90:2460
subroutine spectrum_hsfunction_ar_end
Definition: spectrum.F90:1719
subroutine spectrum_hsfunction_ar_init(dt, is, ie, niter, acc, pos, tret)
Definition: spectrum.F90:1694
subroutine, public spectrum_cross_section(spectrum, namespace, in_file, out_file, ref_file)
Definition: spectrum.F90:710
subroutine spectrum_times_pcm_epsilon(spectrum, pcm, dipole, sigma, nspin, istart, iend, kick_time, dt, no_e)
Definition: spectrum.F90:1061
subroutine, public spectrum_hs_ar_from_acc(spectrum, namespace, out_file, vec, w0)
Definition: spectrum.F90:1732
integer, parameter, public spectrum_damp_lorentzian
Definition: spectrum.F90:164
subroutine, public spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
Definition: spectrum.F90:2508
subroutine, public spectrum_fourier_transform(method, transform, noise, time_start, time_end, t0, time_step, time_function, energy_start, energy_end, energy_step, energy_function)
Computes the sine, cosine, (or "exponential") Fourier transform of the real function given in the tim...
Definition: spectrum.F90:2638
integer, parameter, public spectrum_transform_laplace
Definition: spectrum.F90:171
subroutine, public spectrum_cross_section_tensor(spectrum, namespace, out_file, in_file)
Definition: spectrum.F90:430
subroutine, public spectrum_hsfunction_init(dt, is, ie, niter, acc)
Definition: spectrum.F90:1534
subroutine, public spectrum_hsfunction_end
Definition: spectrum.F90:1569
subroutine spectrum_read_dipole(namespace, in_file, dipole)
Definition: spectrum.F90:911
integer, parameter, public spectrum_damp_sin
Definition: spectrum.F90:164
subroutine spectrum_sigma_diagonalize(namespace, sigma, nspin, energy_step, min_energy, energy_steps, kick)
Definition: spectrum.F90:2757
subroutine spectrum_cross_section_info(namespace, iunit, nspin, kick, energy_steps, dw)
Definition: spectrum.F90:2422
subroutine, public spectrum_dyn_structure_factor(spectrum, namespace, in_file_sin, in_file_cos, out_file)
Definition: spectrum.F90:1262
integer, parameter, public spectrum_damp_gaussian
Definition: spectrum.F90:164
subroutine, public spectrum_init(spectrum, namespace, default_energy_step, default_max_energy)
Definition: spectrum.F90:213
subroutine, public spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax)
Definition: spectrum.F90:2342
integer, parameter, public spectrum_fourier
Definition: spectrum.F90:182
subroutine, public spectrum_dipole_power(spectrum, namespace, in_file, out_file)
Definition: spectrum.F90:1154
subroutine spectrum_add_pcm_dipole(namespace, dipole, time_steps, nspin)
Definition: spectrum.F90:942
subroutine, public spectrum_signal_damp(damp_type, damp_factor, time_start, time_end, t0, time_step, time_function)
Definition: spectrum.F90:2552
subroutine, public spectrum_hs_from_acc(spectrum, namespace, out_file, pol, vec, w0)
Definition: spectrum.F90:2051
integer, parameter, public spectrum_energyloss
Definition: spectrum.F90:176
subroutine spectrum_over_pcm_refraction_index(spectrum, pcm, sigma, nspin, no_e)
Definition: spectrum.F90:1125
subroutine, public spectrum_hs_from_current(spectrum, namespace, out_file, pol, vec, w0)
Definition: spectrum.F90:2152
subroutine spectrum_cross_section_tensor_write(out_file, sigma, nspin, energy_step, min_energy, energy_steps, kick)
Definition: spectrum.F90:593
subroutine spectrum_write_info(spectrum, out_file)
Definition: spectrum.F90:2953
subroutine spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sp)
Definition: spectrum.F90:2307
integer, parameter, public spectrum_damp_polynomial
Definition: spectrum.F90:164
subroutine hsfunction(omega, power)
Definition: spectrum.F90:1650
integer, parameter, public spectrum_rotatory
Definition: spectrum.F90:176
subroutine spectrum_hs(spectrum, namespace, out_file, pol, w0)
Definition: spectrum.F90:2251
integer, parameter, public spectrum_damp_none
Definition: spectrum.F90:164
integer, parameter, public spectrum_transform_cos
Definition: spectrum.F90:171
integer, parameter, public spectrum_transform_sin
Definition: spectrum.F90:171
subroutine, public spectrum_count_time_steps(namespace, iunit, time_steps, dt)
Definition: spectrum.F90:2386
subroutine, public spectrum_rotatory_strength(spectrum, namespace, in_file, out_file)
Definition: spectrum.F90:1415
pure integer function, public spectrum_nenergy_steps(spectrum)
Definition: spectrum.F90:2947
subroutine, public spectrum_hs_from_mult(spectrum, namespace, out_file, pol, vec, w0)
Definition: spectrum.F90:1932
integer, parameter, public spectrum_compressed_sensing
Definition: spectrum.F90:182
subroutine, public spectrum_hs_ar_from_mult(spectrum, namespace, out_file, vec, w0)
Definition: spectrum.F90:1839
integer, parameter, public spectrum_p_power
Definition: spectrum.F90:176
character(len=80) function, public str_center(s_in, l_in)
puts space around string, so that it is centered
Definition: string.F90:197
brief This module defines the class unit_t which is used by the unit_systems_oct_m module.
Definition: unit.F90:132
character(len=20) pure function, public units_abbrev(this)
Definition: unit.F90:223
This module defines the unit system, used for input and output.
integer, parameter, public units_atomic
type(unit_system_t), public units_out
subroutine, public unit_system_get(uu, cc)
integer, parameter, public units_eva
type(unit_system_t), public units_inp
the units systems for reading and writing
type(unit_t), public unit_one
some special units required for particular quantities
Class defining batches of mesh functions.
Definition: batch.F90:159
int true(void)