2019-01-25 11:39:31 +01:00
open Qputils
open Qptypes
2019-03-13 11:35:21 +01:00
open Sexplib . Std
2019-01-25 11:39:31 +01:00
type element =
| Element of Element . t
| Int_elem of ( Nucl_number . t * Element . t )
(* * Handle dummy atoms placed on bonds *)
let dummy_centers ~ threshold ~ molecule ~ nuclei =
let d =
Molecule . distance_matrix molecule
in
let n =
Array . length d
in
let nuclei =
Array . of_list nuclei
in
let rec aux accu = function
| ( - 1 , _ ) -> accu
| ( i , - 1 ) -> aux accu ( i - 1 , i - 1 )
| ( i , j ) when ( i > j ) ->
let new_accu =
let x , y =
Element . covalent_radius ( nuclei . ( i ) ) . Atom . element | > Positive_float . to_float ,
Element . covalent_radius ( nuclei . ( j ) ) . Atom . element | > Positive_float . to_float
in
let r =
( x + . y ) * . threshold
in
if d . ( i ) . ( j ) < r then
( i , x , j , y , d . ( i ) . ( j ) ) :: accu
else
accu
in aux new_accu ( i , j - 1 )
| ( i , j ) when ( i = j ) -> aux accu ( i , j - 1 )
| _ -> assert false
in
aux [] ( n - 1 , n - 1 )
2020-05-25 11:31:28 +02:00
| > list_map ( fun ( i , x , j , y , r ) ->
2019-01-25 11:39:31 +01:00
let f =
x /. ( x + . y )
in
let u =
Point3d . of_tuple ~ units : Units . Bohr
( nuclei . ( i ) . Atom . coord . Point3d . x + .
( nuclei . ( j ) . Atom . coord . Point3d . x -. nuclei . ( i ) . Atom . coord . Point3d . x ) * . f ,
nuclei . ( i ) . Atom . coord . Point3d . y + .
( nuclei . ( j ) . Atom . coord . Point3d . y -. nuclei . ( i ) . Atom . coord . Point3d . y ) * . f ,
nuclei . ( i ) . Atom . coord . Point3d . z + .
( nuclei . ( j ) . Atom . coord . Point3d . z -. nuclei . ( i ) . Atom . coord . Point3d . z ) * . f )
in
Atom . { element = Element . X ; charge = Charge . of_int 0 ; coord = u }
)
(* * Run the program *)
let run ? o b au c d m p cart xyz_file =
(* Read molecule *)
let molecule =
if au then
( Molecule . of_file xyz_file ~ charge : ( Charge . of_int c )
~ multiplicity : ( Multiplicity . of_int m ) ~ units : Units . Bohr )
else
( Molecule . of_file xyz_file ~ charge : ( Charge . of_int c )
~ multiplicity : ( Multiplicity . of_int m ) )
in
let dummy =
dummy_centers ~ threshold : d ~ molecule ~ nuclei : molecule . Molecule . nuclei
in
let nuclei =
molecule . Molecule . nuclei @ dummy
in
(* * * * * * * * * *
Basis set
* * * * * * * * * * )
let basis_table =
2019-03-13 11:35:21 +01:00
Hashtbl . create 63
2019-01-25 11:39:31 +01:00
in
(* Open basis set channels *)
let basis_channel element =
let key =
match element with
| Element e -> Element . to_string e
| Int_elem ( i , e ) -> Printf . sprintf " %d,%s " ( Nucl_number . to_int i ) ( Element . to_string e )
in
2019-03-13 11:35:21 +01:00
Hashtbl . find basis_table key
2019-01-25 11:39:31 +01:00
in
let temp_filename =
Filename . temp_file " qp_create_ " " .basis "
in
let () =
Sys . remove temp_filename
in
let fetch_channel basis =
let long_basis =
Qpackage . root ^ " /data/basis/ " ^ basis
in
match
2019-03-13 11:35:21 +01:00
Sys . file_exists basis ,
Sys . file_exists long_basis
2019-01-25 11:39:31 +01:00
with
2019-03-13 11:35:21 +01:00
| true , _ -> open_in basis
| false , true -> open_in long_basis
2019-01-25 11:39:31 +01:00
| _ -> failwith ( " Basis " ^ basis ^ " not found " )
in
let rec build_basis = function
| [] -> ()
| elem_and_basis_name :: rest ->
begin
2019-03-13 11:35:21 +01:00
match ( String_ext . lsplit2 ~ on : ':' elem_and_basis_name ) with
2019-01-25 11:39:31 +01:00
| None -> (* Principal basis *)
begin
let basis =
elem_and_basis_name
in
let new_channel =
fetch_channel basis
in
2019-03-13 11:35:21 +01:00
List . iter ( fun elem ->
2019-01-25 11:39:31 +01:00
let key =
Element . to_string elem . Atom . element
in
2019-03-13 11:35:21 +01:00
Hashtbl . add basis_table key new_channel
) nuclei
2019-01-25 11:39:31 +01:00
end
| Some ( key , basis ) -> (* Aux basis *)
begin
let elem =
try
Element ( Element . of_string key )
with Element . ElementError _ ->
let result =
2019-03-13 11:35:21 +01:00
match ( String_ext . split ~ on : ',' key ) with
2019-01-25 11:39:31 +01:00
| i :: k :: [] -> ( Nucl_number . of_int @@ int_of_string i , Element . of_string k )
| _ -> failwith " Expected format is int,Element:basis "
in Int_elem result
and basis =
2019-03-13 11:35:21 +01:00
String . lowercase_ascii basis
2019-01-25 11:39:31 +01:00
in
let key =
match elem with
| Element e -> Element . to_string e
| Int_elem ( i , e ) -> Printf . sprintf " %d,%s " ( Nucl_number . to_int i ) ( Element . to_string e )
in
let new_channel =
fetch_channel basis
in
2019-03-13 11:35:21 +01:00
Hashtbl . add basis_table key new_channel
2019-01-25 11:39:31 +01:00
end
end ;
build_basis rest
in
2019-03-13 11:35:21 +01:00
String_ext . split ~ on : '|' b
| > List . rev_map String . trim
2019-01-25 11:39:31 +01:00
| > build_basis ;
(* * * * * * * * * * * * * * *
Pseudopotential
* * * * * * * * * * * * * * * )
let pseudo_table =
2019-03-13 11:35:21 +01:00
Hashtbl . create 63
2019-01-25 11:39:31 +01:00
in
(* Open pseudo channels *)
let pseudo_channel element =
let key =
Element . to_string element
in
2019-03-13 11:35:21 +01:00
Hashtbl . find_opt pseudo_table key
2019-01-25 11:39:31 +01:00
in
let temp_filename =
Filename . temp_file " qp_create_ " " .pseudo "
in
let () =
Sys . remove temp_filename
in
let fetch_channel pseudo =
let long_pseudo =
Qpackage . root ^ " /data/pseudo/ " ^ pseudo
in
match
2019-03-13 11:35:21 +01:00
Sys . file_exists pseudo ,
Sys . file_exists long_pseudo
2019-01-25 11:39:31 +01:00
with
2019-03-13 11:35:21 +01:00
| true , _ -> open_in pseudo
| false , true -> open_in long_pseudo
2019-01-25 11:39:31 +01:00
| _ -> failwith ( " Pseudo file " ^ pseudo ^ " not found. " )
in
let rec build_pseudo = function
| [] -> ()
| elem_and_pseudo_name :: rest ->
begin
2019-03-13 11:35:21 +01:00
match ( String_ext . lsplit2 ~ on : ':' elem_and_pseudo_name ) with
2019-01-25 11:39:31 +01:00
| None -> (* Principal pseudo *)
begin
let pseudo =
elem_and_pseudo_name
in
let new_channel =
fetch_channel pseudo
in
2019-03-13 11:35:21 +01:00
List . iter ( fun elem ->
2019-01-25 11:39:31 +01:00
let key =
Element . to_string elem . Atom . element
in
2019-03-13 11:35:21 +01:00
Hashtbl . add pseudo_table key new_channel
) nuclei
2019-01-25 11:39:31 +01:00
end
| Some ( key , pseudo ) -> (* Aux pseudo *)
begin
let elem =
Element . of_string key
and pseudo =
2019-03-13 11:35:21 +01:00
String . lowercase_ascii pseudo
2019-01-25 11:39:31 +01:00
in
let key =
Element . to_string elem
in
let new_channel =
fetch_channel pseudo
in
2019-03-13 11:35:21 +01:00
Hashtbl . add pseudo_table key new_channel
2019-01-25 11:39:31 +01:00
end
end ;
build_pseudo rest
in
let () =
match p with
| None -> ()
| Some p ->
2019-03-13 11:35:21 +01:00
String_ext . split ~ on : '|' p
| > List . rev_map String . trim
2019-01-25 11:39:31 +01:00
| > build_pseudo
in
(* Build EZFIO File name *)
let ezfio_file =
match o with
| Some x -> x
| None ->
begin
2019-03-13 11:35:21 +01:00
match String_ext . rsplit2 ~ on : '.' xyz_file with
2019-01-25 11:39:31 +01:00
| Some ( x , " xyz " )
| Some ( x , " zmt " ) -> x ^ " .ezfio "
| _ -> xyz_file ^ " .ezfio "
end
in
2019-03-13 11:35:21 +01:00
if Sys . file_exists ezfio_file then
2019-01-25 11:39:31 +01:00
failwith ( ezfio_file ^ " already exists " ) ;
let write_file () =
(* Create EZFIO *)
Ezfio . set_file ezfio_file ;
(* Write Pseudo *)
let pseudo =
2020-05-25 11:31:28 +02:00
list_map ( fun x ->
2019-01-25 11:39:31 +01:00
match pseudo_channel x . Atom . element with
| Some channel -> Pseudo . read_element channel x . Atom . element
| None -> Pseudo . empty x . Atom . element
2019-03-13 11:35:21 +01:00
) nuclei
2019-01-25 11:39:31 +01:00
in
let molecule =
let n_elec_to_remove =
2019-03-13 11:35:21 +01:00
List . fold_left ( fun accu x ->
accu + ( Positive_int . to_int x . Pseudo . n_elec ) ) 0 pseudo
2019-01-25 11:39:31 +01:00
in
{ Molecule . elec_alpha =
( Elec_alpha_number . to_int molecule . Molecule . elec_alpha )
- n_elec_to_remove / 2
| > Elec_alpha_number . of_int ;
Molecule . elec_beta =
( Elec_beta_number . to_int molecule . Molecule . elec_beta )
- ( n_elec_to_remove - n_elec_to_remove / 2 )
| > Elec_beta_number . of_int ;
Molecule . nuclei =
let charges =
2020-05-25 11:31:28 +02:00
list_map ( fun x -> Positive_int . to_int x . Pseudo . n_elec
2019-03-13 11:35:21 +01:00
| > Float . of_int ) pseudo
2019-01-25 11:39:31 +01:00
| > Array . of_list
in
2019-03-13 11:35:21 +01:00
List . mapi ( fun i x ->
2019-01-25 11:39:31 +01:00
{ x with Atom . charge = ( Charge . to_float x . Atom . charge ) -. charges . ( i )
| > Charge . of_float }
2019-03-13 11:35:21 +01:00
) molecule . Molecule . nuclei
2019-01-25 11:39:31 +01:00
}
in
let nuclei =
molecule . Molecule . nuclei @ dummy
in
(* Write Electrons *)
Ezfio . set_electrons_elec_alpha_num ( Elec_alpha_number . to_int
molecule . Molecule . elec_alpha ) ;
Ezfio . set_electrons_elec_beta_num ( Elec_beta_number . to_int
molecule . Molecule . elec_beta ) ;
(* Write Nuclei *)
let labels =
2020-05-25 11:31:28 +02:00
list_map ( fun x -> Element . to_string x . Atom . element ) nuclei
2019-01-25 11:39:31 +01:00
and charges =
2020-05-25 11:31:28 +02:00
list_map ( fun x -> Atom . ( Charge . to_float x . charge ) ) nuclei
2019-01-25 11:39:31 +01:00
and coords =
2020-05-25 11:31:28 +02:00
( list_map ( fun x -> x . Atom . coord . Point3d . x ) nuclei ) @
( list_map ( fun x -> x . Atom . coord . Point3d . y ) nuclei ) @
( list_map ( fun x -> x . Atom . coord . Point3d . z ) nuclei ) in
2019-01-25 11:39:31 +01:00
let nucl_num = ( List . length labels ) in
Ezfio . set_nuclei_nucl_num nucl_num ;
Ezfio . set_nuclei_nucl_label ( Ezfio . ezfio_array_of_list
~ rank : 1 ~ dim : [| nucl_num |] ~ data : labels ) ;
Ezfio . set_nuclei_nucl_charge ( Ezfio . ezfio_array_of_list
~ rank : 1 ~ dim : [| nucl_num |] ~ data : charges ) ;
Ezfio . set_nuclei_nucl_coord ( Ezfio . ezfio_array_of_list
~ rank : 2 ~ dim : [| nucl_num ; 3 |] ~ data : coords ) ;
(* Write pseudopotential *)
let () =
match p with
| None -> Ezfio . set_pseudo_do_pseudo false
| _ -> Ezfio . set_pseudo_do_pseudo true
in
let klocmax =
2019-03-13 11:35:21 +01:00
List . fold_left ( fun accu x ->
2019-01-25 11:39:31 +01:00
let x =
List . length x . Pseudo . local
in
if ( x > accu ) then x
else accu
2019-03-13 11:35:21 +01:00
) 0 pseudo
2019-01-25 11:39:31 +01:00
and lmax =
2019-03-13 11:35:21 +01:00
List . fold_left ( fun accu x ->
2019-01-25 11:39:31 +01:00
let x =
2019-03-13 11:35:21 +01:00
List . fold_left ( fun accu ( x , _ ) ->
2019-01-25 11:39:31 +01:00
let x =
Positive_int . to_int x . Pseudo . GaussianPrimitive_non_local . proj
in
if ( x > accu ) then x
else accu
2019-03-13 11:35:21 +01:00
) 0 x . Pseudo . non_local
2019-01-25 11:39:31 +01:00
in
if ( x > accu ) then x
else accu
2019-03-13 11:35:21 +01:00
) 0 pseudo
2019-01-25 11:39:31 +01:00
in
let kmax =
2019-03-13 11:35:21 +01:00
Array . init ( lmax + 1 ) ( fun i ->
2020-05-25 11:31:28 +02:00
list_map ( fun x ->
2019-03-13 11:35:21 +01:00
List . filter ( fun ( y , _ ) ->
( Positive_int . to_int y . Pseudo . GaussianPrimitive_non_local . proj ) = i )
x . Pseudo . non_local
| > List . length ) pseudo
| > List . fold_left ( fun accu x ->
if accu > x then accu else x ) 0
)
| > Array . fold_left ( fun accu i ->
if i > accu then i else accu ) 0
2019-01-25 11:39:31 +01:00
in
let () =
Ezfio . set_pseudo_pseudo_klocmax klocmax ;
Ezfio . set_pseudo_pseudo_kmax kmax ;
Ezfio . set_pseudo_pseudo_lmax lmax ;
let tmp_array_v_k , tmp_array_dz_k , tmp_array_n_k =
2019-03-13 11:35:21 +01:00
Array . make_matrix klocmax nucl_num 0 . ,
Array . make_matrix klocmax nucl_num 0 . ,
Array . make_matrix klocmax nucl_num 0
2019-01-25 11:39:31 +01:00
in
2019-03-13 11:35:21 +01:00
List . iteri ( fun j x ->
List . iteri ( fun i ( y , c ) ->
2019-01-25 11:39:31 +01:00
tmp_array_v_k . ( i ) . ( j ) <- AO_coef . to_float c ;
let y , z =
AO_expo . to_float y . Pseudo . GaussianPrimitive_local . expo ,
R_power . to_int y . Pseudo . GaussianPrimitive_local . r_power
in
tmp_array_dz_k . ( i ) . ( j ) <- y ;
tmp_array_n_k . ( i ) . ( j ) <- z ;
2019-03-13 11:35:21 +01:00
) x . Pseudo . local
) pseudo ;
2019-01-25 11:39:31 +01:00
let concat_2d tmp_array =
let data =
2019-03-13 11:35:21 +01:00
Array . map Array . to_list tmp_array
2019-01-25 11:39:31 +01:00
| > Array . to_list
| > List . concat
in
Ezfio . ezfio_array_of_list ~ rank : 2 ~ dim : [| nucl_num ; klocmax |] ~ data
in
concat_2d tmp_array_v_k
| > Ezfio . set_pseudo_pseudo_v_k ;
concat_2d tmp_array_dz_k
| > Ezfio . set_pseudo_pseudo_dz_k ;
concat_2d tmp_array_n_k
| > Ezfio . set_pseudo_pseudo_n_k ;
let tmp_array_v_kl , tmp_array_dz_kl , tmp_array_n_kl =
2019-03-13 11:35:21 +01:00
Array . init ( lmax + 1 ) ( fun _ ->
( Array . make_matrix kmax nucl_num 0 . ) ) ,
Array . init ( lmax + 1 ) ( fun _ ->
( Array . make_matrix kmax nucl_num 0 . ) ) ,
Array . init ( lmax + 1 ) ( fun _ ->
( Array . make_matrix kmax nucl_num 0 ) )
2019-01-25 11:39:31 +01:00
in
2019-03-13 11:35:21 +01:00
List . iteri ( fun j x ->
2019-01-25 11:39:31 +01:00
let last_idx =
2019-03-13 11:35:21 +01:00
Array . make ( lmax + 1 ) 0
2019-01-25 11:39:31 +01:00
in
2019-03-13 11:35:21 +01:00
List . iter ( fun ( y , c ) ->
2019-01-25 11:39:31 +01:00
let k , y , z =
Positive_int . to_int y . Pseudo . GaussianPrimitive_non_local . proj ,
AO_expo . to_float y . Pseudo . GaussianPrimitive_non_local . expo ,
R_power . to_int y . Pseudo . GaussianPrimitive_non_local . r_power
in
let i =
last_idx . ( k )
in
tmp_array_v_kl . ( k ) . ( i ) . ( j ) <- AO_coef . to_float c ;
tmp_array_dz_kl . ( k ) . ( i ) . ( j ) <- y ;
tmp_array_n_kl . ( k ) . ( i ) . ( j ) <- z ;
last_idx . ( k ) <- i + 1 ;
2019-03-13 11:35:21 +01:00
) x . Pseudo . non_local
) pseudo ;
2019-01-25 11:39:31 +01:00
let concat_3d tmp_array =
let data =
2019-03-13 11:35:21 +01:00
Array . map ( fun x ->
Array . map Array . to_list x
2019-01-25 11:39:31 +01:00
| > Array . to_list
2019-03-13 11:35:21 +01:00
| > List . concat ) tmp_array
2019-01-25 11:39:31 +01:00
| > Array . to_list
| > List . concat
in
Ezfio . ezfio_array_of_list ~ rank : 3 ~ dim : [| nucl_num ; kmax ; lmax + 1 |] ~ data
in
concat_3d tmp_array_v_kl
| > Ezfio . set_pseudo_pseudo_v_kl ;
concat_3d tmp_array_dz_kl
| > Ezfio . set_pseudo_pseudo_dz_kl ;
concat_3d tmp_array_n_kl
| > Ezfio . set_pseudo_pseudo_n_kl ;
in
(* Write Basis set *)
let basis =
let nmax =
Nucl_number . get_max ()
in
let rec do_work ( accu : ( Atom . t * Nucl_number . t ) list ) ( n : int ) = function
| [] -> accu
| e :: tail ->
let new_accu =
( e , ( Nucl_number . of_int ~ max : nmax n ) ) :: accu
in
do_work new_accu ( n + 1 ) tail
in
let result = do_work [] 1 nuclei
| > List . rev
2020-05-25 11:31:28 +02:00
| > list_map ( fun ( x , i ) ->
2019-01-25 11:39:31 +01:00
try
let e =
match x . Atom . element with
| Element . X -> Element . H
| e -> e
in
let key =
Int_elem ( i , x . Atom . element )
in
try
Basis . read_element ( basis_channel key ) i e
2019-03-13 15:49:57 +01:00
with Not_found ->
2019-01-25 11:39:31 +01:00
let key =
Element x . Atom . element
in
try
Basis . read_element ( basis_channel key ) i e
2019-03-13 15:49:57 +01:00
with Not_found ->
2019-01-25 11:39:31 +01:00
failwith ( Printf . sprintf " Basis not found for atom %d (%s) " ( Nucl_number . to_int i )
( Element . to_string x . Atom . element ) )
with
| End_of_file -> failwith
( " Element " ^ ( Element . to_string x . Atom . element ) ^ " not found in basis set. " )
)
| > List . concat
in
(* close all in_channels *)
result
in
let long_basis = Long_basis . of_basis basis in
let ao_num = List . length long_basis in
Ezfio . set_ao_basis_ao_num ao_num ;
Ezfio . set_ao_basis_ao_basis b ;
2020-05-25 11:31:28 +02:00
let ao_prim_num = list_map ( fun ( _ , g , _ ) -> List . length g . Gto . lc ) long_basis
and ao_nucl = list_map ( fun ( _ , _ , n ) -> Nucl_number . to_int n ) long_basis
2019-01-25 11:39:31 +01:00
and ao_power =
2020-05-25 11:31:28 +02:00
let l = list_map ( fun ( x , _ , _ ) -> x ) long_basis in
( list_map ( fun t -> Positive_int . to_int Symmetry . Xyz . ( t . x ) ) l ) @
( list_map ( fun t -> Positive_int . to_int Symmetry . Xyz . ( t . y ) ) l ) @
( list_map ( fun t -> Positive_int . to_int Symmetry . Xyz . ( t . z ) ) l )
2019-01-25 11:39:31 +01:00
in
2019-03-13 11:35:21 +01:00
let ao_prim_num_max = List . fold_left ( fun s x ->
2019-01-25 11:39:31 +01:00
if x > s then x
2019-03-13 11:35:21 +01:00
else s ) 0 ao_prim_num
2019-01-25 11:39:31 +01:00
in
let gtos =
2020-05-25 11:31:28 +02:00
list_map ( fun ( _ , x , _ ) -> x ) long_basis
2019-01-25 11:39:31 +01:00
in
let create_expo_coef ec =
let coefs =
begin match ec with
2020-05-25 11:31:28 +02:00
| ` Coefs -> list_map ( fun x ->
list_map ( fun ( _ , coef ) ->
2019-03-13 11:35:21 +01:00
AO_coef . to_float coef ) x . Gto . lc ) gtos
2020-05-25 11:31:28 +02:00
| ` Expos -> list_map ( fun x ->
list_map ( fun ( prim , _ ) -> AO_expo . to_float
2019-03-13 11:35:21 +01:00
prim . GaussianPrimitive . expo ) x . Gto . lc ) gtos
2019-01-25 11:39:31 +01:00
end
in
let rec get_n n accu = function
| [] -> List . rev accu
| h :: tail ->
let y =
2019-03-13 11:35:21 +01:00
begin match List . nth_opt h n with
2019-01-25 11:39:31 +01:00
| Some x -> x
| None -> 0 .
end
in
get_n n ( y :: accu ) tail
in
let rec build accu = function
| n when n = ao_prim_num_max -> accu
| n -> build ( accu @ ( get_n n [] coefs ) ) ( n + 1 )
in
build [] 0
in
let ao_coef = create_expo_coef ` Coefs
and ao_expo = create_expo_coef ` Expos
in
let () =
Ezfio . set_ao_basis_ao_prim_num ( Ezfio . ezfio_array_of_list
~ rank : 1 ~ dim : [| ao_num |] ~ data : ao_prim_num ) ;
Ezfio . set_ao_basis_ao_nucl ( Ezfio . ezfio_array_of_list
~ rank : 1 ~ dim : [| ao_num |] ~ data : ao_nucl ) ;
Ezfio . set_ao_basis_ao_power ( Ezfio . ezfio_array_of_list
~ rank : 2 ~ dim : [| ao_num ; 3 |] ~ data : ao_power ) ;
Ezfio . set_ao_basis_ao_coef ( Ezfio . ezfio_array_of_list
~ rank : 2 ~ dim : [| ao_num ; ao_prim_num_max |] ~ data : ao_coef ) ;
Ezfio . set_ao_basis_ao_expo ( Ezfio . ezfio_array_of_list
~ rank : 2 ~ dim : [| ao_num ; ao_prim_num_max |] ~ data : ao_expo ) ;
Ezfio . set_ao_basis_ao_cartesian ( cart ) ;
in
match Input . Ao_basis . read () with
| None -> failwith " Error in basis "
| Some x -> Input . Ao_basis . write x
in
let () =
try write_file () with
| ex ->
begin
begin
2019-03-13 11:35:21 +01:00
try
if Sys . is_directory ezfio_file then
rmdir ezfio_file
with _ -> ()
2019-01-25 11:39:31 +01:00
end ;
raise ex ;
end
in
ignore @@ Sys . command ( " qp_edit -c " ^ ezfio_file ) ;
print_endline ezfio_file
let () =
let open Command_line in
begin
" Creates an EZFIO directory from a standard xyz file or from a z-matrix file in Gaussian format. The basis set is defined as a single string if all the atoms are taken from the same basis set, otherwise specific elements can be defined as follows:
- b \ " cc-pcvdz | H:cc-pvdz | C:6-31g \"
- b \ " cc-pvtz | 1,H:sto-3g | 3,H:6-31g \"
If a file with the same name as the basis set exists , this file will be read . Otherwise , the basis set is obtained from the database .
" |> set_description_doc ;
set_header_doc ( Sys . argv . ( 0 ) ^ " - Quantum Package command " ) ;
[ { opt = Optional ; short = 'o' ; long = " output " ;
arg = With_arg " EZFIO_DIR " ;
doc = " Name of the created EZFIO directory. " } ;
{ opt = Mandatory ; short = 'b' ; long = " basis " ;
arg = With_arg " <string> " ;
2020-02-04 19:04:36 +01:00
doc = " Name of basis set file. Searched in ${QP_ROOT}/data/basis if not found. " } ;
2019-01-25 11:39:31 +01:00
{ opt = Optional ; short = 'a' ; long = " au " ;
arg = Without_arg ;
doc = " Input geometry is in atomic units. " } ;
{ opt = Optional ; short = 'c' ; long = " charge " ;
arg = With_arg " <int> " ;
2019-11-26 14:27:48 +01:00
doc = " Total charge of the molecule. Default is 0. For negative values, use m instead of -, for ex m1 " } ;
2019-01-25 11:39:31 +01:00
{ opt = Optional ; short = 'd' ; long = " dummy " ;
arg = With_arg " <float> " ;
doc = " Add dummy atoms. x * (covalent radii of the atoms). " } ;
{ opt = Optional ; short = 'm' ; long = " multiplicity " ;
arg = With_arg " <int> " ;
doc = " Spin multiplicity (2S+1) of the molecule. Default is 1. " } ;
{ opt = Optional ; short = 'p' ; long = " pseudo " ;
arg = With_arg " <string> " ;
doc = " Name of the pseudopotential. " } ;
{ opt = Optional ; short = 'x' ; long = " cartesian " ;
arg = Without_arg ;
doc = " Compute AOs in the Cartesian basis set (6d, 10f, ...). " } ;
anonymous " FILE " Mandatory " Input file in xyz format or z-matrix. " ;
]
| > set_specs
end ;
(* Handle options *)
let output =
Command_line . get " output "
in
let basis =
match Command_line . get " basis " with
| None -> assert false
| Some x -> x
in
let au =
Command_line . get_bool " au "
in
let charge =
match Command_line . get " charge " with
| None -> 0
2019-11-26 14:27:48 +01:00
| Some x -> ( if x . [ 0 ] = 'm' then
~ - ( int_of_string ( String . sub x 1 ( String . length x - 1 ) ) )
else
int_of_string x )
2019-01-25 11:39:31 +01:00
in
let dummy =
match Command_line . get " dummy " with
| None -> 0 .
| Some x -> float_of_string x
in
let multiplicity =
match Command_line . get " multiplicity " with
| None -> 1
| Some n -> int_of_string n
in
let pseudo =
Command_line . get " pseudo "
in
let cart =
Command_line . get_bool " cartesian "
in
let xyz_filename =
match Command_line . anon_args () with
| [ x ] -> x
| _ -> ( Command_line . help () ; failwith " input file is missing " )
in
run ? o : output basis au charge dummy multiplicity pseudo cart xyz_filename