2015-04-14 02:00:58 +02:00
|
|
|
!==============================================================================!
|
|
|
|
! !
|
|
|
|
! Independent alpha/beta parts !
|
|
|
|
! !
|
|
|
|
!==============================================================================!
|
|
|
|
|
|
|
|
use bitmasks
|
|
|
|
|
|
|
|
integer*8 function spin_det_search_key(det,Nint)
|
|
|
|
use bitmasks
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
|
|
|
! Return an integer*8 corresponding to a determinant index for searching
|
|
|
|
END_DOC
|
|
|
|
integer, intent(in) :: Nint
|
|
|
|
integer(bit_kind), intent(in) :: det(Nint)
|
2016-02-19 00:20:28 +01:00
|
|
|
integer(bit_kind), parameter :: unsigned_shift = -huge(1_bit_kind) ! 100...00
|
2015-04-14 02:00:58 +02:00
|
|
|
integer :: i
|
|
|
|
spin_det_search_key = det(1)
|
|
|
|
do i=2,Nint
|
|
|
|
spin_det_search_key = ieor(spin_det_search_key,det(i))
|
|
|
|
enddo
|
2016-02-19 00:20:28 +01:00
|
|
|
spin_det_search_key = spin_det_search_key+1_bit_kind-unsigned_shift
|
2015-04-14 02:00:58 +02:00
|
|
|
end
|
|
|
|
|
|
|
|
|
|
|
|
BEGIN_PROVIDER [ integer(bit_kind), psi_det_alpha, (N_int,psi_det_size) ]
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
|
|
|
! List of alpha determinants of psi_det
|
|
|
|
END_DOC
|
|
|
|
integer :: i,k
|
|
|
|
|
|
|
|
do i=1,N_det
|
|
|
|
do k=1,N_int
|
|
|
|
psi_det_alpha(k,i) = psi_det(k,1,i)
|
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
END_PROVIDER
|
|
|
|
|
|
|
|
BEGIN_PROVIDER [ integer(bit_kind), psi_det_beta, (N_int,psi_det_size) ]
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
|
|
|
! List of beta determinants of psi_det
|
|
|
|
END_DOC
|
|
|
|
integer :: i,k
|
|
|
|
|
|
|
|
do i=1,N_det
|
|
|
|
do k=1,N_int
|
|
|
|
psi_det_beta(k,i) = psi_det(k,2,i)
|
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
END_PROVIDER
|
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
|
|
|
|
BEGIN_TEMPLATE
|
|
|
|
|
|
|
|
BEGIN_PROVIDER [ integer(bit_kind), psi_det_$alpha_unique, (N_int,psi_det_size) ]
|
|
|
|
&BEGIN_PROVIDER [ integer, N_det_$alpha_unique ]
|
2015-04-14 02:00:58 +02:00
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
2015-05-06 15:05:08 +02:00
|
|
|
! Unique $alpha determinants
|
2015-04-14 02:00:58 +02:00
|
|
|
END_DOC
|
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
integer :: i,j,k
|
2015-04-14 02:00:58 +02:00
|
|
|
integer, allocatable :: iorder(:)
|
|
|
|
integer*8, allocatable :: bit_tmp(:)
|
|
|
|
integer*8 :: last_key
|
|
|
|
integer*8, external :: spin_det_search_key
|
2015-05-06 15:05:08 +02:00
|
|
|
logical,allocatable :: duplicate(:)
|
2015-04-14 02:00:58 +02:00
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
allocate ( iorder(N_det), bit_tmp(N_det), duplicate(N_det) )
|
2015-04-14 02:00:58 +02:00
|
|
|
|
|
|
|
do i=1,N_det
|
|
|
|
iorder(i) = i
|
2015-05-06 15:05:08 +02:00
|
|
|
bit_tmp(i) = spin_det_search_key(psi_det_$alpha(1,i),N_int)
|
2015-04-14 02:00:58 +02:00
|
|
|
enddo
|
|
|
|
|
|
|
|
call i8sort(bit_tmp,iorder,N_det)
|
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
N_det_$alpha_unique = 0
|
2015-04-14 02:00:58 +02:00
|
|
|
last_key = 0_8
|
|
|
|
do i=1,N_det
|
2015-05-06 15:05:08 +02:00
|
|
|
last_key = bit_tmp(i)
|
|
|
|
N_det_$alpha_unique += 1
|
|
|
|
do k=1,N_int
|
|
|
|
psi_det_$alpha_unique(k,N_det_$alpha_unique) = psi_det_$alpha(k,iorder(i))
|
|
|
|
enddo
|
|
|
|
duplicate(i) = .False.
|
2015-04-14 02:00:58 +02:00
|
|
|
enddo
|
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
j=1
|
|
|
|
do i=1,N_det_$alpha_unique-1
|
|
|
|
if (duplicate(i)) then
|
|
|
|
cycle
|
|
|
|
endif
|
|
|
|
j = i+1
|
|
|
|
do while (bit_tmp(j)==bit_tmp(i))
|
|
|
|
if (duplicate(j)) then
|
|
|
|
j += 1
|
|
|
|
cycle
|
|
|
|
endif
|
|
|
|
duplicate(j) = .True.
|
|
|
|
do k=1,N_int
|
|
|
|
if (psi_det_$alpha_unique(k,i) /= psi_det_$alpha_unique(k,j)) then
|
|
|
|
duplicate(j) = .False.
|
|
|
|
exit
|
|
|
|
endif
|
|
|
|
enddo
|
|
|
|
j+=1
|
|
|
|
if (j > N_det_$alpha_unique) then
|
|
|
|
exit
|
|
|
|
endif
|
|
|
|
enddo
|
2015-04-14 02:00:58 +02:00
|
|
|
enddo
|
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
j=1
|
|
|
|
do i=2,N_det_$alpha_unique
|
|
|
|
if (duplicate(i)) then
|
|
|
|
cycle
|
|
|
|
else
|
|
|
|
j += 1
|
|
|
|
psi_det_$alpha_unique(:,j) = psi_det_$alpha_unique(:,i)
|
2015-04-14 02:00:58 +02:00
|
|
|
endif
|
|
|
|
enddo
|
2015-05-06 15:05:08 +02:00
|
|
|
N_det_$alpha_unique = j
|
2015-04-14 02:00:58 +02:00
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
deallocate (iorder, bit_tmp, duplicate)
|
2015-04-14 02:00:58 +02:00
|
|
|
END_PROVIDER
|
|
|
|
|
2015-05-06 15:05:08 +02:00
|
|
|
SUBST [ alpha ]
|
|
|
|
|
|
|
|
alpha ;;
|
|
|
|
beta ;;
|
|
|
|
|
|
|
|
END_TEMPLATE
|
2015-04-14 02:00:58 +02:00
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
integer function get_index_in_psi_det_alpha_unique(key,Nint)
|
|
|
|
use bitmasks
|
|
|
|
BEGIN_DOC
|
|
|
|
! Returns the index of the determinant in the ``psi_det_alpha_unique`` array
|
|
|
|
END_DOC
|
|
|
|
implicit none
|
|
|
|
|
|
|
|
integer, intent(in) :: Nint
|
|
|
|
integer(bit_kind), intent(in) :: key(Nint)
|
|
|
|
|
|
|
|
integer :: i, ibegin, iend, istep, l
|
|
|
|
integer*8 :: det_ref, det_search
|
|
|
|
integer*8, external :: spin_det_search_key
|
2015-07-29 18:27:07 +02:00
|
|
|
logical :: in_wavefunction
|
2015-04-14 02:00:58 +02:00
|
|
|
|
2015-07-29 18:27:07 +02:00
|
|
|
in_wavefunction = .False.
|
2015-04-14 02:00:58 +02:00
|
|
|
get_index_in_psi_det_alpha_unique = 0
|
|
|
|
ibegin = 1
|
|
|
|
iend = N_det_alpha_unique + 1
|
|
|
|
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
det_ref = spin_det_search_key(key,Nint)
|
2015-05-06 15:05:08 +02:00
|
|
|
|
2015-04-14 02:00:58 +02:00
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
det_search = spin_det_search_key(psi_det_alpha_unique(1,1),Nint)
|
|
|
|
|
|
|
|
istep = ishft(iend-ibegin,-1)
|
|
|
|
i=ibegin+istep
|
|
|
|
do while (istep > 0)
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
det_search = spin_det_search_key(psi_det_alpha_unique(1,i),Nint)
|
|
|
|
if ( det_search > det_ref ) then
|
|
|
|
iend = i
|
|
|
|
else if ( det_search == det_ref ) then
|
|
|
|
exit
|
|
|
|
else
|
|
|
|
ibegin = i
|
|
|
|
endif
|
|
|
|
istep = ishft(iend-ibegin,-1)
|
|
|
|
i = ibegin + istep
|
|
|
|
end do
|
|
|
|
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
do while (spin_det_search_key(psi_det_alpha_unique(1,i),Nint) == det_ref)
|
|
|
|
i = i-1
|
|
|
|
if (i == 0) then
|
|
|
|
exit
|
|
|
|
endif
|
|
|
|
enddo
|
|
|
|
i += 1
|
|
|
|
|
|
|
|
if (i > N_det_alpha_unique) then
|
|
|
|
return
|
|
|
|
endif
|
|
|
|
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
do while (spin_det_search_key(psi_det_alpha_unique(1,i),Nint) == det_ref)
|
|
|
|
if (key(1) /= psi_det_alpha_unique(1,i)) then
|
|
|
|
continue
|
|
|
|
else
|
2015-07-29 18:27:07 +02:00
|
|
|
in_wavefunction = .True.
|
2015-04-14 02:00:58 +02:00
|
|
|
!DIR$ IVDEP
|
|
|
|
!DIR$ LOOP COUNT MIN(3)
|
|
|
|
do l=2,Nint
|
|
|
|
if (key(l) /= psi_det_alpha_unique(l,i)) then
|
2015-07-29 18:27:07 +02:00
|
|
|
in_wavefunction = .False.
|
2015-04-14 02:00:58 +02:00
|
|
|
endif
|
|
|
|
enddo
|
2015-07-29 18:27:07 +02:00
|
|
|
if (in_wavefunction) then
|
2015-04-14 02:00:58 +02:00
|
|
|
get_index_in_psi_det_alpha_unique = i
|
|
|
|
return
|
|
|
|
endif
|
|
|
|
endif
|
|
|
|
i += 1
|
|
|
|
if (i > N_det_alpha_unique) then
|
|
|
|
return
|
|
|
|
endif
|
|
|
|
|
|
|
|
enddo
|
|
|
|
|
|
|
|
end
|
|
|
|
|
|
|
|
integer function get_index_in_psi_det_beta_unique(key,Nint)
|
|
|
|
use bitmasks
|
|
|
|
BEGIN_DOC
|
|
|
|
! Returns the index of the determinant in the ``psi_det_beta_unique`` array
|
|
|
|
END_DOC
|
|
|
|
implicit none
|
|
|
|
|
|
|
|
integer, intent(in) :: Nint
|
|
|
|
integer(bit_kind), intent(in) :: key(Nint)
|
|
|
|
|
|
|
|
integer :: i, ibegin, iend, istep, l
|
|
|
|
integer*8 :: det_ref, det_search
|
|
|
|
integer*8, external :: spin_det_search_key
|
2015-07-29 18:27:07 +02:00
|
|
|
logical :: in_wavefunction
|
2015-04-14 02:00:58 +02:00
|
|
|
|
2015-07-29 18:27:07 +02:00
|
|
|
in_wavefunction = .False.
|
2015-04-14 02:00:58 +02:00
|
|
|
get_index_in_psi_det_beta_unique = 0
|
|
|
|
ibegin = 1
|
|
|
|
iend = N_det_beta_unique + 1
|
|
|
|
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
det_ref = spin_det_search_key(key,Nint)
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
det_search = spin_det_search_key(psi_det_beta_unique(1,1),Nint)
|
|
|
|
|
|
|
|
istep = ishft(iend-ibegin,-1)
|
|
|
|
i=ibegin+istep
|
|
|
|
do while (istep > 0)
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
det_search = spin_det_search_key(psi_det_beta_unique(1,i),Nint)
|
|
|
|
if ( det_search > det_ref ) then
|
|
|
|
iend = i
|
|
|
|
else if ( det_search == det_ref ) then
|
|
|
|
exit
|
|
|
|
else
|
|
|
|
ibegin = i
|
|
|
|
endif
|
|
|
|
istep = ishft(iend-ibegin,-1)
|
|
|
|
i = ibegin + istep
|
|
|
|
end do
|
|
|
|
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
do while (spin_det_search_key(psi_det_beta_unique(1,i),Nint) == det_ref)
|
|
|
|
i = i-1
|
|
|
|
if (i == 0) then
|
|
|
|
exit
|
|
|
|
endif
|
|
|
|
enddo
|
|
|
|
i += 1
|
|
|
|
|
|
|
|
if (i > N_det_beta_unique) then
|
|
|
|
return
|
|
|
|
endif
|
|
|
|
|
|
|
|
!DIR$ FORCEINLINE
|
|
|
|
do while (spin_det_search_key(psi_det_beta_unique(1,i),Nint) == det_ref)
|
|
|
|
if (key(1) /= psi_det_beta_unique(1,i)) then
|
|
|
|
continue
|
|
|
|
else
|
2015-07-29 18:27:07 +02:00
|
|
|
in_wavefunction = .True.
|
2015-04-14 02:00:58 +02:00
|
|
|
!DIR$ IVDEP
|
|
|
|
!DIR$ LOOP COUNT MIN(3)
|
|
|
|
do l=2,Nint
|
|
|
|
if (key(l) /= psi_det_beta_unique(l,i)) then
|
2015-07-29 18:27:07 +02:00
|
|
|
in_wavefunction = .False.
|
2015-04-14 02:00:58 +02:00
|
|
|
endif
|
|
|
|
enddo
|
2015-07-29 18:27:07 +02:00
|
|
|
if (in_wavefunction) then
|
2015-04-14 02:00:58 +02:00
|
|
|
get_index_in_psi_det_beta_unique = i
|
|
|
|
return
|
|
|
|
endif
|
|
|
|
endif
|
|
|
|
i += 1
|
|
|
|
if (i > N_det_beta_unique) then
|
|
|
|
return
|
|
|
|
endif
|
|
|
|
|
|
|
|
enddo
|
|
|
|
|
|
|
|
end
|
|
|
|
|
|
|
|
|
2015-03-27 13:32:43 +01:00
|
|
|
subroutine write_spindeterminants
|
|
|
|
use bitmasks
|
|
|
|
implicit none
|
|
|
|
integer*8, allocatable :: tmpdet(:,:)
|
|
|
|
integer :: N_int2
|
|
|
|
integer :: i,j,k
|
|
|
|
integer*8 :: det_8(100)
|
|
|
|
integer(bit_kind) :: det_bk((100*8)/bit_kind)
|
|
|
|
equivalence (det_8, det_bk)
|
|
|
|
|
|
|
|
N_int2 = (N_int*bit_kind)/8
|
|
|
|
call ezfio_set_spindeterminants_n_det_alpha(N_det_alpha_unique)
|
|
|
|
call ezfio_set_spindeterminants_n_det_beta(N_det_beta_unique)
|
2015-04-14 02:00:58 +02:00
|
|
|
call ezfio_set_spindeterminants_n_det(N_det)
|
2015-03-27 13:32:43 +01:00
|
|
|
call ezfio_set_spindeterminants_n_int(N_int)
|
|
|
|
call ezfio_set_spindeterminants_bit_kind(bit_kind)
|
|
|
|
call ezfio_set_spindeterminants_n_states(N_states)
|
|
|
|
|
|
|
|
allocate(tmpdet(N_int2,N_det_alpha_unique))
|
|
|
|
do i=1,N_det_alpha_unique
|
|
|
|
do k=1,N_int
|
|
|
|
det_bk(k) = psi_det_alpha_unique(k,i)
|
|
|
|
enddo
|
|
|
|
do k=1,N_int2
|
|
|
|
tmpdet(k,i) = det_8(k)
|
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
call ezfio_set_spindeterminants_psi_det_alpha(psi_det_alpha_unique)
|
|
|
|
deallocate(tmpdet)
|
2015-03-28 00:15:09 +01:00
|
|
|
|
2015-03-27 13:32:43 +01:00
|
|
|
allocate(tmpdet(N_int2,N_det_beta_unique))
|
|
|
|
do i=1,N_det_beta_unique
|
|
|
|
do k=1,N_int
|
|
|
|
det_bk(k) = psi_det_beta_unique(k,i)
|
|
|
|
enddo
|
|
|
|
do k=1,N_int2
|
|
|
|
tmpdet(k,i) = det_8(k)
|
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
call ezfio_set_spindeterminants_psi_det_beta(psi_det_beta_unique)
|
|
|
|
deallocate(tmpdet)
|
2015-03-28 00:15:09 +01:00
|
|
|
|
2015-07-30 16:05:28 +02:00
|
|
|
call ezfio_set_spindeterminants_psi_coef_matrix_values(psi_bilinear_matrix_values)
|
|
|
|
call ezfio_set_spindeterminants_psi_coef_matrix_rows(psi_bilinear_matrix_rows)
|
|
|
|
call ezfio_set_spindeterminants_psi_coef_matrix_columns(psi_bilinear_matrix_columns)
|
2015-03-28 00:15:09 +01:00
|
|
|
|
2015-03-27 13:32:43 +01:00
|
|
|
end
|
2015-04-14 02:00:58 +02:00
|
|
|
|
2015-10-17 00:19:44 +02:00
|
|
|
BEGIN_PROVIDER [ double precision, det_alpha_norm, (N_det_alpha_unique) ]
|
|
|
|
&BEGIN_PROVIDER [ double precision, det_beta_norm, (N_det_beta_unique) ]
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
|
|
|
! Norm of the alpha and beta spin determinants in the wave function:
|
|
|
|
!
|
|
|
|
! ||Da||_i \sum_j C_{ij}**2
|
|
|
|
END_DOC
|
|
|
|
|
|
|
|
integer :: i,j,k,l
|
|
|
|
double precision :: f
|
|
|
|
|
|
|
|
det_alpha_norm = 0.d0
|
|
|
|
det_beta_norm = 0.d0
|
|
|
|
do k=1,N_det
|
|
|
|
i = psi_bilinear_matrix_rows(k)
|
|
|
|
j = psi_bilinear_matrix_columns(k)
|
|
|
|
do l=1,N_states
|
|
|
|
f = psi_bilinear_matrix_values(k,l)*psi_bilinear_matrix_values(k,l)
|
|
|
|
enddo
|
|
|
|
det_alpha_norm(i) += f
|
|
|
|
det_beta_norm(j) += f
|
|
|
|
enddo
|
|
|
|
det_alpha_norm = det_alpha_norm / dble(N_states)
|
|
|
|
det_beta_norm = det_beta_norm / dble(N_states)
|
|
|
|
|
|
|
|
END_PROVIDER
|
|
|
|
|
2015-04-14 02:00:58 +02:00
|
|
|
|
|
|
|
!==============================================================================!
|
|
|
|
! !
|
|
|
|
! Alpha x Beta Matrix !
|
|
|
|
! !
|
|
|
|
!==============================================================================!
|
|
|
|
|
2015-07-30 16:05:28 +02:00
|
|
|
BEGIN_PROVIDER [ double precision, psi_bilinear_matrix_values, (N_det,N_states) ]
|
|
|
|
&BEGIN_PROVIDER [ integer, psi_bilinear_matrix_rows, (N_det) ]
|
|
|
|
&BEGIN_PROVIDER [ integer, psi_bilinear_matrix_columns, (N_det) ]
|
2015-04-14 02:00:58 +02:00
|
|
|
use bitmasks
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
2015-07-30 16:05:28 +02:00
|
|
|
! Sparse coefficient matrix if the wave function is expressed in a bilinear form :
|
|
|
|
! D_a^t C D_b
|
2015-04-14 02:00:58 +02:00
|
|
|
END_DOC
|
|
|
|
integer :: i,j,k, l
|
|
|
|
integer(bit_kind) :: tmp_det(N_int,2)
|
|
|
|
integer :: idx
|
|
|
|
integer, external :: get_index_in_psi_det_sorted_bit
|
|
|
|
|
|
|
|
|
|
|
|
PROVIDE psi_coef_sorted_bit
|
|
|
|
|
|
|
|
integer, allocatable :: iorder(:), to_sort(:)
|
|
|
|
integer, external :: get_index_in_psi_det_alpha_unique
|
|
|
|
integer, external :: get_index_in_psi_det_beta_unique
|
|
|
|
allocate(iorder(N_det), to_sort(N_det))
|
|
|
|
do k=1,N_det
|
|
|
|
i = get_index_in_psi_det_alpha_unique(psi_det(1,1,k),N_int)
|
|
|
|
j = get_index_in_psi_det_beta_unique (psi_det(1,2,k),N_int)
|
2015-05-06 15:05:08 +02:00
|
|
|
|
2015-04-14 02:00:58 +02:00
|
|
|
do l=1,N_states
|
2015-07-30 16:05:28 +02:00
|
|
|
psi_bilinear_matrix_values(k,l) = psi_coef(k,l)
|
2015-04-14 02:00:58 +02:00
|
|
|
enddo
|
2015-07-30 16:05:28 +02:00
|
|
|
psi_bilinear_matrix_rows(k) = i
|
|
|
|
psi_bilinear_matrix_columns(k) = j
|
2015-04-14 02:00:58 +02:00
|
|
|
to_sort(k) = N_det_alpha_unique * (j-1) + i
|
|
|
|
iorder(k) = k
|
|
|
|
enddo
|
|
|
|
call isort(to_sort, iorder, N_det)
|
2015-07-30 16:05:28 +02:00
|
|
|
call iset_order(psi_bilinear_matrix_rows,iorder,N_det)
|
|
|
|
call iset_order(psi_bilinear_matrix_columns,iorder,N_det)
|
|
|
|
call dset_order(psi_bilinear_matrix_values,iorder,N_det)
|
2015-04-14 02:00:58 +02:00
|
|
|
deallocate(iorder,to_sort)
|
|
|
|
END_PROVIDER
|
|
|
|
|
2015-07-30 16:05:28 +02:00
|
|
|
BEGIN_PROVIDER [ double precision, psi_bilinear_matrix, (N_det_alpha_unique,N_det_beta_unique,N_states) ]
|
2015-04-14 02:00:58 +02:00
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
2015-07-30 16:05:28 +02:00
|
|
|
! Coefficient matrix if the wave function is expressed in a bilinear form :
|
|
|
|
! D_a^t C D_b
|
2015-04-14 02:00:58 +02:00
|
|
|
END_DOC
|
|
|
|
integer :: i,j,k,istate
|
2015-07-30 16:05:28 +02:00
|
|
|
psi_bilinear_matrix = 0.d0
|
2015-04-14 02:00:58 +02:00
|
|
|
do k=1,N_det
|
2015-07-30 16:05:28 +02:00
|
|
|
i = psi_bilinear_matrix_rows(k)
|
|
|
|
j = psi_bilinear_matrix_columns(k)
|
2015-04-14 02:00:58 +02:00
|
|
|
do istate=1,N_states
|
2015-07-30 16:05:28 +02:00
|
|
|
psi_bilinear_matrix(i,j,istate) = psi_bilinear_matrix_values(k,istate)
|
2015-04-14 02:00:58 +02:00
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
END_PROVIDER
|
|
|
|
|
2015-11-12 01:08:04 +01:00
|
|
|
subroutine create_wf_of_psi_bilinear_matrix(truncate)
|
2015-04-14 02:00:58 +02:00
|
|
|
use bitmasks
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
2015-07-30 16:05:28 +02:00
|
|
|
! Generate a wave function containing all possible products
|
|
|
|
! of alpha and beta determinants
|
2015-04-14 02:00:58 +02:00
|
|
|
END_DOC
|
2015-11-12 01:08:04 +01:00
|
|
|
logical, intent(in) :: truncate
|
2015-04-14 02:00:58 +02:00
|
|
|
integer :: i,j,k
|
|
|
|
integer(bit_kind) :: tmp_det(N_int,2)
|
|
|
|
integer :: idx
|
|
|
|
integer, external :: get_index_in_psi_det_sorted_bit
|
|
|
|
double precision :: norm(N_states)
|
|
|
|
|
|
|
|
call generate_all_alpha_beta_det_products
|
|
|
|
norm = 0.d0
|
|
|
|
do j=1,N_det_beta_unique
|
|
|
|
do k=1,N_int
|
|
|
|
tmp_det(k,2) = psi_det_beta_unique(k,j)
|
|
|
|
enddo
|
|
|
|
do i=1,N_det_alpha_unique
|
|
|
|
do k=1,N_int
|
|
|
|
tmp_det(k,1) = psi_det_alpha_unique(k,i)
|
|
|
|
enddo
|
|
|
|
idx = get_index_in_psi_det_sorted_bit(tmp_det,N_int)
|
|
|
|
if (idx > 0) then
|
|
|
|
do k=1,N_states
|
2015-07-30 16:05:28 +02:00
|
|
|
psi_coef_sorted_bit(idx,k) = psi_bilinear_matrix(i,j,k)
|
|
|
|
norm(k) += psi_bilinear_matrix(i,j,k)
|
2015-04-14 02:00:58 +02:00
|
|
|
enddo
|
|
|
|
endif
|
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
do k=1,N_states
|
|
|
|
norm(k) = 1.d0/dsqrt(norm(k))
|
|
|
|
do i=1,N_det
|
|
|
|
psi_coef_sorted_bit(i,k) = psi_coef_sorted_bit(i,k)*norm(k)
|
|
|
|
enddo
|
|
|
|
enddo
|
|
|
|
psi_det = psi_det_sorted_bit
|
|
|
|
psi_coef = psi_coef_sorted_bit
|
|
|
|
TOUCH psi_det psi_coef
|
|
|
|
psi_det = psi_det_sorted
|
|
|
|
psi_coef = psi_coef_sorted
|
|
|
|
norm(1) = 0.d0
|
|
|
|
do i=1,N_det
|
|
|
|
norm(1) += psi_average_norm_contrib_sorted(i)
|
2015-11-12 01:08:04 +01:00
|
|
|
if (truncate) then
|
|
|
|
if (norm(1) >= 0.999999d0) then
|
|
|
|
exit
|
|
|
|
endif
|
2015-04-14 02:00:58 +02:00
|
|
|
endif
|
|
|
|
enddo
|
|
|
|
N_det = min(i,N_det)
|
|
|
|
SOFT_TOUCH psi_det psi_coef N_det
|
|
|
|
|
|
|
|
end
|
|
|
|
|
|
|
|
subroutine generate_all_alpha_beta_det_products
|
|
|
|
implicit none
|
|
|
|
BEGIN_DOC
|
|
|
|
! Create a wave function from all possible alpha x beta determinants
|
|
|
|
END_DOC
|
|
|
|
integer :: i,j,k,l
|
|
|
|
integer :: idx, iproc
|
|
|
|
integer, external :: get_index_in_psi_det_sorted_bit
|
|
|
|
integer(bit_kind), allocatable :: tmp_det(:,:,:)
|
|
|
|
logical, external :: is_in_wavefunction
|
|
|
|
integer, external :: omp_get_thread_num
|
|
|
|
|
|
|
|
!$OMP PARALLEL DEFAULT(NONE) SHARED(psi_coef_sorted_bit,N_det_beta_unique,&
|
|
|
|
!$OMP N_det_alpha_unique, N_int, psi_det_alpha_unique, psi_det_beta_unique,&
|
|
|
|
!$OMP N_det) &
|
|
|
|
!$OMP PRIVATE(i,j,k,l,tmp_det,idx,iproc)
|
|
|
|
!$ iproc = omp_get_thread_num()
|
|
|
|
allocate (tmp_det(N_int,2,N_det_alpha_unique))
|
|
|
|
!$OMP DO
|
|
|
|
do j=1,N_det_beta_unique
|
|
|
|
l = 1
|
|
|
|
do i=1,N_det_alpha_unique
|
|
|
|
do k=1,N_int
|
|
|
|
tmp_det(k,1,l) = psi_det_alpha_unique(k,i)
|
|
|
|
tmp_det(k,2,l) = psi_det_beta_unique (k,j)
|
|
|
|
enddo
|
2015-07-29 18:27:07 +02:00
|
|
|
if (.not.is_in_wavefunction(tmp_det(1,1,l),N_int)) then
|
2015-04-14 02:00:58 +02:00
|
|
|
l = l+1
|
|
|
|
endif
|
|
|
|
enddo
|
|
|
|
call fill_H_apply_buffer_no_selection(l-1, tmp_det, N_int, iproc)
|
|
|
|
enddo
|
|
|
|
!$OMP END DO NOWAIT
|
|
|
|
deallocate(tmp_det)
|
|
|
|
!$OMP END PARALLEL
|
|
|
|
call copy_H_apply_buffer_to_wf
|
|
|
|
SOFT_TOUCH psi_det psi_coef N_det
|
|
|
|
end
|
|
|
|
|
|
|
|
|