add_target Interface

public interface add_target

Module Procedures

private subroutine add_new_target(targets, package, type, output_name, source, link_libraries, features, preprocess, version, output_dir)

Allocate a new target and append to target list

Arguments

Type IntentOptional Attributes Name
type(build_target_ptr), intent(inout), allocatable :: targets(:)
character(len=*), intent(in) :: package
integer, intent(in) :: type
character(len=*), intent(in) :: output_name
type(srcfile_t), intent(in), optional :: source
type(string_t), intent(in), optional :: link_libraries(:)
type(fortran_features_t), intent(in), optional :: features
type(preprocess_config_t), intent(in), optional :: preprocess
character(len=*), intent(in), optional :: version
character(len=*), intent(in), optional :: output_dir

private subroutine add_old_target(targets, add_target)

Arguments

Type IntentOptional Attributes Name
type(build_target_ptr), intent(inout), allocatable :: targets(:)
type(build_target_ptr), intent(in) :: add_target

private subroutine add_old_targets(targets, add_targets)

Arguments

Type IntentOptional Attributes Name
type(build_target_ptr), intent(inout), allocatable :: targets(:)
type(build_target_ptr), intent(in) :: add_targets(:)