octane-0.16.3: Parse Rocket League replays.

Safe HaskellSafe
LanguageHaskell2010

Octane.Type.State

Synopsis

Documentation

data State Source #

The state of an actor in a replication.

Constructors

Opening

This is a new actor that we have not seen before.

Existing

We have seen this actor before.

Closing

This actor is going away.

Instances

Eq State Source # 

Methods

(==) :: State -> State -> Bool #

(/=) :: State -> State -> Bool #

Show State Source # 

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String #

showList :: [State] -> ShowS #

Generic State Source # 

Associated Types

type Rep State :: * -> * #

Methods

from :: State -> Rep State x #

to :: Rep State x -> State #

NFData State Source # 

Methods

rnf :: State -> () #

HasField "state" Replication State # 

Methods

getField :: Proxy# Symbol "state" -> Replication -> State #

ModifyField "state" Replication Replication State State # 
ModifyRec "state" State cs0 => HasField "state" (Rec cs0 Replication) State # 

Methods

getField :: Proxy# Symbol "state" -> Rec cs0 Replication -> State #

ModifyRec "state" State cs0 => ModifyField "state" (Rec cs0 Replication) (Rec cs0 Replication) State State # 

Methods

modifyField :: Proxy# Symbol "state" -> (State -> State) -> Rec cs0 Replication -> Rec cs0 Replication #

setField :: Proxy# Symbol "state" -> Rec cs0 Replication -> State -> Rec cs0 Replication #

fieldLens :: Functor f => Proxy# Symbol "state" -> (State -> f State) -> Rec cs0 Replication -> f (Rec cs0 Replication) #

type Rep State Source # 
type Rep State = D1 (MetaData "State" "Octane.Type.State" "octane-0.16.3-BwaIROHkKmo4WuJxKX8pbC" False) ((:+:) (C1 (MetaCons "Opening" PrefixI False) U1) ((:+:) (C1 (MetaCons "Existing" PrefixI False) U1) (C1 (MetaCons "Closing" PrefixI False) U1)))
type UpdateType "state" Replication State #