octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Property.StrProperty

Documentation

data StrProperty Source #

Instances

Eq StrProperty Source # 
Show StrProperty Source # 
Generic StrProperty Source # 

Associated Types

type Rep StrProperty :: * -> * #

Binary StrProperty Source # 
NFData StrProperty Source # 

Methods

rnf :: StrProperty -> () #

ToJSON StrProperty Source # 

Methods

toJSON :: StrProperty -> Value

toEncoding :: StrProperty -> Encoding

toJSONList :: [StrProperty] -> Value

toEncodingList :: [StrProperty] -> Encoding

HasField "content" StrProperty Text Source # 

Methods

getField :: Proxy# Symbol "content" -> StrProperty -> Text

HasField "size" StrProperty Word64 Source # 

Methods

getField :: Proxy# Symbol "size" -> StrProperty -> Word64

ModifyField "content" StrProperty StrProperty Text Text Source # 

Methods

modifyField :: Proxy# Symbol "content" -> (Text -> Text) -> StrProperty -> StrProperty

setField :: Proxy# Symbol "content" -> StrProperty -> Text -> StrProperty

fieldLens :: Functor f => Proxy# Symbol "content" -> (Text -> f Text) -> StrProperty -> f StrProperty

ModifyField "size" StrProperty StrProperty Word64 Word64 Source # 
ModifyRec "content" Text cs0 => HasField "content" (Rec cs0 StrProperty) Text Source # 

Methods

getField :: Proxy# Symbol "content" -> Rec cs0 StrProperty -> Text

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

Methods

getField :: Proxy# Symbol "size" -> Rec cs0 StrProperty -> Word64

ModifyRec "content" Text cs0 => ModifyField "content" (Rec cs0 StrProperty) (Rec cs0 StrProperty) Text Text Source # 

Methods

modifyField :: Proxy# Symbol "content" -> (Text -> Text) -> Rec cs0 StrProperty -> Rec cs0 StrProperty

setField :: Proxy# Symbol "content" -> Rec cs0 StrProperty -> Text -> Rec cs0 StrProperty

fieldLens :: Functor f => Proxy# Symbol "content" -> (Text -> f Text) -> Rec cs0 StrProperty -> f (Rec cs0 StrProperty)

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

Methods

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

setField :: Proxy# Symbol "size" -> Rec cs0 StrProperty -> Word64 -> Rec cs0 StrProperty

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

type Rep StrProperty Source # 
type Rep StrProperty = D1 (MetaData "StrProperty" "Octane.Type.Property.StrProperty" "octane-0.16.1-GutvkXgevkCABZiWZysr0h" False) (C1 (MetaCons "StrProperty" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "strPropertySize") NoSourceUnpackedness NoSourceStrictness DecidedUnpack) (Rec0 Word64)) (S1 (MetaSel (Just Symbol "strPropertyContent") NoSourceUnpackedness NoSourceStrictness DecidedStrict) (Rec0 Text))))
type FieldType "content" StrProperty Source # 
type FieldType "content" StrProperty = Text
type FieldType "size" StrProperty Source # 
type FieldType "size" StrProperty = Word64
type UpdateType "content" StrProperty Text Source # 
type UpdateType "content" StrProperty Text = StrProperty
type UpdateType "size" StrProperty Word64 Source # 
type UpdateType "size" StrProperty Word64 = StrProperty