Nodes of different colours represent the following:
Solid arrows point from a parent (sub)module to the submodule which is descended from it. Dashed arrows point from a module being used to the module or program unit using it. Where possible, edges connecting nodes are given different colours to make them easier to distinguish in large graphs.
ErrInObject=.true. ErrInObject=.true.
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
character(len=*), | intent(in) | :: | ComponentType | |||
character(len=*), | intent(in) | :: | ComponentName | |||
character(len=*) | :: | InletNodeName | ||||
integer | :: | InletNodeNum | ||||
character(len=*) | :: | OutletNodeName | ||||
integer | :: | OutletNodeNum | ||||
logical, | intent(inout) | :: | ErrorsFound |
Nodes of different colours represent the following:
Solid arrows point from a procedure to one which it calls. Dashed arrows point from an interface to procedures which implement that interface. This could include the module procedures in a generic interface or the implementation in a submodule of an interface in a parent module. Where possible, edges connecting nodes are given different colours to make them easier to distinguish in large graphs.
Nodes of different colours represent the following:
Solid arrows point from a procedure to one which it calls. Dashed arrows point from an interface to procedures which implement that interface. This could include the module procedures in a generic interface or the implementation in a submodule of an interface in a parent module. Where possible, edges connecting nodes are given different colours to make them easier to distinguish in large graphs.
SUBROUTINE GetParentData(ComponentType,ComponentName, &
InletNodeName,InletNodeNum, &
OutletNodeName,OutletNodeNum, &
ErrorsFound)
! SUBROUTINE INFORMATION:
! AUTHOR Linda Lawrie
! DATE WRITTEN May 2005
! MODIFIED na
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! This routine gets node data for a given Parent Component Type and Name Name.
! METHODOLOGY EMPLOYED:
! Traverses CompSet structure.
! REFERENCES:
! na
! USE STATEMENTS:
USE InputProcessor, ONLY: FindItemInList
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE ARGUMENT DEFINITIONS:
CHARACTER(len=*), INTENT(IN) :: ComponentType
CHARACTER(len=*), INTENT(IN) :: ComponentName
CHARACTER(len=*) :: InletNodeName
INTEGER :: InletNodeNum
CHARACTER(len=*) :: OutletNodeName
INTEGER :: OutletNodeNum
LOGICAL, INTENT(INOUT) :: ErrorsFound
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
! INTEGER Loop
LOGICAL ErrInObject
INTEGER Which
InletNodeName=Blank
InletNodeNum=0
OutletNodeName=Blank
OutletNodeNum=0
ErrInObject=.false.
Which=WhichParentSet(ComponentType,ComponentName)
IF (Which /= 0) THEN
InletNodeName=ParentNodeList(Which)%InletNodeName
OutletNodeName=ParentNodeList(Which)%OutletNodeName
! Get Node Numbers
InletNodeNum=FindItemInList(InletNodeName,NodeID(1:NumOfNodes),NumOfNodes)
OutletNodeNum=FindItemInList(OutletNodeName,NodeID(1:NumOfNodes),NumOfNodes)
! IF (InletNodeNum == 0 .and. ComponentType /= 'ZONEHVAC:AIRDISTRIBUTIONUNIT') THEN
! CALL ShowWarningError('GetParentData: Component Type='//TRIM(ComponentType)// &
! ', Component Name='//TRIM(ComponentName))
! CALL ShowContinueError('..Inlet Node Name, not found='//TRIM(InletNodeName))
!! ErrInObject=.true.
! ENDIF
! IF (OutletNodeNum == 0) THEN
! CALL ShowWarningError('GetParentData: Component Type='//TRIM(ComponentType)// &
! ', Component Name='//TRIM(ComponentName))
! CALL ShowContinueError('..Outlet Node Name, not found='//TRIM(OutletNodeName))
!! ErrInObject=.true.
! ENDIF
ELSEIF (IsParentObjectCompSet(ComponentType,ComponentName)) THEN
Which=WhichCompSet(ComponentType,ComponentName)
IF (Which /= 0) THEN
InletNodeName=CompSets(Which)%InletNodeName
OutletNodeName=CompSets(Which)%OutletNodeName
InletNodeNum=FindItemInList(InletNodeName,NodeID(1:NumOfNodes),NumOfNodes)
OutletNodeNum=FindItemInList(OutletNodeName,NodeID(1:NumOfNodes),NumOfNodes)
! IF (InletNodeNum == 0 .and. ComponentType /= 'ZONEHVAC:AIRDISTRIBUTIONUNIT') THEN
! CALL ShowWarningError('GetParentData: Component Type='//TRIM(ComponentType)// &
! ', Component Name='//TRIM(ComponentName))
! CALL ShowContinueError('..Inlet Node Name, not found='//TRIM(InletNodeName))
! ! ErrInObject=.true.
! ENDIF
! IF (OutletNodeNum == 0) THEN
! CALL ShowWarningError('GetParentData: Component Type='//TRIM(ComponentType)// &
! ', Component Name='//TRIM(ComponentName))
! CALL ShowContinueError('..Outlet Node Name, not found='//TRIM(OutletNodeName))
! ! ErrInObject=.true.
! ENDIF
ELSE
ErrInObject=.true.
CALL ShowWarningError('GetParentData: Component Type='//TRIM(ComponentType)// &
', Component Name='//TRIM(ComponentName)//' not found.')
ENDIF
ELSE
ErrInObject=.true.
CALL ShowWarningError('GetParentData: Component Type='//TRIM(ComponentType)// &
', Component Name='//TRIM(ComponentName)//' not found.')
ENDIF
IF (ErrInObject) ErrorsFound=.true.
RETURN
END SUBROUTINE GetParentData