julienne_test_suite_m.f90 Source File


This file depends on

sourcefile~~julienne_test_suite_m.f90~~EfferentGraph sourcefile~julienne_test_suite_m.f90 julienne_test_suite_m.f90 sourcefile~julienne_file_m.f90 julienne_file_m.f90 sourcefile~julienne_test_suite_m.f90->sourcefile~julienne_file_m.f90 sourcefile~julienne_string_m.f90 julienne_string_m.F90 sourcefile~julienne_test_suite_m.f90->sourcefile~julienne_string_m.f90 sourcefile~julienne_file_m.f90->sourcefile~julienne_string_m.f90

Files dependent on this one

sourcefile~~julienne_test_suite_m.f90~~AfferentGraph sourcefile~julienne_test_suite_m.f90 julienne_test_suite_m.f90 sourcefile~julienne_m.f90 julienne_m.f90 sourcefile~julienne_m.f90->sourcefile~julienne_test_suite_m.f90 sourcefile~julienne_test_suite_s.f90 julienne_test_suite_s.F90 sourcefile~julienne_test_suite_s.f90->sourcefile~julienne_test_suite_m.f90 sourcefile~julienne_test_suite_s.f90->sourcefile~julienne_m.f90 sourcefile~assertions.f90 assertions.F90 sourcefile~assertions.f90->sourcefile~julienne_m.f90 sourcefile~check-for-command-line-argument.f90 check-for-command-line-argument.f90 sourcefile~check-for-command-line-argument.f90->sourcefile~julienne_m.f90 sourcefile~get-command-line-flag-value.f90 get-command-line-flag-value.f90 sourcefile~get-command-line-flag-value.f90->sourcefile~julienne_m.f90 sourcefile~scaffold.f90 scaffold.F90 sourcefile~scaffold.f90->sourcefile~julienne_m.f90

Source Code

! Copyright (c) 2024-2025, The Regents of the University of California and Sourcery Institute
! Terms of use are as specified in LICENSE.txt

module julienne_test_suite_m
  use julienne_file_m, only : file_t
  use julienne_string_m, only : string_t
  implicit none

  private
  public :: test_suite_t

  type test_suite_t
    private
    type(string_t), allocatable :: test_subjects_(:)
  contains
    procedure driver_file
    procedure stub_file
    procedure test_subjects
    procedure test_modules
    procedure test_types
    procedure to_file
    procedure write_driver
  end type

  interface test_suite_t

    pure module function from_components(test_subjects) result(test_suite)
      implicit none
      type(string_t), intent(in) :: test_subjects(:)
      type(test_suite_t) test_suite
    end function

    pure module function from_file(file) result(test_suite)
      implicit none
      type(file_t), intent(in) :: file
      type(test_suite_t) test_suite
    end function

  end interface

  interface

    pure module function test_subjects(self) result(subjects)
      implicit none
      class(test_suite_t), intent(in) :: self
      type(string_t), allocatable :: subjects(:)
    end function

    pure module function test_modules(self) result(modules)
      implicit none
      class(test_suite_t), intent(in) :: self
      type(string_t), allocatable :: modules(:)
    end function

    pure module function test_types(self) result(types)
      implicit none
      class(test_suite_t), intent(in) :: self
      type(string_t), allocatable :: types(:)
    end function

    pure module function to_file(self) result(file)
      implicit none
      class(test_suite_t), intent(in) :: self
      type(file_t) file
    end function

    pure module function driver_file(self) result(file)
      implicit none
      class(test_suite_t), intent(in) :: self
      type(file_t) file
    end function

    pure module function stub_file(self, subject) result(file)
      implicit none
      class(test_suite_t), intent(in) :: self
      type(string_t), intent(in) :: subject
      type(file_t) file
    end function

    module subroutine write_driver(self, file_name)
      implicit none
      class(test_suite_t), intent(in) :: self
      character(len=*), intent(in) :: file_name
    end subroutine

  end interface

end module julienne_test_suite_m