File: arrays_op_13.f90

package info (click to toggle)
lfortran 0.45.0-1
  • links: PTS, VCS
  • area: main
  • in suites: sid, trixie
  • size: 46,332 kB
  • sloc: cpp: 137,068; f90: 51,260; python: 6,444; ansic: 4,277; yacc: 2,285; fortran: 806; sh: 524; makefile: 30; javascript: 15
file content (48 lines) | stat: -rw-r--r-- 1,019 bytes parent folder | download
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
module arrays_op_13
    use, intrinsic :: iso_c_binding, only : c_char, c_null_char
    use iso_fortran_env, only: int64
    private
    public :: fpm_model_t, package_t, srcfile_t

    !> Source type unknown
    integer, parameter :: FPM_UNIT_UNKNOWN = -1

    type srcfile_t
        !> Type of source unit
        integer :: unit_type = FPM_UNIT_UNKNOWN

    end type srcfile_t

    type package_t

        !> Array of sources
        type(srcfile_t), allocatable :: sources(:)

    end type package_t

    type :: fpm_model_t

        !> Array of packages (including the root package)
        type(package_t), allocatable :: packages(:)

    end type fpm_model_t

contains

    subroutine build_target_list(model)

        type(fpm_model_t), intent(inout), target :: model

        associate(sources=>model%packages(0)%sources)

        end associate


    end subroutine build_target_list

end module arrays_op_13

program arrays_op_13_main
    implicit none
    print *, "working ok"
end program arrays_op_13_main