module Game.LambdaHack.Atomic.CmdAtomic
( CmdAtomic(..), UpdAtomic(..), HearMsg(..), SfxAtomic(..), SfxMsg(..)
, undoUpdAtomic, undoSfxAtomic, undoCmdAtomic
) where
import Prelude ()
import Game.LambdaHack.Core.Prelude
import Data.Int (Int64)
import qualified System.Random as R
import Game.LambdaHack.Client.ClientOptions
import Game.LambdaHack.Common.Actor
import Game.LambdaHack.Common.Analytics
import Game.LambdaHack.Common.Faction
import Game.LambdaHack.Common.Item
import qualified Game.LambdaHack.Common.ItemAspect as IA
import Game.LambdaHack.Common.Perception
import Game.LambdaHack.Common.Point
import Game.LambdaHack.Common.ReqFailure
import Game.LambdaHack.Common.State
import Game.LambdaHack.Common.Time
import Game.LambdaHack.Common.Types
import Game.LambdaHack.Common.Vector
import Game.LambdaHack.Content.ItemKind (ItemKind)
import qualified Game.LambdaHack.Content.ItemKind as IK
import qualified Game.LambdaHack.Content.PlaceKind as PK
import Game.LambdaHack.Content.TileKind (TileKind)
import qualified Game.LambdaHack.Core.Dice as Dice
import qualified Game.LambdaHack.Definition.Ability as Ability
import Game.LambdaHack.Definition.Defs
data CmdAtomic =
UpdAtomic UpdAtomic
| SfxAtomic SfxAtomic
deriving Int -> CmdAtomic -> ShowS
[CmdAtomic] -> ShowS
CmdAtomic -> String
(Int -> CmdAtomic -> ShowS)
-> (CmdAtomic -> String)
-> ([CmdAtomic] -> ShowS)
-> Show CmdAtomic
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CmdAtomic] -> ShowS
$cshowList :: [CmdAtomic] -> ShowS
show :: CmdAtomic -> String
$cshow :: CmdAtomic -> String
showsPrec :: Int -> CmdAtomic -> ShowS
$cshowsPrec :: Int -> CmdAtomic -> ShowS
Show
data UpdAtomic =
UpdCreateActor ActorId Actor [(ItemId, Item)]
| UpdDestroyActor ActorId Actor [(ItemId, Item)]
| UpdCreateItem ItemId Item ItemQuant Container
| UpdDestroyItem ItemId Item ItemQuant Container
| UpdSpotActor ActorId Actor [(ItemId, Item)]
| UpdLoseActor ActorId Actor [(ItemId, Item)]
| UpdSpotItem Bool ItemId Item ItemQuant Container
| UpdLoseItem Bool ItemId Item ItemQuant Container
| UpdSpotItemBag Container ItemBag [(ItemId, Item)]
| UpdLoseItemBag Container ItemBag [(ItemId, Item)]
| UpdMoveActor ActorId Point Point
| UpdWaitActor ActorId Watchfulness Watchfulness
| UpdDisplaceActor ActorId ActorId
| UpdMoveItem ItemId Int ActorId CStore CStore
| UpdRefillHP ActorId Int64
| UpdRefillCalm ActorId Int64
| UpdTrajectory ActorId (Maybe ([Vector], Speed)) (Maybe ([Vector], Speed))
| UpdQuitFaction FactionId (Maybe Status) (Maybe Status)
(Maybe (FactionAnalytics, GenerationAnalytics))
| UpdLeadFaction FactionId (Maybe ActorId) (Maybe ActorId)
| UpdDiplFaction FactionId FactionId Diplomacy Diplomacy
| UpdTacticFaction FactionId Ability.Tactic Ability.Tactic
| UpdAutoFaction FactionId Bool
| UpdRecordKill ActorId (ContentId ItemKind) Int
| UpdAlterTile LevelId Point (ContentId TileKind) (ContentId TileKind)
| UpdAlterExplorable LevelId Int
| UpdAlterGold Int
| UpdSearchTile ActorId Point (ContentId TileKind)
| UpdHideTile ActorId Point (ContentId TileKind)
| UpdSpotTile LevelId [(Point, ContentId TileKind)]
| UpdLoseTile LevelId [(Point, ContentId TileKind)]
| UpdSpotEntry LevelId [(Point, PK.PlaceEntry)]
| UpdLoseEntry LevelId [(Point, PK.PlaceEntry)]
| UpdAlterSmell LevelId Point Time Time
| UpdSpotSmell LevelId [(Point, Time)]
| UpdLoseSmell LevelId [(Point, Time)]
| UpdTimeItem ItemId Container ItemTimer ItemTimer
| UpdAgeGame [LevelId]
| UpdUnAgeGame [LevelId]
| UpdDiscover Container ItemId (ContentId ItemKind) IA.AspectRecord
| UpdCover Container ItemId (ContentId ItemKind) IA.AspectRecord
| UpdDiscoverKind Container ItemKindIx (ContentId ItemKind)
| UpdCoverKind Container ItemKindIx (ContentId ItemKind)
| UpdDiscoverAspect Container ItemId IA.AspectRecord
| UpdCoverAspect Container ItemId IA.AspectRecord
| UpdDiscoverServer ItemId IA.AspectRecord
| UpdCoverServer ItemId IA.AspectRecord
| UpdPerception LevelId Perception Perception
| UpdRestart FactionId PerLid State Challenge ClientOptions R.StdGen
| UpdRestartServer State
| UpdResume FactionId PerLid
| UpdResumeServer State
| UpdKillExit FactionId
| UpdWriteSave
| UpdHearFid FactionId HearMsg
deriving Int -> UpdAtomic -> ShowS
[UpdAtomic] -> ShowS
UpdAtomic -> String
(Int -> UpdAtomic -> ShowS)
-> (UpdAtomic -> String)
-> ([UpdAtomic] -> ShowS)
-> Show UpdAtomic
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdAtomic] -> ShowS
$cshowList :: [UpdAtomic] -> ShowS
show :: UpdAtomic -> String
$cshow :: UpdAtomic -> String
showsPrec :: Int -> UpdAtomic -> ShowS
$cshowsPrec :: Int -> UpdAtomic -> ShowS
Show
data HearMsg =
HearUpd Bool UpdAtomic
| HearStrike (ContentId ItemKind)
| HearSummon Bool (GroupName ItemKind) Dice.Dice
| HearTaunt Text
deriving Int -> HearMsg -> ShowS
[HearMsg] -> ShowS
HearMsg -> String
(Int -> HearMsg -> ShowS)
-> (HearMsg -> String) -> ([HearMsg] -> ShowS) -> Show HearMsg
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [HearMsg] -> ShowS
$cshowList :: [HearMsg] -> ShowS
show :: HearMsg -> String
$cshow :: HearMsg -> String
showsPrec :: Int -> HearMsg -> ShowS
$cshowsPrec :: Int -> HearMsg -> ShowS
Show
data SfxAtomic =
SfxStrike ActorId ActorId ItemId CStore
| SfxRecoil ActorId ActorId ItemId CStore
| SfxSteal ActorId ActorId ItemId CStore
| SfxRelease ActorId ActorId ItemId CStore
| SfxProject ActorId ItemId CStore
| SfxReceive ActorId ItemId CStore
| SfxApply ActorId ItemId CStore
| SfxCheck ActorId ItemId CStore
| SfxTrigger ActorId Point
| SfxShun ActorId Point
| SfxEffect FactionId ActorId IK.Effect Int64
| SfxMsgFid FactionId SfxMsg
| SfxRestart
| SfxCollideTile ActorId Point
| SfxTaunt Bool ActorId
deriving Int -> SfxAtomic -> ShowS
[SfxAtomic] -> ShowS
SfxAtomic -> String
(Int -> SfxAtomic -> ShowS)
-> (SfxAtomic -> String)
-> ([SfxAtomic] -> ShowS)
-> Show SfxAtomic
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SfxAtomic] -> ShowS
$cshowList :: [SfxAtomic] -> ShowS
show :: SfxAtomic -> String
$cshow :: SfxAtomic -> String
showsPrec :: Int -> SfxAtomic -> ShowS
$cshowsPrec :: Int -> SfxAtomic -> ShowS
Show
data SfxMsg =
SfxUnexpected ReqFailure
| SfxExpected Text ReqFailure
| SfxFizzles
| SfxNothingHappens
| SfxVoidDetection IK.DetectKind
| SfxUnimpressed ActorId
| SfxSummonLackCalm ActorId
| SfxSummonTooManyOwn ActorId
| SfxSummonTooManyAll ActorId
| SfxSummonFailure ActorId
| SfxLevelNoMore
| SfxLevelPushed
| SfxBracedImmune ActorId
| SfxEscapeImpossible
| SfxStasisProtects
| SfxWaterParalysisResisted
| SfxTransImpossible
| SfxIdentifyNothing
| SfxPurposeNothing
| SfxPurposeTooFew Int Int
| SfxPurposeUnique
| SfxPurposeNotCommon
| SfxRerollNothing
| SfxRerollNotRandom
| SfxDupNothing
| SfxDupUnique
| SfxDupValuable
| SfxColdFish
| SfxTimerExtended LevelId ActorId ItemId CStore (Delta Time)
| SfxCollideActor LevelId ActorId ActorId
deriving Int -> SfxMsg -> ShowS
[SfxMsg] -> ShowS
SfxMsg -> String
(Int -> SfxMsg -> ShowS)
-> (SfxMsg -> String) -> ([SfxMsg] -> ShowS) -> Show SfxMsg
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SfxMsg] -> ShowS
$cshowList :: [SfxMsg] -> ShowS
show :: SfxMsg -> String
$cshow :: SfxMsg -> String
showsPrec :: Int -> SfxMsg -> ShowS
$cshowsPrec :: Int -> SfxMsg -> ShowS
Show
undoUpdAtomic :: UpdAtomic -> Maybe UpdAtomic
undoUpdAtomic :: UpdAtomic -> Maybe UpdAtomic
undoUpdAtomic cmd :: UpdAtomic
cmd = case UpdAtomic
cmd of
UpdCreateActor aid :: ActorId
aid body :: Actor
body ais :: [(ItemId, Item)]
ais -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Actor -> [(ItemId, Item)] -> UpdAtomic
UpdDestroyActor ActorId
aid Actor
body [(ItemId, Item)]
ais
UpdDestroyActor aid :: ActorId
aid body :: Actor
body ais :: [(ItemId, Item)]
ais -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Actor -> [(ItemId, Item)] -> UpdAtomic
UpdCreateActor ActorId
aid Actor
body [(ItemId, Item)]
ais
UpdCreateItem iid :: ItemId
iid item :: Item
item k :: ItemQuant
k c :: Container
c -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ItemId -> Item -> ItemQuant -> Container -> UpdAtomic
UpdDestroyItem ItemId
iid Item
item ItemQuant
k Container
c
UpdDestroyItem iid :: ItemId
iid item :: Item
item k :: ItemQuant
k c :: Container
c -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ItemId -> Item -> ItemQuant -> Container -> UpdAtomic
UpdCreateItem ItemId
iid Item
item ItemQuant
k Container
c
UpdSpotActor aid :: ActorId
aid body :: Actor
body ais :: [(ItemId, Item)]
ais -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Actor -> [(ItemId, Item)] -> UpdAtomic
UpdLoseActor ActorId
aid Actor
body [(ItemId, Item)]
ais
UpdLoseActor aid :: ActorId
aid body :: Actor
body ais :: [(ItemId, Item)]
ais -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Actor -> [(ItemId, Item)] -> UpdAtomic
UpdSpotActor ActorId
aid Actor
body [(ItemId, Item)]
ais
UpdSpotItem verbose :: Bool
verbose iid :: ItemId
iid item :: Item
item k :: ItemQuant
k c :: Container
c -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Bool -> ItemId -> Item -> ItemQuant -> Container -> UpdAtomic
UpdLoseItem Bool
verbose ItemId
iid Item
item ItemQuant
k Container
c
UpdLoseItem verbose :: Bool
verbose iid :: ItemId
iid item :: Item
item k :: ItemQuant
k c :: Container
c -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Bool -> ItemId -> Item -> ItemQuant -> Container -> UpdAtomic
UpdSpotItem Bool
verbose ItemId
iid Item
item ItemQuant
k Container
c
UpdSpotItemBag c :: Container
c bag :: ItemBag
bag ais :: [(ItemId, Item)]
ais -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container -> ItemBag -> [(ItemId, Item)] -> UpdAtomic
UpdLoseItemBag Container
c ItemBag
bag [(ItemId, Item)]
ais
UpdLoseItemBag c :: Container
c bag :: ItemBag
bag ais :: [(ItemId, Item)]
ais -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container -> ItemBag -> [(ItemId, Item)] -> UpdAtomic
UpdSpotItemBag Container
c ItemBag
bag [(ItemId, Item)]
ais
UpdMoveActor aid :: ActorId
aid fromP :: Point
fromP toP :: Point
toP -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Point -> Point -> UpdAtomic
UpdMoveActor ActorId
aid Point
toP Point
fromP
UpdWaitActor aid :: ActorId
aid fromWS :: Watchfulness
fromWS toWS :: Watchfulness
toWS -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Watchfulness -> Watchfulness -> UpdAtomic
UpdWaitActor ActorId
aid Watchfulness
toWS Watchfulness
fromWS
UpdDisplaceActor source :: ActorId
source target :: ActorId
target -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> ActorId -> UpdAtomic
UpdDisplaceActor ActorId
target ActorId
source
UpdMoveItem iid :: ItemId
iid k :: Int
k aid :: ActorId
aid c1 :: CStore
c1 c2 :: CStore
c2 -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ItemId -> Int -> ActorId -> CStore -> CStore -> UpdAtomic
UpdMoveItem ItemId
iid Int
k ActorId
aid CStore
c2 CStore
c1
UpdRefillHP aid :: ActorId
aid n :: Int64
n -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Int64 -> UpdAtomic
UpdRefillHP ActorId
aid (-Int64
n)
UpdRefillCalm aid :: ActorId
aid n :: Int64
n -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Int64 -> UpdAtomic
UpdRefillCalm ActorId
aid (-Int64
n)
UpdTrajectory aid :: ActorId
aid fromT :: Maybe ([Vector], Speed)
fromT toT :: Maybe ([Vector], Speed)
toT -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId
-> Maybe ([Vector], Speed) -> Maybe ([Vector], Speed) -> UpdAtomic
UpdTrajectory ActorId
aid Maybe ([Vector], Speed)
toT Maybe ([Vector], Speed)
fromT
UpdQuitFaction fid :: FactionId
fid fromSt :: Maybe Status
fromSt toSt :: Maybe Status
toSt manalytics :: Maybe (FactionAnalytics, GenerationAnalytics)
manalytics ->
UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ FactionId
-> Maybe Status
-> Maybe Status
-> Maybe (FactionAnalytics, GenerationAnalytics)
-> UpdAtomic
UpdQuitFaction FactionId
fid Maybe Status
toSt Maybe Status
fromSt Maybe (FactionAnalytics, GenerationAnalytics)
manalytics
UpdLeadFaction fid :: FactionId
fid source :: Maybe ActorId
source target :: Maybe ActorId
target -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ FactionId -> Maybe ActorId -> Maybe ActorId -> UpdAtomic
UpdLeadFaction FactionId
fid Maybe ActorId
target Maybe ActorId
source
UpdDiplFaction fid1 :: FactionId
fid1 fid2 :: FactionId
fid2 fromDipl :: Diplomacy
fromDipl toDipl :: Diplomacy
toDipl ->
UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ FactionId -> FactionId -> Diplomacy -> Diplomacy -> UpdAtomic
UpdDiplFaction FactionId
fid1 FactionId
fid2 Diplomacy
toDipl Diplomacy
fromDipl
UpdTacticFaction fid :: FactionId
fid toT :: Tactic
toT fromT :: Tactic
fromT -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ FactionId -> Tactic -> Tactic -> UpdAtomic
UpdTacticFaction FactionId
fid Tactic
fromT Tactic
toT
UpdAutoFaction fid :: FactionId
fid st :: Bool
st -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ FactionId -> Bool -> UpdAtomic
UpdAutoFaction FactionId
fid (Bool -> Bool
not Bool
st)
UpdRecordKill aid :: ActorId
aid ikind :: ContentId ItemKind
ikind k :: Int
k -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> ContentId ItemKind -> Int -> UpdAtomic
UpdRecordKill ActorId
aid ContentId ItemKind
ikind (-Int
k)
UpdAlterTile lid :: LevelId
lid p :: Point
p fromTile :: ContentId TileKind
fromTile toTile :: ContentId TileKind
toTile ->
UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId
-> Point -> ContentId TileKind -> ContentId TileKind -> UpdAtomic
UpdAlterTile LevelId
lid Point
p ContentId TileKind
toTile ContentId TileKind
fromTile
UpdAlterExplorable lid :: LevelId
lid delta :: Int
delta -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> Int -> UpdAtomic
UpdAlterExplorable LevelId
lid (-Int
delta)
UpdAlterGold delta :: Int
delta -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Int -> UpdAtomic
UpdAlterGold (-Int
delta)
UpdSearchTile aid :: ActorId
aid p :: Point
p toTile :: ContentId TileKind
toTile -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Point -> ContentId TileKind -> UpdAtomic
UpdHideTile ActorId
aid Point
p ContentId TileKind
toTile
UpdHideTile aid :: ActorId
aid p :: Point
p toTile :: ContentId TileKind
toTile -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ActorId -> Point -> ContentId TileKind -> UpdAtomic
UpdSearchTile ActorId
aid Point
p ContentId TileKind
toTile
UpdSpotTile lid :: LevelId
lid ts :: [(Point, ContentId TileKind)]
ts -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> [(Point, ContentId TileKind)] -> UpdAtomic
UpdLoseTile LevelId
lid [(Point, ContentId TileKind)]
ts
UpdLoseTile lid :: LevelId
lid ts :: [(Point, ContentId TileKind)]
ts -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> [(Point, ContentId TileKind)] -> UpdAtomic
UpdSpotTile LevelId
lid [(Point, ContentId TileKind)]
ts
UpdSpotEntry lid :: LevelId
lid ts :: [(Point, PlaceEntry)]
ts -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> [(Point, PlaceEntry)] -> UpdAtomic
UpdLoseEntry LevelId
lid [(Point, PlaceEntry)]
ts
UpdLoseEntry lid :: LevelId
lid ts :: [(Point, PlaceEntry)]
ts -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> [(Point, PlaceEntry)] -> UpdAtomic
UpdSpotEntry LevelId
lid [(Point, PlaceEntry)]
ts
UpdAlterSmell lid :: LevelId
lid p :: Point
p fromSm :: Time
fromSm toSm :: Time
toSm -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> Point -> Time -> Time -> UpdAtomic
UpdAlterSmell LevelId
lid Point
p Time
toSm Time
fromSm
UpdSpotSmell lid :: LevelId
lid sms :: [(Point, Time)]
sms -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> [(Point, Time)] -> UpdAtomic
UpdLoseSmell LevelId
lid [(Point, Time)]
sms
UpdLoseSmell lid :: LevelId
lid sms :: [(Point, Time)]
sms -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> [(Point, Time)] -> UpdAtomic
UpdSpotSmell LevelId
lid [(Point, Time)]
sms
UpdTimeItem iid :: ItemId
iid c :: Container
c fromIt :: ItemTimer
fromIt toIt :: ItemTimer
toIt -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ItemId -> Container -> ItemTimer -> ItemTimer -> UpdAtomic
UpdTimeItem ItemId
iid Container
c ItemTimer
toIt ItemTimer
fromIt
UpdAgeGame lids :: [LevelId]
lids -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ [LevelId] -> UpdAtomic
UpdUnAgeGame [LevelId]
lids
UpdUnAgeGame lids :: [LevelId]
lids -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ [LevelId] -> UpdAtomic
UpdAgeGame [LevelId]
lids
UpdDiscover c :: Container
c iid :: ItemId
iid ik :: ContentId ItemKind
ik arItem :: AspectRecord
arItem -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container
-> ItemId -> ContentId ItemKind -> AspectRecord -> UpdAtomic
UpdCover Container
c ItemId
iid ContentId ItemKind
ik AspectRecord
arItem
UpdCover c :: Container
c iid :: ItemId
iid ik :: ContentId ItemKind
ik arItem :: AspectRecord
arItem -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container
-> ItemId -> ContentId ItemKind -> AspectRecord -> UpdAtomic
UpdDiscover Container
c ItemId
iid ContentId ItemKind
ik AspectRecord
arItem
UpdDiscoverKind c :: Container
c ix :: ItemKindIx
ix ik :: ContentId ItemKind
ik -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container -> ItemKindIx -> ContentId ItemKind -> UpdAtomic
UpdCoverKind Container
c ItemKindIx
ix ContentId ItemKind
ik
UpdCoverKind c :: Container
c ix :: ItemKindIx
ix ik :: ContentId ItemKind
ik -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container -> ItemKindIx -> ContentId ItemKind -> UpdAtomic
UpdDiscoverKind Container
c ItemKindIx
ix ContentId ItemKind
ik
UpdDiscoverAspect c :: Container
c iid :: ItemId
iid arItem :: AspectRecord
arItem -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container -> ItemId -> AspectRecord -> UpdAtomic
UpdCoverAspect Container
c ItemId
iid AspectRecord
arItem
UpdCoverAspect c :: Container
c iid :: ItemId
iid arItem :: AspectRecord
arItem -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ Container -> ItemId -> AspectRecord -> UpdAtomic
UpdDiscoverAspect Container
c ItemId
iid AspectRecord
arItem
UpdDiscoverServer iid :: ItemId
iid arItem :: AspectRecord
arItem -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ItemId -> AspectRecord -> UpdAtomic
UpdCoverServer ItemId
iid AspectRecord
arItem
UpdCoverServer iid :: ItemId
iid arItem :: AspectRecord
arItem -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ ItemId -> AspectRecord -> UpdAtomic
UpdDiscoverServer ItemId
iid AspectRecord
arItem
UpdPerception lid :: LevelId
lid outPer :: Perception
outPer inPer :: Perception
inPer -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just (UpdAtomic -> Maybe UpdAtomic) -> UpdAtomic -> Maybe UpdAtomic
forall a b. (a -> b) -> a -> b
$ LevelId -> Perception -> Perception -> UpdAtomic
UpdPerception LevelId
lid Perception
inPer Perception
outPer
UpdRestart{} -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just UpdAtomic
cmd
UpdRestartServer{} -> UpdAtomic -> Maybe UpdAtomic
forall a. a -> Maybe a
Just UpdAtomic
cmd
UpdResume{} -> Maybe UpdAtomic
forall a. Maybe a
Nothing
UpdResumeServer{} -> Maybe UpdAtomic
forall a. Maybe a
Nothing
UpdKillExit{} -> Maybe UpdAtomic
forall a. Maybe a
Nothing
UpdWriteSave -> Maybe UpdAtomic
forall a. Maybe a
Nothing
UpdHearFid{} -> Maybe UpdAtomic
forall a. Maybe a
Nothing
undoSfxAtomic :: SfxAtomic -> SfxAtomic
undoSfxAtomic :: SfxAtomic -> SfxAtomic
undoSfxAtomic cmd :: SfxAtomic
cmd = case SfxAtomic
cmd of
SfxStrike source :: ActorId
source target :: ActorId
target iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxRecoil ActorId
source ActorId
target ItemId
iid CStore
cstore
SfxRecoil source :: ActorId
source target :: ActorId
target iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxStrike ActorId
source ActorId
target ItemId
iid CStore
cstore
SfxSteal source :: ActorId
source target :: ActorId
target iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxRelease ActorId
source ActorId
target ItemId
iid CStore
cstore
SfxRelease source :: ActorId
source target :: ActorId
target iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxSteal ActorId
source ActorId
target ItemId
iid CStore
cstore
SfxProject aid :: ActorId
aid iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxReceive ActorId
aid ItemId
iid CStore
cstore
SfxReceive aid :: ActorId
aid iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxProject ActorId
aid ItemId
iid CStore
cstore
SfxApply aid :: ActorId
aid iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxCheck ActorId
aid ItemId
iid CStore
cstore
SfxCheck aid :: ActorId
aid iid :: ItemId
iid cstore :: CStore
cstore -> ActorId -> ItemId -> CStore -> SfxAtomic
SfxApply ActorId
aid ItemId
iid CStore
cstore
SfxTrigger aid :: ActorId
aid p :: Point
p -> ActorId -> Point -> SfxAtomic
SfxShun ActorId
aid Point
p
SfxShun aid :: ActorId
aid p :: Point
p -> ActorId -> Point -> SfxAtomic
SfxTrigger ActorId
aid Point
p
SfxEffect{} -> SfxAtomic
cmd
SfxMsgFid{} -> SfxAtomic
cmd
SfxRestart -> SfxAtomic
cmd
SfxCollideTile{} -> SfxAtomic
cmd
SfxTaunt{} -> SfxAtomic
cmd
undoCmdAtomic :: CmdAtomic -> Maybe CmdAtomic
undoCmdAtomic :: CmdAtomic -> Maybe CmdAtomic
undoCmdAtomic (UpdAtomic cmd :: UpdAtomic
cmd) = UpdAtomic -> CmdAtomic
UpdAtomic (UpdAtomic -> CmdAtomic) -> Maybe UpdAtomic -> Maybe CmdAtomic
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> UpdAtomic -> Maybe UpdAtomic
undoUpdAtomic UpdAtomic
cmd
undoCmdAtomic (SfxAtomic sfx :: SfxAtomic
sfx) = CmdAtomic -> Maybe CmdAtomic
forall a. a -> Maybe a
Just (CmdAtomic -> Maybe CmdAtomic) -> CmdAtomic -> Maybe CmdAtomic
forall a b. (a -> b) -> a -> b
$ SfxAtomic -> CmdAtomic
SfxAtomic (SfxAtomic -> CmdAtomic) -> SfxAtomic -> CmdAtomic
forall a b. (a -> b) -> a -> b
$ SfxAtomic -> SfxAtomic
undoSfxAtomic SfxAtomic
sfx