-
-
Notifications
You must be signed in to change notification settings - Fork 48
Closed
Labels
bugSomething isn't workingSomething isn't working
Description
fortls can detect the interface in a module, but not its implementation in a submodule, see this example.
MODULE MOD
IMPLICIT NONE
!==============================================================================
TYPE :: TYP
REAL(KIND=8) :: value
CONTAINS
PROCEDURE :: PRC1 => PRC_PRC1
END TYPE TYP
!==============================================================================
!==============================================================================
INTERFACE
MODULE SUBROUTINE PRC_PRC1(this)
IMPLICIT NONE
CLASS(TYP), INTENT(INOUT) :: this
END SUBROUTINE PRC_PRC1
END INTERFACE
!==============================================================================
END MODULE MOD
SUBMODULE(MOD) SMOD
IMPLICIT NONE
CONTAINS
!==============================================================================
MODULE SUBROUTINE PRC_PRC1(this)
IMPLICIT NONE
CLASS(TYP), INTENT(INOUT) :: this
this%value = 0
END SUBROUTINE PRC_PRC1
!==============================================================================
END SUBMODULE SMOD
JHenneberg, bmlowe4 and driftglass
Metadata
Metadata
Assignees
Labels
bugSomething isn't workingSomething isn't working