octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Property.ArrayProperty

Documentation

data ArrayProperty a Source #

Instances

HasField "size" (ArrayProperty a0) Word64 Source # 

Methods

getField :: Proxy# Symbol "size" -> ArrayProperty a0 -> Word64

HasField "content" (ArrayProperty a0) (List (Dictionary a0)) Source # 

Methods

getField :: Proxy# Symbol "content" -> ArrayProperty a0 -> List (Dictionary a0)

ModifyField "size" (ArrayProperty a0) (ArrayProperty a0) Word64 Word64 Source # 

Methods

modifyField :: Proxy# Symbol "size" -> (Word64 -> Word64) -> ArrayProperty a0 -> ArrayProperty a0

setField :: Proxy# Symbol "size" -> ArrayProperty a0 -> Word64 -> ArrayProperty a0

fieldLens :: Functor f => Proxy# Symbol "size" -> (Word64 -> f Word64) -> ArrayProperty a0 -> f (ArrayProperty a0)

ModifyField "content" (ArrayProperty a0) (ArrayProperty a0) (List (Dictionary a0)) (List (Dictionary a0)) Source # 

Methods

modifyField :: Proxy# Symbol "content" -> (List (Dictionary a0) -> List (Dictionary a0)) -> ArrayProperty a0 -> ArrayProperty a0

setField :: Proxy# Symbol "content" -> ArrayProperty a0 -> List (Dictionary a0) -> ArrayProperty a0

fieldLens :: Functor f => Proxy# Symbol "content" -> (List (Dictionary a0) -> f (List (Dictionary a0))) -> ArrayProperty a0 -> f (ArrayProperty a0)

ModifyRec "size" Word64 cs0 => HasField "size" (Rec cs0 (ArrayProperty a0)) Word64 Source # 

Methods

getField :: Proxy# Symbol "size" -> Rec cs0 (ArrayProperty a0) -> Word64

ModifyRec "content" (List (Dictionary a0)) cs0 => HasField "content" (Rec cs0 (ArrayProperty a0)) (List (Dictionary a0)) Source # 

Methods

getField :: Proxy# Symbol "content" -> Rec cs0 (ArrayProperty a0) -> List (Dictionary a0)

ModifyRec "size" Word64 cs0 => ModifyField "size" (Rec cs0 (ArrayProperty a0)) (Rec cs0 (ArrayProperty a0)) Word64 Word64 Source # 

Methods

modifyField :: Proxy# Symbol "size" -> (Word64 -> Word64) -> Rec cs0 (ArrayProperty a0) -> Rec cs0 (ArrayProperty a0)

setField :: Proxy# Symbol "size" -> Rec cs0 (ArrayProperty a0) -> Word64 -> Rec cs0 (ArrayProperty a0)

fieldLens :: Functor f => Proxy# Symbol "size" -> (Word64 -> f Word64) -> Rec cs0 (ArrayProperty a0) -> f (Rec cs0 (ArrayProperty a0))

ModifyRec "content" (List (Dictionary a0)) cs0 => ModifyField "content" (Rec cs0 (ArrayProperty a0)) (Rec cs0 (ArrayProperty a0)) (List (Dictionary a0)) (List (Dictionary a0)) Source # 

Methods

modifyField :: Proxy# Symbol "content" -> (List (Dictionary a0) -> List (Dictionary a0)) -> Rec cs0 (ArrayProperty a0) -> Rec cs0 (ArrayProperty a0)

setField :: Proxy# Symbol "content" -> Rec cs0 (ArrayProperty a0) -> List (Dictionary a0) -> Rec cs0 (ArrayProperty a0)

fieldLens :: Functor f => Proxy# Symbol "content" -> (List (Dictionary a0) -> f (List (Dictionary a0))) -> Rec cs0 (ArrayProperty a0) -> f (Rec cs0 (ArrayProperty a0))

Eq a => Eq (ArrayProperty a) Source # 
Show a => Show (ArrayProperty a) Source # 
Generic (ArrayProperty a) Source # 

Associated Types

type Rep (ArrayProperty a) :: * -> * #

Binary a => Binary (ArrayProperty a) Source # 
NFData a => NFData (ArrayProperty a) Source # 

Methods

rnf :: ArrayProperty a -> () #

ToJSON a => ToJSON (ArrayProperty a) Source # 

Methods

toJSON :: ArrayProperty a -> Value

toEncoding :: ArrayProperty a -> Encoding

toJSONList :: [ArrayProperty a] -> Value

toEncodingList :: [ArrayProperty a] -> Encoding

type FieldType "content" (ArrayProperty a0) Source # 
type FieldType "content" (ArrayProperty a0) = List (Dictionary a0)
type FieldType "size" (ArrayProperty a0) Source # 
type FieldType "size" (ArrayProperty a0) = Word64
type UpdateType "size" (ArrayProperty a0) Word64 Source # 
type UpdateType "size" (ArrayProperty a0) Word64 = ArrayProperty a0
type UpdateType "content" (ArrayProperty a0) (List (Dictionary a0)) Source # 
type UpdateType "content" (ArrayProperty a0) (List (Dictionary a0)) = ArrayProperty a0
type Rep (ArrayProperty a) Source # 
type Rep (ArrayProperty a) = D1 (MetaData "ArrayProperty" "Octane.Type.Property.ArrayProperty" "octane-0.16.1-GutvkXgevkCABZiWZysr0h" False) (C1 (MetaCons "ArrayProperty" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "arrayPropertySize") NoSourceUnpackedness NoSourceStrictness DecidedUnpack) (Rec0 Word64)) (S1 (MetaSel (Just Symbol "arrayPropertyContent") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 (List (Dictionary a))))))