Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
real(kind=r64) | :: | IO | ||||
real(kind=r64) | :: | IL | ||||
real(kind=r64) | :: | RSer | ||||
real(kind=r64) | :: | AA | ||||
real(kind=r64) | :: | EPS | ||||
real(kind=r64) | :: | II | ||||
real(kind=r64) | :: | VV | ||||
real(kind=r64) | :: | PP |
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 POWER(IO,IL,RSER,AA,EPS,II,VV,PP)
! SUBROUTINE INFORMATION:
! AUTHOR Ø. Ulleberg, IFE Norway for Hydrogems
! DATE WRITTEN March 2001
! MODIFIED D. Bradley for use with EnergyPlus
! RE-ENGINEERED na
! PURPOSE OF THIS SUBROUTINE:
! This subroutine calculates the power produced by the PV.
! METHODOLOGY EMPLOYED:
! na
! REFERENCES:
! na
! USE STATEMENTS:
! na
IMPLICIT NONE ! Enforce explicit typing of all variables in this routine
! SUBROUTINE FUNCTION DECLARATIONS:
! na
! SUBROUTINE ARGUMENT DEFINITIONS:
REAL(r64) :: IO !passed in from CalcPV
REAL(r64) :: IL !passed in from CalcPV
REAL(r64) :: RSer !passed in from CalcPV
REAL(r64) :: AA !passed in from CalcPV
REAL(r64) :: EPS !passed in from CalcPV
! SUBROUTINE PARAMETER DEFINITIONS:
! na
! INTERFACE BLOCK SPECIFICATIONS:
! na
! DERIVED TYPE DEFINITIONS:
! na
! SUBROUTINE LOCAL VARIABLE DECLARATIONS:
REAL(r64) :: II !current [A]
REAL(r64) :: VV !voltage [V]
REAL(r64) :: PP !power [W]
REAL(r64) :: IG1
! NEWTON --> II (STARTVALUE: IG1 BASED ON SIMPLIFIED I(I,V) EQUATION)
IG1 = IL-IO*EXP(VV/AA-1.0d0)
CALL NEWTON(II,FUN,FI,II,VV,IO,IL,RSER,AA,IG1,EPS)
PP = II*VV
RETURN
END SUBROUTINE POWER