octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Value.PickupValue

Documentation

data PickupValue Source #

Instances

Eq PickupValue Source # 
Show PickupValue Source # 
Generic PickupValue Source # 

Associated Types

type Rep PickupValue :: * -> * #

NFData PickupValue Source # 

Methods

rnf :: PickupValue -> () #

ToJSON PickupValue Source # 

Methods

toJSON :: PickupValue -> Value

toEncoding :: PickupValue -> Encoding

toJSONList :: [PickupValue] -> Value

toEncodingList :: [PickupValue] -> Encoding

HasField "hasInstigator" PickupValue Boolean Source # 

Methods

getField :: Proxy# Symbol "hasInstigator" -> PickupValue -> Boolean

HasField "pickedUp" PickupValue Boolean Source # 

Methods

getField :: Proxy# Symbol "pickedUp" -> PickupValue -> Boolean

ModifyField "hasInstigator" PickupValue PickupValue Boolean Boolean Source # 

Methods

modifyField :: Proxy# Symbol "hasInstigator" -> (Boolean -> Boolean) -> PickupValue -> PickupValue

setField :: Proxy# Symbol "hasInstigator" -> PickupValue -> Boolean -> PickupValue

fieldLens :: Functor f => Proxy# Symbol "hasInstigator" -> (Boolean -> f Boolean) -> PickupValue -> f PickupValue

ModifyField "pickedUp" PickupValue PickupValue Boolean Boolean Source # 
ModifyField "instigatorId" PickupValue PickupValue (Maybe Word32) (Maybe Word32) Source # 

Methods

modifyField :: Proxy# Symbol "instigatorId" -> (Maybe Word32 -> Maybe Word32) -> PickupValue -> PickupValue

setField :: Proxy# Symbol "instigatorId" -> PickupValue -> Maybe Word32 -> PickupValue

fieldLens :: Functor f => Proxy# Symbol "instigatorId" -> (Maybe Word32 -> f (Maybe Word32)) -> PickupValue -> f PickupValue

HasField "instigatorId" PickupValue (Maybe Word32) Source # 

Methods

getField :: Proxy# Symbol "instigatorId" -> PickupValue -> Maybe Word32

ModifyRec "hasInstigator" Boolean cs0 => HasField "hasInstigator" (Rec cs0 PickupValue) Boolean Source # 

Methods

getField :: Proxy# Symbol "hasInstigator" -> Rec cs0 PickupValue -> Boolean

ModifyRec "pickedUp" Boolean cs0 => HasField "pickedUp" (Rec cs0 PickupValue) Boolean Source # 

Methods

getField :: Proxy# Symbol "pickedUp" -> Rec cs0 PickupValue -> Boolean

ModifyRec "instigatorId" (Maybe Word32) cs0 => HasField "instigatorId" (Rec cs0 PickupValue) (Maybe Word32) Source # 

Methods

getField :: Proxy# Symbol "instigatorId" -> Rec cs0 PickupValue -> Maybe Word32

ModifyRec "hasInstigator" Boolean cs0 => ModifyField "hasInstigator" (Rec cs0 PickupValue) (Rec cs0 PickupValue) Boolean Boolean Source # 

Methods

modifyField :: Proxy# Symbol "hasInstigator" -> (Boolean -> Boolean) -> Rec cs0 PickupValue -> Rec cs0 PickupValue

setField :: Proxy# Symbol "hasInstigator" -> Rec cs0 PickupValue -> Boolean -> Rec cs0 PickupValue

fieldLens :: Functor f => Proxy# Symbol "hasInstigator" -> (Boolean -> f Boolean) -> Rec cs0 PickupValue -> f (Rec cs0 PickupValue)

ModifyRec "pickedUp" Boolean cs0 => ModifyField "pickedUp" (Rec cs0 PickupValue) (Rec cs0 PickupValue) Boolean Boolean Source # 

Methods

modifyField :: Proxy# Symbol "pickedUp" -> (Boolean -> Boolean) -> Rec cs0 PickupValue -> Rec cs0 PickupValue

setField :: Proxy# Symbol "pickedUp" -> Rec cs0 PickupValue -> Boolean -> Rec cs0 PickupValue

fieldLens :: Functor f => Proxy# Symbol "pickedUp" -> (Boolean -> f Boolean) -> Rec cs0 PickupValue -> f (Rec cs0 PickupValue)

ModifyRec "instigatorId" (Maybe Word32) cs0 => ModifyField "instigatorId" (Rec cs0 PickupValue) (Rec cs0 PickupValue) (Maybe Word32) (Maybe Word32) Source # 

Methods

modifyField :: Proxy# Symbol "instigatorId" -> (Maybe Word32 -> Maybe Word32) -> Rec cs0 PickupValue -> Rec cs0 PickupValue

setField :: Proxy# Symbol "instigatorId" -> Rec cs0 PickupValue -> Maybe Word32 -> Rec cs0 PickupValue

fieldLens :: Functor f => Proxy# Symbol "instigatorId" -> (Maybe Word32 -> f (Maybe Word32)) -> Rec cs0 PickupValue -> f (Rec cs0 PickupValue)

type Rep PickupValue Source # 
type Rep PickupValue = D1 (MetaData "PickupValue" "Octane.Type.Value.PickupValue" "octane-0.16.1-GutvkXgevkCABZiWZysr0h" False) (C1 (MetaCons "PickupValue" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "pickupValueHasInstigator") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Boolean)) ((:*:) (S1 (MetaSel (Just Symbol "pickupValueInstigatorId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 (Maybe Word32))) (S1 (MetaSel (Just Symbol "pickupValuePickedUp") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Boolean)))))
type FieldType "hasInstigator" PickupValue Source # 
type FieldType "hasInstigator" PickupValue = Boolean
type FieldType "instigatorId" PickupValue Source # 
type FieldType "instigatorId" PickupValue = Maybe Word32
type FieldType "pickedUp" PickupValue Source # 
type FieldType "pickedUp" PickupValue = Boolean
type UpdateType "hasInstigator" PickupValue Boolean Source # 
type UpdateType "hasInstigator" PickupValue Boolean = PickupValue
type UpdateType "pickedUp" PickupValue Boolean Source # 
type UpdateType "pickedUp" PickupValue Boolean = PickupValue
type UpdateType "instigatorId" PickupValue (Maybe Word32) Source # 
type UpdateType "instigatorId" PickupValue (Maybe Word32) = PickupValue