SUBROUTINE PIPE_RAMS1 USE VARIABLES ! USE CAccumulatorVariables ! USE CBopStackVariables USE CBopStackVariables USE CBopControlPanelVariables USE CEquipmentsConstants ! USE CSimulationVariables implicit none !===================================================================== ! PIPE RAMS 1- BOP CAMERON Type U 5000 ! START CONDITIONS FOR PIPE RAMS 1 !===================================================================== RAM(2)%SuccessionCounter = RAM(2)%SuccessionCounter + 1 if (UpperRamsValve == 1.0 .and. UpperRamsFailureMalf==0 .and. RigAirMalf==0 .and. AirMasterValve==1) then if (UpperRamsCloseLEDMine == LedOn) then RETURN end if if ( RAM(2)%SuccessionCounter /= RAM(2)%SuccessionCounterOld+1 ) then RAM(2)%SuccessionCounter = 0 ! also in starup RAM(2)%SuccessionCounterOld = 0 ! also in starup !return else RAM(2)%SuccessionCounterOld= RAM(2)%SuccessionCounter endif if ( RAM(2)%SuccessionCounter >= int(2.5/DeltaT_BOP) ) then !return RAM(2)%First_CloseTimecheck= 1 UpperRamsOpenLED = LedOff UpperRamsOpenLEDMine = LedOff UpperRamsCloseLED = LedOn !LedBlinking RAM(2)%FourwayValve = 1 endif endif if (RAM(2)%FourwayValve == 1 .and. p_acc>acc_MinPressure) then ! 1: Open , 0: Close !write(*,*) 'close 2' RAM(2)%FourwayValve = 0 PipeRam1_closed=0 !PipeRam1_closed_withPossibility= PipeRam1_closed * TD_BOPConnectionPossibility(2) RAM(2)%vdis_tot=0 RAM(2)%vdis_bottles=0. RAM(2)%fvr_air=0. RAM(2)%vdis_elecp=0. Qiter=7 RAM(2)%Qzero=70 RAM(2)%Q=RAM(2)%Qzero RAM(2)%flow=70 RAM(2)%tol=0.0037 if (finished_pipe1==1) then PipeRams1LeverOld=-1.0 else PipeRams1LeverOld=UpperRamsValve endif finished_pipe1=0 PipeRam1IsClosing = .true. PipeRam1IsOpening = .false. RAM(2)%bop_type = 3 !AbopPipeRam=196.67 AbopPipeRam=(UpperRamClose*231)/((IDPipeRamBase-ODDrillpipe_inPipeRam1Base)/2.) NeededVolumePipeRams1=AbopPipeRam*(IDPipeRamBase-max(ODDrillpipe_inPipeRam1,ODDrillpipe_inPipeRam1Base))/(2.*231) !3.67 galon for each BOP endif if (UpperRamsValve == -1.0 .and. UpperRamsFailureMalf==0 .and. RigAirMalf==0 .and. AirMasterValve==1) then if (UpperRamsOpenLEDMine == LedOn) then RETURN end if if ( RAM(2)%SuccessionCounter /= RAM(2)%SuccessionCounterOld+1 ) then RAM(2)%SuccessionCounter = 0 ! also in starup RAM(2)%SuccessionCounterOld = 0 ! also in starup !return else RAM(2)%SuccessionCounterOld= RAM(2)%SuccessionCounter endif if ( RAM(2)%SuccessionCounter >= int(2.5/DeltaT_BOP) ) then !return RAM(2)%First_OpenTimecheck= 1 UpperRamsCloseLed = LedOff !new UpperRamsCloseLedMine = LedOff !new UpperRamsOpenLED = LedOn !LedBlinking RAM(2)%FourwayValve = 1 endif endif if (RAM(2)%FourwayValve == 1 .and. p_acc>acc_MinPressure) then ! 1: Open , 0: Close !write(*,*) 'open 2' RAM(2)%FourwayValve = 0 PipeRam1_closed=0 !PipeRam1_closed_withPossibility= PipeRam1_closed * TD_BOPConnectionPossibility(2) RAM(2)%vdis_tot=0 RAM(2)%vdis_bottles=0. RAM(2)%fvr_air=0. RAM(2)%vdis_elecp=0. Qiter=7 RAM(2)%Qzero=70 RAM(2)%Q=RAM(2)%Qzero RAM(2)%flow=70 RAM(2)%tol=0.0037 if (finished_pipe1==1) then PipeRams1LeverOld=1.0 else PipeRams1LeverOld=UpperRamsValve endif finished_pipe1=0 PipeRam1IsOpening = .true. PipeRam1IsClosing = .false. !if (UpperRamsOpenLED == LedOn) then ! RETURN !end if RAM(2)%bop_type = 3 !AbopPipeRam=186.5 AbopPipeRam=(UpperRamOpen*231)/((IDPipeRamBase-ODDrillpipe_inPipeRam1Base)/2.) NeededVolumePipeRams1=AbopPipeRam*(IDPipeRamBase-max(ODDrillpipe_inPipeRam1,ODDrillpipe_inPipeRam1Base))/(2.*231) !3.48 galon for each BOP endif !===================================================================== if (PipeRam1IsOpening .or. PipeRam1IsClosing .or. RAM(2)%Bottles_Charged_MalfActive) then CALL PIPE_RAMS1_SUB end if END SUBROUTINE PIPE_RAMS1 SUBROUTINE PIPE_RAMS1_SUB USE VARIABLES USE CBopStackVariables USE CBopControlPanelVariables USE CEquipmentsConstants USE CSimulationVariables implicit none FirstSet= 0 RamsFirstSet= 0 loop3: do while (finished_pipe1==0) RAM(2)%SuccessionCounter = RAM(2)%SuccessionCounter + 1 if (UpperRamsValve == 1.0 .and. PipeRams1LeverOld == -1.0 .and. UpperRamsFailureMalf==0 .and. RigAirMalf==0 .and. AirMasterValve==1) then if ( RAM(2)%First_CloseTimecheck == 0 ) then if ( RAM(2)%SuccessionCounter /= RAM(2)%SuccessionCounterOld+1 ) then RAM(2)%SuccessionCounter = 0 ! also in starup RAM(2)%SuccessionCounterOld = 0 ! also in starup !return else RAM(2)%SuccessionCounterOld= RAM(2)%SuccessionCounter endif if ( RAM(2)%SuccessionCounter >= int(2.5/DeltaT_BOP) ) then !return UpperRamsOpenLED = LedOff UpperRamsOpenLEDMine = LedOff UpperRamsCloseLED = LedOn !LedBlinking RAM(2)%FourwayValve = 1 endif endif endif if (RAM(2)%FourwayValve == 1 .and. p_acc>acc_MinPressure) then !write(*,*) 'close 4' RAM(2)%FourwayValve = 0 PipeRam1_closed=0 !PipeRam1_closed_withPossibility= PipeRam1_closed * TD_BOPConnectionPossibility(2) ! for TD code CALL OpenUpperRams ! for C code PipeRam1_Situation_forTD= 0 ! open - for TD code RAM(2)%p_bop=pa PipeRams1LeverOld = UpperRamsValve RAM(2)%bop_type = 3 !AbopPipeRam=196.67 AbopPipeRam=(UpperRamClose*231)/((IDPipeRamBase-ODDrillpipe_inPipeRam1Base)/2.) !write(*,*) 'NeededVolumeShearRams1=',NeededVolumeShearRams NeededVolumePipeRams1=AbopPipeRam*(IDPipeRam1-max(ODDrillpipe_inPipeRam1,ODDrillpipe_inPipeRam1Base))/(2.*231) ! write(*,*) 'NeededVolumeShearRams2=',NeededVolumeShearRams RAM(2)%vdis_bottles=0. RAM(2)%fvr_air=0. RAM(2)%vdis_elecp=0. PipeRam1IsClosing = .true. PipeRam1IsOpening = .false. endif if (UpperRamsValve == -1.0 .and. PipeRams1LeverOld == 1.0 .and. UpperRamsFailureMalf==0 .and. RigAirMalf==0 .and. AirMasterValve==1) then if ( RAM(2)%First_OpenTimecheck == 0 ) then if ( RAM(2)%SuccessionCounter /= RAM(2)%SuccessionCounterOld+1 ) then RAM(2)%SuccessionCounter = 0 ! also in starup RAM(2)%SuccessionCounterOld = 0 ! also in starup !return else RAM(2)%SuccessionCounterOld= RAM(2)%SuccessionCounter endif if ( RAM(2)%SuccessionCounter >= int(2.5/DeltaT_BOP) ) then !return UpperRamsCloseLED = LedOff UpperRamsCloseLEDMine = LedOff UpperRamsOpenLED = LedOn !LedBlinking RAM(2)%FourwayValve = 1 endif endif endif if (RAM(2)%FourwayValve == 1 .and. p_acc>acc_MinPressure) then !write(*,*) 'open 4' RAM(2)%FourwayValve = 0 PipeRam1_closed=0 !PipeRam1_closed_withPossibility= PipeRam1_closed * TD_BOPConnectionPossibility(2) CALL OpenUpperRams PipeRam1_Situation_forTD= 0 ! open - for TD code RAM(2)%p_bop=pa PipeRams1LeverOld = UpperRamsValve RAM(2)%bop_type = 3 !AbopPipeRam=186.5 AbopPipeRam=(UpperRamOpen*231)/((IDPipeRamBase-ODDrillpipe_inPipeRam1Base)/2.) NeededVolumePipeRams1=AbopPipeRam*(IDPipeRamBase-IDPipeRam1)/(2.*231) RAM(2)%vdis_bottles=0. RAM(2)%fvr_air=0. RAM(2)%vdis_elecp=0. PipeRam1IsOpening = .true. PipeRam1IsClosing = .false. endif RAM(2)%First_CloseTimecheck = 0 RAM(2)%First_OpenTimecheck = 0 RAM(2)%time=RAM(2)%time+DeltaT_BOP !overal time (s) !=================================================== ! BOP !=================================================== if (PipeRam1_closed==0) then !bop closing call bop_code(2,H_PipeRam1Bop,2) !ramtype=2 2=RNUMBER endif !bop is closing !================================================================ if (PipeRam1_closed==1) then RAM(2)%Q=0 !p_bop=pram_reg RAM(2)%p_bop=pa RAMS%minloss(2,17)=0. !RNUMBER=2 endif RAM(2)%timecounter_ram=RAM(2)%timecounter_ram+1 ! MiddleRamsStatus = IDshearBop ! UpperRamsStatus = IDPipeRam1 ! LowerRamsStatus = IDPipeRam2 ! AnnularStatus = IDAnnular ! AccumulatorPressureGauge = p_acc ! ManifoldPressureGauge= pram_reg ! AnnularPressureGauge=Pannular_reg ! ! ! ! WRITE(60,60) RAM(2)%time,RAM(2)%Q,RAM(2)%vdis_tot,p_acc, & ! pram_reg,Pannular_reg,RAM(2)%p_bop,IDshearBop, & ! IDPipeRam1,IDPipeRam2,IDAnnular !60 FORMAT(11(f18.5)) call sleepqq(100) if (PipeRam1_closed==1) then ! if ((MiddleRamsValve==1. .and. MiddleRamsFailureMalf==0) .or. (MiddleRamsValve==-1.0 .and. MiddleRamsFailureMalf==0) .or. (LowerRamsValve==1. .and. LowerRamsFailureMalf==0) .or. (LowerRamsValve==-1.0 .and. LowerRamsFailureMalf==0) .or. (AnnularValve==1. .and. AnnularFailureMalf==0) .or. (AnnularValve==-1.0 .and. AnnularFailureMalf==0) .or. ChokeLineValve==1. .or. ChokeLineValve==-1.0 .or. KillLineValve==1. .or. KillLineValve==-1.0) then finished_pipe1=1 ! endif endif if (IsStopped == .true.) return end do loop3 !while finished_pipe1==0 if ( finished_pipe1==1 .and. RAM(2)%Bottles_Charged_MalfActive==.true.) then call bop_code(2,H_PipeRam1Bop,2) !ramtype=2 2=RNUMBER call sleepqq(100) endif END SUBROUTINE PIPE_RAMS1_SUB