Skip to content

Commit

Permalink
Merge branch 'develop' into global_dataEnvironment
Browse files Browse the repository at this point in the history
  • Loading branch information
mitchute committed Nov 29, 2020
2 parents b64dfaf + 7a650ed commit a4c345e
Showing 1 changed file with 131 additions and 5 deletions.
136 changes: 131 additions & 5 deletions src/Transition/CreateNewIDFUsingRulesV9_4_0.f90
Original file line number Diff line number Diff line change
Expand Up @@ -126,7 +126,6 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
CHARACTER(len=MaxNameLength) :: OutputDiagnosticsName
CHARACTER(len=MaxNameLength), ALLOCATABLE, DIMENSION(:) :: OutputDiagnosticsNames
LOGICAL :: alreadyProcessedOneOutputDiagnostic=.false.
INTEGER :: nE, nEC, nG, nNG, nFO, nFON

LOGICAL :: changeMeterNameFlag
INTEGER :: totMeterCustom = 0
Expand Down Expand Up @@ -765,6 +764,21 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
.true.)
IF (DelThis) CYCLE

! Begin - Special section for v9.4
IF (CurArgs .GE. 3) THEN
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(3))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(3), NoDiff)
END IF
END IF
! End - Special section for v9.4

CASE('OUTPUT:TABLE:MONTHLY')
CALL GetNewObjectDefInIDD(ObjectName,NwNumArgs,NwAorN,NwReqFld,NwObjMinFlds,NwFldNames,NwFldDefaults,NwFldUnits)
nodiff=.true.
Expand Down Expand Up @@ -1103,7 +1117,23 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
EXIT
ENDIF
ENDDO
IF (.not. DelThis) CurVar=CurVar+2
IF (.not. DelThis) THEN

! Begin - Special section for v9.4
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(Var))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(CurVar), NoDiff)
END IF
! End - Special section for v9.4

CurVar=CurVar+2
END IF
ENDDO
CurArgs=CurVar
DO Arg=CurVar,1,-1
Expand All @@ -1118,8 +1148,8 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
CALL GetNewObjectDefInIDD(ObjectName,NwNumArgs,NwAorN,NwReqFld,NwObjMinFlds,NwFldNames,NwFldDefaults,NwFldUnits)
OutArgs(1:CurArgs)=InArgs(1:CurArgs)
nodiff=.true.
CurVar=4 ! In case Source Meter would change
DO Var=4,CurArgs,2
CurVar=3 ! In case Source Meter would change
DO Var=3,CurArgs,2
UCRepVarName=MakeUPPERCase(InArgs(Var))
OutArgs(CurVar)=InArgs(Var)
OutArgs(CurVar+1)=InArgs(Var+1)
Expand Down Expand Up @@ -1211,7 +1241,23 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
EXIT
ENDIF
ENDDO
IF (.not. DelThis) CurVar=CurVar+2
IF (.not. DelThis) THEN

! Begin - Special section for v9.4
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(Var))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(CurVar), NoDiff)
END IF
! End - Special section for v9.4

CurVar=CurVar+2
END IF
ENDDO
CurArgs=CurVar
DO Arg=CurVar,1,-1
Expand Down Expand Up @@ -1243,6 +1289,57 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
Written, &
.false.)

! Begin - Special section for v9.4
IF (CurArgs .GE. 2) THEN
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(2))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(2), NoDiff)
END IF
END IF
! End - Special section for v9.4

CASE('ELECTRICLOADCENTER:TRANSFORMER')
CALL GetNewObjectDefInIDD(ObjectName,NwNumArgs,NwAorN,NwReqFld,NwObjMinFlds,NwFldNames,NwFldDefaults,NwFldUnits)
OutArgs(1:CurArgs)=InArgs(1:CurArgs)
nodiff=.true.

DO Var=19,28,1
CALL ScanOutputVariablesForReplacement( &
Var, &
DelThis, &
checkrvi, &
nodiff, &
ObjectName, &
DifLfn, &
.false., & !OutVar
.true., & !MtrVar
.false., & !TimeBinVar
CurArgs, &
Written, &
.false.)

! Begin - Special section for v9.4
IF (CurArgs .GE. Var) THEN
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(Var))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(Var), NoDiff)
END IF
END IF
! End - Special section for v9.4
END DO

CASE('ELECTRICLOADCENTER:DISTRIBUTION')
CALL GetNewObjectDefInIDD(ObjectName,NwNumArgs,NwAorN,NwReqFld,NwObjMinFlds,NwFldNames,NwFldDefaults,NwFldUnits)
OutArgs(1:CurArgs)=InArgs(1:CurArgs)
Expand All @@ -1263,6 +1360,21 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
Written, &
.false.)

! Begin - Special section for v9.4
IF (CurArgs .GE. 6) THEN
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(6))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(6), NoDiff)
END IF
END IF
! End - Special section for v9.4

