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 == -1) then
1693 iunit = io_open('td.general/multipoles', namespace, action='read', status='old')
1694 end if
1695 call spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1696 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1697
1698 call io_skip_header(iunit)
1699! write (*,*)
1700
1701 safe_allocate(dd(1:3, 1:nspin))
1702 do istep = 0, time_steps-1
1703 read(iunit, *) trash, dump, dump, dd
1704 pos(1:3, istep) = -sum(dd(1:3, :),2)
1705 pos(:,istep) = units_to_atomic(units_out%length, pos(:,istep))
1706 write (*,*) istep, real(pos(:,istep))
1707 end do
1708 safe_deallocate_a(dd)
1709 pos(:,0) = pos(:,1)
1710 call io_close(iunit)
1711
1712! write (*,*)
1713
1714 ! normalize vector and set to global var
1715! vv = vec / sqrt(sum(vec(:)**2))
1716 vv(1:3) = vec(1:3)
1717
1718 pp(:,0) = m_zero
1719 do istep = 0, time_steps - 1
1720 nn(:) = vv(:)-pos(:,istep)
1721 nn(:) = nn(:)/norm2(abs(nn(:)))
1722 tret(istep) = dot_product(vv(:), real(pos(:,istep), real64))/p_c
1723 pp(:,istep) = zcross_product(nn, zcross_product(nn, acc(:,istep)))
1724! write (*,*) istep, Real(PP(:,istep)),"acc", Real(acc(:,istep))
1725 end do
1726
1727 call spectrum_hsfunction_ar_init(dt, istart, iend, time_steps, pp, pos, tret)
1728 call spectrum_hs(spectrum, namespace, out_file, 'a', w0)
1730
1731 safe_deallocate_a(acc)
1732 safe_deallocate_a(pp)
1733 safe_deallocate_a(pos)
1734 safe_deallocate_a(tret)
1735
1737 end subroutine spectrum_hs_ar_from_acc
1738 ! ---------------------------------------------------------
1739
1740
1741 ! ---------------------------------------------------------
1742 subroutine spectrum_hs_ar_from_mult(spectrum, namespace, out_file, vec, w0)
1743 type(spectrum_t), intent(inout) :: spectrum
1744 type(namespace_t), intent(in) :: namespace
1745 character(len=*), intent(in) :: out_file
1746 real(real64), intent(in) :: vec(:)
1747 real(real64), optional, intent(in) :: w0
1748
1749 integer :: istep, trash, iunit, nspin, time_steps, istart, iend, ntiter, lmax
1750 real(real64) :: dt, dump
1751 type(kick_t) :: kick
1752 real(real64), allocatable :: dd(:,:)
1753 complex(real64), allocatable :: dipole(:,:), ddipole(:,:), pp(:,:), tret(:)
1754 complex(real64) :: vv(3)
1755 type(unit_system_t) :: file_units
1756
1757 push_sub(spectrum_hs_ar_from_mult)
1758
1759
1760 iunit = io_open('multipoles', namespace, action='read', status='old', die=.false.)
1761 if (iunit == -1) then
1762 iunit = io_open('td.general/multipoles', namespace, action='read', status='old')
1763 end if
1764 call spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1765 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1766
1767 call io_skip_header(iunit)
1768
1769 ! load dipole from file
1770 safe_allocate(dipole(1:3, 0:time_steps))
1771 safe_allocate(ddipole(1:3, 0:time_steps))
1772 safe_allocate(pp(1:3, 0:time_steps))
1773 safe_allocate(tret(0:time_steps))
1774 safe_allocate(dd(1:3, 1:nspin))
1775
1776 tret= m_zero
1777
1778 do istep = 1, time_steps
1779 read(iunit, *) trash, dump, dump, dd
1780 dipole(1:3, istep) = -sum(dd(1:3, :),2)
1781 dipole(:,istep) = units_to_atomic(units_out%length, dipole(:,istep))
1782 end do
1783 safe_deallocate_a(dd)
1784 dipole(:,0) = dipole(:,1)
1785 call io_close(iunit)
1786
1787 ! we now calculate the acceleration.
1788 ddipole(:,0) = m_zero
1789 do istep = 1, time_steps - 1
1790 ddipole(:,istep) = (dipole(:,istep - 1) + dipole(:,istep + 1) - m_two * dipole(:,istep)) / dt**2
1791 end do
1792 call interpolate(dt*(/ -3, -2, -1 /), &
1793 ddipole(1,time_steps - 3:time_steps - 1), &
1794 m_zero, &
1795 ddipole(1,time_steps))
1796 call interpolate(dt*(/ -3, -2, -1 /), &
1797 ddipole(2,time_steps - 3:time_steps - 1), &
1798 m_zero, &
1799 ddipole(2,time_steps))
1800 call interpolate(dt*(/ -3, -2, -1 /), &
1801 ddipole(3,time_steps - 3:time_steps - 1), &
1802 m_zero, &
1803 ddipole(3,time_steps))
1804
1805 ! normalize vector and set to global var
1806 vv(1:3) = vec(1:3) / norm2(vec(1:3))
1807
1808 pp(:,0) = m_zero
1809 do istep = 1, time_steps - 1
1810! write (*,*) istep, istep*dt, Real(ddipole(1,istep)), Real(ddipole(2,istep))
1811 tret(istep) = dot_product(vv(:), dipole(:,istep))/p_c
1812 pp(:,istep) = zcross_product(vv, zcross_product(vv, ddipole(:,istep - 1)))
1813! PP(istep) = sum(abs(dipole(:,istep))**2)
1814! write(*,*) istep, PP(istep)
1815
1816 end do
1817
1818
1819 call spectrum_hsfunction_ar_init(dt, istart, iend, time_steps, pp, dipole,tret)
1820 call spectrum_hs(spectrum, namespace, out_file, 'a', w0)
1822
1823 safe_deallocate_a(dipole)
1824 safe_deallocate_a(ddipole)
1825 safe_deallocate_a(pp)
1826 safe_deallocate_a(tret)
1827
1828
1830 end subroutine spectrum_hs_ar_from_mult
1831 ! ---------------------------------------------------------
1832
1833
1834 ! ---------------------------------------------------------
1835 subroutine spectrum_hs_from_mult(spectrum, namespace, out_file, pol, vec, w0)
1836 type(spectrum_t), intent(inout) :: spectrum
1837 type(namespace_t), intent(in) :: namespace
1838 character(len=*), intent(in) :: out_file
1839 character, intent(in) :: pol
1840 real(real64), intent(in) :: vec(:)
1841 real(real64), optional, intent(in) :: w0
1842
1843 integer :: istep, trash, iunit, nspin, time_steps, istart, iend, ntiter, lmax, no_e, ie, idir, ispin
1844 real(real64) :: dt, dump, vv(3)
1845 type(kick_t) :: kick
1846 real(real64), allocatable :: dd(:,:)
1847 real(real64), allocatable :: sps(:), spc(:), racc(:)
1848 complex(real64), allocatable :: dipole(:), ddipole(:)
1849 type(batch_t) :: acc_batch, sps_batch, spc_batch
1850 type(unit_system_t) :: file_units
1851
1852 push_sub(spectrum_hs_from_mult)
1853
1854 iunit = io_open('multipoles', namespace, action='read', status='old', die=.false.)
1855 if (iunit == -1) then
1856 iunit = io_open('td.general/multipoles', namespace, action='read', status='old')
1857 end if
1858 call spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax=lmax)
1859 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1860
1861 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1862
1863 call io_skip_header(iunit)
1864
1865 ! load dipole from file
1866 safe_allocate(dipole(0:time_steps))
1867 safe_allocate(ddipole(0:time_steps))
1868 safe_allocate(dd(1:3, 1:nspin))
1869
1870 vv(1:3) = vec(1:3) / norm2(vec(1:3))
1871
1872 do istep = 1, time_steps
1873 dd = m_zero
1874 read(iunit, *) trash, dump, (dump, (dd(idir, ispin), idir = 1, kick%dim), ispin = 1, nspin)
1875 select case (pol)
1876 case ('x')
1877 dipole(istep) = -sum(dd(1, :))
1878 case ('y')
1879 dipole(istep) = -sum(dd(2, :))
1880 case ('z')
1881 dipole(istep) = sum(dd(3, :))
1882 case ('+')
1883 dipole(istep) = -sum(cmplx(dd(1, :), dd(2, :), real64)) / sqrt(m_two)
1884 case ('-')
1885 dipole(istep) = -sum(cmplx(dd(1, :), -dd(2, :), real64)) / sqrt(m_two)
1886 case ('v')
1887 dipole(istep) = -sum(vv(1)*dd(1, :) + vv(2)*dd(2, :) + vv(3)*dd(3, :))
1888 end select
1889 dipole(istep) = units_to_atomic(units_out%length, dipole(istep))
1890 end do
1891 safe_deallocate_a(dd)
1892 dipole(0) = dipole(1)
1893 call io_close(iunit)
1894
1895 ! we now calculate the acceleration.
1896 ddipole(0) = m_zero
1897 do istep = 1, time_steps - 1
1898 ddipole(istep) = (dipole(istep - 1) + dipole(istep + 1) - m_two * dipole(istep)) / dt**2
1899 end do
1900 call interpolate( dt*(/ -3, -2, -1 /), &
1901 ddipole(time_steps - 3:time_steps - 1), &
1902 m_zero, &
1903 ddipole(time_steps))
1904
1905 if (present(w0)) then
1906
1907 call spectrum_hsfunction_init(dt, istart, iend, time_steps, ddipole)
1908 call spectrum_hs(spectrum, namespace, out_file, pol, w0)
1910
1911 else
1912
1913 safe_allocate(racc(0:time_steps))
1914 racc = real(ddipole, real64)
1915
1916 no_e = spectrum_nenergy_steps(spectrum)
1917 safe_allocate(sps(1:no_e))
1918 safe_allocate(spc(1:no_e))
1919 sps = m_zero
1920 spc = m_zero
1921
1922 call batch_init(acc_batch, racc)
1923 call batch_init(sps_batch, sps)
1924 call batch_init(spc_batch, spc)
1925
1926 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
1927 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, spc_batch)
1928 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
1929 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sps_batch)
1930
1931 do ie = 1, no_e
1932 sps(ie) = (sps(ie)**2 + spc(ie)**2)
1933 end do
1934
1935 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sps)
1936
1937 call acc_batch%end()
1938 call sps_batch%end()
1939 call spc_batch%end()
1940
1941 safe_deallocate_a(racc)
1942
1943 end if
1944
1945 safe_deallocate_a(dipole)
1946 safe_deallocate_a(ddipole)
1947
1948 pop_sub(spectrum_hs_from_mult)
1949 end subroutine spectrum_hs_from_mult
1950 ! ---------------------------------------------------------
1951
1952
1953 ! ---------------------------------------------------------
1954 subroutine spectrum_hs_from_acc(spectrum, namespace, out_file, pol, vec, w0)
1955 type(spectrum_t), intent(inout) :: spectrum
1956 type(namespace_t), intent(in) :: namespace
1957 character(len=*), intent(in) :: out_file
1958 character, intent(in) :: pol
1959 real(real64), intent(in) :: vec(:)
1960 real(real64), optional, intent(in) :: w0
1961
1962 integer :: istep, jj, iunit, time_steps, istart, iend, ntiter, ierr, no_e, ie
1963 real(real64) :: dt, aa(3), vv(3)
1964 complex(real64), allocatable :: acc(:)
1965 real(real64), allocatable :: racc(:), sps(:), spc(:)
1966 type(batch_t) :: acc_batch, sps_batch, spc_batch
1967
1968 push_sub(spectrum_hs_from_acc)
1969
1970 call spectrum_tdfile_info(namespace, 'acceleration', iunit, time_steps, dt)
1971 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
1972
1973 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt*time_steps)
1974
1975 ! load dipole from file
1976 safe_allocate(acc(0:time_steps))
1977 acc = m_zero
1978 vv = vec / norm2(vec(:))
1979 call io_skip_header(iunit)
1980
1981 do istep = 1, time_steps
1982 aa = m_zero
1983 read(iunit, '(28x,e20.12)', advance = 'no', iostat = ierr) aa(1)
1984 jj = 2
1985 do while((ierr == 0) .and. (jj <= 3))
1986 read(iunit, '(e20.12)', advance = 'no', iostat = ierr) aa(jj)
1987 jj = jj + 1
1988 end do
1989 select case (pol)
1990 case ('x')
1991 acc(istep) = aa(1)
1992 case ('y')
1993 acc(istep) = aa(2)
1994 case ('z')
1995 acc(istep) = aa(3)
1996 case ('+')
1997 acc(istep) = cmplx(aa(1), aa(2), real64) / sqrt(m_two)
1998 case ('-')
1999 acc(istep) = cmplx(aa(1), -aa(2), real64) / sqrt(m_two)
2000 case ('v')
2001 acc(istep) = vv(1)*aa(1) + vv(2)*aa(2) + vv(3)*aa(3)
2002 end select
2003 acc(istep) = units_to_atomic(units_out%acceleration, acc(istep))
2004 end do
2005 close(iunit)
2006
2007 if (present(w0)) then
2008
2009 call spectrum_hsfunction_init(dt, istart, iend, time_steps, acc)
2010 call spectrum_hs(spectrum, namespace, out_file, pol, w0)
2012
2013 else
2014
2015 safe_allocate(racc(0:time_steps))
2016 racc = real(acc, real64)
2017
2018 no_e = spectrum_nenergy_steps(spectrum)
2019 safe_allocate(sps(1:no_e))
2020 safe_allocate(spc(1:no_e))
2021 sps = m_zero
2022 spc = m_zero
2023
2024 call batch_init(acc_batch, racc)
2025 call batch_init(sps_batch, sps)
2026 call batch_init(spc_batch, spc)
2027
2028 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
2029 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, &
2030 spectrum%max_energy, spectrum%energy_step, spc_batch)
2031 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
2032 istart + 1, iend + 1, m_zero, dt, acc_batch, spectrum%min_energy, &
2033 spectrum%max_energy, spectrum%energy_step, sps_batch)
2034
2035 do ie = 1, no_e
2036 sps(ie) = (sps(ie)**2 + spc(ie)**2)
2037 end do
2038
2039 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sps)
2040
2041 call acc_batch%end()
2042 call sps_batch%end()
2043 call spc_batch%end()
2044
2045 safe_deallocate_a(racc)
2046
2047 end if
2048
2049 safe_deallocate_a(acc)
2050 pop_sub(spectrum_hs_from_acc)
2051 end subroutine spectrum_hs_from_acc
2052 ! ---------------------------------------------------------
2053
2054 ! ---------------------------------------------------------
2055 subroutine spectrum_hs_from_current(spectrum, namespace, out_file, pol, vec, w0)
2056 type(spectrum_t), intent(inout) :: spectrum
2057 type(namespace_t), intent(in) :: namespace
2058 character(len=*), intent(in) :: out_file
2059 character, intent(in) :: pol
2060 real(real64), intent(in) :: vec(:)
2061 real(real64), optional, intent(in) :: w0
2062
2063 integer :: istep, jj, iunit, time_steps, istart, iend, ntiter, ierr, no_e, ie
2064 real(real64) :: dt, cc(3), vv(3)
2065 complex(real64), allocatable :: cur(:)
2066 real(real64), allocatable :: rcur(:), sps(:), spc(:)
2067 type(batch_t) :: cur_batch, sps_batch, spc_batch
2068
2069 push_sub(spectrum_hs_from_current)
2070
2071 call spectrum_tdfile_info(namespace, 'total_current', iunit, time_steps, dt)
2072 call spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
2073
2074 if (spectrum%energy_step <= m_zero) spectrum%energy_step = m_two * m_pi / (dt * time_steps)
2075
2076 ! load dipole from file
2077 safe_allocate(cur(0:time_steps))
2078 cur = m_zero
2079 vv = vec / norm2(vec(:))
2080 call io_skip_header(iunit)
2081
2082 do istep = 1, time_steps
2083 cc = m_zero
2084 read(iunit, '(28x,e20.12)', advance = 'no', iostat = ierr) cc(1)
2085 jj = 2
2086 do while((ierr == 0) .and. (jj <= 3))
2087 read(iunit, '(e20.12)', advance = 'no', iostat = ierr) cc(jj)
2088 jj = jj + 1
2089 end do
2090 select case (pol)
2091 case ('x')
2092 cur(istep) = cc(1)
2093 case ('y')
2094 cur(istep) = cc(2)
2095 case ('z')
2096 cur(istep) = cc(3)
2097 case ('+')
2098 cur(istep) = cmplx(cc(1), cc(2), real64) / sqrt(m_two)
2099 case ('-')
2100 cur(istep) = cmplx(cc(1), -cc(2), real64) / sqrt(m_two)
2101 case ('v')
2102 cur(istep) = vv(1)*cc(1) + vv(2)*cc(2) + vv(3)*cc(3)
2103 end select
2104 cur(istep) = units_to_atomic(units_out%velocity, cur(istep))
2105 end do
2106 close(iunit)
2107
2108 if (present(w0)) then
2109
2110 call spectrum_hsfunction_init(dt, istart, iend, time_steps, cur)
2111 call spectrum_hs(spectrum, namespace, out_file, pol, w0)
2113
2114 else
2115
2116 safe_allocate(rcur(0:time_steps))
2117 rcur = real(cur, real64)
2118
2119 no_e = spectrum_nenergy_steps(spectrum)
2120 safe_allocate(sps(1:no_e))
2121 safe_allocate(spc(1:no_e))
2122 sps = m_zero
2123 spc = m_zero
2124
2125 call batch_init(cur_batch, rcur)
2126 call batch_init(sps_batch, sps)
2127 call batch_init(spc_batch, spc)
2128
2129 call spectrum_fourier_transform(spectrum%method, spectrum_transform_cos, spectrum%noise, &
2130 istart + 1, iend + 1, m_zero, dt, cur_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, spc_batch)
2131 call spectrum_fourier_transform(spectrum%method, spectrum_transform_sin, spectrum%noise, &
2132 istart + 1, iend + 1, m_zero, dt, cur_batch, spectrum%min_energy, spectrum%max_energy, spectrum%energy_step, sps_batch)
2133
2134 do ie = 1, no_e
2135 sps(ie) = (sps(ie)**2 + spc(ie)**2) * ((ie-1) * spectrum%energy_step + spectrum%min_energy)**2
2136 end do
2137
2138 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sps)
2139
2140 call cur_batch%end()
2141 call sps_batch%end()
2142 call spc_batch%end()
2143
2144 safe_deallocate_a(rcur)
2145
2146 end if
2147
2148 safe_deallocate_a(cur)
2150 end subroutine spectrum_hs_from_current
2151
2152
2153 ! ---------------------------------------------------------
2154 subroutine spectrum_hs(spectrum, namespace, out_file, pol, w0)
2155 type(spectrum_t), intent(inout) :: spectrum
2156 type(namespace_t), intent(in) :: namespace
2157 character(len=*), intent(in) :: out_file
2158 character, intent(in) :: pol
2159 real(real64), optional, intent(in) :: w0
2160
2161 integer :: iunit, no_e, ie
2162 real(real64) :: omega, hsval, xx
2163 real(real64), allocatable :: sp(:)
2164
2165 push_sub(spectrum_hs)
2166
2167 if (present(w0)) then
2168
2169 iunit = io_open(trim(out_file) // "." // trim(pol), namespace, action='write')
2170 write(iunit, '(a1,a20,a20)') '#', str_center("w", 20), str_center("H(w)", 20)
2171 write(iunit, '(a1,a20,a20)') '#', &
2172 str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20), &
2173 str_center('[('//trim(units_abbrev(units_out%length))//'/' &
2174 //trim(units_abbrev(units_out%time**2)), 20)
2175
2176 ! output
2177 omega = w0
2178 do while(omega <= spectrum%max_energy)
2179 call spectrum_hsfunction_min(namespace, omega - w0, omega + w0, xx, hsval)
2180
2181 write(iunit, '(1x,2e20.8)') units_from_atomic(units_out%energy, xx), &
2182 units_from_atomic((units_out%length / units_out%time)**2, -hsval)
2183
2184 ! 2 * w0 because we assume that there are only odd peaks.
2185 omega = omega + 2 * w0
2186 end do
2187 call io_close(iunit)
2188
2189 else
2190 no_e = spectrum_nenergy_steps(spectrum)
2191 safe_allocate(sp(1:no_e))
2192 sp = m_zero
2193
2194 do ie = 1, no_e
2195 call hsfunction((ie-1) * spectrum%energy_step + spectrum%min_energy, sp(ie))
2196 sp(ie) = -sp(ie)
2197 end do
2198
2199 call spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sp)
2200
2201 safe_deallocate_a(sp)
2202
2203 end if
2204
2205 pop_sub(spectrum_hs)
2206 end subroutine spectrum_hs
2207 ! ---------------------------------------------------------
2208
2209
2210 subroutine spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sp)
2211 type(spectrum_t), intent(inout) :: spectrum
2212 type(namespace_t), intent(in) :: namespace
2213 character(len=*), intent(in) :: out_file
2214 character, intent(in) :: pol
2215 integer, intent(in) :: no_e
2216 real(real64), intent(in) :: sp(:)
2217
2218 integer :: iunit, ie
2219
2220 push_sub(spectrum_hs_output)
2221
2222 ! output
2223 if (trim(out_file) /= '-') then
2224 iunit = io_open(trim(out_file) // "." // trim(pol), namespace, action='write')
2225 write(iunit, '(a1,a20,a20)') '#', str_center("w", 20), str_center("H(w)", 20)
2226
2227 write(iunit, '(a1,a20,a20)') &
2228 '#', str_center('['//trim(units_abbrev(units_out%energy)) // ']', 20), &
2229 str_center('[('//trim(units_abbrev(units_out%length))//'/' &
2230 //trim(units_abbrev(units_out%time**2)), 20)
2231
2232 do ie = 1, no_e
2233 write(iunit, '(2e15.6)') units_from_atomic(units_out%energy, (ie-1) * spectrum%energy_step + spectrum%min_energy), &
2234 units_from_atomic((units_out%length / units_out%time)**2, sp(ie))
2235 end do
2236
2237 call io_close(iunit)
2238 end if
2239
2240 pop_sub(spectrum_hs_output)
2241 end subroutine spectrum_hs_output
2242
2243
2244 ! ---------------------------------------------------------
2245 subroutine spectrum_mult_info(namespace, iunit, nspin, kick, time_steps, dt, file_units, lmax)
2246 type(namespace_t), intent(in) :: namespace
2247 integer, intent(in) :: iunit
2248 integer, intent(out) :: nspin
2249 type(kick_t), intent(out) :: kick
2250 integer, intent(out) :: time_steps
2251 real(real64), intent(out) :: dt
2252 type(unit_system_t), intent(out) :: file_units
2253 integer, optional, intent(out) :: lmax
2254
2255 integer :: ii
2256 character(len=100) :: line
2257
2258 push_sub(spectrum_mult_info)
2259
2260 assert(iunit /= -1)
2261
2262 rewind(iunit)
2263 read(iunit,*)
2264 read(iunit,*)
2265 read(iunit, '(15x,i2)') nspin
2266 if (present(lmax)) then
2267 read(iunit, '(15x,i2)') lmax
2268 end if
2269 call kick_read(kick, iunit, namespace)
2270 read(iunit, '(a)') line
2271 read(iunit, '(a)') line
2272 call io_skip_header(iunit)
2273
2274 ! Figure out the units of the file
2275 ii = index(line,'eV')
2276 if (ii /= 0) then
2277 call unit_system_get(file_units, units_eva)
2278 else
2279 call unit_system_get(file_units, units_atomic)
2280 end if
2281
2282 call spectrum_count_time_steps(namespace, iunit, time_steps, dt)
2283 dt = units_to_atomic(file_units%time, dt) ! units_out is OK
2284
2285 pop_sub(spectrum_mult_info)
2286 end subroutine spectrum_mult_info
2287 ! ---------------------------------------------------------
2288
2289
2290 ! ---------------------------------------------------------
2291 subroutine spectrum_count_time_steps(namespace, iunit, time_steps, dt)
2292 type(namespace_t), intent(in) :: namespace
2293 integer, intent(in) :: iunit
2294 integer, intent(out) :: time_steps
2295 real(real64), intent(out) :: dt
2296
2297 real(real64) :: t1, t2, dummy
2298 integer :: trash
2299
2300 push_sub(count_time_steps)
2301
2302 ! count number of time_steps
2303 time_steps = 0
2304 t1 = m_zero
2305 t2 = m_zero
2306 do
2307 read(iunit, *, end=100) trash, dummy
2308 time_steps = time_steps + 1
2309 if (time_steps == 1) t1 = dummy
2310 if (time_steps == 2) t2 = dummy
2311 end do
2312100 continue
2313 dt = (t2 - t1)
2314 time_steps = time_steps - 1
2315
2316 if (time_steps < 3) then
2317 message(1) = "Empty file?"
2318 call messages_fatal(1, namespace=namespace)
2319 end if
2320
2321 pop_sub(count_time_steps)
2322 end subroutine spectrum_count_time_steps
2323 ! ---------------------------------------------------------
2324
2325
2326 ! ---------------------------------------------------------
2327 subroutine spectrum_cross_section_info(namespace, iunit, nspin, kick, energy_steps, dw)
2328 type(namespace_t), intent(in) :: namespace
2329 integer, intent(in) :: iunit
2330 integer, intent(out) :: nspin
2331 type(kick_t), intent(out) :: kick
2332 integer, intent(out) :: energy_steps
2333 real(real64), intent(out) :: dw
2334
2335 real(real64) :: dummy, e1, e2
2336
2339 ! read in number of spin components
2340 read(iunit, '(15x,i2)') nspin
2341 call kick_read(kick, iunit, namespace)
2342 call io_skip_header(iunit)
2343
2344 ! count number of time_steps
2345 energy_steps = 0
2346 do
2347 read(iunit, *, end=100) dummy
2348 energy_steps = energy_steps + 1
2349 if (energy_steps == 1) e1 = dummy
2350 if (energy_steps == 2) e2 = dummy
2351 end do
2352100 continue
2353 dw = units_to_atomic(units_out%energy, e2 - e1)
2354
2355 if (energy_steps < 3) then
2356 message(1) = "Empty multipole file?"
2357 call messages_fatal(1, namespace=namespace)
2358 end if
2359
2361 end subroutine spectrum_cross_section_info
2362
2363
2364 ! ---------------------------------------------------------
2365 subroutine spectrum_tdfile_info(namespace, fname, iunit, time_steps, dt)
2366 type(namespace_t), intent(in) :: namespace
2367 character(len=*), intent(in) :: fname
2368 integer, intent(out) :: iunit, time_steps
2369 real(real64), intent(out) :: dt
2370
2371 integer :: trash
2372 real(real64) :: t1, t2, dummy
2373 character(len=256) :: filename
2374
2375 push_sub(spectrum_tdfile_info)
2376
2377 ! open files
2378 filename = trim('td.general/')//trim(fname)
2379 iunit = io_open(filename, namespace, action='read', status='old', die=.false.)
2380
2381 if (iunit == -1) then
2382 filename = trim('./')//trim(fname)
2383 iunit = io_open(filename, namespace, action='read', status='old')
2384 end if
2385
2386
2387 ! read in dipole
2388 call io_skip_header(iunit)
2389
2390 ! count number of time_steps
2391 time_steps = 0
2392 do
2393 read(iunit, *, end=100) trash, dummy
2394 time_steps = time_steps + 1
2395 if (time_steps == 1) t1 = dummy
2396 if (time_steps == 2) t2 = dummy
2397 end do
2398100 continue
2399 dt = units_to_atomic(units_out%time, t2 - t1) ! units_out is OK
2400 time_steps = time_steps - 1
2401
2402 if (time_steps < 3) then
2403 message(1) = "Empty file?"
2404 call messages_fatal(1, namespace=namespace)
2405 end if
2406
2407 rewind(iunit)
2408 pop_sub(spectrum_tdfile_info)
2409 end subroutine spectrum_tdfile_info
2410
2411
2412 ! ---------------------------------------------------------
2413 subroutine spectrum_fix_time_limits(spectrum, time_steps, dt, istart, iend, ntiter)
2414 type(spectrum_t), intent(inout) :: spectrum
2415 integer, intent(in) :: time_steps
2416 real(real64), intent(in) :: dt
2417 integer, intent(out) :: istart, iend, ntiter
2418
2419 real(real64) :: ts, te, dummy
2421 push_sub(spectrum_fix_time_limits)
2422
2423 ts = m_zero
2424 te = time_steps * dt
2425
2426 if (spectrum%start_time < ts) spectrum%start_time = ts
2427 if (spectrum%start_time > te) spectrum%start_time = te
2428 if (spectrum%end_time > te .or. spectrum%end_time <= m_zero) spectrum%end_time = te
2429 if (spectrum%end_time < ts) spectrum%end_time = ts
2430
2431 if (spectrum%end_time < spectrum%start_time) then
2432 dummy = spectrum%end_time ! swap
2433 spectrum%end_time = spectrum%start_time
2434 spectrum%start_time = dummy
2435 end if
2436 istart = nint(spectrum%start_time / dt)
2437 iend = nint(spectrum%end_time / dt)
2438 ntiter = iend - istart + 1
2439
2440 ! Get default damp factor
2441 if (spectrum%damp /= spectrum_damp_none .and. spectrum%damp /= spectrum_damp_polynomial &
2442 .and. is_close(spectrum%damp_factor, -m_one)) then
2443 select case (spectrum%damp)
2445 spectrum%damp_factor = -log(0.0001_real64)/(spectrum%end_time-spectrum%start_time)
2447 spectrum%damp_factor = sqrt(-log(0.0001_real64)/(spectrum%end_time-spectrum%start_time)**2)
2448 end select
2449 end if
2450
2451
2453 end subroutine spectrum_fix_time_limits
2454
2455 ! -------------------------------------------------------
2456
2457 subroutine spectrum_signal_damp(damp_type, damp_factor, time_start, time_end, t0, time_step, time_function)
2458 integer, intent(in) :: damp_type
2459 real(real64), intent(in) :: damp_factor
2460 integer, intent(in) :: time_start
2461 integer, intent(in) :: time_end
2462 real(real64), intent(in) :: t0
2463 real(real64), intent(in) :: time_step
2464 type(batch_t), intent(inout) :: time_function
2465
2466 integer :: itime, ii
2467 real(real64) :: time
2468 real(real64), allocatable :: weight(:)
2469
2470 push_sub(signal_damp)
2471
2472 assert(time_function%status() == batch_not_packed)
2473
2474 safe_allocate(weight(time_start:time_end))
2475
2476 do itime = time_start, time_end
2477 time = time_step*(itime-1)
2478
2479 ! Gets the damp function
2480 select case (damp_type)
2481 case (spectrum_damp_none)
2482 weight(itime) = m_one
2484 if (time < t0) then
2485 weight(itime) = m_one
2486 else
2487 weight(itime) = exp(-(time - t0)*damp_factor)
2488 end if
2490 if (time < t0) then
2491 weight(itime) = m_one
2492 else
2493 weight(itime) = m_one - m_three*((time - t0) / (time_step * (time_end - 1) - t0))**2 + &
2494 m_two * ((time - t0) / (time_step * (time_end - 1) - t0))**3
2495 end if
2497 if (time < t0) then
2498 weight(itime) = m_one
2499 else
2500 weight(itime) = exp(-(time - t0)**2*damp_factor**2)
2501 end if
2502 case (spectrum_damp_sin)
2503 if (time < t0) then
2504 weight(itime) = m_one
2505 else
2506 weight(itime) = sin(-(time - t0)*m_pi/(time_end+t0))
2507 end if
2508 end select
2509 end do
2510
2511 if (time_function%type() == type_cmplx) then
2512 do ii = 1, time_function%nst_linear
2513 do itime = time_start, time_end
2514 time_function%zff_linear(itime, ii) = weight(itime)*time_function%zff_linear(itime, ii)
2515 end do
2516 end do
2517 else
2518 do ii = 1, time_function%nst_linear
2519 do itime = time_start, time_end
2520 time_function%dff_linear(itime, ii) = weight(itime)*time_function%dff_linear(itime, ii)
2521 end do
2522 end do
2523 end if
2524
2525 safe_deallocate_a(weight)
2526
2527 pop_sub(signal_damp)
2528
2529 end subroutine spectrum_signal_damp
2530 ! -------------------------------------------------------
2531
2532 ! -------------------------------------------------------
2542 subroutine spectrum_fourier_transform(method, transform, noise, time_start, time_end, t0, time_step, time_function, &
2543 energy_start, energy_end, energy_step, energy_function)
2544 integer, intent(in) :: method
2545 integer, intent(in) :: transform
2546 real(real64), intent(in) :: noise
2547 integer, intent(in) :: time_start
2548 integer, intent(in) :: time_end
2549 real(real64), intent(in) :: t0
2550 real(real64), intent(in) :: time_step
2551 type(batch_t), intent(in) :: time_function
2552 real(real64), intent(in) :: energy_start
2553 real(real64), intent(in) :: energy_end
2554 real(real64), intent(in) :: energy_step
2555 type(batch_t), intent(inout) :: energy_function
2556
2557 integer :: itime, ienergy, ii, energy_steps
2558 real(real64) :: energy, sinz, cosz
2559 complex(real64) :: ez, eidt
2560 type(compressed_sensing_t) :: cs
2561
2562 push_sub(fourier_transform)
2563
2564 assert(time_function%nst_linear == energy_function%nst_linear)
2565 assert(time_function%status() == energy_function%status())
2566 assert(time_function%status() == batch_not_packed)
2567 assert(time_function%type() == type_float)
2568 assert(energy_function%type() == type_float)
2569
2570 energy_steps = nint((energy_end-energy_start) / energy_step) + 1
2571
2572 select case (method)
2573
2574 case (spectrum_fourier)
2575
2576 do ienergy = 1, energy_steps
2577
2578 energy = energy_step*(ienergy - 1) + energy_start
2579
2580 do ii = 1, energy_function%nst_linear
2581 energy_function%dff_linear(ienergy, ii) = m_zero
2582 end do
2583
2584 select case (transform)
2585
2586 ! The sine and cosine transforms are computed as the real and imaginary part of the exponential.
2587 ! One can compute the exponential by successive multiplications, instead of calling the sine or
2588 ! cosine function at each time step.
2590
2591 eidt = exp(m_zi * energy * time_step)
2592 ez = exp(m_zi * energy * ((time_start-1)*time_step - t0))
2593 sinz = aimag(ez)
2594 do itime = time_start, time_end
2595 do ii = 1, time_function%nst_linear
2596 energy_function%dff_linear(ienergy, ii) = &
2597 energy_function%dff_linear(ienergy, ii) + &
2598 time_function%dff_linear(itime, ii) * sinz
2599 end do
2600 ez = ez * eidt
2601 sinz = aimag(ez)
2602 end do
2603
2605
2606 eidt = exp(m_zi * energy * time_step)
2607 ez = exp(m_zi * energy * ( (time_start-1)*time_step - t0))
2608 cosz = real(ez, real64)
2609 do itime = time_start, time_end
2610 do ii = 1, time_function%nst_linear
2611 energy_function%dff_linear(ienergy, ii) = &
2612 energy_function%dff_linear(ienergy, ii) + &
2613 time_function%dff_linear(itime, ii) * cosz
2614 end do
2615 ez = ez * eidt
2616 cosz = real(ez, real64)
2617 end do
2618
2620
2621 eidt = exp(-energy * time_step)
2622 ez = exp(-energy * ((time_start - 1) * time_step - t0))
2623 do itime = time_start, time_end
2624 do ii = 1, time_function%nst_linear
2625 energy_function%dff_linear(ienergy, ii) = &
2626 energy_function%dff_linear(ienergy, ii) + &
2627 real( time_function%dff_linear(itime, ii) * ez, real64)
2628 end do
2629 ez = ez * eidt
2630 end do
2631 end select
2632
2633 ! The total sum must be multiplied by time_step in order to get the integral.
2634 do ii = 1, time_function%nst_linear
2635 energy_function%dff_linear(ienergy, ii) = &
2636 energy_function%dff_linear(ienergy, ii) * time_step
2637 end do
2638
2639
2640 end do
2641
2643
2644 call compressed_sensing_init(cs, transform, &
2645 time_end - time_start + 1, time_step, time_step*(time_start - 1) - t0, &
2646 energy_steps, energy_step, energy_start, noise)
2647
2648 do ii = 1, time_function%nst_linear
2649 call compressed_sensing_spectral_analysis(cs, time_function%dff_linear(:, ii), &
2650 energy_function%dff_linear(:, ii))
2651 end do
2652
2653 call compressed_sensing_end(cs)
2654
2655 end select
2656
2657 pop_sub(fourier_transform)
2658
2659 end subroutine spectrum_fourier_transform
2660
2661 ! ---------------------------------------------------------
2662 subroutine spectrum_sigma_diagonalize(namespace, sigma, nspin, energy_step, min_energy, energy_steps, kick)
2663 type(namespace_t), intent(in) :: namespace
2664 real(real64), intent(in) :: sigma(:, :, :, :)
2665 integer, intent(in) :: nspin
2666 real(real64), intent(in) :: energy_step, min_energy
2667 integer, intent(in) :: energy_steps
2668 type(kick_t), optional, intent(in) :: kick
2669
2670 integer :: is, idir, jdir, ie, info, out_file, out_file_t
2671 real(real64), allocatable :: work(:,:)
2672 complex(real64), allocatable :: w(:)
2673 character(len=20) :: header_string
2674 logical :: spins_singlet, spins_triplet, symmetrize
2675 real(real64), allocatable :: pp(:,:), pp2(:,:)
2676
2678
2679
2680 !%Variable PropagationSpectrumSymmetrizeSigma
2681 !%Type logical
2682 !%Default .false.
2683 !%Section Utilities::oct-propagation_spectrum
2684 !%Description
2685 !% The polarizablity tensor has to be real and symmetric. Due to numerical accuracy,
2686 !% that is not extricly conserved when computing it from different time-propations.
2687 !% If <tt>PropagationSpectrumSymmetrizeSigma = yes</tt>, the polarizability tensor is
2688 !% symmetrized before its diagonalizied.
2689 !% This variable is only used if the cross_section_tensor is computed.
2690 !%End
2691 call parse_variable(namespace, 'PropagationSpectrumSymmetrizeSigma', .false., symmetrize)
2692 call messages_print_var_value('PropagationSpectrumSymmetrizeSigma', symmetrize, namespace=namespace)
2693
2694 spins_singlet = .true.
2695 spins_triplet = .false.
2696 if (present(kick)) then
2697 select case (kick_get_type(kick))
2698 case (kick_spin_mode)
2699 spins_triplet = .true.
2700 spins_singlet = .false.
2701 case (kick_spin_density_mode)
2702 spins_triplet = .true.
2703 end select
2704 end if
2705
2706 if (spins_singlet .and. spins_triplet) then
2707 out_file = io_open('cross_section_diagonal-sigma_s', namespace, action='write')
2708 out_file_t = io_open('cross_section_diagonal-sigma_t', namespace, action='write')
2709 else
2710 out_file = io_open('cross_section_diagonal-sigma', namespace, action='write')
2711 end if
2712
2713 write(out_file, '(a1, a20)', advance = 'no') '#', str_center("Energy", 20)
2714 do idir = 1, 3
2715 write(out_file, '(a20)', advance = 'no') str_center("Real part", 20)
2716 if (.not. symmetrize) write(out_file, '(a20)', advance = 'no') str_center("Imaginary part", 20)
2717 do jdir = 1, 3
2718 write(header_string,'(a7,i1,a1,i1,a1,i1,a1)') 'vector(', idir, ',', jdir, ',', is, ')'
2719 write(out_file, '(a20)', advance = 'no') str_center(trim(header_string), 20)
2720 end do
2721 end do
2722 write(out_file, '(1x)')
2723 write(out_file, '(a1,a20)', advance = 'no') '#', str_center('[' // trim(units_abbrev(units_out%energy)) // ']', 20)
2724
2725 do idir = 1, 3
2726 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2727 if (.not. symmetrize) then
2728 write(out_file, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2729 end if
2730 do jdir = 1, 3
2731 write(out_file, '(a20)', advance = 'no') str_center('[ - ]', 20)
2732 end do
2733 end do
2734 write(out_file, '(1x)')
2735
2736 if (spins_singlet .and. spins_triplet) then
2737 write(out_file_t, '(a1, a20)', advance = 'no') '#', str_center("Energy", 20)
2738 do idir = 1, 3
2739 write(out_file_t, '(a20)', advance = 'no') str_center("Real part", 20)
2740 if (.not. symmetrize) write(out_file_t, '(a20)', advance = 'no') str_center("Imaginary part", 20)
2741 do jdir = 1, 3
2742 write(header_string,'(a7,i1,a1,i1,a1,i1,a1)') 'vector(', idir, ',', jdir, ',', is, ')'
2743 write(out_file_t, '(a20)', advance = 'no') str_center(trim(header_string), 20)
2744 end do
2745 end do
2746 write(out_file_t, '(1x)')
2747 write(out_file_t, '(a1,a20)', advance = 'no') '#', str_center('[' // trim(units_abbrev(units_out%energy)) // ']', 20)
2748
2749 do idir = 1, 3
2750 write(out_file_t, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2751 if (.not. symmetrize) then
2752 write(out_file_t, '(a20)', advance = 'no') str_center('[' // trim(units_abbrev(units_out%length**2)) // ']', 20)
2753 end if
2754 do jdir = 1, 3
2755 write(out_file_t, '(a20)', advance = 'no') str_center('[ - ]', 20)
2756 end do
2757 end do
2758 write(out_file_t, '(1x)')
2759 end if
2760
2761 safe_allocate(pp(1:3, 1:3))
2762 if (spins_triplet .and. spins_singlet) then
2763 safe_allocate(pp2(1:3, 1:3))
2764 end if
2765 safe_allocate(w(1:3))
2766 safe_allocate(work(1:3, 1:3))
2767 do ie = 1, energy_steps
2768
2769 pp(:, :) = sigma(:, :, ie, 1)
2770 if (nspin >= 2) then
2771 if (spins_singlet .and. spins_triplet) then
2772 pp2(:, :) = pp(:, :) - sigma(:, :, ie, 2)
2773 pp(:, :) = pp(:, :) + sigma(:, :, ie, 2)
2774 elseif (spins_triplet .and. .not. spins_singlet) then
2775 pp(:, :) = pp(:, :) - sigma(:, :, ie, 2)
2776 elseif (spins_singlet .and. .not. spins_triplet) then
2777 pp(:, :) = pp(:, :) + sigma(:, :, ie, 2)
2778 end if
2779 end if
2780
2781 if (symmetrize) then
2782 do idir = 1, 3
2783 do jdir = idir + 1, 3
2784 pp(idir, jdir) = (pp(idir, jdir) + pp(jdir, idir)) / m_two
2785 pp(jdir, idir) = pp(idir, jdir)
2786 end do
2787 end do
2788 end if
2789
2790 work(1:3, 1:3) = pp(1:3, 1:3)
2791 call lalg_eigensolve_nonh(3, work, w, err_code = info, sort_eigenvectors = .true.)
2792 ! Note that the cross-section elements do not have to be transformed to the proper units, since
2793 ! they have been read from the "cross_section_vector.x", where they are already in the proper units.
2794
2795 write(out_file,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, ((ie-1) * energy_step + min_energy))
2796 do idir = 3, 1, -1
2797 if (symmetrize) then
2798 write(out_file,'(2e20.8)', advance = 'no') real(w(idir), real64)
2799 else
2800 write(out_file,'(2e20.8)', advance = 'no') w(idir)
2801 end if
2802
2803 do jdir = 1, 3
2804 write(out_file,'(e20.8)', advance = 'no') work(jdir, idir)
2805 end do
2806 end do
2807 write(out_file, '(1x)')
2808
2809 if (spins_singlet .and. spins_triplet) then
2810 if (symmetrize) then
2811 do idir = 1, 3
2812 do jdir = idir + 1, 3
2813 pp2(idir, jdir) = (pp2(idir, jdir) + pp2(jdir, idir)) / m_two
2814 pp2(jdir, idir) = pp2(idir, jdir)
2815 end do
2816 end do
2817 end if
2818 work(1:3, 1:3) = -pp2(1:3, 1:3)
2819 call lalg_eigensolve_nonh(3, work, w, err_code = info, sort_eigenvectors = .true.)
2820 ! Note that the cross-section elements do not have to be transformed to the proper units, since
2821 ! they have been read from the "cross_section_vector.x", where they are already in the proper units.
2822
2823 write(out_file_t,'(e20.8)', advance = 'no') units_from_atomic(units_out%energy, (ie * energy_step + min_energy))
2824 do idir = 3, 1, -1
2825 if (symmetrize) then
2826 write(out_file_t,'(2e20.8)', advance = 'no') real(w(idir), real64)
2827 else
2828 write(out_file_t,'(2e20.8)', advance = 'no') w(idir)
2829 end if
2830
2831 do jdir = 1, 3
2832 write(out_file_t,'(e20.8)', advance = 'no') work(jdir, idir)
2833 end do
2834 end do
2835 write(out_file_t, '(1x)')
2836 end if
2837 end do
2838
2839 call io_close(out_file)
2840
2841 safe_deallocate_a(pp)
2842 if (spins_triplet .and. spins_singlet) then
2843 safe_deallocate_a(pp2)
2844 call io_close(out_file_t)
2845 end if
2846 safe_deallocate_a(w)
2847 safe_deallocate_a(work)
2848
2850 end subroutine spectrum_sigma_diagonalize
2851
2852 pure integer function spectrum_nenergy_steps(spectrum) result(no_e)
2853 type(spectrum_t), intent(in) :: spectrum
2854
2855 no_e = nint((spectrum%max_energy-spectrum%min_energy) / spectrum%energy_step) + 1
2856 end function spectrum_nenergy_steps
2857
2858 subroutine spectrum_write_info(spectrum, out_file)
2859 type(spectrum_t), intent(in) :: spectrum
2860 integer, intent(in) :: out_file
2861
2862 push_sub(spectrum_write_info)
2863
2864 write(out_file, '(a,i4)') '# PropagationSpectrumDampMode = ', spectrum%damp
2865 write(out_file, '(a,f10.4)') '# PropagationSpectrumDampFactor = ', units_from_atomic(units_out%time**(-1), &
2866 spectrum%damp_factor)
2867 write(out_file, '(a,f10.4)') '# PropagationSpectrumStartTime = ', units_from_atomic(units_out%time, spectrum%start_time)
2868 write(out_file, '(a,f10.4)') '# PropagationSpectrumEndTime = ', units_from_atomic(units_out%time, spectrum%end_time)
2869 write(out_file, '(a,f10.4)') '# PropagationSpectrumMinEnergy = ', units_from_atomic(units_out%energy, spectrum%min_energy)
2870 write(out_file, '(a,f10.4)') '# PropagationSpectrumMaxEnergy = ', units_from_atomic(units_out%energy, spectrum%max_energy)
2871 write(out_file, '(a,f10.4)') '# PropagationSpectrumEnergyStep = ', units_from_atomic(units_out%energy, spectrum%energy_step)
2872
2873 pop_sub(spectrum_write_info)
2874 end subroutine spectrum_write_info
2875
2876end module spectrum_oct_m
2877
2878!! Local Variables:
2879!! mode: f90
2880!! coding: utf-8
2881!! 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:187
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:418
subroutine, public fft_end(this)
Definition: fft.F90:996
integer, parameter, public fft_complex
Definition: fft.F90:178
integer, parameter, public fftlib_fftw
Definition: fft.F90:183
real(real64), parameter, public m_two
Definition: global.F90:190
real(real64), parameter, public m_zero
Definition: global.F90:188
real(real64), parameter, public m_four
Definition: global.F90:192
real(real64), parameter, public p_ry
Definition: global.F90:221
real(real64), parameter, public m_third
Definition: global.F90:195
real(real64), parameter, public m_pi
some mathematical constants
Definition: global.F90:186
character(len= *), parameter, public pcm_dir
Definition: global.F90:260
complex(real64), parameter, public m_z0
Definition: global.F90:198
complex(real64), parameter, public m_zi
Definition: global.F90:202
real(real64), parameter, public p_c
Electron gyromagnetic ratio, see Phys. Rev. Lett. 130, 071801 (2023)
Definition: global.F90:224
real(real64), parameter, public m_one
Definition: global.F90:189
real(real64), parameter, public m_three
Definition: global.F90:191
Definition: io.F90:114
subroutine, public io_close(iunit, grp)
Definition: io.F90:418
subroutine, public io_skip_header(iunit)
Definition: io.F90:597
integer function, public io_open(file, namespace, action, status, form, position, die, recl, grp)
Definition: io.F90:352
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:1364
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:1668
subroutine, public messages_print_with_emphasis(msg, iunit, namespace)
Definition: messages.F90:920
character(len=512), private msg
Definition: messages.F90:165
subroutine, public messages_warning(no_lines, all_nodes, namespace)
Definition: messages.F90:537
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:414
subroutine, public messages_input_error(namespace, var, details, row, column)
Definition: messages.F90:713
subroutine, public messages_experimental(name, namespace)
Definition: messages.F90:1085
subroutine, public messages_info(no_lines, iunit, debug_only, stress, all_nodes, namespace)
Definition: messages.F90:616
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:2459
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:2507
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:2637
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:2756
subroutine spectrum_cross_section_info(namespace, iunit, nspin, kick, energy_steps, dw)
Definition: spectrum.F90:2421
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:2339
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:2551
subroutine, public spectrum_hs_from_acc(spectrum, namespace, out_file, pol, vec, w0)
Definition: spectrum.F90:2048
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:2149
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:2952
subroutine spectrum_hs_output(spectrum, namespace, out_file, pol, no_e, sp)
Definition: spectrum.F90:2304
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:2248
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:2385
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:2946
subroutine, public spectrum_hs_from_mult(spectrum, namespace, out_file, pol, vec, w0)
Definition: spectrum.F90:1929
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:1836
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)