octane-0.14.0: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.CacheProperty

Synopsis

Documentation

data CacheProperty Source #

A property on an item in the class net cache map.

Constructors

CacheProperty 

Fields

Instances

Eq CacheProperty Source # 
Show CacheProperty Source # 
Generic CacheProperty Source # 

Associated Types

type Rep CacheProperty :: * -> * #

Binary CacheProperty Source #

Fields are stored one after the other in order.

>>> Binary.decode "\x01\x00\x00\x00\x02\x00\x00\x00" :: CacheProperty
CacheProperty {cachePropertyObjectId = 0x00000001, cachePropertyStreamId = 0x00000002}
>>> Binary.encode (CacheProperty 1 2)
"\SOH\NUL\NUL\NUL\STX\NUL\NUL\NUL"
NFData CacheProperty Source # 

Methods

rnf :: CacheProperty -> () #

HasField "objectId" CacheProperty Word32 Source # 

Methods

getField :: Proxy# Symbol "objectId" -> CacheProperty -> Word32 #

HasField "streamId" CacheProperty Word32 Source # 

Methods

getField :: Proxy# Symbol "streamId" -> CacheProperty -> Word32 #

ModifyField "objectId" CacheProperty CacheProperty Word32 Word32 Source # 
ModifyField "streamId" CacheProperty CacheProperty Word32 Word32 Source # 
ModifyField "properties" CacheItem CacheItem (List CacheProperty) (List CacheProperty) # 
HasField "properties" CacheItem (List CacheProperty) # 

Methods

getField :: Proxy# Symbol "properties" -> CacheItem -> List CacheProperty #

ModifyRec "objectId" Word32 cs0 => HasField "objectId" (Rec cs0 CacheProperty) Word32 Source # 

Methods

getField :: Proxy# Symbol "objectId" -> Rec cs0 CacheProperty -> Word32 #

ModifyRec "streamId" Word32 cs0 => HasField "streamId" (Rec cs0 CacheProperty) Word32 Source # 

Methods

getField :: Proxy# Symbol "streamId" -> Rec cs0 CacheProperty -> Word32 #

ModifyRec "properties" (List CacheProperty) cs0 => HasField "properties" (Rec cs0 CacheItem) (List CacheProperty) # 

Methods

getField :: Proxy# Symbol "properties" -> Rec cs0 CacheItem -> List CacheProperty #

ModifyRec "objectId" Word32 cs0 => ModifyField "objectId" (Rec cs0 CacheProperty) (Rec cs0 CacheProperty) Word32 Word32 Source # 

Methods

modifyField :: Proxy# Symbol "objectId" -> (Word32 -> Word32) -> Rec cs0 CacheProperty -> Rec cs0 CacheProperty #

setField :: Proxy# Symbol "objectId" -> Rec cs0 CacheProperty -> Word32 -> Rec cs0 CacheProperty #

fieldLens :: Functor f => Proxy# Symbol "objectId" -> (Word32 -> f Word32) -> Rec cs0 CacheProperty -> f (Rec cs0 CacheProperty) #

ModifyRec "streamId" Word32 cs0 => ModifyField "streamId" (Rec cs0 CacheProperty) (Rec cs0 CacheProperty) Word32 Word32 Source # 

Methods

modifyField :: Proxy# Symbol "streamId" -> (Word32 -> Word32) -> Rec cs0 CacheProperty -> Rec cs0 CacheProperty #

setField :: Proxy# Symbol "streamId" -> Rec cs0 CacheProperty -> Word32 -> Rec cs0 CacheProperty #

fieldLens :: Functor f => Proxy# Symbol "streamId" -> (Word32 -> f Word32) -> Rec cs0 CacheProperty -> f (Rec cs0 CacheProperty) #

ModifyRec "properties" (List CacheProperty) cs0 => ModifyField "properties" (Rec cs0 CacheItem) (Rec cs0 CacheItem) (List CacheProperty) (List CacheProperty) # 

Methods

modifyField :: Proxy# Symbol "properties" -> (List CacheProperty -> List CacheProperty) -> Rec cs0 CacheItem -> Rec cs0 CacheItem #

setField :: Proxy# Symbol "properties" -> Rec cs0 CacheItem -> List CacheProperty -> Rec cs0 CacheItem #

fieldLens :: Functor f => Proxy# Symbol "properties" -> (List CacheProperty -> f (List CacheProperty)) -> Rec cs0 CacheItem -> f (Rec cs0 CacheItem) #

type Rep CacheProperty Source # 
type Rep CacheProperty = D1 (MetaData "CacheProperty" "Octane.Type.CacheProperty" "octane-0.14.0-IznL7Q8DYDX3jshGLPoKHr" False) (C1 (MetaCons "CacheProperty" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "cachePropertyObjectId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32)) (S1 (MetaSel (Just Symbol "cachePropertyStreamId") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Word32))))
type FieldType "objectId" CacheProperty Source # 
type FieldType "objectId" CacheProperty = Word32
type FieldType "streamId" CacheProperty Source # 
type FieldType "streamId" CacheProperty = Word32
type UpdateType "objectId" CacheProperty Word32 Source # 
type UpdateType "streamId" CacheProperty Word32 Source # 
type UpdateType "properties" CacheItem (List CacheProperty) #