! Field 12 A11, \field Storage Control Track Meter Name
CALL ScanOutputVariablesForReplacement( &
12, &
Expand All @@ -1278,6 +1390,20 @@ SUBROUTINE CreateNewIDFUsingRules(EndOfFile,DiffOnly,InLfn,AskForInput,InputFile
Written, &
.false.)

! Begin - Special section for v9.4
IF (CurArgs .GE. 12) THEN
changeMeterNameFlag = .true.
DO numMeterCustom=1, totMeterCustom + totMeterCustomDecr
MeterCustomName = MeterCustomNames(numMeterCustom)
IF (MeterCustomName .eq. MakeUPPERCase(InArgs(12))) THEN
changeMeterNameFlag = .false.
END IF
END DO
IF (changeMeterNameFlag) THEN
CALL ReplaceFuelNameWithEndUseSubcategory(OutArgs(12), NoDiff)
END IF
END IF
! End - Special section for v9.4

! ANY OTHER OBJECT
CASE DEFAULT
Expand Down

5 comments on commit a4c345e

@nrel-bot-3
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

global_dataEnvironment (mitchute) - x86_64-MacOS-10.15-clang-11.0.0: Tests Failed (2296 of 2994 tests passed, 2 test warnings)

Messages:\n

  • 681 tests had: EIO diffs.
  • 261 tests had: ERR diffs.
  • 641 tests had: ESO big diffs.
  • 521 tests had: MTR big diffs.
  • 370 tests had: ZSZ big diffs.
  • 636 tests had: Table big diffs.
  • 13 tests had: EDD diffs.
  • 300 tests had: SSZ big diffs.
  • 46 tests had: AUD diffs.
  • 3 tests had: JSON big diffs.
  • 4 tests had: ESO small diffs.
  • 1 test had: MTR small diffs.
  • 2 tests had: MDD diffs.
  • 2 tests had: MTD diffs.
  • 2 tests had: RDD diffs.
  • 1 test had: Table small diffs.

Failures:\n

EnergyPlusFixture Test Summary

  • Passed: 1076
  • Failed: 13
  • SEGFAULT: 1
  • Timeout: 1

integration Test Summary

  • Passed: 717
  • Failed: 2

regression Test Summary

  • Passed: 36
  • Failed: 681

Build Badge Test Badge

@nrel-bot-2c
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

global_dataEnvironment (mitchute) - x86_64-Linux-Ubuntu-18.04-gcc-7.5: Tests Failed (2332 of 3034 tests passed, 2 test warnings)

Messages:\n

  • 685 tests had: EIO diffs.
  • 260 tests had: ERR diffs.
  • 645 tests had: ESO big diffs.
  • 521 tests had: MTR big diffs.
  • 639 tests had: Table big diffs.
  • 371 tests had: ZSZ big diffs.
  • 13 tests had: EDD diffs.
  • 300 tests had: SSZ big diffs.
  • 46 tests had: AUD diffs.
  • 3 tests had: JSON big diffs.
  • 4 tests had: ESO small diffs.
  • 1 test had: MTR small diffs.
  • 2 tests had: MDD diffs.
  • 2 tests had: MTD diffs.
  • 2 tests had: RDD diffs.
  • 1 test had: Table small diffs.

Failures:\n

EnergyPlusFixture Test Summary

  • Passed: 1076
  • Failed: 13
  • SEGFAULT: 1
  • Timeout: 1

integration Test Summary

  • Passed: 720
  • Failed: 2

regression Test Summary

  • Passed: 52
  • Failed: 685

Build Badge Test Badge

@nrel-bot-2b
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

global_dataEnvironment (mitchute) - x86_64-Linux-Ubuntu-18.04-gcc-7.5-UnitTestsCoverage-Debug: OK (1543 of 1558 tests passed, 0 test warnings)

Failures:\n

EnergyPlusFixture Test Summary

  • Passed: 1076
  • Child aborted: 1
  • Failed: 13
  • Timeout: 1

Build Badge Test Badge Coverage Badge

@nrel-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

global_dataEnvironment (mitchute) - Win64-Windows-10-VisualStudio-16: OK (2233 of 2250 tests passed, 0 test warnings)

Failures:\n

EnergyPlusFixture Test Summary

  • Passed: 1075
  • Failed: 14
  • Timeout: 1

integration Test Summary

  • Passed: 717
  • Failed: 2

Build Badge Test Badge

@nrel-bot-2
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

global_dataEnvironment (mitchute) - x86_64-Linux-Ubuntu-18.04-gcc-7.5-IntegrationCoverage-Debug: Coverage Too Low

Failures:\n

integration Test Summary

  • Passed: 715
  • Failed: 4
  • Timeout: 3

Build Badge Test Badge Coverage Badge

Please sign in to comment.