fpm_manifest Module

Package configuration data.

This module provides the necessary procedure to translate a TOML document to the corresponding Fortran type, while verifying it with respect to its schema.

Additionally, the required data types for users of this module are reexported to hide the actual implementation details.



Subroutines

public subroutine default_example(self, name)

Populate test in case we find the default example/ directory

Arguments

Type IntentOptional Attributes Name
type(example_config_t), intent(out) :: self

Instance of the executable meta data

character(len=*), intent(in) :: name

Name of the package

public subroutine default_executable(self, name)

Populate executable in case we find the default app directory

Arguments

Type IntentOptional Attributes Name
type(executable_config_t), intent(out) :: self

Instance of the executable meta data

character(len=*), intent(in) :: name

Name of the package

public subroutine default_library(self)

Populate library in case we find the default src directory

Arguments

Type IntentOptional Attributes Name
type(library_config_t), intent(out) :: self

Instance of the library meta data

public subroutine default_test(self, name)

Populate test in case we find the default test/ directory

Arguments

Type IntentOptional Attributes Name
type(test_config_t), intent(out) :: self

Instance of the executable meta data

character(len=*), intent(in) :: name

Name of the package

public subroutine get_package_data(package, file, error, apply_defaults)

Obtain package meta data from a configuation file

Arguments

Type IntentOptional Attributes Name
type(package_config_t), intent(out) :: package

Parsed package meta data

character(len=*), intent(in) :: file

Name of the package configuration file

type(error_t), intent(out), allocatable :: error

Error status of the operation

logical, intent(in), optional :: apply_defaults

Apply package defaults (uses file system operations)