octane-0.16.1: Parse Rocket League replays.

Safe HaskellNone
LanguageHaskell2010

Octane.Type.Value.StringValue

Documentation

newtype StringValue Source #

Constructors

StringValue 

Instances

Eq StringValue Source # 
Show StringValue Source # 
Generic StringValue Source # 

Associated Types

type Rep StringValue :: * -> * #

NFData StringValue Source # 

Methods

rnf :: StringValue -> () #

ToJSON StringValue Source # 

Methods

toJSON :: StringValue -> Value

toEncoding :: StringValue -> Encoding

toJSONList :: [StringValue] -> Value

toEncodingList :: [StringValue] -> Encoding

HasField "unpack" StringValue Text Source # 

Methods

getField :: Proxy# Symbol "unpack" -> StringValue -> Text

ModifyField "unpack" StringValue StringValue Text Text Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Text -> Text) -> StringValue -> StringValue

setField :: Proxy# Symbol "unpack" -> StringValue -> Text -> StringValue

fieldLens :: Functor f => Proxy# Symbol "unpack" -> (Text -> f Text) -> StringValue -> f StringValue

ModifyRec "unpack" Text cs0 => HasField "unpack" (Rec cs0 StringValue) Text Source # 

Methods

getField :: Proxy# Symbol "unpack" -> Rec cs0 StringValue -> Text

ModifyRec "unpack" Text cs0 => ModifyField "unpack" (Rec cs0 StringValue) (Rec cs0 StringValue) Text Text Source # 

Methods

modifyField :: Proxy# Symbol "unpack" -> (Text -> Text) -> Rec cs0 StringValue -> Rec cs0 StringValue

setField :: Proxy# Symbol "unpack" -> Rec cs0 StringValue -> Text -> Rec cs0 StringValue

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

type Rep StringValue Source # 
type Rep StringValue = D1 (MetaData "StringValue" "Octane.Type.Value.StringValue" "octane-0.16.1-GutvkXgevkCABZiWZysr0h" True) (C1 (MetaCons "StringValue" PrefixI True) (S1 (MetaSel (Just Symbol "stringValueUnpack") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type FieldType "unpack" StringValue Source # 
type FieldType "unpack" StringValue = Text
type UpdateType "unpack" StringValue Text Source # 
type UpdateType "unpack" StringValue Text = StringValue