|
123456789101112131415161718192021222324252627282930313233343536373839404142434445464748495051525354 |
- subroutine Pump3_OffMode_Solver
-
- use Pump_VARIABLES
- use CPumpsVariables
- use CDrillingConsoleVariables
- use CDataDisplayConsoleVariables
- use CSimulationVariables
- use CDrillWatchVariables
- use CSounds
-
-
- IMPLICIT NONE
- INTEGER :: Pump_No
-
-
-
- CALL Pump_INPUTS
-
-
-
- !==================================================================
- ! Rate limit for off Mode
-
- if (((PUMP(3)%N_old-0.0d0)/PUMP(3)%time_step)>386.) then
- PUMP(3)%N_ref = (-386.*PUMP(3)%time_step)+PUMP(3)%N_old
- !else
- ! PUMP(1)%N_ref=0.0d0
- !end if
-
- Call Pump3_OnMode_Solver
-
- PUMP(3)%N_old = PUMP(3)%N_ref
-
- !==================================================================
- else
-
-
- PUMP(3)%Speed = 0.0
-
- Call Pump_Solver(3)
-
- Call Pump_Total_Counts
-
-
- Call Set_MP1SPMGauge( real((PUMP(3)%Speed/PUMP(3)%Trans_Ratio),8) )
- SPM1 = MP1SPMGauge
- PUMP(3)%SoundSPM = INT(PUMP(3)%Speed/PUMP(3)%Trans_Ratio)
- Call SetSoundMP3( PUMP(3)%SoundSPM )
-
-
- end if
-
-
- end subroutine Pump3_OffMode_Solver
|