|
- module CDrillingConsole
- use CDrillingConsoleVariables
- use CSimulationVariables
- use CLog4
- use CLog3
- implicit none
- public
- contains
-
- ! Input routines
- subroutine SetAssignmentSwitch(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetAssignmentSwitch
- !DEC$ ATTRIBUTES ALIAS: 'SetAssignmentSwitch' :: SetAssignmentSwitch
- implicit none
- integer, intent(in) :: v
- DrillingConsole%AssignmentSwitch = v
- #ifdef deb
- call Log_4( 'AssignmentSwitch=', DrillingConsole%AssignmentSwitch)
- #endif
- end subroutine
-
- subroutine SetEmergencySwitch(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetEmergencySwitch
- !DEC$ ATTRIBUTES ALIAS: 'SetEmergencySwitch' :: SetEmergencySwitch
- implicit none
- logical, intent(in) :: v
- DrillingConsole%EmergencySwitch = v
- #ifdef deb
- print*, 'EmergencySwitch=', DrillingConsole%EmergencySwitch
- #endif
- end subroutine
-
- subroutine SetRTTorqueLimitKnob(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetRTTorqueLimitKnob
- !DEC$ ATTRIBUTES ALIAS: 'SetRTTorqueLimitKnob' :: SetRTTorqueLimitKnob
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%RTTorqueLimitKnob = v
- #ifdef deb
- print*, 'RTTorqueLimitKnob=', DrillingConsole%RTTorqueLimitKnob
- #endif
- end subroutine
-
- subroutine SetMP1CPSwitch(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetMP1CPSwitch
- !DEC$ ATTRIBUTES ALIAS: 'SetMP1CPSwitch' :: SetMP1CPSwitch
- implicit none
- integer, intent(in) :: v
-
- if(DrillingConsole%MP1CPSwitch == v) return
-
- if(SimulationState == SimulationState_Started) then
- DrillingConsole%MP1CPSwitchI = DrillingConsole%MP1CPSwitchI + 1
- if(DrillingConsole%MP1CPSwitchI >= 1) DrillingConsole%MP1CPSwitch = v
- if(DrillingConsole%MP1CPSwitchI >= 100) DrillingConsole%MP1CPSwitchI = 1
- !call Log_3( "MP1CPSwitchI=", MP1CPSwitchI)
- !call Log_3( "MP1CPSwitch=", MP1CPSwitch)
-
- !MP1CPSwitch = v
- endif
- ! if(SimulationState == SimulationState_Started) then
- ! !call Log_3( 'MP1CPSwitc(s)h=', MP1CPSwitch)
- ! if(MP1CPSwitchT /= v) then
- ! MP1CPSwitchT = v
- ! MP1CPSwitch = v
- !#ifdef deb
- ! !print*, 'MP1CPSwitch=', MP1CPSwitch
- ! !call Log_3( 'MP1CPSwitch=', MP1CPSwitch)
- !#endif
- ! endif
- ! else
- ! MP1CPSwitchT = v
- ! endif
- end subroutine
-
- subroutine SetMP1Throttle(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetMP1Throttle
- !DEC$ ATTRIBUTES ALIAS: 'SetMP1Throttle' :: SetMP1Throttle
- implicit none
- real*8, intent(in) :: v
- if(DrillingConsole%MP1Throttle == v) return
- if(SimulationState == SimulationState_Started) then
- if( abs(v - DrillingConsole%MP1Throttle) > 0.1) DrillingConsole%MP1ThrottleUpdate = .true.
- if(DrillingConsole%MP1ThrottleUpdate) DrillingConsole%MP1Throttle = v
-
- !call Log_3( 'v-mp1=', v)
- !call Log_3( 'MP1Throttle=', MP1Throttle)
- !call Log_3( 'MP1ThrottleUpdate=', MP1ThrottleUpdate)
-
- !MP1Throttle = v
- endif
- #ifdef deb
- print*, 'MP1Throttle=', DrillingConsole%MP1Throttle
- #endif
- end subroutine
-
- subroutine SetMP2Switch(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetMP2Switch
- !DEC$ ATTRIBUTES ALIAS: 'SetMP2Switch' :: SetMP2Switch
- implicit none
- logical, intent(in) :: v
- !call Log_3( 'v=', MP2SwitchT)
-
- if(DrillingConsole%MP2Switch == v) return
-
- if(SimulationState == SimulationState_Started) then
- DrillingConsole%MP2SwitchI = DrillingConsole%MP2SwitchI + 1
- if(DrillingConsole%MP2SwitchI >= 1) DrillingConsole%MP2Switch = v
- if(DrillingConsole%MP2SwitchI >= 100) DrillingConsole%MP2SwitchI = 1
- !call Log_3( "MP1CPSwitchI=", MP1CPSwitchI)
- !call Log_3( "MP2Switch=", MP2Switch)
-
- !MP2Switch = v
- endif
-
- ! if(SimulationState == SimulationState_Started) then
- ! !call Log_3( 'MP2Switch(s)=', MP2Switch)
- ! if(MP2SwitchT /= v) then
- ! MP2SwitchT = v
- ! MP2Switch = v
- !#ifdef deb
- ! !print*, 'MP2Switch=', MP2Switch
- ! !call Log_3( 'MP2Switch=', MP2Switch)
- !#endif
- ! endif
- ! else
- ! MP2SwitchT = v
- ! !call Log_3( 'MP2SwitchTMP2SwitchTMP2SwitchT=', MP2SwitchT)
- ! endif
- end subroutine
-
- subroutine SetMP2Throttle(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetMP2Throttle
- !DEC$ ATTRIBUTES ALIAS: 'SetMP2Throttle' :: SetMP2Throttle
- implicit none
- real*8, intent(in) :: v
- if(DrillingConsole%MP2Throttle == v) return
- if(SimulationState == SimulationState_Started) then
- if( abs(v - DrillingConsole%MP2Throttle) > 0.1) DrillingConsole%MP2ThrottleUpdate = .true.
- if(DrillingConsole%MP2ThrottleUpdate) DrillingConsole%MP2Throttle = v
-
- !call Log_3( 'v-mp2=', v)
- !call Log_3( 'MP2Throttle=', MP2Throttle)
- !call Log_3( 'MP2ThrottleUpdate=', MP2ThrottleUpdate)
-
- !MP2Throttle = v
- endif
- #ifdef deb
- print*, 'MP2Throttle=', DrillingConsole%MP2Throttle
- #endif
- end subroutine
-
- subroutine SetDWSwitch(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWSwitch
- !DEC$ ATTRIBUTES ALIAS: 'SetDWSwitch' :: SetDWSwitch
- implicit none
- integer, intent(in) :: v
- DrillingConsole%DWSwitch = v
- #ifdef deb
- print*, 'DWSwitch=', DrillingConsole%DWSwitch
- #endif
- end subroutine
-
- subroutine SetDWThrottle(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWThrottle
- !DEC$ ATTRIBUTES ALIAS: 'SetDWThrottle' :: SetDWThrottle
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%DWThrottle = v
- #ifdef deb
- print*, 'DWThrottle=', DrillingConsole%DWThrottle
- #endif
- end subroutine
-
- subroutine SetRTSwitch(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetRTSwitch
- !DEC$ ATTRIBUTES ALIAS: 'SetRTSwitch' :: SetRTSwitch
- implicit none
- integer, intent(in) :: v
- DrillingConsole%RTSwitch = v
- #ifdef deb
- print*, 'RTSwitch=', DrillingConsole%RTSwitch
- #endif
- end subroutine
-
- subroutine SetRTThrottle(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetRTThrottle
- !DEC$ ATTRIBUTES ALIAS: 'SetRTThrottle' :: SetRTThrottle
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%RTThrottle = v
- #ifdef deb
- print*, 'RTThrottle=', DrillingConsole%RTThrottle
- #endif
- end subroutine
-
- subroutine SetDWBreak(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWBreak
- !DEC$ ATTRIBUTES ALIAS: 'SetDWBreak' :: SetDWBreak
- implicit none
- real*8, intent(in) :: v
- !if(ForceBreak) return
- DrillingConsole%PreviousDWBreak = DrillingConsole%DWBreak
- DrillingConsole%DWBreak = v
- #ifdef deb
- print*, 'DWBreak=', DrillingConsole%DWBreak
- #endif
- end subroutine
-
- subroutine SetDWAcceleretor(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWAcceleretor
- !DEC$ ATTRIBUTES ALIAS: 'SetDWAcceleretor' :: SetDWAcceleretor
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%DWAcceleretor = v
- #ifdef deb
- print*, 'DWAcceleretor=', DrillingConsole%DWAcceleretor
- #endif
- end subroutine
-
- subroutine SetDWTransmisionLever(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWTransmisionLever
- !DEC$ ATTRIBUTES ALIAS: 'SetDWTransmisionLever' :: SetDWTransmisionLever
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%DWTransmisionLever = v
- #ifdef deb
- print*, 'DWTransmisionLever=', DrillingConsole%DWTransmisionLever
- #endif
- end subroutine
-
- subroutine SetDWPowerLever(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWPowerLever
- !DEC$ ATTRIBUTES ALIAS: 'SetDWPowerLever' :: SetDWPowerLever
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%DWPowerLever = v
- #ifdef deb
- print*, 'DWPowerLever=', DrillingConsole%DWPowerLever
- #endif
- end subroutine
-
- subroutine SetTongLever(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetTongLever
- !DEC$ ATTRIBUTES ALIAS: 'SetTongLever' :: SetTongLever
- implicit none
- real*8, intent(in) :: v
- if (DrillingConsole%TongLever == v) return
- DrillingConsole%TongLever = v
-
- ! if(dint(TongLever) == 1.0) then
- ! call OnBreakoutLeverPress%RunAll()
- ! #ifdef deb
- ! print*, 'OnBreakoutLeverPress=', size(OnBreakoutLeverPress%Delegates)
- ! #endif
- ! endif
- ! if(dint(TongLever) == -1.0) then
- ! call OnMakeupLeverPress%RunAll()
-
- ! #ifdef deb
- ! print*, 'OnMakeupPress=', size(OnMakeupLeverPress%Delegates)
- ! #endif
- ! endif
- ! if(dint(TongLever) == 0.0) then
- ! call OnTongNeutralPress%RunAll()
- ! #ifdef deb
- ! print*, 'OnTongNeutralPress=', size(OnTongNeutralPress%Delegates)
- ! #endif
- ! endif
-
- #ifdef deb
- print*, 'TongLever=', DrillingConsole%TongLever
- #endif
- end subroutine
-
- subroutine SetRTTransmissionLever(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetRTTransmissionLever
- !DEC$ ATTRIBUTES ALIAS: 'SetRTTransmissionLever' :: SetRTTransmissionLever
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%RTTransmissionLever = v
- #ifdef deb
- print*, 'RTTransmissionLever=', DrillingConsole%RTTransmissionLever
- #endif
- end subroutine
-
- subroutine SetDWClutchLever(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetDWClutchLever
- !DEC$ ATTRIBUTES ALIAS: 'SetDWClutchLever' :: SetDWClutchLever
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%DWClutchLever = v
- #ifdef deb
- print*, 'DWClutchLever=', DrillingConsole%DWClutchLever
- #endif
- end subroutine
-
- subroutine SetEddyBreakLever(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetEddyBreakLever
- !DEC$ ATTRIBUTES ALIAS: 'SetEddyBreakLever' :: SetEddyBreakLever
- implicit none
- real*8, intent(in) :: v
- DrillingConsole%EddyBreakLever = v
- #ifdef deb
- print*, 'EddyBreakLever=', DrillingConsole%EddyBreakLever
- #endif
- end subroutine
-
- subroutine SetAutoDW(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetAutoDW
- !DEC$ ATTRIBUTES ALIAS: 'SetAutoDW' :: SetAutoDW
- implicit none
- logical, intent(in) :: v
- DrillingConsole%AutoDW = v
- #ifdef deb
- print*, 'AutoDW=', DrillingConsole%AutoDW
- #endif
- end subroutine
-
- subroutine SetGEN1(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetGEN1
- !DEC$ ATTRIBUTES ALIAS: 'SetGEN1' :: SetGEN1
- implicit none
- logical, intent(in) :: v
- DrillingConsole%GEN1 = v
- #ifdef deb
- print*, 'GEN1=', DrillingConsole%GEN1
- #endif
- end subroutine
-
- subroutine SetGEN2(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetGEN2
- !DEC$ ATTRIBUTES ALIAS: 'SetGEN2' :: SetGEN2
- implicit none
- logical, intent(in) :: v
- DrillingConsole%GEN2 = v
- #ifdef deb
- print*, 'GEN2=', DrillingConsole%GEN2
- #endif
- end subroutine
-
- subroutine SetGEN3(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetGEN3
- !DEC$ ATTRIBUTES ALIAS: 'SetGEN3' :: SetGEN3
- implicit none
- logical, intent(in) :: v
- DrillingConsole%GEN3 = v
- #ifdef deb
- print*, 'GEN3=', DrillingConsole%GEN3
- #endif
- end subroutine
-
- subroutine SetGEN4(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetGEN4
- !DEC$ ATTRIBUTES ALIAS: 'SetGEN4' :: SetGEN4
- implicit none
- logical, intent(in) :: v
- DrillingConsole%GEN4 = v
- #ifdef deb
- print*, 'GEN4=', DrillingConsole%GEN4
- #endif
- end subroutine
-
- ! subroutine SetInstallSafetyValve(v)
- ! !DEC$ ATTRIBUTES DLLEXPORT :: SetInstallSafetyValve
- ! !DEC$ ATTRIBUTES ALIAS: 'SetInstallSafetyValve' :: SetInstallSafetyValve
- ! implicit none
- ! logical, intent(in) :: v
- ! InstallSafetyValve = v
- !#ifdef deb
- ! print*, 'InstallSafetyValve=', InstallSafetyValve
- !#endif
- ! end subroutine
- !
- ! subroutine SetOpenSafetyValve(v)
- ! !DEC$ ATTRIBUTES DLLEXPORT :: SetOpenSafetyValve
- ! !DEC$ ATTRIBUTES ALIAS: 'SetOpenSafetyValve' :: SetOpenSafetyValve
- ! implicit none
- ! logical, intent(in) :: v
- ! OpenSafetyValve = v
- !#ifdef deb
- ! print*, 'OpenSafetyValve=', OpenSafetyValve
- !#endif
- ! end subroutine
- !
- ! subroutine SetRemoveSafetyValve(v)
- ! !DEC$ ATTRIBUTES DLLEXPORT :: SetRemoveSafetyValve
- ! !DEC$ ATTRIBUTES ALIAS: 'SetRemoveSafetyValve' :: SetRemoveSafetyValve
- ! implicit none
- ! logical, intent(in) :: v
- ! RemoveSafetyValve = v
- !#ifdef deb
- ! print*, 'RemoveSafetyValve=', RemoveSafetyValve
- !#endif
- ! end subroutine
- !
- ! subroutine SetCloseSafetyValve(v)
- ! !DEC$ ATTRIBUTES DLLEXPORT :: SetCloseSafetyValve
- ! !DEC$ ATTRIBUTES ALIAS: 'SetCloseSafetyValve' :: SetCloseSafetyValve
- ! implicit none
- ! logical, intent(in) :: v
- ! CloseSafetyValve = v
- !#ifdef deb
- ! print*, 'CloseSafetyValve=', CloseSafetyValve
- !#endif
- ! end subroutine
- !
- ! subroutine SetMakeJoint(v)
- ! !DEC$ ATTRIBUTES DLLEXPORT :: SetMakeJoint
- ! !DEC$ ATTRIBUTES ALIAS: 'SetMakeJoint' :: SetMakeJoint
- ! implicit none
- ! logical, intent(in) :: v
- ! MakeJoint = v
- !#ifdef deb
- ! print*, 'MakeJoint=', MakeJoint
- !#endif
- ! end subroutine
- !
- ! subroutine SetBreakJoint(v)
- ! !DEC$ ATTRIBUTES DLLEXPORT :: SetBreakJoint
- ! !DEC$ ATTRIBUTES ALIAS: 'SetBreakJoint' :: SetBreakJoint
- ! implicit none
- ! logical, intent(in) :: v
- ! BreakJoint = v
- !#ifdef deb
- ! print*, 'BreakJoint=', BreakJoint
- !#endif
- ! end subroutine
-
- subroutine SetOpenKellyCock(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetOpenKellyCock
- !DEC$ ATTRIBUTES ALIAS: 'SetOpenKellyCock' :: SetOpenKellyCock
- use CManifolds, OpenKellyCockSub => OpenKellyCock
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%OpenKellyCock == v) return
- DrillingConsole%OpenKellyCock = v
- ! if (v) call OnOpenKellyCockPress%RunAll()
- if(v .and. DrillingConsole%Permission_OpenKellyCock) call OpenKellyCockSub()
- #ifdef deb
- print*, 'OpenKellyCock=', DrillingConsole%OpenKellyCock
- #endif
- end subroutine
-
- subroutine SetCloseKellyCock(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetCloseKellyCock
- !DEC$ ATTRIBUTES ALIAS: 'SetCloseKellyCock' :: SetCloseKellyCock
- use CManifolds, CloseKellyCockSub => CloseKellyCock
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%CloseKellyCock == v) return
- DrillingConsole%CloseKellyCock = v
- ! if (v) call OnCloseKellyCockPress%RunAll()
- if(v .and. DrillingConsole%Permission_CloseKellyCock) call CloseKellyCockSub()
- #ifdef deb
- print*, 'CloseKellyCock=', DrillingConsole%CloseKellyCock
- #endif
- end subroutine
-
- subroutine SetOpenSafetyValve(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetOpenSafetyValve
- !DEC$ ATTRIBUTES ALIAS: 'SetOpenSafetyValve' :: SetOpenSafetyValve
- !use CManifolds, OpenSafetyValveSub => OpenSafetyValve
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%OpenSafetyValve == v) return
- DrillingConsole%OpenSafetyValve = v
- ! if (v) call OnOpenSafetyValvePress%RunAll()
- !if(v .and. Permission_OpenSafetyValve) call OpenSafetyValveSub()
- #ifdef deb
- print*, 'OpenSafetyValve=', DrillingConsole%OpenSafetyValve
- #endif
- end subroutine
-
- subroutine SetCloseSafetyValve(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetCloseSafetyValve
- !DEC$ ATTRIBUTES ALIAS: 'SetCloseSafetyValve' :: SetCloseSafetyValve
- !use CManifolds, CloseSafetyValveSub => CloseSafetyValve
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%CloseSafetyValve == v) return
- DrillingConsole%CloseSafetyValve = v
- ! if (v) call OnCloseSafetyValvePress%RunAll()
- !if(v .and. Permission_CloseSafetyValve) call CloseSafetyValveSub()
- #ifdef deb
- print*, 'CloseSafetyValve=', DrillingConsole%CloseSafetyValve
- #endif
- end subroutine
-
- subroutine SetIRSafetyValve(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetIRSafetyValve
- !DEC$ ATTRIBUTES ALIAS: 'SetIRSafetyValve' :: SetIRSafetyValve
- use CManifolds
- implicit none
- logical, intent(in) :: v
- logical :: prev
- if (DrillingConsole%IRSafetyValve == v) return
- prev = DrillingConsole%IRSafetyValve
- DrillingConsole%IRSafetyValve = v
- ! if (v) call OnIRSafetyValvePress%RunAll()
- !if(prev /= IRSafetyValve .and. v .and. Permission_IRSafetyValve) call ToggleSafetyValve()
- !if(prev /= IRSafetyValve .and. v) call ToggleSafetyValve()
- #ifdef deb
- print*, 'IRSafetyValve=', DrillingConsole%IRSafetyValve
- #endif
- end subroutine
-
- subroutine SetIRIBop(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetIRIBop
- !DEC$ ATTRIBUTES ALIAS: 'SetIRIBop' :: SetIRIBop
- use CManifolds
- implicit none
- logical, intent(in) :: v
- logical :: prev
- if (DrillingConsole%IRIBop == v) return
- prev = DrillingConsole%IRIBop
- DrillingConsole%IRIBop = v
- ! if (v) call OnIRIBopPress%RunAll()
- !if(prev /= IRIBop .and. v .and. Permission_IRIBop) call ToggleIBop()
- !if(prev /= IRIBop .and. v) call ToggleIBop()
- #ifdef deb
- print*, 'IRIBop=', DrillingConsole%IRIBop
- #endif
- end subroutine
-
-
-
- subroutine SetLatchPipe(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetLatchPipe
- !DEC$ ATTRIBUTES ALIAS: 'SetLatchPipe' :: SetLatchPipe
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%LatchPipe .eqv. v) return
- DrillingConsole%LatchPipe = v
- ! if (v) call OnLatchPipePress%RunAll()
- #ifdef deb
- print*, 'LatchPipe=', DrillingConsole%LatchPipe
- #endif
- end subroutine
-
- subroutine SetUnlatchPipe(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetUnlatchPipe
- !DEC$ ATTRIBUTES ALIAS: 'SetUnlatchPipe' :: SetUnlatchPipe
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%UnlatchPipe .eqv. v) return
- DrillingConsole%UnlatchPipe = v
- ! if (v) call OnUnlatchPipePress%RunAll()
- #ifdef deb
- print*, 'UnlatchPipe=', DrillingConsole%UnlatchPipe
- #endif
- end subroutine
-
- subroutine SetSwing(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetSwing
- !DEC$ ATTRIBUTES ALIAS: 'SetSwing' :: SetSwing
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%Swing .eqv. v) return
- DrillingConsole%Swing = v
- ! if (v) call OnSwingPress%RunAll()
- #ifdef deb
- print*, 'Swing=', DrillingConsole%Swing
- #endif
- end subroutine
-
- subroutine SetFillMouseHole(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetFillMouseHole
- !DEC$ ATTRIBUTES ALIAS: 'SetFillMouseHole' :: SetFillMouseHole
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%FillMouseHole .eqv. v) return
- DrillingConsole%FillMouseHole = v
- ! if (v) call OnFillMouseHolePress%RunAll()
- #ifdef deb
- print*, 'FillMouseHole=', DrillingConsole%FillMouseHole
- #endif
- end subroutine
-
- subroutine SetSlips(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetSlips
- !DEC$ ATTRIBUTES ALIAS: 'SetSlips' :: SetSlips
- implicit none
- logical, intent(in) :: v
- if (DrillingConsole%Slips .eqv. v) return
- DrillingConsole%Slips = v
- #ifdef deb
- print*, 'Slips=', DrillingConsole%Slips
- #endif
- ! if (v) call OnSlipsPress%RunAll()
- end subroutine
-
-
- subroutine SetBrakeLeverCoefficient(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetBrakeLeverCoefficient
- !DEC$ ATTRIBUTES ALIAS: 'SetBrakeLeverCoefficient' :: SetBrakeLeverCoefficient
- implicit none
- real, intent(in) :: v
- DrillingConsole%BrakeLeverCoefficient = v
- #ifdef deb
- print*, 'BrakeLeverCoefficient=', DrillingConsole%BrakeLeverCoefficient
- #endif
- end subroutine
-
- subroutine SetHideDrillingBrake(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetHideDrillingBrake
- !DEC$ ATTRIBUTES ALIAS: 'SetHideDrillingBrake' :: SetHideDrillingBrake
- implicit none
- logical, intent(in) :: v
- DrillingConsole%HideDrillingBrake = v
- #ifdef deb
- print*, 'HideDrillingBrake=', DrillingConsole%HideDrillingBrake
- #endif
- end subroutine
-
-
-
-
-
-
-
-
- subroutine SetParkingBrake(v)
- !DEC$ ATTRIBUTES DLLEXPORT :: SetParkingBrake
- !DEC$ ATTRIBUTES ALIAS: 'SetParkingBrake' :: SetParkingBrake
- implicit none
- logical, intent(in) :: v
- DrillingConsole%ParkingBrakeBtn = v
- #ifdef deb
- print*, 'ParkingBrakeBtn=', DrillingConsole%ParkingBrakeBtn
- #endif
- end subroutine
-
-
-
-
-
-
-
-
-
-
-
-
- ! Output routines
-
- logical function GetParkingBrakeLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetParkingBrakeLed
- !DEC$ ATTRIBUTES ALIAS: 'GetParkingBrakeLed' :: GetParkingBrakeLed
- implicit none
- GetParkingBrakeLed = DrillingConsole%ParkingBrakeLed
- !GetParkingBrakeLed = .true.
- end function
-
-
- integer function GetGEN1LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN1LED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN1LED' :: GetGEN1LED
- implicit none
- GetGEN1LED = 1
- !GetGEN1LED = GEN1LED
- end function
-
- integer function GetGEN2LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN2LED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN2LED' :: GetGEN2LED
- implicit none
- GetGEN2LED = 1
- !GetGEN2LED = GEN2LED
- end function
-
- integer function GetGEN3LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN3LED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN3LED' :: GetGEN3LED
- implicit none
- GetGEN3LED = 1
- !GetGEN3LED = GEN3LED
- end function
-
- integer function GetGEN4LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN4LED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN4LED' :: GetGEN4LED
- implicit none
- GetGEN4LED = 1
- !GetGEN4LED = GEN4LED
- end function
-
- integer function GetSCR1LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetSCR1LED
- !DEC$ ATTRIBUTES ALIAS: 'GetSCR1LED' :: GetSCR1LED
- implicit none
- GetSCR1LED = DrillingConsole%SCR1LED
- end function
-
- integer function GetSCR2LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetSCR2LED
- !DEC$ ATTRIBUTES ALIAS: 'GetSCR2LED' :: GetSCR2LED
- implicit none
- GetSCR2LED = DrillingConsole%SCR2LED
- end function
-
- integer function GetSCR3LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetSCR3LED
- !DEC$ ATTRIBUTES ALIAS: 'GetSCR3LED' :: GetSCR3LED
- implicit none
- GetSCR3LED = DrillingConsole%SCR3LED
- end function
-
- integer function GetSCR4LED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetSCR4LED
- !DEC$ ATTRIBUTES ALIAS: 'GetSCR4LED' :: GetSCR4LED
- implicit none
- GetSCR4LED = DrillingConsole%SCR4LED
- end function
-
- integer function GetMP1BLWR()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetMP1BLWR
- !DEC$ ATTRIBUTES ALIAS: 'GetMP1BLWR' :: GetMP1BLWR
- implicit none
- GetMP1BLWR = DrillingConsole%MP1BLWR
- end function
-
- integer function GetMP2BLWR()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetMP2BLWR
- !DEC$ ATTRIBUTES ALIAS: 'GetMP2BLWR' :: GetMP2BLWR
- implicit none
- GetMP2BLWR = DrillingConsole%MP2BLWR
- end function
-
- integer function GetDWBLWR()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetDWBLWR
- !DEC$ ATTRIBUTES ALIAS: 'GetDWBLWR' :: GetDWBLWR
- implicit none
- GetDWBLWR = DrillingConsole%DWBLWR
- end function
-
- integer function GetRTBLWR()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetRTBLWR
- !DEC$ ATTRIBUTES ALIAS: 'GetRTBLWR' :: GetRTBLWR
- implicit none
- GetRTBLWR = DrillingConsole%RTBLWR
- end function
-
- integer function GetPWRLIM()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetPWRLIM
- !DEC$ ATTRIBUTES ALIAS: 'GetPWRLIM' :: GetPWRLIM
- implicit none
- GetPWRLIM = DrillingConsole%PWRLIM
- end function
-
- real(8) function GetPWRLIMMTR()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetPWRLIMMTR
- !DEC$ ATTRIBUTES ALIAS: 'GetPWRLIMMTR' :: GetPWRLIMMTR
- implicit none
- GetPWRLIMMTR = DrillingConsole%PWRLIMMTR
- end function
-
- real(8) function GetRTTorqueLimitGauge()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetRTTorqueLimitGauge
- !DEC$ ATTRIBUTES ALIAS: 'GetRTTorqueLimitGauge' :: GetRTTorqueLimitGauge
- implicit none
- GetRTTorqueLimitGauge = DrillingConsole%RTTorqueLimitGauge
- end function
-
- integer function GetAutoDWLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetAutoDWLED
- !DEC$ ATTRIBUTES ALIAS: 'GetAutoDWLED' :: GetAutoDWLED
- implicit none
- GetAutoDWLED = DrillingConsole%AutoDWLED
- end function
-
- integer function GetGEN1BTNLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN1BTNLED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN1BTNLED' :: GetGEN1BTNLED
- implicit none
- GetGEN1BTNLED = DrillingConsole%GEN1BTNLED
- end function
-
- integer function GetGEN2BTNLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN2BTNLED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN2BTNLED' :: GetGEN2BTNLED
- implicit none
- GetGEN2BTNLED = DrillingConsole%GEN2BTNLED
- end function
-
- integer function GetGEN3BTNLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN3BTNLED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN3BTNLED' :: GetGEN3BTNLED
- implicit none
- GetGEN3BTNLED = DrillingConsole%GEN3BTNLED
- end function
-
- integer function GetGEN4BTNLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetGEN4BTNLED
- !DEC$ ATTRIBUTES ALIAS: 'GetGEN4BTNLED' :: GetGEN4BTNLED
- implicit none
- GetGEN4BTNLED = DrillingConsole%GEN4BTNLED
- end function
-
- integer function GetOpenKellyCockLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetOpenKellyCockLed
- !DEC$ ATTRIBUTES ALIAS: 'GetOpenKellyCockLed' :: GetOpenKellyCockLed
- implicit none
- GetOpenKellyCockLed = DrillingConsole%OpenKellyCockLed
- end function
-
- integer function GetCloseKellyCockLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetCloseKellyCockLed
- !DEC$ ATTRIBUTES ALIAS: 'GetCloseKellyCockLed' :: GetCloseKellyCockLed
- implicit none
- GetCloseKellyCockLed = DrillingConsole%CloseKellyCockLed
- end function
-
- integer function GetOpenSafetyValveLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetOpenSafetyValveLed
- !DEC$ ATTRIBUTES ALIAS: 'GetOpenSafetyValveLed' :: GetOpenSafetyValveLed
- implicit none
- GetOpenSafetyValveLed = DrillingConsole%OpenSafetyValveLed
- end function
-
- integer function GetCloseSafetyValveLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetCloseSafetyValveLed
- !DEC$ ATTRIBUTES ALIAS: 'GetCloseSafetyValveLed' :: GetCloseSafetyValveLed
- implicit none
- GetCloseSafetyValveLed = DrillingConsole%CloseSafetyValveLed
- end function
-
- integer function GetIRSafetyValveLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetIRSafetyValveLed
- !DEC$ ATTRIBUTES ALIAS: 'GetIRSafetyValveLed' :: GetIRSafetyValveLed
- implicit none
- GetIRSafetyValveLed = DrillingConsole%IRSafetyValveLed
- end function
-
- integer function GetIRIBopLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetIRIBopLed
- !DEC$ ATTRIBUTES ALIAS: 'GetIRIBopLed' :: GetIRIBopLed
- implicit none
- GetIRIBopLed = DrillingConsole%IRIBopLed
- end function
-
-
- integer function GetLatchPipeLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetLatchPipeLED
- !DEC$ ATTRIBUTES ALIAS: 'GetLatchPipeLED' :: GetLatchPipeLED
- implicit none
- GetLatchPipeLED = DrillingConsole%LatchPipeLED
- end function
-
- integer function GetUnlatchPipeLED()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetUnlatchPipeLED
- !DEC$ ATTRIBUTES ALIAS: 'GetUnlatchPipeLED' :: GetUnlatchPipeLED
- implicit none
- GetUnlatchPipeLED = DrillingConsole%UnlatchPipeLED
- end function
-
- integer function GetSwingLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetSwingLed
- !DEC$ ATTRIBUTES ALIAS: 'GetSwingLed' :: GetSwingLed
- implicit none
- GetSwingLed = DrillingConsole%SwingLed
- end function
-
- integer function GetFillMouseHoleLed()
- !DEC$ ATTRIBUTES DLLEXPORT :: GetFillMouseHoleLed
- !DEC$ ATTRIBUTES ALIAS: 'GetFillMouseHoleLed' :: GetFillMouseHoleLed
- implicit none
- GetFillMouseHoleLed = DrillingConsole%FillMouseHoleLed
- end function
-
- end module CDrillingConsole
|